R Under development (unstable) (2023-06-30 r84625 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") [18:03:15.521] plan(): Setting new future strategy stack: [18:03:15.522] List of future strategies: [18:03:15.522] 1. sequential: [18:03:15.522] - args: function (..., envir = parent.frame()) [18:03:15.522] - tweaked: FALSE [18:03:15.522] - call: future::plan("sequential") [18:03:15.538] plan(): nbrOfWorkers() = 1 > > message("*** rng ...") *** rng ... > > okind <- RNGkind() > > ## A valid regular seed > f <- Future(42, seed = 42L) [18:03:15.546] getGlobalsAndPackages() ... [18:03:15.546] [18:03:15.547] - globals: [0] [18:03:15.547] getGlobalsAndPackages() ... DONE > print(f) Future: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: c(10407, -1871565002, 1968597656, -505666782, 1055078269, 658163990, 1090264187) Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'Future', 'environment' > stopifnot(identical(RNGkind(), okind)) > > ## A valid L'Ecuyer-CMRG RNG seed > seed <- c(407L, 1420090545L, 65713854L, -990249945L, + 1780737596L, -1213437427L, 1082168682L) > f <- Future(42, seed = seed) [18:03:15.548] getGlobalsAndPackages() ... [18:03:15.549] [18:03:15.549] - globals: [0] [18:03:15.549] getGlobalsAndPackages() ... DONE > print(f) Future: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: c(407, 1420090545, 65713854, -990249945, 1780737596, -1213437427, 1082168682) Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'Future', 'environment' > stopifnot(identical(RNGkind(), okind)) > > f <- Future(42, seed = TRUE) [18:03:15.550] getGlobalsAndPackages() ... [18:03:15.550] [18:03:15.550] - globals: [0] [18:03:15.550] getGlobalsAndPackages() ... DONE > print(f) Future: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: c(10407, -236144643, -1170490849, -2094916212, -1843441965, -298819292, -983535361) Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'Future', 'environment' > stopifnot(identical(RNGkind(), okind)) > > f <- Future(42, seed = FALSE) [18:03:15.551] getGlobalsAndPackages() ... [18:03:15.551] [18:03:15.551] - globals: [0] [18:03:15.551] getGlobalsAndPackages() ... DONE > print(f) Future: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'Future', 'environment' > stopifnot(identical(RNGkind(), okind)) > > f <- Future(42, seed = NULL) [18:03:15.552] getGlobalsAndPackages() ... [18:03:15.552] [18:03:15.553] - globals: [0] [18:03:15.553] getGlobalsAndPackages() ... DONE > print(f) Future: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'Future', 'environment' > stopifnot(identical(RNGkind(), okind)) > > > ## See Section 6 on 'Random-number generation' in > ## vignette("parallel", package = "parallel") > fsample <- function(x, size = 4L, seed = NULL, what = c("future", "%<-%")) { + what <- match.arg(what) + + ## Must use session-specific '.GlobalEnv' here + .GlobalEnv <- globalenv() + + oseed <- .GlobalEnv$.Random.seed + orng <- RNGkind("L'Ecuyer-CMRG")[1L] + on.exit(RNGkind(orng)) + + if (isFALSE(seed) || isNA(seed) || is.null(seed)) { + if (what == "future") { + fs <- list() + for (ii in seq_len(size)) { + label <- sprintf("fsample_%d-%d", ii, sample.int(1e6, size=1L)) + fs[[ii]] <- future({ sample(x, size = 1L) }, seed = seed, label = label) + print(fs[[ii]]) + } + res <- value(fs) + } else { + res <- listenv::listenv() + for (ii in seq_len(size)) { + label <- sprintf("fsample_%d-%d", ii, sample.int(1e6, size=1L)) + res[[ii]] %<-% { sample(x, size = 1L) } %seed% seed %label% label + } + res <- as.list(res) + } + } else { + ## Reset state of random seed afterwards? + on.exit({ + if (is.null(oseed)) { + rm(list = ".Random.seed", envir = .GlobalEnv, inherits = FALSE) + } else { + .GlobalEnv$.Random.seed <- oseed + } + }, add = TRUE) + + set.seed(seed) + + .seed <- .Random.seed + + if (what == "future") { + fs <- list() + for (ii in seq_len(size)) { + .seed <- parallel::nextRNGStream(.seed) + fs[[ii]] <- future({ sample(x, size = 1L) }, seed = .seed) + } + res <- value(fs) + } else { + res <- listenv::listenv() + for (ii in seq_len(size)) { + .seed <- parallel::nextRNGStream(.seed) + res[[ii]] %<-% { sample(x, size = 1L) } %seed% .seed + } + res <- as.list(res) + } + } + + res + } # fsample() > > > dummy <- sample(0:3, size = 1L) > seed0 <- .Random.seed > stopifnot(identical(RNGkind(), okind)) > > ## Reference sample with fixed random seed > plan("sequential") [18:03:15.560] plan(): Setting new future strategy stack: [18:03:15.560] List of future strategies: [18:03:15.560] 1. sequential: [18:03:15.560] - args: function (..., envir = parent.frame()) [18:03:15.560] - tweaked: FALSE [18:03:15.560] - call: plan("sequential") [18:03:15.573] plan(): nbrOfWorkers() = 1 > y0 <- fsample(0:3, seed = 42L) [18:03:15.598] getGlobalsAndPackages() ... [18:03:15.598] Searching for globals... [18:03:15.607] - globals found: [3] '{', 'sample', 'x' [18:03:15.607] Searching for globals ... DONE [18:03:15.607] Resolving globals: FALSE [18:03:15.609] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.609] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.609] - globals: [1] 'x' [18:03:15.610] [18:03:15.610] getGlobalsAndPackages() ... DONE [18:03:15.610] run() for 'Future' ... [18:03:15.611] - state: 'created' [18:03:15.611] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.611] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.612] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.612] - Field: 'label' [18:03:15.612] - Field: 'local' [18:03:15.612] - Field: 'owner' [18:03:15.612] - Field: 'envir' [18:03:15.613] - Field: 'packages' [18:03:15.613] - Field: 'gc' [18:03:15.613] - Field: 'conditions' [18:03:15.613] - Field: 'expr' [18:03:15.613] - Field: 'uuid' [18:03:15.613] - Field: 'seed' [18:03:15.614] - Field: 'version' [18:03:15.614] - Field: 'result' [18:03:15.614] - Field: 'asynchronous' [18:03:15.614] - Field: 'calls' [18:03:15.614] - Field: 'globals' [18:03:15.614] - Field: 'stdout' [18:03:15.615] - Field: 'earlySignal' [18:03:15.615] - Field: 'lazy' [18:03:15.615] - Field: 'state' [18:03:15.615] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.615] - Launch lazy future ... [18:03:15.616] Packages needed by the future expression (n = 0): [18:03:15.616] Packages needed by future strategies (n = 0): [18:03:15.617] { [18:03:15.617] { [18:03:15.617] { [18:03:15.617] ...future.startTime <- base::Sys.time() [18:03:15.617] { [18:03:15.617] { [18:03:15.617] { [18:03:15.617] { [18:03:15.617] base::local({ [18:03:15.617] has_future <- base::requireNamespace("future", [18:03:15.617] quietly = TRUE) [18:03:15.617] if (has_future) { [18:03:15.617] ns <- base::getNamespace("future") [18:03:15.617] version <- ns[[".package"]][["version"]] [18:03:15.617] if (is.null(version)) [18:03:15.617] version <- utils::packageVersion("future") [18:03:15.617] } [18:03:15.617] else { [18:03:15.617] version <- NULL [18:03:15.617] } [18:03:15.617] if (!has_future || version < "1.8.0") { [18:03:15.617] info <- base::c(r_version = base::gsub("R version ", [18:03:15.617] "", base::R.version$version.string), [18:03:15.617] platform = base::sprintf("%s (%s-bit)", [18:03:15.617] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.617] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.617] "release", "version")], collapse = " "), [18:03:15.617] hostname = base::Sys.info()[["nodename"]]) [18:03:15.617] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.617] info) [18:03:15.617] info <- base::paste(info, collapse = "; ") [18:03:15.617] if (!has_future) { [18:03:15.617] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.617] info) [18:03:15.617] } [18:03:15.617] else { [18:03:15.617] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.617] info, version) [18:03:15.617] } [18:03:15.617] base::stop(msg) [18:03:15.617] } [18:03:15.617] }) [18:03:15.617] } [18:03:15.617] options(future.plan = NULL) [18:03:15.617] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.617] future::plan("default", .cleanup = FALSE, [18:03:15.617] .init = FALSE) [18:03:15.617] } [18:03:15.617] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:15.617] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:15.617] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:15.617] } [18:03:15.617] ...future.workdir <- getwd() [18:03:15.617] } [18:03:15.617] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.617] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.617] } [18:03:15.617] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.617] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.617] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.617] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.617] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.617] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.617] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.617] base::names(...future.oldOptions)) [18:03:15.617] } [18:03:15.617] if (FALSE) { [18:03:15.617] } [18:03:15.617] else { [18:03:15.617] if (TRUE) { [18:03:15.617] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.617] open = "w") [18:03:15.617] } [18:03:15.617] else { [18:03:15.617] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.617] windows = "NUL", "/dev/null"), open = "w") [18:03:15.617] } [18:03:15.617] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.617] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.617] base::sink(type = "output", split = FALSE) [18:03:15.617] base::close(...future.stdout) [18:03:15.617] }, add = TRUE) [18:03:15.617] } [18:03:15.617] ...future.frame <- base::sys.nframe() [18:03:15.617] ...future.conditions <- base::list() [18:03:15.617] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.617] if (FALSE) { [18:03:15.617] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.617] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.617] } [18:03:15.617] ...future.result <- base::tryCatch({ [18:03:15.617] base::withCallingHandlers({ [18:03:15.617] ...future.value <- base::withVisible(base::local({ [18:03:15.617] sample(x, size = 1L) [18:03:15.617] })) [18:03:15.617] future::FutureResult(value = ...future.value$value, [18:03:15.617] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.617] ...future.rng), globalenv = if (FALSE) [18:03:15.617] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.617] ...future.globalenv.names)) [18:03:15.617] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.617] }, condition = base::local({ [18:03:15.617] c <- base::c [18:03:15.617] inherits <- base::inherits [18:03:15.617] invokeRestart <- base::invokeRestart [18:03:15.617] length <- base::length [18:03:15.617] list <- base::list [18:03:15.617] seq.int <- base::seq.int [18:03:15.617] signalCondition <- base::signalCondition [18:03:15.617] sys.calls <- base::sys.calls [18:03:15.617] `[[` <- base::`[[` [18:03:15.617] `+` <- base::`+` [18:03:15.617] `<<-` <- base::`<<-` [18:03:15.617] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.617] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.617] 3L)] [18:03:15.617] } [18:03:15.617] function(cond) { [18:03:15.617] is_error <- inherits(cond, "error") [18:03:15.617] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.617] NULL) [18:03:15.617] if (is_error) { [18:03:15.617] sessionInformation <- function() { [18:03:15.617] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.617] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.617] search = base::search(), system = base::Sys.info()) [18:03:15.617] } [18:03:15.617] ...future.conditions[[length(...future.conditions) + [18:03:15.617] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.617] cond$call), session = sessionInformation(), [18:03:15.617] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.617] signalCondition(cond) [18:03:15.617] } [18:03:15.617] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.617] "immediateCondition"))) { [18:03:15.617] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.617] ...future.conditions[[length(...future.conditions) + [18:03:15.617] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.617] if (TRUE && !signal) { [18:03:15.617] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.617] { [18:03:15.617] inherits <- base::inherits [18:03:15.617] invokeRestart <- base::invokeRestart [18:03:15.617] is.null <- base::is.null [18:03:15.617] muffled <- FALSE [18:03:15.617] if (inherits(cond, "message")) { [18:03:15.617] muffled <- grepl(pattern, "muffleMessage") [18:03:15.617] if (muffled) [18:03:15.617] invokeRestart("muffleMessage") [18:03:15.617] } [18:03:15.617] else if (inherits(cond, "warning")) { [18:03:15.617] muffled <- grepl(pattern, "muffleWarning") [18:03:15.617] if (muffled) [18:03:15.617] invokeRestart("muffleWarning") [18:03:15.617] } [18:03:15.617] else if (inherits(cond, "condition")) { [18:03:15.617] if (!is.null(pattern)) { [18:03:15.617] computeRestarts <- base::computeRestarts [18:03:15.617] grepl <- base::grepl [18:03:15.617] restarts <- computeRestarts(cond) [18:03:15.617] for (restart in restarts) { [18:03:15.617] name <- restart$name [18:03:15.617] if (is.null(name)) [18:03:15.617] next [18:03:15.617] if (!grepl(pattern, name)) [18:03:15.617] next [18:03:15.617] invokeRestart(restart) [18:03:15.617] muffled <- TRUE [18:03:15.617] break [18:03:15.617] } [18:03:15.617] } [18:03:15.617] } [18:03:15.617] invisible(muffled) [18:03:15.617] } [18:03:15.617] muffleCondition(cond, pattern = "^muffle") [18:03:15.617] } [18:03:15.617] } [18:03:15.617] else { [18:03:15.617] if (TRUE) { [18:03:15.617] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.617] { [18:03:15.617] inherits <- base::inherits [18:03:15.617] invokeRestart <- base::invokeRestart [18:03:15.617] is.null <- base::is.null [18:03:15.617] muffled <- FALSE [18:03:15.617] if (inherits(cond, "message")) { [18:03:15.617] muffled <- grepl(pattern, "muffleMessage") [18:03:15.617] if (muffled) [18:03:15.617] invokeRestart("muffleMessage") [18:03:15.617] } [18:03:15.617] else if (inherits(cond, "warning")) { [18:03:15.617] muffled <- grepl(pattern, "muffleWarning") [18:03:15.617] if (muffled) [18:03:15.617] invokeRestart("muffleWarning") [18:03:15.617] } [18:03:15.617] else if (inherits(cond, "condition")) { [18:03:15.617] if (!is.null(pattern)) { [18:03:15.617] computeRestarts <- base::computeRestarts [18:03:15.617] grepl <- base::grepl [18:03:15.617] restarts <- computeRestarts(cond) [18:03:15.617] for (restart in restarts) { [18:03:15.617] name <- restart$name [18:03:15.617] if (is.null(name)) [18:03:15.617] next [18:03:15.617] if (!grepl(pattern, name)) [18:03:15.617] next [18:03:15.617] invokeRestart(restart) [18:03:15.617] muffled <- TRUE [18:03:15.617] break [18:03:15.617] } [18:03:15.617] } [18:03:15.617] } [18:03:15.617] invisible(muffled) [18:03:15.617] } [18:03:15.617] muffleCondition(cond, pattern = "^muffle") [18:03:15.617] } [18:03:15.617] } [18:03:15.617] } [18:03:15.617] })) [18:03:15.617] }, error = function(ex) { [18:03:15.617] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.617] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.617] ...future.rng), started = ...future.startTime, [18:03:15.617] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.617] version = "1.8"), class = "FutureResult") [18:03:15.617] }, finally = { [18:03:15.617] if (!identical(...future.workdir, getwd())) [18:03:15.617] setwd(...future.workdir) [18:03:15.617] { [18:03:15.617] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.617] ...future.oldOptions$nwarnings <- NULL [18:03:15.617] } [18:03:15.617] base::options(...future.oldOptions) [18:03:15.617] if (.Platform$OS.type == "windows") { [18:03:15.617] old_names <- names(...future.oldEnvVars) [18:03:15.617] envs <- base::Sys.getenv() [18:03:15.617] names <- names(envs) [18:03:15.617] common <- intersect(names, old_names) [18:03:15.617] added <- setdiff(names, old_names) [18:03:15.617] removed <- setdiff(old_names, names) [18:03:15.617] changed <- common[...future.oldEnvVars[common] != [18:03:15.617] envs[common]] [18:03:15.617] NAMES <- toupper(changed) [18:03:15.617] args <- list() [18:03:15.617] for (kk in seq_along(NAMES)) { [18:03:15.617] name <- changed[[kk]] [18:03:15.617] NAME <- NAMES[[kk]] [18:03:15.617] if (name != NAME && is.element(NAME, old_names)) [18:03:15.617] next [18:03:15.617] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.617] } [18:03:15.617] NAMES <- toupper(added) [18:03:15.617] for (kk in seq_along(NAMES)) { [18:03:15.617] name <- added[[kk]] [18:03:15.617] NAME <- NAMES[[kk]] [18:03:15.617] if (name != NAME && is.element(NAME, old_names)) [18:03:15.617] next [18:03:15.617] args[[name]] <- "" [18:03:15.617] } [18:03:15.617] NAMES <- toupper(removed) [18:03:15.617] for (kk in seq_along(NAMES)) { [18:03:15.617] name <- removed[[kk]] [18:03:15.617] NAME <- NAMES[[kk]] [18:03:15.617] if (name != NAME && is.element(NAME, old_names)) [18:03:15.617] next [18:03:15.617] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.617] } [18:03:15.617] if (length(args) > 0) [18:03:15.617] base::do.call(base::Sys.setenv, args = args) [18:03:15.617] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.617] } [18:03:15.617] else { [18:03:15.617] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.617] } [18:03:15.617] { [18:03:15.617] if (base::length(...future.futureOptionsAdded) > [18:03:15.617] 0L) { [18:03:15.617] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.617] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.617] base::options(opts) [18:03:15.617] } [18:03:15.617] { [18:03:15.617] { [18:03:15.617] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.617] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.617] -1344458670L), envir = base::globalenv(), [18:03:15.617] inherits = FALSE) [18:03:15.617] NULL [18:03:15.617] } [18:03:15.617] options(future.plan = NULL) [18:03:15.617] if (is.na(NA_character_)) [18:03:15.617] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.617] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.617] future::plan(list(function (..., envir = parent.frame()) [18:03:15.617] { [18:03:15.617] future <- SequentialFuture(..., envir = envir) [18:03:15.617] if (!future$lazy) [18:03:15.617] future <- run(future) [18:03:15.617] invisible(future) [18:03:15.617] }), .cleanup = FALSE, .init = FALSE) [18:03:15.617] } [18:03:15.617] } [18:03:15.617] } [18:03:15.617] }) [18:03:15.617] if (TRUE) { [18:03:15.617] base::sink(type = "output", split = FALSE) [18:03:15.617] if (TRUE) { [18:03:15.617] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.617] } [18:03:15.617] else { [18:03:15.617] ...future.result["stdout"] <- base::list(NULL) [18:03:15.617] } [18:03:15.617] base::close(...future.stdout) [18:03:15.617] ...future.stdout <- NULL [18:03:15.617] } [18:03:15.617] ...future.result$conditions <- ...future.conditions [18:03:15.617] ...future.result$finished <- base::Sys.time() [18:03:15.617] ...future.result [18:03:15.617] } [18:03:15.621] assign_globals() ... [18:03:15.622] List of 1 [18:03:15.622] $ x: int [1:4] 0 1 2 3 [18:03:15.622] - attr(*, "where")=List of 1 [18:03:15.622] ..$ x: [18:03:15.622] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.622] - attr(*, "resolved")= logi FALSE [18:03:15.622] - attr(*, "total_size")= num 64 [18:03:15.622] - attr(*, "already-done")= logi TRUE [18:03:15.627] - copied 'x' to environment [18:03:15.628] assign_globals() ... done [18:03:15.628] plan(): Setting new future strategy stack: [18:03:15.628] List of future strategies: [18:03:15.628] 1. sequential: [18:03:15.628] - args: function (..., envir = parent.frame()) [18:03:15.628] - tweaked: FALSE [18:03:15.628] - call: NULL [18:03:15.629] plan(): nbrOfWorkers() = 1 [18:03:15.631] plan(): Setting new future strategy stack: [18:03:15.631] List of future strategies: [18:03:15.631] 1. sequential: [18:03:15.631] - args: function (..., envir = parent.frame()) [18:03:15.631] - tweaked: FALSE [18:03:15.631] - call: plan("sequential") [18:03:15.631] plan(): nbrOfWorkers() = 1 [18:03:15.632] SequentialFuture started (and completed) [18:03:15.632] - Launch lazy future ... done [18:03:15.632] run() for 'SequentialFuture' ... done [18:03:15.633] getGlobalsAndPackages() ... [18:03:15.633] Searching for globals... [18:03:15.634] - globals found: [3] '{', 'sample', 'x' [18:03:15.634] Searching for globals ... DONE [18:03:15.634] Resolving globals: FALSE [18:03:15.635] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.635] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.636] - globals: [1] 'x' [18:03:15.636] [18:03:15.636] getGlobalsAndPackages() ... DONE [18:03:15.636] run() for 'Future' ... [18:03:15.636] - state: 'created' [18:03:15.637] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.637] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.637] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.637] - Field: 'label' [18:03:15.638] - Field: 'local' [18:03:15.638] - Field: 'owner' [18:03:15.638] - Field: 'envir' [18:03:15.638] - Field: 'packages' [18:03:15.638] - Field: 'gc' [18:03:15.638] - Field: 'conditions' [18:03:15.639] - Field: 'expr' [18:03:15.639] - Field: 'uuid' [18:03:15.639] - Field: 'seed' [18:03:15.639] - Field: 'version' [18:03:15.639] - Field: 'result' [18:03:15.640] - Field: 'asynchronous' [18:03:15.640] - Field: 'calls' [18:03:15.640] - Field: 'globals' [18:03:15.640] - Field: 'stdout' [18:03:15.640] - Field: 'earlySignal' [18:03:15.640] - Field: 'lazy' [18:03:15.641] - Field: 'state' [18:03:15.641] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.641] - Launch lazy future ... [18:03:15.641] Packages needed by the future expression (n = 0): [18:03:15.641] Packages needed by future strategies (n = 0): [18:03:15.642] { [18:03:15.642] { [18:03:15.642] { [18:03:15.642] ...future.startTime <- base::Sys.time() [18:03:15.642] { [18:03:15.642] { [18:03:15.642] { [18:03:15.642] { [18:03:15.642] base::local({ [18:03:15.642] has_future <- base::requireNamespace("future", [18:03:15.642] quietly = TRUE) [18:03:15.642] if (has_future) { [18:03:15.642] ns <- base::getNamespace("future") [18:03:15.642] version <- ns[[".package"]][["version"]] [18:03:15.642] if (is.null(version)) [18:03:15.642] version <- utils::packageVersion("future") [18:03:15.642] } [18:03:15.642] else { [18:03:15.642] version <- NULL [18:03:15.642] } [18:03:15.642] if (!has_future || version < "1.8.0") { [18:03:15.642] info <- base::c(r_version = base::gsub("R version ", [18:03:15.642] "", base::R.version$version.string), [18:03:15.642] platform = base::sprintf("%s (%s-bit)", [18:03:15.642] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.642] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.642] "release", "version")], collapse = " "), [18:03:15.642] hostname = base::Sys.info()[["nodename"]]) [18:03:15.642] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.642] info) [18:03:15.642] info <- base::paste(info, collapse = "; ") [18:03:15.642] if (!has_future) { [18:03:15.642] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.642] info) [18:03:15.642] } [18:03:15.642] else { [18:03:15.642] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.642] info, version) [18:03:15.642] } [18:03:15.642] base::stop(msg) [18:03:15.642] } [18:03:15.642] }) [18:03:15.642] } [18:03:15.642] options(future.plan = NULL) [18:03:15.642] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.642] future::plan("default", .cleanup = FALSE, [18:03:15.642] .init = FALSE) [18:03:15.642] } [18:03:15.642] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:15.642] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:15.642] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:15.642] } [18:03:15.642] ...future.workdir <- getwd() [18:03:15.642] } [18:03:15.642] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.642] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.642] } [18:03:15.642] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.642] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.642] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.642] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.642] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.642] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.642] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.642] base::names(...future.oldOptions)) [18:03:15.642] } [18:03:15.642] if (FALSE) { [18:03:15.642] } [18:03:15.642] else { [18:03:15.642] if (TRUE) { [18:03:15.642] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.642] open = "w") [18:03:15.642] } [18:03:15.642] else { [18:03:15.642] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.642] windows = "NUL", "/dev/null"), open = "w") [18:03:15.642] } [18:03:15.642] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.642] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.642] base::sink(type = "output", split = FALSE) [18:03:15.642] base::close(...future.stdout) [18:03:15.642] }, add = TRUE) [18:03:15.642] } [18:03:15.642] ...future.frame <- base::sys.nframe() [18:03:15.642] ...future.conditions <- base::list() [18:03:15.642] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.642] if (FALSE) { [18:03:15.642] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.642] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.642] } [18:03:15.642] ...future.result <- base::tryCatch({ [18:03:15.642] base::withCallingHandlers({ [18:03:15.642] ...future.value <- base::withVisible(base::local({ [18:03:15.642] sample(x, size = 1L) [18:03:15.642] })) [18:03:15.642] future::FutureResult(value = ...future.value$value, [18:03:15.642] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.642] ...future.rng), globalenv = if (FALSE) [18:03:15.642] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.642] ...future.globalenv.names)) [18:03:15.642] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.642] }, condition = base::local({ [18:03:15.642] c <- base::c [18:03:15.642] inherits <- base::inherits [18:03:15.642] invokeRestart <- base::invokeRestart [18:03:15.642] length <- base::length [18:03:15.642] list <- base::list [18:03:15.642] seq.int <- base::seq.int [18:03:15.642] signalCondition <- base::signalCondition [18:03:15.642] sys.calls <- base::sys.calls [18:03:15.642] `[[` <- base::`[[` [18:03:15.642] `+` <- base::`+` [18:03:15.642] `<<-` <- base::`<<-` [18:03:15.642] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.642] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.642] 3L)] [18:03:15.642] } [18:03:15.642] function(cond) { [18:03:15.642] is_error <- inherits(cond, "error") [18:03:15.642] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.642] NULL) [18:03:15.642] if (is_error) { [18:03:15.642] sessionInformation <- function() { [18:03:15.642] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.642] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.642] search = base::search(), system = base::Sys.info()) [18:03:15.642] } [18:03:15.642] ...future.conditions[[length(...future.conditions) + [18:03:15.642] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.642] cond$call), session = sessionInformation(), [18:03:15.642] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.642] signalCondition(cond) [18:03:15.642] } [18:03:15.642] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.642] "immediateCondition"))) { [18:03:15.642] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.642] ...future.conditions[[length(...future.conditions) + [18:03:15.642] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.642] if (TRUE && !signal) { [18:03:15.642] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.642] { [18:03:15.642] inherits <- base::inherits [18:03:15.642] invokeRestart <- base::invokeRestart [18:03:15.642] is.null <- base::is.null [18:03:15.642] muffled <- FALSE [18:03:15.642] if (inherits(cond, "message")) { [18:03:15.642] muffled <- grepl(pattern, "muffleMessage") [18:03:15.642] if (muffled) [18:03:15.642] invokeRestart("muffleMessage") [18:03:15.642] } [18:03:15.642] else if (inherits(cond, "warning")) { [18:03:15.642] muffled <- grepl(pattern, "muffleWarning") [18:03:15.642] if (muffled) [18:03:15.642] invokeRestart("muffleWarning") [18:03:15.642] } [18:03:15.642] else if (inherits(cond, "condition")) { [18:03:15.642] if (!is.null(pattern)) { [18:03:15.642] computeRestarts <- base::computeRestarts [18:03:15.642] grepl <- base::grepl [18:03:15.642] restarts <- computeRestarts(cond) [18:03:15.642] for (restart in restarts) { [18:03:15.642] name <- restart$name [18:03:15.642] if (is.null(name)) [18:03:15.642] next [18:03:15.642] if (!grepl(pattern, name)) [18:03:15.642] next [18:03:15.642] invokeRestart(restart) [18:03:15.642] muffled <- TRUE [18:03:15.642] break [18:03:15.642] } [18:03:15.642] } [18:03:15.642] } [18:03:15.642] invisible(muffled) [18:03:15.642] } [18:03:15.642] muffleCondition(cond, pattern = "^muffle") [18:03:15.642] } [18:03:15.642] } [18:03:15.642] else { [18:03:15.642] if (TRUE) { [18:03:15.642] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.642] { [18:03:15.642] inherits <- base::inherits [18:03:15.642] invokeRestart <- base::invokeRestart [18:03:15.642] is.null <- base::is.null [18:03:15.642] muffled <- FALSE [18:03:15.642] if (inherits(cond, "message")) { [18:03:15.642] muffled <- grepl(pattern, "muffleMessage") [18:03:15.642] if (muffled) [18:03:15.642] invokeRestart("muffleMessage") [18:03:15.642] } [18:03:15.642] else if (inherits(cond, "warning")) { [18:03:15.642] muffled <- grepl(pattern, "muffleWarning") [18:03:15.642] if (muffled) [18:03:15.642] invokeRestart("muffleWarning") [18:03:15.642] } [18:03:15.642] else if (inherits(cond, "condition")) { [18:03:15.642] if (!is.null(pattern)) { [18:03:15.642] computeRestarts <- base::computeRestarts [18:03:15.642] grepl <- base::grepl [18:03:15.642] restarts <- computeRestarts(cond) [18:03:15.642] for (restart in restarts) { [18:03:15.642] name <- restart$name [18:03:15.642] if (is.null(name)) [18:03:15.642] next [18:03:15.642] if (!grepl(pattern, name)) [18:03:15.642] next [18:03:15.642] invokeRestart(restart) [18:03:15.642] muffled <- TRUE [18:03:15.642] break [18:03:15.642] } [18:03:15.642] } [18:03:15.642] } [18:03:15.642] invisible(muffled) [18:03:15.642] } [18:03:15.642] muffleCondition(cond, pattern = "^muffle") [18:03:15.642] } [18:03:15.642] } [18:03:15.642] } [18:03:15.642] })) [18:03:15.642] }, error = function(ex) { [18:03:15.642] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.642] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.642] ...future.rng), started = ...future.startTime, [18:03:15.642] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.642] version = "1.8"), class = "FutureResult") [18:03:15.642] }, finally = { [18:03:15.642] if (!identical(...future.workdir, getwd())) [18:03:15.642] setwd(...future.workdir) [18:03:15.642] { [18:03:15.642] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.642] ...future.oldOptions$nwarnings <- NULL [18:03:15.642] } [18:03:15.642] base::options(...future.oldOptions) [18:03:15.642] if (.Platform$OS.type == "windows") { [18:03:15.642] old_names <- names(...future.oldEnvVars) [18:03:15.642] envs <- base::Sys.getenv() [18:03:15.642] names <- names(envs) [18:03:15.642] common <- intersect(names, old_names) [18:03:15.642] added <- setdiff(names, old_names) [18:03:15.642] removed <- setdiff(old_names, names) [18:03:15.642] changed <- common[...future.oldEnvVars[common] != [18:03:15.642] envs[common]] [18:03:15.642] NAMES <- toupper(changed) [18:03:15.642] args <- list() [18:03:15.642] for (kk in seq_along(NAMES)) { [18:03:15.642] name <- changed[[kk]] [18:03:15.642] NAME <- NAMES[[kk]] [18:03:15.642] if (name != NAME && is.element(NAME, old_names)) [18:03:15.642] next [18:03:15.642] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.642] } [18:03:15.642] NAMES <- toupper(added) [18:03:15.642] for (kk in seq_along(NAMES)) { [18:03:15.642] name <- added[[kk]] [18:03:15.642] NAME <- NAMES[[kk]] [18:03:15.642] if (name != NAME && is.element(NAME, old_names)) [18:03:15.642] next [18:03:15.642] args[[name]] <- "" [18:03:15.642] } [18:03:15.642] NAMES <- toupper(removed) [18:03:15.642] for (kk in seq_along(NAMES)) { [18:03:15.642] name <- removed[[kk]] [18:03:15.642] NAME <- NAMES[[kk]] [18:03:15.642] if (name != NAME && is.element(NAME, old_names)) [18:03:15.642] next [18:03:15.642] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.642] } [18:03:15.642] if (length(args) > 0) [18:03:15.642] base::do.call(base::Sys.setenv, args = args) [18:03:15.642] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.642] } [18:03:15.642] else { [18:03:15.642] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.642] } [18:03:15.642] { [18:03:15.642] if (base::length(...future.futureOptionsAdded) > [18:03:15.642] 0L) { [18:03:15.642] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.642] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.642] base::options(opts) [18:03:15.642] } [18:03:15.642] { [18:03:15.642] { [18:03:15.642] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.642] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.642] -1344458670L), envir = base::globalenv(), [18:03:15.642] inherits = FALSE) [18:03:15.642] NULL [18:03:15.642] } [18:03:15.642] options(future.plan = NULL) [18:03:15.642] if (is.na(NA_character_)) [18:03:15.642] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.642] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.642] future::plan(list(function (..., envir = parent.frame()) [18:03:15.642] { [18:03:15.642] future <- SequentialFuture(..., envir = envir) [18:03:15.642] if (!future$lazy) [18:03:15.642] future <- run(future) [18:03:15.642] invisible(future) [18:03:15.642] }), .cleanup = FALSE, .init = FALSE) [18:03:15.642] } [18:03:15.642] } [18:03:15.642] } [18:03:15.642] }) [18:03:15.642] if (TRUE) { [18:03:15.642] base::sink(type = "output", split = FALSE) [18:03:15.642] if (TRUE) { [18:03:15.642] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.642] } [18:03:15.642] else { [18:03:15.642] ...future.result["stdout"] <- base::list(NULL) [18:03:15.642] } [18:03:15.642] base::close(...future.stdout) [18:03:15.642] ...future.stdout <- NULL [18:03:15.642] } [18:03:15.642] ...future.result$conditions <- ...future.conditions [18:03:15.642] ...future.result$finished <- base::Sys.time() [18:03:15.642] ...future.result [18:03:15.642] } [18:03:15.646] assign_globals() ... [18:03:15.646] List of 1 [18:03:15.646] $ x: int [1:4] 0 1 2 3 [18:03:15.646] - attr(*, "where")=List of 1 [18:03:15.646] ..$ x: [18:03:15.646] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.646] - attr(*, "resolved")= logi FALSE [18:03:15.646] - attr(*, "total_size")= num 64 [18:03:15.646] - attr(*, "already-done")= logi TRUE [18:03:15.649] - copied 'x' to environment [18:03:15.649] assign_globals() ... done [18:03:15.650] plan(): Setting new future strategy stack: [18:03:15.650] List of future strategies: [18:03:15.650] 1. sequential: [18:03:15.650] - args: function (..., envir = parent.frame()) [18:03:15.650] - tweaked: FALSE [18:03:15.650] - call: NULL [18:03:15.650] plan(): nbrOfWorkers() = 1 [18:03:15.651] plan(): Setting new future strategy stack: [18:03:15.652] List of future strategies: [18:03:15.652] 1. sequential: [18:03:15.652] - args: function (..., envir = parent.frame()) [18:03:15.652] - tweaked: FALSE [18:03:15.652] - call: plan("sequential") [18:03:15.652] plan(): nbrOfWorkers() = 1 [18:03:15.652] SequentialFuture started (and completed) [18:03:15.653] - Launch lazy future ... done [18:03:15.653] run() for 'SequentialFuture' ... done [18:03:15.653] getGlobalsAndPackages() ... [18:03:15.653] Searching for globals... [18:03:15.654] - globals found: [3] '{', 'sample', 'x' [18:03:15.654] Searching for globals ... DONE [18:03:15.655] Resolving globals: FALSE [18:03:15.655] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.657] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.657] - globals: [1] 'x' [18:03:15.657] [18:03:15.658] getGlobalsAndPackages() ... DONE [18:03:15.658] run() for 'Future' ... [18:03:15.658] - state: 'created' [18:03:15.658] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.659] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.659] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.659] - Field: 'label' [18:03:15.659] - Field: 'local' [18:03:15.659] - Field: 'owner' [18:03:15.660] - Field: 'envir' [18:03:15.660] - Field: 'packages' [18:03:15.660] - Field: 'gc' [18:03:15.660] - Field: 'conditions' [18:03:15.660] - Field: 'expr' [18:03:15.660] - Field: 'uuid' [18:03:15.661] - Field: 'seed' [18:03:15.661] - Field: 'version' [18:03:15.661] - Field: 'result' [18:03:15.661] - Field: 'asynchronous' [18:03:15.661] - Field: 'calls' [18:03:15.661] - Field: 'globals' [18:03:15.662] - Field: 'stdout' [18:03:15.662] - Field: 'earlySignal' [18:03:15.662] - Field: 'lazy' [18:03:15.662] - Field: 'state' [18:03:15.662] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.663] - Launch lazy future ... [18:03:15.663] Packages needed by the future expression (n = 0): [18:03:15.663] Packages needed by future strategies (n = 0): [18:03:15.663] { [18:03:15.663] { [18:03:15.663] { [18:03:15.663] ...future.startTime <- base::Sys.time() [18:03:15.663] { [18:03:15.663] { [18:03:15.663] { [18:03:15.663] { [18:03:15.663] base::local({ [18:03:15.663] has_future <- base::requireNamespace("future", [18:03:15.663] quietly = TRUE) [18:03:15.663] if (has_future) { [18:03:15.663] ns <- base::getNamespace("future") [18:03:15.663] version <- ns[[".package"]][["version"]] [18:03:15.663] if (is.null(version)) [18:03:15.663] version <- utils::packageVersion("future") [18:03:15.663] } [18:03:15.663] else { [18:03:15.663] version <- NULL [18:03:15.663] } [18:03:15.663] if (!has_future || version < "1.8.0") { [18:03:15.663] info <- base::c(r_version = base::gsub("R version ", [18:03:15.663] "", base::R.version$version.string), [18:03:15.663] platform = base::sprintf("%s (%s-bit)", [18:03:15.663] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.663] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.663] "release", "version")], collapse = " "), [18:03:15.663] hostname = base::Sys.info()[["nodename"]]) [18:03:15.663] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.663] info) [18:03:15.663] info <- base::paste(info, collapse = "; ") [18:03:15.663] if (!has_future) { [18:03:15.663] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.663] info) [18:03:15.663] } [18:03:15.663] else { [18:03:15.663] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.663] info, version) [18:03:15.663] } [18:03:15.663] base::stop(msg) [18:03:15.663] } [18:03:15.663] }) [18:03:15.663] } [18:03:15.663] options(future.plan = NULL) [18:03:15.663] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.663] future::plan("default", .cleanup = FALSE, [18:03:15.663] .init = FALSE) [18:03:15.663] } [18:03:15.663] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:15.663] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:15.663] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:15.663] } [18:03:15.663] ...future.workdir <- getwd() [18:03:15.663] } [18:03:15.663] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.663] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.663] } [18:03:15.663] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.663] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.663] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.663] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.663] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.663] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.663] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.663] base::names(...future.oldOptions)) [18:03:15.663] } [18:03:15.663] if (FALSE) { [18:03:15.663] } [18:03:15.663] else { [18:03:15.663] if (TRUE) { [18:03:15.663] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.663] open = "w") [18:03:15.663] } [18:03:15.663] else { [18:03:15.663] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.663] windows = "NUL", "/dev/null"), open = "w") [18:03:15.663] } [18:03:15.663] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.663] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.663] base::sink(type = "output", split = FALSE) [18:03:15.663] base::close(...future.stdout) [18:03:15.663] }, add = TRUE) [18:03:15.663] } [18:03:15.663] ...future.frame <- base::sys.nframe() [18:03:15.663] ...future.conditions <- base::list() [18:03:15.663] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.663] if (FALSE) { [18:03:15.663] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.663] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.663] } [18:03:15.663] ...future.result <- base::tryCatch({ [18:03:15.663] base::withCallingHandlers({ [18:03:15.663] ...future.value <- base::withVisible(base::local({ [18:03:15.663] sample(x, size = 1L) [18:03:15.663] })) [18:03:15.663] future::FutureResult(value = ...future.value$value, [18:03:15.663] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.663] ...future.rng), globalenv = if (FALSE) [18:03:15.663] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.663] ...future.globalenv.names)) [18:03:15.663] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.663] }, condition = base::local({ [18:03:15.663] c <- base::c [18:03:15.663] inherits <- base::inherits [18:03:15.663] invokeRestart <- base::invokeRestart [18:03:15.663] length <- base::length [18:03:15.663] list <- base::list [18:03:15.663] seq.int <- base::seq.int [18:03:15.663] signalCondition <- base::signalCondition [18:03:15.663] sys.calls <- base::sys.calls [18:03:15.663] `[[` <- base::`[[` [18:03:15.663] `+` <- base::`+` [18:03:15.663] `<<-` <- base::`<<-` [18:03:15.663] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.663] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.663] 3L)] [18:03:15.663] } [18:03:15.663] function(cond) { [18:03:15.663] is_error <- inherits(cond, "error") [18:03:15.663] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.663] NULL) [18:03:15.663] if (is_error) { [18:03:15.663] sessionInformation <- function() { [18:03:15.663] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.663] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.663] search = base::search(), system = base::Sys.info()) [18:03:15.663] } [18:03:15.663] ...future.conditions[[length(...future.conditions) + [18:03:15.663] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.663] cond$call), session = sessionInformation(), [18:03:15.663] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.663] signalCondition(cond) [18:03:15.663] } [18:03:15.663] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.663] "immediateCondition"))) { [18:03:15.663] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.663] ...future.conditions[[length(...future.conditions) + [18:03:15.663] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.663] if (TRUE && !signal) { [18:03:15.663] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.663] { [18:03:15.663] inherits <- base::inherits [18:03:15.663] invokeRestart <- base::invokeRestart [18:03:15.663] is.null <- base::is.null [18:03:15.663] muffled <- FALSE [18:03:15.663] if (inherits(cond, "message")) { [18:03:15.663] muffled <- grepl(pattern, "muffleMessage") [18:03:15.663] if (muffled) [18:03:15.663] invokeRestart("muffleMessage") [18:03:15.663] } [18:03:15.663] else if (inherits(cond, "warning")) { [18:03:15.663] muffled <- grepl(pattern, "muffleWarning") [18:03:15.663] if (muffled) [18:03:15.663] invokeRestart("muffleWarning") [18:03:15.663] } [18:03:15.663] else if (inherits(cond, "condition")) { [18:03:15.663] if (!is.null(pattern)) { [18:03:15.663] computeRestarts <- base::computeRestarts [18:03:15.663] grepl <- base::grepl [18:03:15.663] restarts <- computeRestarts(cond) [18:03:15.663] for (restart in restarts) { [18:03:15.663] name <- restart$name [18:03:15.663] if (is.null(name)) [18:03:15.663] next [18:03:15.663] if (!grepl(pattern, name)) [18:03:15.663] next [18:03:15.663] invokeRestart(restart) [18:03:15.663] muffled <- TRUE [18:03:15.663] break [18:03:15.663] } [18:03:15.663] } [18:03:15.663] } [18:03:15.663] invisible(muffled) [18:03:15.663] } [18:03:15.663] muffleCondition(cond, pattern = "^muffle") [18:03:15.663] } [18:03:15.663] } [18:03:15.663] else { [18:03:15.663] if (TRUE) { [18:03:15.663] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.663] { [18:03:15.663] inherits <- base::inherits [18:03:15.663] invokeRestart <- base::invokeRestart [18:03:15.663] is.null <- base::is.null [18:03:15.663] muffled <- FALSE [18:03:15.663] if (inherits(cond, "message")) { [18:03:15.663] muffled <- grepl(pattern, "muffleMessage") [18:03:15.663] if (muffled) [18:03:15.663] invokeRestart("muffleMessage") [18:03:15.663] } [18:03:15.663] else if (inherits(cond, "warning")) { [18:03:15.663] muffled <- grepl(pattern, "muffleWarning") [18:03:15.663] if (muffled) [18:03:15.663] invokeRestart("muffleWarning") [18:03:15.663] } [18:03:15.663] else if (inherits(cond, "condition")) { [18:03:15.663] if (!is.null(pattern)) { [18:03:15.663] computeRestarts <- base::computeRestarts [18:03:15.663] grepl <- base::grepl [18:03:15.663] restarts <- computeRestarts(cond) [18:03:15.663] for (restart in restarts) { [18:03:15.663] name <- restart$name [18:03:15.663] if (is.null(name)) [18:03:15.663] next [18:03:15.663] if (!grepl(pattern, name)) [18:03:15.663] next [18:03:15.663] invokeRestart(restart) [18:03:15.663] muffled <- TRUE [18:03:15.663] break [18:03:15.663] } [18:03:15.663] } [18:03:15.663] } [18:03:15.663] invisible(muffled) [18:03:15.663] } [18:03:15.663] muffleCondition(cond, pattern = "^muffle") [18:03:15.663] } [18:03:15.663] } [18:03:15.663] } [18:03:15.663] })) [18:03:15.663] }, error = function(ex) { [18:03:15.663] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.663] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.663] ...future.rng), started = ...future.startTime, [18:03:15.663] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.663] version = "1.8"), class = "FutureResult") [18:03:15.663] }, finally = { [18:03:15.663] if (!identical(...future.workdir, getwd())) [18:03:15.663] setwd(...future.workdir) [18:03:15.663] { [18:03:15.663] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.663] ...future.oldOptions$nwarnings <- NULL [18:03:15.663] } [18:03:15.663] base::options(...future.oldOptions) [18:03:15.663] if (.Platform$OS.type == "windows") { [18:03:15.663] old_names <- names(...future.oldEnvVars) [18:03:15.663] envs <- base::Sys.getenv() [18:03:15.663] names <- names(envs) [18:03:15.663] common <- intersect(names, old_names) [18:03:15.663] added <- setdiff(names, old_names) [18:03:15.663] removed <- setdiff(old_names, names) [18:03:15.663] changed <- common[...future.oldEnvVars[common] != [18:03:15.663] envs[common]] [18:03:15.663] NAMES <- toupper(changed) [18:03:15.663] args <- list() [18:03:15.663] for (kk in seq_along(NAMES)) { [18:03:15.663] name <- changed[[kk]] [18:03:15.663] NAME <- NAMES[[kk]] [18:03:15.663] if (name != NAME && is.element(NAME, old_names)) [18:03:15.663] next [18:03:15.663] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.663] } [18:03:15.663] NAMES <- toupper(added) [18:03:15.663] for (kk in seq_along(NAMES)) { [18:03:15.663] name <- added[[kk]] [18:03:15.663] NAME <- NAMES[[kk]] [18:03:15.663] if (name != NAME && is.element(NAME, old_names)) [18:03:15.663] next [18:03:15.663] args[[name]] <- "" [18:03:15.663] } [18:03:15.663] NAMES <- toupper(removed) [18:03:15.663] for (kk in seq_along(NAMES)) { [18:03:15.663] name <- removed[[kk]] [18:03:15.663] NAME <- NAMES[[kk]] [18:03:15.663] if (name != NAME && is.element(NAME, old_names)) [18:03:15.663] next [18:03:15.663] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.663] } [18:03:15.663] if (length(args) > 0) [18:03:15.663] base::do.call(base::Sys.setenv, args = args) [18:03:15.663] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.663] } [18:03:15.663] else { [18:03:15.663] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.663] } [18:03:15.663] { [18:03:15.663] if (base::length(...future.futureOptionsAdded) > [18:03:15.663] 0L) { [18:03:15.663] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.663] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.663] base::options(opts) [18:03:15.663] } [18:03:15.663] { [18:03:15.663] { [18:03:15.663] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.663] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.663] -1344458670L), envir = base::globalenv(), [18:03:15.663] inherits = FALSE) [18:03:15.663] NULL [18:03:15.663] } [18:03:15.663] options(future.plan = NULL) [18:03:15.663] if (is.na(NA_character_)) [18:03:15.663] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.663] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.663] future::plan(list(function (..., envir = parent.frame()) [18:03:15.663] { [18:03:15.663] future <- SequentialFuture(..., envir = envir) [18:03:15.663] if (!future$lazy) [18:03:15.663] future <- run(future) [18:03:15.663] invisible(future) [18:03:15.663] }), .cleanup = FALSE, .init = FALSE) [18:03:15.663] } [18:03:15.663] } [18:03:15.663] } [18:03:15.663] }) [18:03:15.663] if (TRUE) { [18:03:15.663] base::sink(type = "output", split = FALSE) [18:03:15.663] if (TRUE) { [18:03:15.663] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.663] } [18:03:15.663] else { [18:03:15.663] ...future.result["stdout"] <- base::list(NULL) [18:03:15.663] } [18:03:15.663] base::close(...future.stdout) [18:03:15.663] ...future.stdout <- NULL [18:03:15.663] } [18:03:15.663] ...future.result$conditions <- ...future.conditions [18:03:15.663] ...future.result$finished <- base::Sys.time() [18:03:15.663] ...future.result [18:03:15.663] } [18:03:15.667] assign_globals() ... [18:03:15.668] List of 1 [18:03:15.668] $ x: int [1:4] 0 1 2 3 [18:03:15.668] - attr(*, "where")=List of 1 [18:03:15.668] ..$ x: [18:03:15.668] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.668] - attr(*, "resolved")= logi FALSE [18:03:15.668] - attr(*, "total_size")= num 64 [18:03:15.668] - attr(*, "already-done")= logi TRUE [18:03:15.670] - copied 'x' to environment [18:03:15.671] assign_globals() ... done [18:03:15.671] plan(): Setting new future strategy stack: [18:03:15.671] List of future strategies: [18:03:15.671] 1. sequential: [18:03:15.671] - args: function (..., envir = parent.frame()) [18:03:15.671] - tweaked: FALSE [18:03:15.671] - call: NULL [18:03:15.672] plan(): nbrOfWorkers() = 1 [18:03:15.673] plan(): Setting new future strategy stack: [18:03:15.673] List of future strategies: [18:03:15.673] 1. sequential: [18:03:15.673] - args: function (..., envir = parent.frame()) [18:03:15.673] - tweaked: FALSE [18:03:15.673] - call: plan("sequential") [18:03:15.673] plan(): nbrOfWorkers() = 1 [18:03:15.674] SequentialFuture started (and completed) [18:03:15.674] - Launch lazy future ... done [18:03:15.674] run() for 'SequentialFuture' ... done [18:03:15.674] getGlobalsAndPackages() ... [18:03:15.674] Searching for globals... [18:03:15.676] - globals found: [3] '{', 'sample', 'x' [18:03:15.676] Searching for globals ... DONE [18:03:15.676] Resolving globals: FALSE [18:03:15.676] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.677] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.677] - globals: [1] 'x' [18:03:15.677] [18:03:15.677] getGlobalsAndPackages() ... DONE [18:03:15.678] run() for 'Future' ... [18:03:15.678] - state: 'created' [18:03:15.678] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.678] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.679] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.679] - Field: 'label' [18:03:15.679] - Field: 'local' [18:03:15.679] - Field: 'owner' [18:03:15.679] - Field: 'envir' [18:03:15.679] - Field: 'packages' [18:03:15.680] - Field: 'gc' [18:03:15.680] - Field: 'conditions' [18:03:15.680] - Field: 'expr' [18:03:15.680] - Field: 'uuid' [18:03:15.680] - Field: 'seed' [18:03:15.681] - Field: 'version' [18:03:15.681] - Field: 'result' [18:03:15.681] - Field: 'asynchronous' [18:03:15.681] - Field: 'calls' [18:03:15.681] - Field: 'globals' [18:03:15.681] - Field: 'stdout' [18:03:15.682] - Field: 'earlySignal' [18:03:15.682] - Field: 'lazy' [18:03:15.682] - Field: 'state' [18:03:15.682] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.682] - Launch lazy future ... [18:03:15.683] Packages needed by the future expression (n = 0): [18:03:15.683] Packages needed by future strategies (n = 0): [18:03:15.683] { [18:03:15.683] { [18:03:15.683] { [18:03:15.683] ...future.startTime <- base::Sys.time() [18:03:15.683] { [18:03:15.683] { [18:03:15.683] { [18:03:15.683] { [18:03:15.683] base::local({ [18:03:15.683] has_future <- base::requireNamespace("future", [18:03:15.683] quietly = TRUE) [18:03:15.683] if (has_future) { [18:03:15.683] ns <- base::getNamespace("future") [18:03:15.683] version <- ns[[".package"]][["version"]] [18:03:15.683] if (is.null(version)) [18:03:15.683] version <- utils::packageVersion("future") [18:03:15.683] } [18:03:15.683] else { [18:03:15.683] version <- NULL [18:03:15.683] } [18:03:15.683] if (!has_future || version < "1.8.0") { [18:03:15.683] info <- base::c(r_version = base::gsub("R version ", [18:03:15.683] "", base::R.version$version.string), [18:03:15.683] platform = base::sprintf("%s (%s-bit)", [18:03:15.683] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.683] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.683] "release", "version")], collapse = " "), [18:03:15.683] hostname = base::Sys.info()[["nodename"]]) [18:03:15.683] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.683] info) [18:03:15.683] info <- base::paste(info, collapse = "; ") [18:03:15.683] if (!has_future) { [18:03:15.683] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.683] info) [18:03:15.683] } [18:03:15.683] else { [18:03:15.683] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.683] info, version) [18:03:15.683] } [18:03:15.683] base::stop(msg) [18:03:15.683] } [18:03:15.683] }) [18:03:15.683] } [18:03:15.683] options(future.plan = NULL) [18:03:15.683] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.683] future::plan("default", .cleanup = FALSE, [18:03:15.683] .init = FALSE) [18:03:15.683] } [18:03:15.683] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:15.683] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:15.683] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:15.683] } [18:03:15.683] ...future.workdir <- getwd() [18:03:15.683] } [18:03:15.683] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.683] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.683] } [18:03:15.683] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.683] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.683] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.683] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.683] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.683] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.683] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.683] base::names(...future.oldOptions)) [18:03:15.683] } [18:03:15.683] if (FALSE) { [18:03:15.683] } [18:03:15.683] else { [18:03:15.683] if (TRUE) { [18:03:15.683] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.683] open = "w") [18:03:15.683] } [18:03:15.683] else { [18:03:15.683] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.683] windows = "NUL", "/dev/null"), open = "w") [18:03:15.683] } [18:03:15.683] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.683] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.683] base::sink(type = "output", split = FALSE) [18:03:15.683] base::close(...future.stdout) [18:03:15.683] }, add = TRUE) [18:03:15.683] } [18:03:15.683] ...future.frame <- base::sys.nframe() [18:03:15.683] ...future.conditions <- base::list() [18:03:15.683] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.683] if (FALSE) { [18:03:15.683] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.683] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.683] } [18:03:15.683] ...future.result <- base::tryCatch({ [18:03:15.683] base::withCallingHandlers({ [18:03:15.683] ...future.value <- base::withVisible(base::local({ [18:03:15.683] sample(x, size = 1L) [18:03:15.683] })) [18:03:15.683] future::FutureResult(value = ...future.value$value, [18:03:15.683] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.683] ...future.rng), globalenv = if (FALSE) [18:03:15.683] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.683] ...future.globalenv.names)) [18:03:15.683] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.683] }, condition = base::local({ [18:03:15.683] c <- base::c [18:03:15.683] inherits <- base::inherits [18:03:15.683] invokeRestart <- base::invokeRestart [18:03:15.683] length <- base::length [18:03:15.683] list <- base::list [18:03:15.683] seq.int <- base::seq.int [18:03:15.683] signalCondition <- base::signalCondition [18:03:15.683] sys.calls <- base::sys.calls [18:03:15.683] `[[` <- base::`[[` [18:03:15.683] `+` <- base::`+` [18:03:15.683] `<<-` <- base::`<<-` [18:03:15.683] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.683] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.683] 3L)] [18:03:15.683] } [18:03:15.683] function(cond) { [18:03:15.683] is_error <- inherits(cond, "error") [18:03:15.683] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.683] NULL) [18:03:15.683] if (is_error) { [18:03:15.683] sessionInformation <- function() { [18:03:15.683] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.683] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.683] search = base::search(), system = base::Sys.info()) [18:03:15.683] } [18:03:15.683] ...future.conditions[[length(...future.conditions) + [18:03:15.683] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.683] cond$call), session = sessionInformation(), [18:03:15.683] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.683] signalCondition(cond) [18:03:15.683] } [18:03:15.683] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.683] "immediateCondition"))) { [18:03:15.683] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.683] ...future.conditions[[length(...future.conditions) + [18:03:15.683] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.683] if (TRUE && !signal) { [18:03:15.683] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.683] { [18:03:15.683] inherits <- base::inherits [18:03:15.683] invokeRestart <- base::invokeRestart [18:03:15.683] is.null <- base::is.null [18:03:15.683] muffled <- FALSE [18:03:15.683] if (inherits(cond, "message")) { [18:03:15.683] muffled <- grepl(pattern, "muffleMessage") [18:03:15.683] if (muffled) [18:03:15.683] invokeRestart("muffleMessage") [18:03:15.683] } [18:03:15.683] else if (inherits(cond, "warning")) { [18:03:15.683] muffled <- grepl(pattern, "muffleWarning") [18:03:15.683] if (muffled) [18:03:15.683] invokeRestart("muffleWarning") [18:03:15.683] } [18:03:15.683] else if (inherits(cond, "condition")) { [18:03:15.683] if (!is.null(pattern)) { [18:03:15.683] computeRestarts <- base::computeRestarts [18:03:15.683] grepl <- base::grepl [18:03:15.683] restarts <- computeRestarts(cond) [18:03:15.683] for (restart in restarts) { [18:03:15.683] name <- restart$name [18:03:15.683] if (is.null(name)) [18:03:15.683] next [18:03:15.683] if (!grepl(pattern, name)) [18:03:15.683] next [18:03:15.683] invokeRestart(restart) [18:03:15.683] muffled <- TRUE [18:03:15.683] break [18:03:15.683] } [18:03:15.683] } [18:03:15.683] } [18:03:15.683] invisible(muffled) [18:03:15.683] } [18:03:15.683] muffleCondition(cond, pattern = "^muffle") [18:03:15.683] } [18:03:15.683] } [18:03:15.683] else { [18:03:15.683] if (TRUE) { [18:03:15.683] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.683] { [18:03:15.683] inherits <- base::inherits [18:03:15.683] invokeRestart <- base::invokeRestart [18:03:15.683] is.null <- base::is.null [18:03:15.683] muffled <- FALSE [18:03:15.683] if (inherits(cond, "message")) { [18:03:15.683] muffled <- grepl(pattern, "muffleMessage") [18:03:15.683] if (muffled) [18:03:15.683] invokeRestart("muffleMessage") [18:03:15.683] } [18:03:15.683] else if (inherits(cond, "warning")) { [18:03:15.683] muffled <- grepl(pattern, "muffleWarning") [18:03:15.683] if (muffled) [18:03:15.683] invokeRestart("muffleWarning") [18:03:15.683] } [18:03:15.683] else if (inherits(cond, "condition")) { [18:03:15.683] if (!is.null(pattern)) { [18:03:15.683] computeRestarts <- base::computeRestarts [18:03:15.683] grepl <- base::grepl [18:03:15.683] restarts <- computeRestarts(cond) [18:03:15.683] for (restart in restarts) { [18:03:15.683] name <- restart$name [18:03:15.683] if (is.null(name)) [18:03:15.683] next [18:03:15.683] if (!grepl(pattern, name)) [18:03:15.683] next [18:03:15.683] invokeRestart(restart) [18:03:15.683] muffled <- TRUE [18:03:15.683] break [18:03:15.683] } [18:03:15.683] } [18:03:15.683] } [18:03:15.683] invisible(muffled) [18:03:15.683] } [18:03:15.683] muffleCondition(cond, pattern = "^muffle") [18:03:15.683] } [18:03:15.683] } [18:03:15.683] } [18:03:15.683] })) [18:03:15.683] }, error = function(ex) { [18:03:15.683] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.683] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.683] ...future.rng), started = ...future.startTime, [18:03:15.683] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.683] version = "1.8"), class = "FutureResult") [18:03:15.683] }, finally = { [18:03:15.683] if (!identical(...future.workdir, getwd())) [18:03:15.683] setwd(...future.workdir) [18:03:15.683] { [18:03:15.683] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.683] ...future.oldOptions$nwarnings <- NULL [18:03:15.683] } [18:03:15.683] base::options(...future.oldOptions) [18:03:15.683] if (.Platform$OS.type == "windows") { [18:03:15.683] old_names <- names(...future.oldEnvVars) [18:03:15.683] envs <- base::Sys.getenv() [18:03:15.683] names <- names(envs) [18:03:15.683] common <- intersect(names, old_names) [18:03:15.683] added <- setdiff(names, old_names) [18:03:15.683] removed <- setdiff(old_names, names) [18:03:15.683] changed <- common[...future.oldEnvVars[common] != [18:03:15.683] envs[common]] [18:03:15.683] NAMES <- toupper(changed) [18:03:15.683] args <- list() [18:03:15.683] for (kk in seq_along(NAMES)) { [18:03:15.683] name <- changed[[kk]] [18:03:15.683] NAME <- NAMES[[kk]] [18:03:15.683] if (name != NAME && is.element(NAME, old_names)) [18:03:15.683] next [18:03:15.683] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.683] } [18:03:15.683] NAMES <- toupper(added) [18:03:15.683] for (kk in seq_along(NAMES)) { [18:03:15.683] name <- added[[kk]] [18:03:15.683] NAME <- NAMES[[kk]] [18:03:15.683] if (name != NAME && is.element(NAME, old_names)) [18:03:15.683] next [18:03:15.683] args[[name]] <- "" [18:03:15.683] } [18:03:15.683] NAMES <- toupper(removed) [18:03:15.683] for (kk in seq_along(NAMES)) { [18:03:15.683] name <- removed[[kk]] [18:03:15.683] NAME <- NAMES[[kk]] [18:03:15.683] if (name != NAME && is.element(NAME, old_names)) [18:03:15.683] next [18:03:15.683] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.683] } [18:03:15.683] if (length(args) > 0) [18:03:15.683] base::do.call(base::Sys.setenv, args = args) [18:03:15.683] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.683] } [18:03:15.683] else { [18:03:15.683] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.683] } [18:03:15.683] { [18:03:15.683] if (base::length(...future.futureOptionsAdded) > [18:03:15.683] 0L) { [18:03:15.683] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.683] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.683] base::options(opts) [18:03:15.683] } [18:03:15.683] { [18:03:15.683] { [18:03:15.683] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.683] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.683] -1344458670L), envir = base::globalenv(), [18:03:15.683] inherits = FALSE) [18:03:15.683] NULL [18:03:15.683] } [18:03:15.683] options(future.plan = NULL) [18:03:15.683] if (is.na(NA_character_)) [18:03:15.683] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.683] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.683] future::plan(list(function (..., envir = parent.frame()) [18:03:15.683] { [18:03:15.683] future <- SequentialFuture(..., envir = envir) [18:03:15.683] if (!future$lazy) [18:03:15.683] future <- run(future) [18:03:15.683] invisible(future) [18:03:15.683] }), .cleanup = FALSE, .init = FALSE) [18:03:15.683] } [18:03:15.683] } [18:03:15.683] } [18:03:15.683] }) [18:03:15.683] if (TRUE) { [18:03:15.683] base::sink(type = "output", split = FALSE) [18:03:15.683] if (TRUE) { [18:03:15.683] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.683] } [18:03:15.683] else { [18:03:15.683] ...future.result["stdout"] <- base::list(NULL) [18:03:15.683] } [18:03:15.683] base::close(...future.stdout) [18:03:15.683] ...future.stdout <- NULL [18:03:15.683] } [18:03:15.683] ...future.result$conditions <- ...future.conditions [18:03:15.683] ...future.result$finished <- base::Sys.time() [18:03:15.683] ...future.result [18:03:15.683] } [18:03:15.687] assign_globals() ... [18:03:15.687] List of 1 [18:03:15.687] $ x: int [1:4] 0 1 2 3 [18:03:15.687] - attr(*, "where")=List of 1 [18:03:15.687] ..$ x: [18:03:15.687] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.687] - attr(*, "resolved")= logi FALSE [18:03:15.687] - attr(*, "total_size")= num 64 [18:03:15.687] - attr(*, "already-done")= logi TRUE [18:03:15.690] - copied 'x' to environment [18:03:15.690] assign_globals() ... done [18:03:15.691] plan(): Setting new future strategy stack: [18:03:15.691] List of future strategies: [18:03:15.691] 1. sequential: [18:03:15.691] - args: function (..., envir = parent.frame()) [18:03:15.691] - tweaked: FALSE [18:03:15.691] - call: NULL [18:03:15.691] plan(): nbrOfWorkers() = 1 [18:03:15.692] plan(): Setting new future strategy stack: [18:03:15.693] List of future strategies: [18:03:15.693] 1. sequential: [18:03:15.693] - args: function (..., envir = parent.frame()) [18:03:15.693] - tweaked: FALSE [18:03:15.693] - call: plan("sequential") [18:03:15.693] plan(): nbrOfWorkers() = 1 [18:03:15.693] SequentialFuture started (and completed) [18:03:15.693] - Launch lazy future ... done [18:03:15.694] run() for 'SequentialFuture' ... done [18:03:15.694] resolve() on list ... [18:03:15.694] recursive: 0 [18:03:15.695] length: 4 [18:03:15.695] [18:03:15.695] resolved() for 'SequentialFuture' ... [18:03:15.695] - state: 'finished' [18:03:15.696] - run: TRUE [18:03:15.696] - result: 'FutureResult' [18:03:15.696] resolved() for 'SequentialFuture' ... done [18:03:15.696] Future #1 [18:03:15.697] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:15.697] - nx: 4 [18:03:15.697] - relay: TRUE [18:03:15.697] - stdout: TRUE [18:03:15.697] - signal: TRUE [18:03:15.698] - resignal: FALSE [18:03:15.698] - force: TRUE [18:03:15.698] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:15.698] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:15.698] - until=1 [18:03:15.698] - relaying element #1 [18:03:15.699] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.699] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.699] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:03:15.699] length: 3 (resolved future 1) [18:03:15.700] resolved() for 'SequentialFuture' ... [18:03:15.701] - state: 'finished' [18:03:15.701] - run: TRUE [18:03:15.701] - result: 'FutureResult' [18:03:15.701] resolved() for 'SequentialFuture' ... done [18:03:15.701] Future #2 [18:03:15.702] signalConditionsASAP(SequentialFuture, pos=2) ... [18:03:15.702] - nx: 4 [18:03:15.702] - relay: TRUE [18:03:15.702] - stdout: TRUE [18:03:15.702] - signal: TRUE [18:03:15.702] - resignal: FALSE [18:03:15.702] - force: TRUE [18:03:15.703] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.703] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.703] - until=2 [18:03:15.703] - relaying element #2 [18:03:15.703] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.704] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.704] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:03:15.704] length: 2 (resolved future 2) [18:03:15.704] resolved() for 'SequentialFuture' ... [18:03:15.704] - state: 'finished' [18:03:15.704] - run: TRUE [18:03:15.705] - result: 'FutureResult' [18:03:15.705] resolved() for 'SequentialFuture' ... done [18:03:15.705] Future #3 [18:03:15.705] signalConditionsASAP(SequentialFuture, pos=3) ... [18:03:15.706] - nx: 4 [18:03:15.706] - relay: TRUE [18:03:15.706] - stdout: TRUE [18:03:15.706] - signal: TRUE [18:03:15.706] - resignal: FALSE [18:03:15.706] - force: TRUE [18:03:15.706] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.707] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.707] - until=3 [18:03:15.707] - relaying element #3 [18:03:15.707] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.707] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.708] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:03:15.708] length: 1 (resolved future 3) [18:03:15.708] resolved() for 'SequentialFuture' ... [18:03:15.708] - state: 'finished' [18:03:15.708] - run: TRUE [18:03:15.708] - result: 'FutureResult' [18:03:15.709] resolved() for 'SequentialFuture' ... done [18:03:15.709] Future #4 [18:03:15.709] signalConditionsASAP(SequentialFuture, pos=4) ... [18:03:15.709] - nx: 4 [18:03:15.709] - relay: TRUE [18:03:15.709] - stdout: TRUE [18:03:15.710] - signal: TRUE [18:03:15.710] - resignal: FALSE [18:03:15.710] - force: TRUE [18:03:15.710] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.710] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.710] - until=4 [18:03:15.711] - relaying element #4 [18:03:15.711] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.711] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.711] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:03:15.711] length: 0 (resolved future 4) [18:03:15.711] Relaying remaining futures [18:03:15.712] signalConditionsASAP(NULL, pos=0) ... [18:03:15.712] - nx: 4 [18:03:15.712] - relay: TRUE [18:03:15.712] - stdout: TRUE [18:03:15.712] - signal: TRUE [18:03:15.712] - resignal: FALSE [18:03:15.713] - force: TRUE [18:03:15.713] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.713] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:15.713] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.713] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.713] signalConditionsASAP(NULL, pos=0) ... done [18:03:15.714] resolve() on list ... DONE > > ## Assert that random seed is reset > stopifnot( + identical(.GlobalEnv$.Random.seed, seed0), + identical(RNGkind(), okind) + ) > > > for (cores in 1:availCores) { + ## Speed up CRAN checks: Skip on CRAN Windows 32-bit + if (!fullTest && isWin32) next + + message(sprintf("Testing with %d cores ...", cores)) + options(mc.cores = cores) + + for (strategy in supportedStrategies(cores)) { + message(sprintf("%s ...", strategy)) + + plan(strategy) + + for (what in c("future", "%<-%")) { + .GlobalEnv$.Random.seed <- seed0 + + ## Fixed random seed + y1 <- fsample(0:3, seed = 42L, what = what) + print(y1) + stopifnot(identical(y1, y0)) + + ## Assert that random seed is reset + stopifnot( + identical(.GlobalEnv$.Random.seed, seed0), + identical(RNGkind(), okind) + ) + + ## Fixed random seed + y2 <- fsample(0:3, seed = 42L, what = what) + print(y2) + stopifnot(identical(y2, y1)) + stopifnot(identical(y2, y0)) + + ## Assert that random seed is reset + stopifnot( + identical(.GlobalEnv$.Random.seed, seed0), + identical(RNGkind(), okind) + ) + + ## No seed + for (misuse in c("ignore", "warning", "error")) { + options(future.rng.onMisuse = misuse) + + y3 <- tryCatch({ + ## WORKAROUND: fsample() triggers a R_FUTURE_GLOBALS_ONREFERENCE + ## warning. Not sure why. /HB 2019-12-27 + ovalue <- Sys.getenv("R_FUTURE_GLOBALS_ONREFERENCE") + on.exit(Sys.setenv("R_FUTURE_GLOBALS_ONREFERENCE" = ovalue)) + Sys.setenv("R_FUTURE_GLOBALS_ONREFERENCE" = "ignore") + + fsample(0:3, what = what, seed = FALSE) + }, warning = identity, error = identity) + print(y3) + if (misuse %in% c("warning", "error")) { + stopifnot( + inherits(y3, misuse), + inherits(y3, "RngFutureCondition"), + inherits(y3, switch(misuse, + warning = "RngFutureWarning", + error = "RngFutureError" + )) + ) + } + + ## seed = NULL equals seed = FALSE but without the check of misuse + y4 <- fsample(0:3, what = what, seed = NULL) + print(y4) + } + + options(future.rng.onMisuse = "ignore") + } + + message(sprintf("%s ... done", strategy)) + } + + message(sprintf("Testing with %d cores ... DONE", cores)) + } ## for (cores ...) Testing with 1 cores ... sequential ... [18:03:15.748] plan(): Setting new future strategy stack: [18:03:15.748] List of future strategies: [18:03:15.748] 1. sequential: [18:03:15.748] - args: function (..., envir = parent.frame()) [18:03:15.748] - tweaked: FALSE [18:03:15.748] - call: plan(strategy) [18:03:15.748] plan(): nbrOfWorkers() = 1 [18:03:15.748] getGlobalsAndPackages() ... [18:03:15.749] Searching for globals... [18:03:15.750] - globals found: [3] '{', 'sample', 'x' [18:03:15.750] Searching for globals ... DONE [18:03:15.750] Resolving globals: FALSE [18:03:15.751] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.751] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.751] - globals: [1] 'x' [18:03:15.751] [18:03:15.752] getGlobalsAndPackages() ... DONE [18:03:15.752] run() for 'Future' ... [18:03:15.752] - state: 'created' [18:03:15.752] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.753] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.753] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.753] - Field: 'label' [18:03:15.753] - Field: 'local' [18:03:15.754] - Field: 'owner' [18:03:15.754] - Field: 'envir' [18:03:15.754] - Field: 'packages' [18:03:15.754] - Field: 'gc' [18:03:15.754] - Field: 'conditions' [18:03:15.754] - Field: 'expr' [18:03:15.755] - Field: 'uuid' [18:03:15.755] - Field: 'seed' [18:03:15.755] - Field: 'version' [18:03:15.755] - Field: 'result' [18:03:15.755] - Field: 'asynchronous' [18:03:15.755] - Field: 'calls' [18:03:15.756] - Field: 'globals' [18:03:15.756] - Field: 'stdout' [18:03:15.756] - Field: 'earlySignal' [18:03:15.756] - Field: 'lazy' [18:03:15.756] - Field: 'state' [18:03:15.756] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.757] - Launch lazy future ... [18:03:15.757] Packages needed by the future expression (n = 0): [18:03:15.757] Packages needed by future strategies (n = 0): [18:03:15.758] { [18:03:15.758] { [18:03:15.758] { [18:03:15.758] ...future.startTime <- base::Sys.time() [18:03:15.758] { [18:03:15.758] { [18:03:15.758] { [18:03:15.758] { [18:03:15.758] base::local({ [18:03:15.758] has_future <- base::requireNamespace("future", [18:03:15.758] quietly = TRUE) [18:03:15.758] if (has_future) { [18:03:15.758] ns <- base::getNamespace("future") [18:03:15.758] version <- ns[[".package"]][["version"]] [18:03:15.758] if (is.null(version)) [18:03:15.758] version <- utils::packageVersion("future") [18:03:15.758] } [18:03:15.758] else { [18:03:15.758] version <- NULL [18:03:15.758] } [18:03:15.758] if (!has_future || version < "1.8.0") { [18:03:15.758] info <- base::c(r_version = base::gsub("R version ", [18:03:15.758] "", base::R.version$version.string), [18:03:15.758] platform = base::sprintf("%s (%s-bit)", [18:03:15.758] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.758] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.758] "release", "version")], collapse = " "), [18:03:15.758] hostname = base::Sys.info()[["nodename"]]) [18:03:15.758] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.758] info) [18:03:15.758] info <- base::paste(info, collapse = "; ") [18:03:15.758] if (!has_future) { [18:03:15.758] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.758] info) [18:03:15.758] } [18:03:15.758] else { [18:03:15.758] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.758] info, version) [18:03:15.758] } [18:03:15.758] base::stop(msg) [18:03:15.758] } [18:03:15.758] }) [18:03:15.758] } [18:03:15.758] options(future.plan = NULL) [18:03:15.758] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.758] future::plan("default", .cleanup = FALSE, [18:03:15.758] .init = FALSE) [18:03:15.758] } [18:03:15.758] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:15.758] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:15.758] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:15.758] } [18:03:15.758] ...future.workdir <- getwd() [18:03:15.758] } [18:03:15.758] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.758] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.758] } [18:03:15.758] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.758] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.758] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.758] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.758] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.758] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.758] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.758] base::names(...future.oldOptions)) [18:03:15.758] } [18:03:15.758] if (FALSE) { [18:03:15.758] } [18:03:15.758] else { [18:03:15.758] if (TRUE) { [18:03:15.758] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.758] open = "w") [18:03:15.758] } [18:03:15.758] else { [18:03:15.758] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.758] windows = "NUL", "/dev/null"), open = "w") [18:03:15.758] } [18:03:15.758] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.758] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.758] base::sink(type = "output", split = FALSE) [18:03:15.758] base::close(...future.stdout) [18:03:15.758] }, add = TRUE) [18:03:15.758] } [18:03:15.758] ...future.frame <- base::sys.nframe() [18:03:15.758] ...future.conditions <- base::list() [18:03:15.758] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.758] if (FALSE) { [18:03:15.758] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.758] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.758] } [18:03:15.758] ...future.result <- base::tryCatch({ [18:03:15.758] base::withCallingHandlers({ [18:03:15.758] ...future.value <- base::withVisible(base::local({ [18:03:15.758] sample(x, size = 1L) [18:03:15.758] })) [18:03:15.758] future::FutureResult(value = ...future.value$value, [18:03:15.758] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.758] ...future.rng), globalenv = if (FALSE) [18:03:15.758] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.758] ...future.globalenv.names)) [18:03:15.758] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.758] }, condition = base::local({ [18:03:15.758] c <- base::c [18:03:15.758] inherits <- base::inherits [18:03:15.758] invokeRestart <- base::invokeRestart [18:03:15.758] length <- base::length [18:03:15.758] list <- base::list [18:03:15.758] seq.int <- base::seq.int [18:03:15.758] signalCondition <- base::signalCondition [18:03:15.758] sys.calls <- base::sys.calls [18:03:15.758] `[[` <- base::`[[` [18:03:15.758] `+` <- base::`+` [18:03:15.758] `<<-` <- base::`<<-` [18:03:15.758] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.758] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.758] 3L)] [18:03:15.758] } [18:03:15.758] function(cond) { [18:03:15.758] is_error <- inherits(cond, "error") [18:03:15.758] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.758] NULL) [18:03:15.758] if (is_error) { [18:03:15.758] sessionInformation <- function() { [18:03:15.758] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.758] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.758] search = base::search(), system = base::Sys.info()) [18:03:15.758] } [18:03:15.758] ...future.conditions[[length(...future.conditions) + [18:03:15.758] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.758] cond$call), session = sessionInformation(), [18:03:15.758] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.758] signalCondition(cond) [18:03:15.758] } [18:03:15.758] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.758] "immediateCondition"))) { [18:03:15.758] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.758] ...future.conditions[[length(...future.conditions) + [18:03:15.758] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.758] if (TRUE && !signal) { [18:03:15.758] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.758] { [18:03:15.758] inherits <- base::inherits [18:03:15.758] invokeRestart <- base::invokeRestart [18:03:15.758] is.null <- base::is.null [18:03:15.758] muffled <- FALSE [18:03:15.758] if (inherits(cond, "message")) { [18:03:15.758] muffled <- grepl(pattern, "muffleMessage") [18:03:15.758] if (muffled) [18:03:15.758] invokeRestart("muffleMessage") [18:03:15.758] } [18:03:15.758] else if (inherits(cond, "warning")) { [18:03:15.758] muffled <- grepl(pattern, "muffleWarning") [18:03:15.758] if (muffled) [18:03:15.758] invokeRestart("muffleWarning") [18:03:15.758] } [18:03:15.758] else if (inherits(cond, "condition")) { [18:03:15.758] if (!is.null(pattern)) { [18:03:15.758] computeRestarts <- base::computeRestarts [18:03:15.758] grepl <- base::grepl [18:03:15.758] restarts <- computeRestarts(cond) [18:03:15.758] for (restart in restarts) { [18:03:15.758] name <- restart$name [18:03:15.758] if (is.null(name)) [18:03:15.758] next [18:03:15.758] if (!grepl(pattern, name)) [18:03:15.758] next [18:03:15.758] invokeRestart(restart) [18:03:15.758] muffled <- TRUE [18:03:15.758] break [18:03:15.758] } [18:03:15.758] } [18:03:15.758] } [18:03:15.758] invisible(muffled) [18:03:15.758] } [18:03:15.758] muffleCondition(cond, pattern = "^muffle") [18:03:15.758] } [18:03:15.758] } [18:03:15.758] else { [18:03:15.758] if (TRUE) { [18:03:15.758] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.758] { [18:03:15.758] inherits <- base::inherits [18:03:15.758] invokeRestart <- base::invokeRestart [18:03:15.758] is.null <- base::is.null [18:03:15.758] muffled <- FALSE [18:03:15.758] if (inherits(cond, "message")) { [18:03:15.758] muffled <- grepl(pattern, "muffleMessage") [18:03:15.758] if (muffled) [18:03:15.758] invokeRestart("muffleMessage") [18:03:15.758] } [18:03:15.758] else if (inherits(cond, "warning")) { [18:03:15.758] muffled <- grepl(pattern, "muffleWarning") [18:03:15.758] if (muffled) [18:03:15.758] invokeRestart("muffleWarning") [18:03:15.758] } [18:03:15.758] else if (inherits(cond, "condition")) { [18:03:15.758] if (!is.null(pattern)) { [18:03:15.758] computeRestarts <- base::computeRestarts [18:03:15.758] grepl <- base::grepl [18:03:15.758] restarts <- computeRestarts(cond) [18:03:15.758] for (restart in restarts) { [18:03:15.758] name <- restart$name [18:03:15.758] if (is.null(name)) [18:03:15.758] next [18:03:15.758] if (!grepl(pattern, name)) [18:03:15.758] next [18:03:15.758] invokeRestart(restart) [18:03:15.758] muffled <- TRUE [18:03:15.758] break [18:03:15.758] } [18:03:15.758] } [18:03:15.758] } [18:03:15.758] invisible(muffled) [18:03:15.758] } [18:03:15.758] muffleCondition(cond, pattern = "^muffle") [18:03:15.758] } [18:03:15.758] } [18:03:15.758] } [18:03:15.758] })) [18:03:15.758] }, error = function(ex) { [18:03:15.758] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.758] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.758] ...future.rng), started = ...future.startTime, [18:03:15.758] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.758] version = "1.8"), class = "FutureResult") [18:03:15.758] }, finally = { [18:03:15.758] if (!identical(...future.workdir, getwd())) [18:03:15.758] setwd(...future.workdir) [18:03:15.758] { [18:03:15.758] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.758] ...future.oldOptions$nwarnings <- NULL [18:03:15.758] } [18:03:15.758] base::options(...future.oldOptions) [18:03:15.758] if (.Platform$OS.type == "windows") { [18:03:15.758] old_names <- names(...future.oldEnvVars) [18:03:15.758] envs <- base::Sys.getenv() [18:03:15.758] names <- names(envs) [18:03:15.758] common <- intersect(names, old_names) [18:03:15.758] added <- setdiff(names, old_names) [18:03:15.758] removed <- setdiff(old_names, names) [18:03:15.758] changed <- common[...future.oldEnvVars[common] != [18:03:15.758] envs[common]] [18:03:15.758] NAMES <- toupper(changed) [18:03:15.758] args <- list() [18:03:15.758] for (kk in seq_along(NAMES)) { [18:03:15.758] name <- changed[[kk]] [18:03:15.758] NAME <- NAMES[[kk]] [18:03:15.758] if (name != NAME && is.element(NAME, old_names)) [18:03:15.758] next [18:03:15.758] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.758] } [18:03:15.758] NAMES <- toupper(added) [18:03:15.758] for (kk in seq_along(NAMES)) { [18:03:15.758] name <- added[[kk]] [18:03:15.758] NAME <- NAMES[[kk]] [18:03:15.758] if (name != NAME && is.element(NAME, old_names)) [18:03:15.758] next [18:03:15.758] args[[name]] <- "" [18:03:15.758] } [18:03:15.758] NAMES <- toupper(removed) [18:03:15.758] for (kk in seq_along(NAMES)) { [18:03:15.758] name <- removed[[kk]] [18:03:15.758] NAME <- NAMES[[kk]] [18:03:15.758] if (name != NAME && is.element(NAME, old_names)) [18:03:15.758] next [18:03:15.758] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.758] } [18:03:15.758] if (length(args) > 0) [18:03:15.758] base::do.call(base::Sys.setenv, args = args) [18:03:15.758] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.758] } [18:03:15.758] else { [18:03:15.758] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.758] } [18:03:15.758] { [18:03:15.758] if (base::length(...future.futureOptionsAdded) > [18:03:15.758] 0L) { [18:03:15.758] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.758] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.758] base::options(opts) [18:03:15.758] } [18:03:15.758] { [18:03:15.758] { [18:03:15.758] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.758] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.758] -1344458670L), envir = base::globalenv(), [18:03:15.758] inherits = FALSE) [18:03:15.758] NULL [18:03:15.758] } [18:03:15.758] options(future.plan = NULL) [18:03:15.758] if (is.na(NA_character_)) [18:03:15.758] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.758] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.758] future::plan(list(function (..., envir = parent.frame()) [18:03:15.758] { [18:03:15.758] future <- SequentialFuture(..., envir = envir) [18:03:15.758] if (!future$lazy) [18:03:15.758] future <- run(future) [18:03:15.758] invisible(future) [18:03:15.758] }), .cleanup = FALSE, .init = FALSE) [18:03:15.758] } [18:03:15.758] } [18:03:15.758] } [18:03:15.758] }) [18:03:15.758] if (TRUE) { [18:03:15.758] base::sink(type = "output", split = FALSE) [18:03:15.758] if (TRUE) { [18:03:15.758] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.758] } [18:03:15.758] else { [18:03:15.758] ...future.result["stdout"] <- base::list(NULL) [18:03:15.758] } [18:03:15.758] base::close(...future.stdout) [18:03:15.758] ...future.stdout <- NULL [18:03:15.758] } [18:03:15.758] ...future.result$conditions <- ...future.conditions [18:03:15.758] ...future.result$finished <- base::Sys.time() [18:03:15.758] ...future.result [18:03:15.758] } [18:03:15.761] assign_globals() ... [18:03:15.762] List of 1 [18:03:15.762] $ x: int [1:4] 0 1 2 3 [18:03:15.762] - attr(*, "where")=List of 1 [18:03:15.762] ..$ x: [18:03:15.762] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.762] - attr(*, "resolved")= logi FALSE [18:03:15.762] - attr(*, "total_size")= num 64 [18:03:15.762] - attr(*, "already-done")= logi TRUE [18:03:15.765] - copied 'x' to environment [18:03:15.766] assign_globals() ... done [18:03:15.766] plan(): Setting new future strategy stack: [18:03:15.766] List of future strategies: [18:03:15.766] 1. sequential: [18:03:15.766] - args: function (..., envir = parent.frame()) [18:03:15.766] - tweaked: FALSE [18:03:15.766] - call: NULL [18:03:15.767] plan(): nbrOfWorkers() = 1 [18:03:15.768] plan(): Setting new future strategy stack: [18:03:15.768] List of future strategies: [18:03:15.768] 1. sequential: [18:03:15.768] - args: function (..., envir = parent.frame()) [18:03:15.768] - tweaked: FALSE [18:03:15.768] - call: plan(strategy) [18:03:15.768] plan(): nbrOfWorkers() = 1 [18:03:15.769] SequentialFuture started (and completed) [18:03:15.769] - Launch lazy future ... done [18:03:15.769] run() for 'SequentialFuture' ... done [18:03:15.769] getGlobalsAndPackages() ... [18:03:15.769] Searching for globals... [18:03:15.770] - globals found: [3] '{', 'sample', 'x' [18:03:15.771] Searching for globals ... DONE [18:03:15.771] Resolving globals: FALSE [18:03:15.771] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.772] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.772] - globals: [1] 'x' [18:03:15.772] [18:03:15.772] getGlobalsAndPackages() ... DONE [18:03:15.773] run() for 'Future' ... [18:03:15.773] - state: 'created' [18:03:15.773] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.773] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.773] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.774] - Field: 'label' [18:03:15.774] - Field: 'local' [18:03:15.774] - Field: 'owner' [18:03:15.774] - Field: 'envir' [18:03:15.774] - Field: 'packages' [18:03:15.775] - Field: 'gc' [18:03:15.775] - Field: 'conditions' [18:03:15.775] - Field: 'expr' [18:03:15.775] - Field: 'uuid' [18:03:15.775] - Field: 'seed' [18:03:15.775] - Field: 'version' [18:03:15.776] - Field: 'result' [18:03:15.776] - Field: 'asynchronous' [18:03:15.776] - Field: 'calls' [18:03:15.776] - Field: 'globals' [18:03:15.776] - Field: 'stdout' [18:03:15.776] - Field: 'earlySignal' [18:03:15.777] - Field: 'lazy' [18:03:15.777] - Field: 'state' [18:03:15.777] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.777] - Launch lazy future ... [18:03:15.777] Packages needed by the future expression (n = 0): [18:03:15.778] Packages needed by future strategies (n = 0): [18:03:15.778] { [18:03:15.778] { [18:03:15.778] { [18:03:15.778] ...future.startTime <- base::Sys.time() [18:03:15.778] { [18:03:15.778] { [18:03:15.778] { [18:03:15.778] { [18:03:15.778] base::local({ [18:03:15.778] has_future <- base::requireNamespace("future", [18:03:15.778] quietly = TRUE) [18:03:15.778] if (has_future) { [18:03:15.778] ns <- base::getNamespace("future") [18:03:15.778] version <- ns[[".package"]][["version"]] [18:03:15.778] if (is.null(version)) [18:03:15.778] version <- utils::packageVersion("future") [18:03:15.778] } [18:03:15.778] else { [18:03:15.778] version <- NULL [18:03:15.778] } [18:03:15.778] if (!has_future || version < "1.8.0") { [18:03:15.778] info <- base::c(r_version = base::gsub("R version ", [18:03:15.778] "", base::R.version$version.string), [18:03:15.778] platform = base::sprintf("%s (%s-bit)", [18:03:15.778] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.778] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.778] "release", "version")], collapse = " "), [18:03:15.778] hostname = base::Sys.info()[["nodename"]]) [18:03:15.778] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.778] info) [18:03:15.778] info <- base::paste(info, collapse = "; ") [18:03:15.778] if (!has_future) { [18:03:15.778] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.778] info) [18:03:15.778] } [18:03:15.778] else { [18:03:15.778] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.778] info, version) [18:03:15.778] } [18:03:15.778] base::stop(msg) [18:03:15.778] } [18:03:15.778] }) [18:03:15.778] } [18:03:15.778] options(future.plan = NULL) [18:03:15.778] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.778] future::plan("default", .cleanup = FALSE, [18:03:15.778] .init = FALSE) [18:03:15.778] } [18:03:15.778] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:15.778] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:15.778] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:15.778] } [18:03:15.778] ...future.workdir <- getwd() [18:03:15.778] } [18:03:15.778] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.778] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.778] } [18:03:15.778] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.778] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.778] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.778] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.778] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.778] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.778] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.778] base::names(...future.oldOptions)) [18:03:15.778] } [18:03:15.778] if (FALSE) { [18:03:15.778] } [18:03:15.778] else { [18:03:15.778] if (TRUE) { [18:03:15.778] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.778] open = "w") [18:03:15.778] } [18:03:15.778] else { [18:03:15.778] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.778] windows = "NUL", "/dev/null"), open = "w") [18:03:15.778] } [18:03:15.778] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.778] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.778] base::sink(type = "output", split = FALSE) [18:03:15.778] base::close(...future.stdout) [18:03:15.778] }, add = TRUE) [18:03:15.778] } [18:03:15.778] ...future.frame <- base::sys.nframe() [18:03:15.778] ...future.conditions <- base::list() [18:03:15.778] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.778] if (FALSE) { [18:03:15.778] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.778] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.778] } [18:03:15.778] ...future.result <- base::tryCatch({ [18:03:15.778] base::withCallingHandlers({ [18:03:15.778] ...future.value <- base::withVisible(base::local({ [18:03:15.778] sample(x, size = 1L) [18:03:15.778] })) [18:03:15.778] future::FutureResult(value = ...future.value$value, [18:03:15.778] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.778] ...future.rng), globalenv = if (FALSE) [18:03:15.778] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.778] ...future.globalenv.names)) [18:03:15.778] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.778] }, condition = base::local({ [18:03:15.778] c <- base::c [18:03:15.778] inherits <- base::inherits [18:03:15.778] invokeRestart <- base::invokeRestart [18:03:15.778] length <- base::length [18:03:15.778] list <- base::list [18:03:15.778] seq.int <- base::seq.int [18:03:15.778] signalCondition <- base::signalCondition [18:03:15.778] sys.calls <- base::sys.calls [18:03:15.778] `[[` <- base::`[[` [18:03:15.778] `+` <- base::`+` [18:03:15.778] `<<-` <- base::`<<-` [18:03:15.778] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.778] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.778] 3L)] [18:03:15.778] } [18:03:15.778] function(cond) { [18:03:15.778] is_error <- inherits(cond, "error") [18:03:15.778] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.778] NULL) [18:03:15.778] if (is_error) { [18:03:15.778] sessionInformation <- function() { [18:03:15.778] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.778] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.778] search = base::search(), system = base::Sys.info()) [18:03:15.778] } [18:03:15.778] ...future.conditions[[length(...future.conditions) + [18:03:15.778] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.778] cond$call), session = sessionInformation(), [18:03:15.778] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.778] signalCondition(cond) [18:03:15.778] } [18:03:15.778] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.778] "immediateCondition"))) { [18:03:15.778] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.778] ...future.conditions[[length(...future.conditions) + [18:03:15.778] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.778] if (TRUE && !signal) { [18:03:15.778] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.778] { [18:03:15.778] inherits <- base::inherits [18:03:15.778] invokeRestart <- base::invokeRestart [18:03:15.778] is.null <- base::is.null [18:03:15.778] muffled <- FALSE [18:03:15.778] if (inherits(cond, "message")) { [18:03:15.778] muffled <- grepl(pattern, "muffleMessage") [18:03:15.778] if (muffled) [18:03:15.778] invokeRestart("muffleMessage") [18:03:15.778] } [18:03:15.778] else if (inherits(cond, "warning")) { [18:03:15.778] muffled <- grepl(pattern, "muffleWarning") [18:03:15.778] if (muffled) [18:03:15.778] invokeRestart("muffleWarning") [18:03:15.778] } [18:03:15.778] else if (inherits(cond, "condition")) { [18:03:15.778] if (!is.null(pattern)) { [18:03:15.778] computeRestarts <- base::computeRestarts [18:03:15.778] grepl <- base::grepl [18:03:15.778] restarts <- computeRestarts(cond) [18:03:15.778] for (restart in restarts) { [18:03:15.778] name <- restart$name [18:03:15.778] if (is.null(name)) [18:03:15.778] next [18:03:15.778] if (!grepl(pattern, name)) [18:03:15.778] next [18:03:15.778] invokeRestart(restart) [18:03:15.778] muffled <- TRUE [18:03:15.778] break [18:03:15.778] } [18:03:15.778] } [18:03:15.778] } [18:03:15.778] invisible(muffled) [18:03:15.778] } [18:03:15.778] muffleCondition(cond, pattern = "^muffle") [18:03:15.778] } [18:03:15.778] } [18:03:15.778] else { [18:03:15.778] if (TRUE) { [18:03:15.778] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.778] { [18:03:15.778] inherits <- base::inherits [18:03:15.778] invokeRestart <- base::invokeRestart [18:03:15.778] is.null <- base::is.null [18:03:15.778] muffled <- FALSE [18:03:15.778] if (inherits(cond, "message")) { [18:03:15.778] muffled <- grepl(pattern, "muffleMessage") [18:03:15.778] if (muffled) [18:03:15.778] invokeRestart("muffleMessage") [18:03:15.778] } [18:03:15.778] else if (inherits(cond, "warning")) { [18:03:15.778] muffled <- grepl(pattern, "muffleWarning") [18:03:15.778] if (muffled) [18:03:15.778] invokeRestart("muffleWarning") [18:03:15.778] } [18:03:15.778] else if (inherits(cond, "condition")) { [18:03:15.778] if (!is.null(pattern)) { [18:03:15.778] computeRestarts <- base::computeRestarts [18:03:15.778] grepl <- base::grepl [18:03:15.778] restarts <- computeRestarts(cond) [18:03:15.778] for (restart in restarts) { [18:03:15.778] name <- restart$name [18:03:15.778] if (is.null(name)) [18:03:15.778] next [18:03:15.778] if (!grepl(pattern, name)) [18:03:15.778] next [18:03:15.778] invokeRestart(restart) [18:03:15.778] muffled <- TRUE [18:03:15.778] break [18:03:15.778] } [18:03:15.778] } [18:03:15.778] } [18:03:15.778] invisible(muffled) [18:03:15.778] } [18:03:15.778] muffleCondition(cond, pattern = "^muffle") [18:03:15.778] } [18:03:15.778] } [18:03:15.778] } [18:03:15.778] })) [18:03:15.778] }, error = function(ex) { [18:03:15.778] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.778] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.778] ...future.rng), started = ...future.startTime, [18:03:15.778] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.778] version = "1.8"), class = "FutureResult") [18:03:15.778] }, finally = { [18:03:15.778] if (!identical(...future.workdir, getwd())) [18:03:15.778] setwd(...future.workdir) [18:03:15.778] { [18:03:15.778] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.778] ...future.oldOptions$nwarnings <- NULL [18:03:15.778] } [18:03:15.778] base::options(...future.oldOptions) [18:03:15.778] if (.Platform$OS.type == "windows") { [18:03:15.778] old_names <- names(...future.oldEnvVars) [18:03:15.778] envs <- base::Sys.getenv() [18:03:15.778] names <- names(envs) [18:03:15.778] common <- intersect(names, old_names) [18:03:15.778] added <- setdiff(names, old_names) [18:03:15.778] removed <- setdiff(old_names, names) [18:03:15.778] changed <- common[...future.oldEnvVars[common] != [18:03:15.778] envs[common]] [18:03:15.778] NAMES <- toupper(changed) [18:03:15.778] args <- list() [18:03:15.778] for (kk in seq_along(NAMES)) { [18:03:15.778] name <- changed[[kk]] [18:03:15.778] NAME <- NAMES[[kk]] [18:03:15.778] if (name != NAME && is.element(NAME, old_names)) [18:03:15.778] next [18:03:15.778] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.778] } [18:03:15.778] NAMES <- toupper(added) [18:03:15.778] for (kk in seq_along(NAMES)) { [18:03:15.778] name <- added[[kk]] [18:03:15.778] NAME <- NAMES[[kk]] [18:03:15.778] if (name != NAME && is.element(NAME, old_names)) [18:03:15.778] next [18:03:15.778] args[[name]] <- "" [18:03:15.778] } [18:03:15.778] NAMES <- toupper(removed) [18:03:15.778] for (kk in seq_along(NAMES)) { [18:03:15.778] name <- removed[[kk]] [18:03:15.778] NAME <- NAMES[[kk]] [18:03:15.778] if (name != NAME && is.element(NAME, old_names)) [18:03:15.778] next [18:03:15.778] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.778] } [18:03:15.778] if (length(args) > 0) [18:03:15.778] base::do.call(base::Sys.setenv, args = args) [18:03:15.778] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.778] } [18:03:15.778] else { [18:03:15.778] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.778] } [18:03:15.778] { [18:03:15.778] if (base::length(...future.futureOptionsAdded) > [18:03:15.778] 0L) { [18:03:15.778] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.778] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.778] base::options(opts) [18:03:15.778] } [18:03:15.778] { [18:03:15.778] { [18:03:15.778] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.778] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.778] -1344458670L), envir = base::globalenv(), [18:03:15.778] inherits = FALSE) [18:03:15.778] NULL [18:03:15.778] } [18:03:15.778] options(future.plan = NULL) [18:03:15.778] if (is.na(NA_character_)) [18:03:15.778] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.778] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.778] future::plan(list(function (..., envir = parent.frame()) [18:03:15.778] { [18:03:15.778] future <- SequentialFuture(..., envir = envir) [18:03:15.778] if (!future$lazy) [18:03:15.778] future <- run(future) [18:03:15.778] invisible(future) [18:03:15.778] }), .cleanup = FALSE, .init = FALSE) [18:03:15.778] } [18:03:15.778] } [18:03:15.778] } [18:03:15.778] }) [18:03:15.778] if (TRUE) { [18:03:15.778] base::sink(type = "output", split = FALSE) [18:03:15.778] if (TRUE) { [18:03:15.778] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.778] } [18:03:15.778] else { [18:03:15.778] ...future.result["stdout"] <- base::list(NULL) [18:03:15.778] } [18:03:15.778] base::close(...future.stdout) [18:03:15.778] ...future.stdout <- NULL [18:03:15.778] } [18:03:15.778] ...future.result$conditions <- ...future.conditions [18:03:15.778] ...future.result$finished <- base::Sys.time() [18:03:15.778] ...future.result [18:03:15.778] } [18:03:15.782] assign_globals() ... [18:03:15.782] List of 1 [18:03:15.782] $ x: int [1:4] 0 1 2 3 [18:03:15.782] - attr(*, "where")=List of 1 [18:03:15.782] ..$ x: [18:03:15.782] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.782] - attr(*, "resolved")= logi FALSE [18:03:15.782] - attr(*, "total_size")= num 64 [18:03:15.782] - attr(*, "already-done")= logi TRUE [18:03:15.785] - copied 'x' to environment [18:03:15.785] assign_globals() ... done [18:03:15.785] plan(): Setting new future strategy stack: [18:03:15.786] List of future strategies: [18:03:15.786] 1. sequential: [18:03:15.786] - args: function (..., envir = parent.frame()) [18:03:15.786] - tweaked: FALSE [18:03:15.786] - call: NULL [18:03:15.786] plan(): nbrOfWorkers() = 1 [18:03:15.787] plan(): Setting new future strategy stack: [18:03:15.787] List of future strategies: [18:03:15.787] 1. sequential: [18:03:15.787] - args: function (..., envir = parent.frame()) [18:03:15.787] - tweaked: FALSE [18:03:15.787] - call: plan(strategy) [18:03:15.788] plan(): nbrOfWorkers() = 1 [18:03:15.788] SequentialFuture started (and completed) [18:03:15.788] - Launch lazy future ... done [18:03:15.788] run() for 'SequentialFuture' ... done [18:03:15.789] getGlobalsAndPackages() ... [18:03:15.789] Searching for globals... [18:03:15.790] - globals found: [3] '{', 'sample', 'x' [18:03:15.790] Searching for globals ... DONE [18:03:15.790] Resolving globals: FALSE [18:03:15.791] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.791] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.791] - globals: [1] 'x' [18:03:15.792] [18:03:15.792] getGlobalsAndPackages() ... DONE [18:03:15.792] run() for 'Future' ... [18:03:15.792] - state: 'created' [18:03:15.792] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.793] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.793] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.793] - Field: 'label' [18:03:15.793] - Field: 'local' [18:03:15.794] - Field: 'owner' [18:03:15.794] - Field: 'envir' [18:03:15.794] - Field: 'packages' [18:03:15.794] - Field: 'gc' [18:03:15.794] - Field: 'conditions' [18:03:15.794] - Field: 'expr' [18:03:15.795] - Field: 'uuid' [18:03:15.795] - Field: 'seed' [18:03:15.795] - Field: 'version' [18:03:15.795] - Field: 'result' [18:03:15.795] - Field: 'asynchronous' [18:03:15.795] - Field: 'calls' [18:03:15.796] - Field: 'globals' [18:03:15.796] - Field: 'stdout' [18:03:15.796] - Field: 'earlySignal' [18:03:15.796] - Field: 'lazy' [18:03:15.796] - Field: 'state' [18:03:15.797] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.797] - Launch lazy future ... [18:03:15.797] Packages needed by the future expression (n = 0): [18:03:15.797] Packages needed by future strategies (n = 0): [18:03:15.798] { [18:03:15.798] { [18:03:15.798] { [18:03:15.798] ...future.startTime <- base::Sys.time() [18:03:15.798] { [18:03:15.798] { [18:03:15.798] { [18:03:15.798] { [18:03:15.798] base::local({ [18:03:15.798] has_future <- base::requireNamespace("future", [18:03:15.798] quietly = TRUE) [18:03:15.798] if (has_future) { [18:03:15.798] ns <- base::getNamespace("future") [18:03:15.798] version <- ns[[".package"]][["version"]] [18:03:15.798] if (is.null(version)) [18:03:15.798] version <- utils::packageVersion("future") [18:03:15.798] } [18:03:15.798] else { [18:03:15.798] version <- NULL [18:03:15.798] } [18:03:15.798] if (!has_future || version < "1.8.0") { [18:03:15.798] info <- base::c(r_version = base::gsub("R version ", [18:03:15.798] "", base::R.version$version.string), [18:03:15.798] platform = base::sprintf("%s (%s-bit)", [18:03:15.798] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.798] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.798] "release", "version")], collapse = " "), [18:03:15.798] hostname = base::Sys.info()[["nodename"]]) [18:03:15.798] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.798] info) [18:03:15.798] info <- base::paste(info, collapse = "; ") [18:03:15.798] if (!has_future) { [18:03:15.798] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.798] info) [18:03:15.798] } [18:03:15.798] else { [18:03:15.798] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.798] info, version) [18:03:15.798] } [18:03:15.798] base::stop(msg) [18:03:15.798] } [18:03:15.798] }) [18:03:15.798] } [18:03:15.798] options(future.plan = NULL) [18:03:15.798] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.798] future::plan("default", .cleanup = FALSE, [18:03:15.798] .init = FALSE) [18:03:15.798] } [18:03:15.798] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:15.798] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:15.798] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:15.798] } [18:03:15.798] ...future.workdir <- getwd() [18:03:15.798] } [18:03:15.798] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.798] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.798] } [18:03:15.798] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.798] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.798] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.798] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.798] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.798] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.798] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.798] base::names(...future.oldOptions)) [18:03:15.798] } [18:03:15.798] if (FALSE) { [18:03:15.798] } [18:03:15.798] else { [18:03:15.798] if (TRUE) { [18:03:15.798] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.798] open = "w") [18:03:15.798] } [18:03:15.798] else { [18:03:15.798] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.798] windows = "NUL", "/dev/null"), open = "w") [18:03:15.798] } [18:03:15.798] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.798] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.798] base::sink(type = "output", split = FALSE) [18:03:15.798] base::close(...future.stdout) [18:03:15.798] }, add = TRUE) [18:03:15.798] } [18:03:15.798] ...future.frame <- base::sys.nframe() [18:03:15.798] ...future.conditions <- base::list() [18:03:15.798] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.798] if (FALSE) { [18:03:15.798] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.798] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.798] } [18:03:15.798] ...future.result <- base::tryCatch({ [18:03:15.798] base::withCallingHandlers({ [18:03:15.798] ...future.value <- base::withVisible(base::local({ [18:03:15.798] sample(x, size = 1L) [18:03:15.798] })) [18:03:15.798] future::FutureResult(value = ...future.value$value, [18:03:15.798] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.798] ...future.rng), globalenv = if (FALSE) [18:03:15.798] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.798] ...future.globalenv.names)) [18:03:15.798] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.798] }, condition = base::local({ [18:03:15.798] c <- base::c [18:03:15.798] inherits <- base::inherits [18:03:15.798] invokeRestart <- base::invokeRestart [18:03:15.798] length <- base::length [18:03:15.798] list <- base::list [18:03:15.798] seq.int <- base::seq.int [18:03:15.798] signalCondition <- base::signalCondition [18:03:15.798] sys.calls <- base::sys.calls [18:03:15.798] `[[` <- base::`[[` [18:03:15.798] `+` <- base::`+` [18:03:15.798] `<<-` <- base::`<<-` [18:03:15.798] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.798] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.798] 3L)] [18:03:15.798] } [18:03:15.798] function(cond) { [18:03:15.798] is_error <- inherits(cond, "error") [18:03:15.798] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.798] NULL) [18:03:15.798] if (is_error) { [18:03:15.798] sessionInformation <- function() { [18:03:15.798] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.798] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.798] search = base::search(), system = base::Sys.info()) [18:03:15.798] } [18:03:15.798] ...future.conditions[[length(...future.conditions) + [18:03:15.798] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.798] cond$call), session = sessionInformation(), [18:03:15.798] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.798] signalCondition(cond) [18:03:15.798] } [18:03:15.798] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.798] "immediateCondition"))) { [18:03:15.798] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.798] ...future.conditions[[length(...future.conditions) + [18:03:15.798] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.798] if (TRUE && !signal) { [18:03:15.798] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.798] { [18:03:15.798] inherits <- base::inherits [18:03:15.798] invokeRestart <- base::invokeRestart [18:03:15.798] is.null <- base::is.null [18:03:15.798] muffled <- FALSE [18:03:15.798] if (inherits(cond, "message")) { [18:03:15.798] muffled <- grepl(pattern, "muffleMessage") [18:03:15.798] if (muffled) [18:03:15.798] invokeRestart("muffleMessage") [18:03:15.798] } [18:03:15.798] else if (inherits(cond, "warning")) { [18:03:15.798] muffled <- grepl(pattern, "muffleWarning") [18:03:15.798] if (muffled) [18:03:15.798] invokeRestart("muffleWarning") [18:03:15.798] } [18:03:15.798] else if (inherits(cond, "condition")) { [18:03:15.798] if (!is.null(pattern)) { [18:03:15.798] computeRestarts <- base::computeRestarts [18:03:15.798] grepl <- base::grepl [18:03:15.798] restarts <- computeRestarts(cond) [18:03:15.798] for (restart in restarts) { [18:03:15.798] name <- restart$name [18:03:15.798] if (is.null(name)) [18:03:15.798] next [18:03:15.798] if (!grepl(pattern, name)) [18:03:15.798] next [18:03:15.798] invokeRestart(restart) [18:03:15.798] muffled <- TRUE [18:03:15.798] break [18:03:15.798] } [18:03:15.798] } [18:03:15.798] } [18:03:15.798] invisible(muffled) [18:03:15.798] } [18:03:15.798] muffleCondition(cond, pattern = "^muffle") [18:03:15.798] } [18:03:15.798] } [18:03:15.798] else { [18:03:15.798] if (TRUE) { [18:03:15.798] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.798] { [18:03:15.798] inherits <- base::inherits [18:03:15.798] invokeRestart <- base::invokeRestart [18:03:15.798] is.null <- base::is.null [18:03:15.798] muffled <- FALSE [18:03:15.798] if (inherits(cond, "message")) { [18:03:15.798] muffled <- grepl(pattern, "muffleMessage") [18:03:15.798] if (muffled) [18:03:15.798] invokeRestart("muffleMessage") [18:03:15.798] } [18:03:15.798] else if (inherits(cond, "warning")) { [18:03:15.798] muffled <- grepl(pattern, "muffleWarning") [18:03:15.798] if (muffled) [18:03:15.798] invokeRestart("muffleWarning") [18:03:15.798] } [18:03:15.798] else if (inherits(cond, "condition")) { [18:03:15.798] if (!is.null(pattern)) { [18:03:15.798] computeRestarts <- base::computeRestarts [18:03:15.798] grepl <- base::grepl [18:03:15.798] restarts <- computeRestarts(cond) [18:03:15.798] for (restart in restarts) { [18:03:15.798] name <- restart$name [18:03:15.798] if (is.null(name)) [18:03:15.798] next [18:03:15.798] if (!grepl(pattern, name)) [18:03:15.798] next [18:03:15.798] invokeRestart(restart) [18:03:15.798] muffled <- TRUE [18:03:15.798] break [18:03:15.798] } [18:03:15.798] } [18:03:15.798] } [18:03:15.798] invisible(muffled) [18:03:15.798] } [18:03:15.798] muffleCondition(cond, pattern = "^muffle") [18:03:15.798] } [18:03:15.798] } [18:03:15.798] } [18:03:15.798] })) [18:03:15.798] }, error = function(ex) { [18:03:15.798] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.798] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.798] ...future.rng), started = ...future.startTime, [18:03:15.798] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.798] version = "1.8"), class = "FutureResult") [18:03:15.798] }, finally = { [18:03:15.798] if (!identical(...future.workdir, getwd())) [18:03:15.798] setwd(...future.workdir) [18:03:15.798] { [18:03:15.798] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.798] ...future.oldOptions$nwarnings <- NULL [18:03:15.798] } [18:03:15.798] base::options(...future.oldOptions) [18:03:15.798] if (.Platform$OS.type == "windows") { [18:03:15.798] old_names <- names(...future.oldEnvVars) [18:03:15.798] envs <- base::Sys.getenv() [18:03:15.798] names <- names(envs) [18:03:15.798] common <- intersect(names, old_names) [18:03:15.798] added <- setdiff(names, old_names) [18:03:15.798] removed <- setdiff(old_names, names) [18:03:15.798] changed <- common[...future.oldEnvVars[common] != [18:03:15.798] envs[common]] [18:03:15.798] NAMES <- toupper(changed) [18:03:15.798] args <- list() [18:03:15.798] for (kk in seq_along(NAMES)) { [18:03:15.798] name <- changed[[kk]] [18:03:15.798] NAME <- NAMES[[kk]] [18:03:15.798] if (name != NAME && is.element(NAME, old_names)) [18:03:15.798] next [18:03:15.798] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.798] } [18:03:15.798] NAMES <- toupper(added) [18:03:15.798] for (kk in seq_along(NAMES)) { [18:03:15.798] name <- added[[kk]] [18:03:15.798] NAME <- NAMES[[kk]] [18:03:15.798] if (name != NAME && is.element(NAME, old_names)) [18:03:15.798] next [18:03:15.798] args[[name]] <- "" [18:03:15.798] } [18:03:15.798] NAMES <- toupper(removed) [18:03:15.798] for (kk in seq_along(NAMES)) { [18:03:15.798] name <- removed[[kk]] [18:03:15.798] NAME <- NAMES[[kk]] [18:03:15.798] if (name != NAME && is.element(NAME, old_names)) [18:03:15.798] next [18:03:15.798] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.798] } [18:03:15.798] if (length(args) > 0) [18:03:15.798] base::do.call(base::Sys.setenv, args = args) [18:03:15.798] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.798] } [18:03:15.798] else { [18:03:15.798] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.798] } [18:03:15.798] { [18:03:15.798] if (base::length(...future.futureOptionsAdded) > [18:03:15.798] 0L) { [18:03:15.798] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.798] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.798] base::options(opts) [18:03:15.798] } [18:03:15.798] { [18:03:15.798] { [18:03:15.798] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.798] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.798] -1344458670L), envir = base::globalenv(), [18:03:15.798] inherits = FALSE) [18:03:15.798] NULL [18:03:15.798] } [18:03:15.798] options(future.plan = NULL) [18:03:15.798] if (is.na(NA_character_)) [18:03:15.798] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.798] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.798] future::plan(list(function (..., envir = parent.frame()) [18:03:15.798] { [18:03:15.798] future <- SequentialFuture(..., envir = envir) [18:03:15.798] if (!future$lazy) [18:03:15.798] future <- run(future) [18:03:15.798] invisible(future) [18:03:15.798] }), .cleanup = FALSE, .init = FALSE) [18:03:15.798] } [18:03:15.798] } [18:03:15.798] } [18:03:15.798] }) [18:03:15.798] if (TRUE) { [18:03:15.798] base::sink(type = "output", split = FALSE) [18:03:15.798] if (TRUE) { [18:03:15.798] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.798] } [18:03:15.798] else { [18:03:15.798] ...future.result["stdout"] <- base::list(NULL) [18:03:15.798] } [18:03:15.798] base::close(...future.stdout) [18:03:15.798] ...future.stdout <- NULL [18:03:15.798] } [18:03:15.798] ...future.result$conditions <- ...future.conditions [18:03:15.798] ...future.result$finished <- base::Sys.time() [18:03:15.798] ...future.result [18:03:15.798] } [18:03:15.802] assign_globals() ... [18:03:15.802] List of 1 [18:03:15.802] $ x: int [1:4] 0 1 2 3 [18:03:15.802] - attr(*, "where")=List of 1 [18:03:15.802] ..$ x: [18:03:15.802] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.802] - attr(*, "resolved")= logi FALSE [18:03:15.802] - attr(*, "total_size")= num 64 [18:03:15.802] - attr(*, "already-done")= logi TRUE [18:03:15.806] - copied 'x' to environment [18:03:15.806] assign_globals() ... done [18:03:15.806] plan(): Setting new future strategy stack: [18:03:15.806] List of future strategies: [18:03:15.806] 1. sequential: [18:03:15.806] - args: function (..., envir = parent.frame()) [18:03:15.806] - tweaked: FALSE [18:03:15.806] - call: NULL [18:03:15.807] plan(): nbrOfWorkers() = 1 [18:03:15.808] plan(): Setting new future strategy stack: [18:03:15.808] List of future strategies: [18:03:15.808] 1. sequential: [18:03:15.808] - args: function (..., envir = parent.frame()) [18:03:15.808] - tweaked: FALSE [18:03:15.808] - call: plan(strategy) [18:03:15.809] plan(): nbrOfWorkers() = 1 [18:03:15.809] SequentialFuture started (and completed) [18:03:15.809] - Launch lazy future ... done [18:03:15.809] run() for 'SequentialFuture' ... done [18:03:15.809] getGlobalsAndPackages() ... [18:03:15.810] Searching for globals... [18:03:15.811] - globals found: [3] '{', 'sample', 'x' [18:03:15.811] Searching for globals ... DONE [18:03:15.811] Resolving globals: FALSE [18:03:15.812] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.812] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.812] - globals: [1] 'x' [18:03:15.812] [18:03:15.812] getGlobalsAndPackages() ... DONE [18:03:15.813] run() for 'Future' ... [18:03:15.813] - state: 'created' [18:03:15.813] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.814] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.814] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.814] - Field: 'label' [18:03:15.814] - Field: 'local' [18:03:15.814] - Field: 'owner' [18:03:15.814] - Field: 'envir' [18:03:15.815] - Field: 'packages' [18:03:15.815] - Field: 'gc' [18:03:15.815] - Field: 'conditions' [18:03:15.815] - Field: 'expr' [18:03:15.815] - Field: 'uuid' [18:03:15.816] - Field: 'seed' [18:03:15.816] - Field: 'version' [18:03:15.816] - Field: 'result' [18:03:15.816] - Field: 'asynchronous' [18:03:15.816] - Field: 'calls' [18:03:15.816] - Field: 'globals' [18:03:15.817] - Field: 'stdout' [18:03:15.817] - Field: 'earlySignal' [18:03:15.817] - Field: 'lazy' [18:03:15.817] - Field: 'state' [18:03:15.817] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.817] - Launch lazy future ... [18:03:15.818] Packages needed by the future expression (n = 0): [18:03:15.818] Packages needed by future strategies (n = 0): [18:03:15.818] { [18:03:15.818] { [18:03:15.818] { [18:03:15.818] ...future.startTime <- base::Sys.time() [18:03:15.818] { [18:03:15.818] { [18:03:15.818] { [18:03:15.818] { [18:03:15.818] base::local({ [18:03:15.818] has_future <- base::requireNamespace("future", [18:03:15.818] quietly = TRUE) [18:03:15.818] if (has_future) { [18:03:15.818] ns <- base::getNamespace("future") [18:03:15.818] version <- ns[[".package"]][["version"]] [18:03:15.818] if (is.null(version)) [18:03:15.818] version <- utils::packageVersion("future") [18:03:15.818] } [18:03:15.818] else { [18:03:15.818] version <- NULL [18:03:15.818] } [18:03:15.818] if (!has_future || version < "1.8.0") { [18:03:15.818] info <- base::c(r_version = base::gsub("R version ", [18:03:15.818] "", base::R.version$version.string), [18:03:15.818] platform = base::sprintf("%s (%s-bit)", [18:03:15.818] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.818] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.818] "release", "version")], collapse = " "), [18:03:15.818] hostname = base::Sys.info()[["nodename"]]) [18:03:15.818] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.818] info) [18:03:15.818] info <- base::paste(info, collapse = "; ") [18:03:15.818] if (!has_future) { [18:03:15.818] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.818] info) [18:03:15.818] } [18:03:15.818] else { [18:03:15.818] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.818] info, version) [18:03:15.818] } [18:03:15.818] base::stop(msg) [18:03:15.818] } [18:03:15.818] }) [18:03:15.818] } [18:03:15.818] options(future.plan = NULL) [18:03:15.818] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.818] future::plan("default", .cleanup = FALSE, [18:03:15.818] .init = FALSE) [18:03:15.818] } [18:03:15.818] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:15.818] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:15.818] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:15.818] } [18:03:15.818] ...future.workdir <- getwd() [18:03:15.818] } [18:03:15.818] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.818] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.818] } [18:03:15.818] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.818] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.818] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.818] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.818] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.818] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.818] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.818] base::names(...future.oldOptions)) [18:03:15.818] } [18:03:15.818] if (FALSE) { [18:03:15.818] } [18:03:15.818] else { [18:03:15.818] if (TRUE) { [18:03:15.818] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.818] open = "w") [18:03:15.818] } [18:03:15.818] else { [18:03:15.818] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.818] windows = "NUL", "/dev/null"), open = "w") [18:03:15.818] } [18:03:15.818] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.818] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.818] base::sink(type = "output", split = FALSE) [18:03:15.818] base::close(...future.stdout) [18:03:15.818] }, add = TRUE) [18:03:15.818] } [18:03:15.818] ...future.frame <- base::sys.nframe() [18:03:15.818] ...future.conditions <- base::list() [18:03:15.818] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.818] if (FALSE) { [18:03:15.818] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.818] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.818] } [18:03:15.818] ...future.result <- base::tryCatch({ [18:03:15.818] base::withCallingHandlers({ [18:03:15.818] ...future.value <- base::withVisible(base::local({ [18:03:15.818] sample(x, size = 1L) [18:03:15.818] })) [18:03:15.818] future::FutureResult(value = ...future.value$value, [18:03:15.818] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.818] ...future.rng), globalenv = if (FALSE) [18:03:15.818] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.818] ...future.globalenv.names)) [18:03:15.818] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.818] }, condition = base::local({ [18:03:15.818] c <- base::c [18:03:15.818] inherits <- base::inherits [18:03:15.818] invokeRestart <- base::invokeRestart [18:03:15.818] length <- base::length [18:03:15.818] list <- base::list [18:03:15.818] seq.int <- base::seq.int [18:03:15.818] signalCondition <- base::signalCondition [18:03:15.818] sys.calls <- base::sys.calls [18:03:15.818] `[[` <- base::`[[` [18:03:15.818] `+` <- base::`+` [18:03:15.818] `<<-` <- base::`<<-` [18:03:15.818] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.818] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.818] 3L)] [18:03:15.818] } [18:03:15.818] function(cond) { [18:03:15.818] is_error <- inherits(cond, "error") [18:03:15.818] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.818] NULL) [18:03:15.818] if (is_error) { [18:03:15.818] sessionInformation <- function() { [18:03:15.818] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.818] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.818] search = base::search(), system = base::Sys.info()) [18:03:15.818] } [18:03:15.818] ...future.conditions[[length(...future.conditions) + [18:03:15.818] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.818] cond$call), session = sessionInformation(), [18:03:15.818] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.818] signalCondition(cond) [18:03:15.818] } [18:03:15.818] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.818] "immediateCondition"))) { [18:03:15.818] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.818] ...future.conditions[[length(...future.conditions) + [18:03:15.818] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.818] if (TRUE && !signal) { [18:03:15.818] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.818] { [18:03:15.818] inherits <- base::inherits [18:03:15.818] invokeRestart <- base::invokeRestart [18:03:15.818] is.null <- base::is.null [18:03:15.818] muffled <- FALSE [18:03:15.818] if (inherits(cond, "message")) { [18:03:15.818] muffled <- grepl(pattern, "muffleMessage") [18:03:15.818] if (muffled) [18:03:15.818] invokeRestart("muffleMessage") [18:03:15.818] } [18:03:15.818] else if (inherits(cond, "warning")) { [18:03:15.818] muffled <- grepl(pattern, "muffleWarning") [18:03:15.818] if (muffled) [18:03:15.818] invokeRestart("muffleWarning") [18:03:15.818] } [18:03:15.818] else if (inherits(cond, "condition")) { [18:03:15.818] if (!is.null(pattern)) { [18:03:15.818] computeRestarts <- base::computeRestarts [18:03:15.818] grepl <- base::grepl [18:03:15.818] restarts <- computeRestarts(cond) [18:03:15.818] for (restart in restarts) { [18:03:15.818] name <- restart$name [18:03:15.818] if (is.null(name)) [18:03:15.818] next [18:03:15.818] if (!grepl(pattern, name)) [18:03:15.818] next [18:03:15.818] invokeRestart(restart) [18:03:15.818] muffled <- TRUE [18:03:15.818] break [18:03:15.818] } [18:03:15.818] } [18:03:15.818] } [18:03:15.818] invisible(muffled) [18:03:15.818] } [18:03:15.818] muffleCondition(cond, pattern = "^muffle") [18:03:15.818] } [18:03:15.818] } [18:03:15.818] else { [18:03:15.818] if (TRUE) { [18:03:15.818] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.818] { [18:03:15.818] inherits <- base::inherits [18:03:15.818] invokeRestart <- base::invokeRestart [18:03:15.818] is.null <- base::is.null [18:03:15.818] muffled <- FALSE [18:03:15.818] if (inherits(cond, "message")) { [18:03:15.818] muffled <- grepl(pattern, "muffleMessage") [18:03:15.818] if (muffled) [18:03:15.818] invokeRestart("muffleMessage") [18:03:15.818] } [18:03:15.818] else if (inherits(cond, "warning")) { [18:03:15.818] muffled <- grepl(pattern, "muffleWarning") [18:03:15.818] if (muffled) [18:03:15.818] invokeRestart("muffleWarning") [18:03:15.818] } [18:03:15.818] else if (inherits(cond, "condition")) { [18:03:15.818] if (!is.null(pattern)) { [18:03:15.818] computeRestarts <- base::computeRestarts [18:03:15.818] grepl <- base::grepl [18:03:15.818] restarts <- computeRestarts(cond) [18:03:15.818] for (restart in restarts) { [18:03:15.818] name <- restart$name [18:03:15.818] if (is.null(name)) [18:03:15.818] next [18:03:15.818] if (!grepl(pattern, name)) [18:03:15.818] next [18:03:15.818] invokeRestart(restart) [18:03:15.818] muffled <- TRUE [18:03:15.818] break [18:03:15.818] } [18:03:15.818] } [18:03:15.818] } [18:03:15.818] invisible(muffled) [18:03:15.818] } [18:03:15.818] muffleCondition(cond, pattern = "^muffle") [18:03:15.818] } [18:03:15.818] } [18:03:15.818] } [18:03:15.818] })) [18:03:15.818] }, error = function(ex) { [18:03:15.818] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.818] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.818] ...future.rng), started = ...future.startTime, [18:03:15.818] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.818] version = "1.8"), class = "FutureResult") [18:03:15.818] }, finally = { [18:03:15.818] if (!identical(...future.workdir, getwd())) [18:03:15.818] setwd(...future.workdir) [18:03:15.818] { [18:03:15.818] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.818] ...future.oldOptions$nwarnings <- NULL [18:03:15.818] } [18:03:15.818] base::options(...future.oldOptions) [18:03:15.818] if (.Platform$OS.type == "windows") { [18:03:15.818] old_names <- names(...future.oldEnvVars) [18:03:15.818] envs <- base::Sys.getenv() [18:03:15.818] names <- names(envs) [18:03:15.818] common <- intersect(names, old_names) [18:03:15.818] added <- setdiff(names, old_names) [18:03:15.818] removed <- setdiff(old_names, names) [18:03:15.818] changed <- common[...future.oldEnvVars[common] != [18:03:15.818] envs[common]] [18:03:15.818] NAMES <- toupper(changed) [18:03:15.818] args <- list() [18:03:15.818] for (kk in seq_along(NAMES)) { [18:03:15.818] name <- changed[[kk]] [18:03:15.818] NAME <- NAMES[[kk]] [18:03:15.818] if (name != NAME && is.element(NAME, old_names)) [18:03:15.818] next [18:03:15.818] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.818] } [18:03:15.818] NAMES <- toupper(added) [18:03:15.818] for (kk in seq_along(NAMES)) { [18:03:15.818] name <- added[[kk]] [18:03:15.818] NAME <- NAMES[[kk]] [18:03:15.818] if (name != NAME && is.element(NAME, old_names)) [18:03:15.818] next [18:03:15.818] args[[name]] <- "" [18:03:15.818] } [18:03:15.818] NAMES <- toupper(removed) [18:03:15.818] for (kk in seq_along(NAMES)) { [18:03:15.818] name <- removed[[kk]] [18:03:15.818] NAME <- NAMES[[kk]] [18:03:15.818] if (name != NAME && is.element(NAME, old_names)) [18:03:15.818] next [18:03:15.818] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.818] } [18:03:15.818] if (length(args) > 0) [18:03:15.818] base::do.call(base::Sys.setenv, args = args) [18:03:15.818] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.818] } [18:03:15.818] else { [18:03:15.818] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.818] } [18:03:15.818] { [18:03:15.818] if (base::length(...future.futureOptionsAdded) > [18:03:15.818] 0L) { [18:03:15.818] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.818] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.818] base::options(opts) [18:03:15.818] } [18:03:15.818] { [18:03:15.818] { [18:03:15.818] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.818] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.818] -1344458670L), envir = base::globalenv(), [18:03:15.818] inherits = FALSE) [18:03:15.818] NULL [18:03:15.818] } [18:03:15.818] options(future.plan = NULL) [18:03:15.818] if (is.na(NA_character_)) [18:03:15.818] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.818] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.818] future::plan(list(function (..., envir = parent.frame()) [18:03:15.818] { [18:03:15.818] future <- SequentialFuture(..., envir = envir) [18:03:15.818] if (!future$lazy) [18:03:15.818] future <- run(future) [18:03:15.818] invisible(future) [18:03:15.818] }), .cleanup = FALSE, .init = FALSE) [18:03:15.818] } [18:03:15.818] } [18:03:15.818] } [18:03:15.818] }) [18:03:15.818] if (TRUE) { [18:03:15.818] base::sink(type = "output", split = FALSE) [18:03:15.818] if (TRUE) { [18:03:15.818] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.818] } [18:03:15.818] else { [18:03:15.818] ...future.result["stdout"] <- base::list(NULL) [18:03:15.818] } [18:03:15.818] base::close(...future.stdout) [18:03:15.818] ...future.stdout <- NULL [18:03:15.818] } [18:03:15.818] ...future.result$conditions <- ...future.conditions [18:03:15.818] ...future.result$finished <- base::Sys.time() [18:03:15.818] ...future.result [18:03:15.818] } [18:03:15.822] assign_globals() ... [18:03:15.822] List of 1 [18:03:15.822] $ x: int [1:4] 0 1 2 3 [18:03:15.822] - attr(*, "where")=List of 1 [18:03:15.822] ..$ x: [18:03:15.822] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.822] - attr(*, "resolved")= logi FALSE [18:03:15.822] - attr(*, "total_size")= num 64 [18:03:15.822] - attr(*, "already-done")= logi TRUE [18:03:15.825] - copied 'x' to environment [18:03:15.825] assign_globals() ... done [18:03:15.826] plan(): Setting new future strategy stack: [18:03:15.826] List of future strategies: [18:03:15.826] 1. sequential: [18:03:15.826] - args: function (..., envir = parent.frame()) [18:03:15.826] - tweaked: FALSE [18:03:15.826] - call: NULL [18:03:15.826] plan(): nbrOfWorkers() = 1 [18:03:15.828] plan(): Setting new future strategy stack: [18:03:15.828] List of future strategies: [18:03:15.828] 1. sequential: [18:03:15.828] - args: function (..., envir = parent.frame()) [18:03:15.828] - tweaked: FALSE [18:03:15.828] - call: plan(strategy) [18:03:15.828] plan(): nbrOfWorkers() = 1 [18:03:15.828] SequentialFuture started (and completed) [18:03:15.829] - Launch lazy future ... done [18:03:15.829] run() for 'SequentialFuture' ... done [18:03:15.829] resolve() on list ... [18:03:15.829] recursive: 0 [18:03:15.829] length: 4 [18:03:15.829] [18:03:15.830] resolved() for 'SequentialFuture' ... [18:03:15.830] - state: 'finished' [18:03:15.830] - run: TRUE [18:03:15.830] - result: 'FutureResult' [18:03:15.830] resolved() for 'SequentialFuture' ... done [18:03:15.831] Future #1 [18:03:15.831] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:15.831] - nx: 4 [18:03:15.831] - relay: TRUE [18:03:15.831] - stdout: TRUE [18:03:15.831] - signal: TRUE [18:03:15.832] - resignal: FALSE [18:03:15.832] - force: TRUE [18:03:15.832] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:15.832] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:15.832] - until=1 [18:03:15.833] - relaying element #1 [18:03:15.833] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.833] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.833] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:03:15.834] length: 3 (resolved future 1) [18:03:15.834] resolved() for 'SequentialFuture' ... [18:03:15.834] - state: 'finished' [18:03:15.835] - run: TRUE [18:03:15.835] - result: 'FutureResult' [18:03:15.835] resolved() for 'SequentialFuture' ... done [18:03:15.835] Future #2 [18:03:15.836] signalConditionsASAP(SequentialFuture, pos=2) ... [18:03:15.836] - nx: 4 [18:03:15.836] - relay: TRUE [18:03:15.836] - stdout: TRUE [18:03:15.836] - signal: TRUE [18:03:15.837] - resignal: FALSE [18:03:15.837] - force: TRUE [18:03:15.837] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.837] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.838] - until=2 [18:03:15.838] - relaying element #2 [18:03:15.838] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.838] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.839] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:03:15.839] length: 2 (resolved future 2) [18:03:15.839] resolved() for 'SequentialFuture' ... [18:03:15.839] - state: 'finished' [18:03:15.840] - run: TRUE [18:03:15.840] - result: 'FutureResult' [18:03:15.840] resolved() for 'SequentialFuture' ... done [18:03:15.840] Future #3 [18:03:15.841] signalConditionsASAP(SequentialFuture, pos=3) ... [18:03:15.841] - nx: 4 [18:03:15.841] - relay: TRUE [18:03:15.841] - stdout: TRUE [18:03:15.841] - signal: TRUE [18:03:15.842] - resignal: FALSE [18:03:15.842] - force: TRUE [18:03:15.842] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.842] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.842] - until=3 [18:03:15.843] - relaying element #3 [18:03:15.844] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.845] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.845] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:03:15.845] length: 1 (resolved future 3) [18:03:15.845] resolved() for 'SequentialFuture' ... [18:03:15.846] - state: 'finished' [18:03:15.846] - run: TRUE [18:03:15.846] - result: 'FutureResult' [18:03:15.846] resolved() for 'SequentialFuture' ... done [18:03:15.847] Future #4 [18:03:15.847] signalConditionsASAP(SequentialFuture, pos=4) ... [18:03:15.847] - nx: 4 [18:03:15.847] - relay: TRUE [18:03:15.847] - stdout: TRUE [18:03:15.848] - signal: TRUE [18:03:15.848] - resignal: FALSE [18:03:15.848] - force: TRUE [18:03:15.848] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.848] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.849] - until=4 [18:03:15.849] - relaying element #4 [18:03:15.849] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.849] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.850] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:03:15.850] length: 0 (resolved future 4) [18:03:15.850] Relaying remaining futures [18:03:15.850] signalConditionsASAP(NULL, pos=0) ... [18:03:15.851] - nx: 4 [18:03:15.851] - relay: TRUE [18:03:15.851] - stdout: TRUE [18:03:15.851] - signal: TRUE [18:03:15.851] - resignal: FALSE [18:03:15.852] - force: TRUE [18:03:15.852] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.852] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:15.852] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.852] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.853] signalConditionsASAP(NULL, pos=0) ... done [18:03:15.853] resolve() on list ... DONE [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:15.853] getGlobalsAndPackages() ... [18:03:15.853] Searching for globals... [18:03:15.855] - globals found: [3] '{', 'sample', 'x' [18:03:15.855] Searching for globals ... DONE [18:03:15.855] Resolving globals: FALSE [18:03:15.855] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.856] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.856] - globals: [1] 'x' [18:03:15.856] [18:03:15.856] getGlobalsAndPackages() ... DONE [18:03:15.857] run() for 'Future' ... [18:03:15.857] - state: 'created' [18:03:15.857] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.858] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.858] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.858] - Field: 'label' [18:03:15.858] - Field: 'local' [18:03:15.858] - Field: 'owner' [18:03:15.858] - Field: 'envir' [18:03:15.859] - Field: 'packages' [18:03:15.859] - Field: 'gc' [18:03:15.859] - Field: 'conditions' [18:03:15.859] - Field: 'expr' [18:03:15.859] - Field: 'uuid' [18:03:15.860] - Field: 'seed' [18:03:15.860] - Field: 'version' [18:03:15.860] - Field: 'result' [18:03:15.860] - Field: 'asynchronous' [18:03:15.860] - Field: 'calls' [18:03:15.860] - Field: 'globals' [18:03:15.861] - Field: 'stdout' [18:03:15.861] - Field: 'earlySignal' [18:03:15.861] - Field: 'lazy' [18:03:15.861] - Field: 'state' [18:03:15.861] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.861] - Launch lazy future ... [18:03:15.862] Packages needed by the future expression (n = 0): [18:03:15.862] Packages needed by future strategies (n = 0): [18:03:15.862] { [18:03:15.862] { [18:03:15.862] { [18:03:15.862] ...future.startTime <- base::Sys.time() [18:03:15.862] { [18:03:15.862] { [18:03:15.862] { [18:03:15.862] { [18:03:15.862] base::local({ [18:03:15.862] has_future <- base::requireNamespace("future", [18:03:15.862] quietly = TRUE) [18:03:15.862] if (has_future) { [18:03:15.862] ns <- base::getNamespace("future") [18:03:15.862] version <- ns[[".package"]][["version"]] [18:03:15.862] if (is.null(version)) [18:03:15.862] version <- utils::packageVersion("future") [18:03:15.862] } [18:03:15.862] else { [18:03:15.862] version <- NULL [18:03:15.862] } [18:03:15.862] if (!has_future || version < "1.8.0") { [18:03:15.862] info <- base::c(r_version = base::gsub("R version ", [18:03:15.862] "", base::R.version$version.string), [18:03:15.862] platform = base::sprintf("%s (%s-bit)", [18:03:15.862] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.862] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.862] "release", "version")], collapse = " "), [18:03:15.862] hostname = base::Sys.info()[["nodename"]]) [18:03:15.862] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.862] info) [18:03:15.862] info <- base::paste(info, collapse = "; ") [18:03:15.862] if (!has_future) { [18:03:15.862] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.862] info) [18:03:15.862] } [18:03:15.862] else { [18:03:15.862] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.862] info, version) [18:03:15.862] } [18:03:15.862] base::stop(msg) [18:03:15.862] } [18:03:15.862] }) [18:03:15.862] } [18:03:15.862] options(future.plan = NULL) [18:03:15.862] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.862] future::plan("default", .cleanup = FALSE, [18:03:15.862] .init = FALSE) [18:03:15.862] } [18:03:15.862] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:15.862] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:15.862] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:15.862] } [18:03:15.862] ...future.workdir <- getwd() [18:03:15.862] } [18:03:15.862] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.862] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.862] } [18:03:15.862] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.862] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.862] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.862] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.862] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.862] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.862] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.862] base::names(...future.oldOptions)) [18:03:15.862] } [18:03:15.862] if (FALSE) { [18:03:15.862] } [18:03:15.862] else { [18:03:15.862] if (TRUE) { [18:03:15.862] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.862] open = "w") [18:03:15.862] } [18:03:15.862] else { [18:03:15.862] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.862] windows = "NUL", "/dev/null"), open = "w") [18:03:15.862] } [18:03:15.862] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.862] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.862] base::sink(type = "output", split = FALSE) [18:03:15.862] base::close(...future.stdout) [18:03:15.862] }, add = TRUE) [18:03:15.862] } [18:03:15.862] ...future.frame <- base::sys.nframe() [18:03:15.862] ...future.conditions <- base::list() [18:03:15.862] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.862] if (FALSE) { [18:03:15.862] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.862] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.862] } [18:03:15.862] ...future.result <- base::tryCatch({ [18:03:15.862] base::withCallingHandlers({ [18:03:15.862] ...future.value <- base::withVisible(base::local({ [18:03:15.862] sample(x, size = 1L) [18:03:15.862] })) [18:03:15.862] future::FutureResult(value = ...future.value$value, [18:03:15.862] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.862] ...future.rng), globalenv = if (FALSE) [18:03:15.862] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.862] ...future.globalenv.names)) [18:03:15.862] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.862] }, condition = base::local({ [18:03:15.862] c <- base::c [18:03:15.862] inherits <- base::inherits [18:03:15.862] invokeRestart <- base::invokeRestart [18:03:15.862] length <- base::length [18:03:15.862] list <- base::list [18:03:15.862] seq.int <- base::seq.int [18:03:15.862] signalCondition <- base::signalCondition [18:03:15.862] sys.calls <- base::sys.calls [18:03:15.862] `[[` <- base::`[[` [18:03:15.862] `+` <- base::`+` [18:03:15.862] `<<-` <- base::`<<-` [18:03:15.862] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.862] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.862] 3L)] [18:03:15.862] } [18:03:15.862] function(cond) { [18:03:15.862] is_error <- inherits(cond, "error") [18:03:15.862] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.862] NULL) [18:03:15.862] if (is_error) { [18:03:15.862] sessionInformation <- function() { [18:03:15.862] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.862] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.862] search = base::search(), system = base::Sys.info()) [18:03:15.862] } [18:03:15.862] ...future.conditions[[length(...future.conditions) + [18:03:15.862] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.862] cond$call), session = sessionInformation(), [18:03:15.862] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.862] signalCondition(cond) [18:03:15.862] } [18:03:15.862] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.862] "immediateCondition"))) { [18:03:15.862] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.862] ...future.conditions[[length(...future.conditions) + [18:03:15.862] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.862] if (TRUE && !signal) { [18:03:15.862] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.862] { [18:03:15.862] inherits <- base::inherits [18:03:15.862] invokeRestart <- base::invokeRestart [18:03:15.862] is.null <- base::is.null [18:03:15.862] muffled <- FALSE [18:03:15.862] if (inherits(cond, "message")) { [18:03:15.862] muffled <- grepl(pattern, "muffleMessage") [18:03:15.862] if (muffled) [18:03:15.862] invokeRestart("muffleMessage") [18:03:15.862] } [18:03:15.862] else if (inherits(cond, "warning")) { [18:03:15.862] muffled <- grepl(pattern, "muffleWarning") [18:03:15.862] if (muffled) [18:03:15.862] invokeRestart("muffleWarning") [18:03:15.862] } [18:03:15.862] else if (inherits(cond, "condition")) { [18:03:15.862] if (!is.null(pattern)) { [18:03:15.862] computeRestarts <- base::computeRestarts [18:03:15.862] grepl <- base::grepl [18:03:15.862] restarts <- computeRestarts(cond) [18:03:15.862] for (restart in restarts) { [18:03:15.862] name <- restart$name [18:03:15.862] if (is.null(name)) [18:03:15.862] next [18:03:15.862] if (!grepl(pattern, name)) [18:03:15.862] next [18:03:15.862] invokeRestart(restart) [18:03:15.862] muffled <- TRUE [18:03:15.862] break [18:03:15.862] } [18:03:15.862] } [18:03:15.862] } [18:03:15.862] invisible(muffled) [18:03:15.862] } [18:03:15.862] muffleCondition(cond, pattern = "^muffle") [18:03:15.862] } [18:03:15.862] } [18:03:15.862] else { [18:03:15.862] if (TRUE) { [18:03:15.862] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.862] { [18:03:15.862] inherits <- base::inherits [18:03:15.862] invokeRestart <- base::invokeRestart [18:03:15.862] is.null <- base::is.null [18:03:15.862] muffled <- FALSE [18:03:15.862] if (inherits(cond, "message")) { [18:03:15.862] muffled <- grepl(pattern, "muffleMessage") [18:03:15.862] if (muffled) [18:03:15.862] invokeRestart("muffleMessage") [18:03:15.862] } [18:03:15.862] else if (inherits(cond, "warning")) { [18:03:15.862] muffled <- grepl(pattern, "muffleWarning") [18:03:15.862] if (muffled) [18:03:15.862] invokeRestart("muffleWarning") [18:03:15.862] } [18:03:15.862] else if (inherits(cond, "condition")) { [18:03:15.862] if (!is.null(pattern)) { [18:03:15.862] computeRestarts <- base::computeRestarts [18:03:15.862] grepl <- base::grepl [18:03:15.862] restarts <- computeRestarts(cond) [18:03:15.862] for (restart in restarts) { [18:03:15.862] name <- restart$name [18:03:15.862] if (is.null(name)) [18:03:15.862] next [18:03:15.862] if (!grepl(pattern, name)) [18:03:15.862] next [18:03:15.862] invokeRestart(restart) [18:03:15.862] muffled <- TRUE [18:03:15.862] break [18:03:15.862] } [18:03:15.862] } [18:03:15.862] } [18:03:15.862] invisible(muffled) [18:03:15.862] } [18:03:15.862] muffleCondition(cond, pattern = "^muffle") [18:03:15.862] } [18:03:15.862] } [18:03:15.862] } [18:03:15.862] })) [18:03:15.862] }, error = function(ex) { [18:03:15.862] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.862] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.862] ...future.rng), started = ...future.startTime, [18:03:15.862] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.862] version = "1.8"), class = "FutureResult") [18:03:15.862] }, finally = { [18:03:15.862] if (!identical(...future.workdir, getwd())) [18:03:15.862] setwd(...future.workdir) [18:03:15.862] { [18:03:15.862] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.862] ...future.oldOptions$nwarnings <- NULL [18:03:15.862] } [18:03:15.862] base::options(...future.oldOptions) [18:03:15.862] if (.Platform$OS.type == "windows") { [18:03:15.862] old_names <- names(...future.oldEnvVars) [18:03:15.862] envs <- base::Sys.getenv() [18:03:15.862] names <- names(envs) [18:03:15.862] common <- intersect(names, old_names) [18:03:15.862] added <- setdiff(names, old_names) [18:03:15.862] removed <- setdiff(old_names, names) [18:03:15.862] changed <- common[...future.oldEnvVars[common] != [18:03:15.862] envs[common]] [18:03:15.862] NAMES <- toupper(changed) [18:03:15.862] args <- list() [18:03:15.862] for (kk in seq_along(NAMES)) { [18:03:15.862] name <- changed[[kk]] [18:03:15.862] NAME <- NAMES[[kk]] [18:03:15.862] if (name != NAME && is.element(NAME, old_names)) [18:03:15.862] next [18:03:15.862] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.862] } [18:03:15.862] NAMES <- toupper(added) [18:03:15.862] for (kk in seq_along(NAMES)) { [18:03:15.862] name <- added[[kk]] [18:03:15.862] NAME <- NAMES[[kk]] [18:03:15.862] if (name != NAME && is.element(NAME, old_names)) [18:03:15.862] next [18:03:15.862] args[[name]] <- "" [18:03:15.862] } [18:03:15.862] NAMES <- toupper(removed) [18:03:15.862] for (kk in seq_along(NAMES)) { [18:03:15.862] name <- removed[[kk]] [18:03:15.862] NAME <- NAMES[[kk]] [18:03:15.862] if (name != NAME && is.element(NAME, old_names)) [18:03:15.862] next [18:03:15.862] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.862] } [18:03:15.862] if (length(args) > 0) [18:03:15.862] base::do.call(base::Sys.setenv, args = args) [18:03:15.862] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.862] } [18:03:15.862] else { [18:03:15.862] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.862] } [18:03:15.862] { [18:03:15.862] if (base::length(...future.futureOptionsAdded) > [18:03:15.862] 0L) { [18:03:15.862] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.862] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.862] base::options(opts) [18:03:15.862] } [18:03:15.862] { [18:03:15.862] { [18:03:15.862] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.862] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.862] -1344458670L), envir = base::globalenv(), [18:03:15.862] inherits = FALSE) [18:03:15.862] NULL [18:03:15.862] } [18:03:15.862] options(future.plan = NULL) [18:03:15.862] if (is.na(NA_character_)) [18:03:15.862] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.862] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.862] future::plan(list(function (..., envir = parent.frame()) [18:03:15.862] { [18:03:15.862] future <- SequentialFuture(..., envir = envir) [18:03:15.862] if (!future$lazy) [18:03:15.862] future <- run(future) [18:03:15.862] invisible(future) [18:03:15.862] }), .cleanup = FALSE, .init = FALSE) [18:03:15.862] } [18:03:15.862] } [18:03:15.862] } [18:03:15.862] }) [18:03:15.862] if (TRUE) { [18:03:15.862] base::sink(type = "output", split = FALSE) [18:03:15.862] if (TRUE) { [18:03:15.862] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.862] } [18:03:15.862] else { [18:03:15.862] ...future.result["stdout"] <- base::list(NULL) [18:03:15.862] } [18:03:15.862] base::close(...future.stdout) [18:03:15.862] ...future.stdout <- NULL [18:03:15.862] } [18:03:15.862] ...future.result$conditions <- ...future.conditions [18:03:15.862] ...future.result$finished <- base::Sys.time() [18:03:15.862] ...future.result [18:03:15.862] } [18:03:15.866] assign_globals() ... [18:03:15.866] List of 1 [18:03:15.866] $ x: int [1:4] 0 1 2 3 [18:03:15.866] - attr(*, "where")=List of 1 [18:03:15.866] ..$ x: [18:03:15.866] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.866] - attr(*, "resolved")= logi FALSE [18:03:15.866] - attr(*, "total_size")= num 64 [18:03:15.866] - attr(*, "already-done")= logi TRUE [18:03:15.869] - copied 'x' to environment [18:03:15.870] assign_globals() ... done [18:03:15.870] plan(): Setting new future strategy stack: [18:03:15.870] List of future strategies: [18:03:15.870] 1. sequential: [18:03:15.870] - args: function (..., envir = parent.frame()) [18:03:15.870] - tweaked: FALSE [18:03:15.870] - call: NULL [18:03:15.871] plan(): nbrOfWorkers() = 1 [18:03:15.872] plan(): Setting new future strategy stack: [18:03:15.872] List of future strategies: [18:03:15.872] 1. sequential: [18:03:15.872] - args: function (..., envir = parent.frame()) [18:03:15.872] - tweaked: FALSE [18:03:15.872] - call: plan(strategy) [18:03:15.872] plan(): nbrOfWorkers() = 1 [18:03:15.873] SequentialFuture started (and completed) [18:03:15.873] - Launch lazy future ... done [18:03:15.873] run() for 'SequentialFuture' ... done [18:03:15.873] getGlobalsAndPackages() ... [18:03:15.873] Searching for globals... [18:03:15.874] - globals found: [3] '{', 'sample', 'x' [18:03:15.875] Searching for globals ... DONE [18:03:15.875] Resolving globals: FALSE [18:03:15.875] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.876] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.876] - globals: [1] 'x' [18:03:15.876] [18:03:15.876] getGlobalsAndPackages() ... DONE [18:03:15.877] run() for 'Future' ... [18:03:15.877] - state: 'created' [18:03:15.877] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.877] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.878] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.878] - Field: 'label' [18:03:15.878] - Field: 'local' [18:03:15.878] - Field: 'owner' [18:03:15.878] - Field: 'envir' [18:03:15.878] - Field: 'packages' [18:03:15.879] - Field: 'gc' [18:03:15.879] - Field: 'conditions' [18:03:15.879] - Field: 'expr' [18:03:15.879] - Field: 'uuid' [18:03:15.879] - Field: 'seed' [18:03:15.879] - Field: 'version' [18:03:15.880] - Field: 'result' [18:03:15.880] - Field: 'asynchronous' [18:03:15.880] - Field: 'calls' [18:03:15.880] - Field: 'globals' [18:03:15.880] - Field: 'stdout' [18:03:15.881] - Field: 'earlySignal' [18:03:15.881] - Field: 'lazy' [18:03:15.881] - Field: 'state' [18:03:15.881] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.881] - Launch lazy future ... [18:03:15.881] Packages needed by the future expression (n = 0): [18:03:15.882] Packages needed by future strategies (n = 0): [18:03:15.882] { [18:03:15.882] { [18:03:15.882] { [18:03:15.882] ...future.startTime <- base::Sys.time() [18:03:15.882] { [18:03:15.882] { [18:03:15.882] { [18:03:15.882] { [18:03:15.882] base::local({ [18:03:15.882] has_future <- base::requireNamespace("future", [18:03:15.882] quietly = TRUE) [18:03:15.882] if (has_future) { [18:03:15.882] ns <- base::getNamespace("future") [18:03:15.882] version <- ns[[".package"]][["version"]] [18:03:15.882] if (is.null(version)) [18:03:15.882] version <- utils::packageVersion("future") [18:03:15.882] } [18:03:15.882] else { [18:03:15.882] version <- NULL [18:03:15.882] } [18:03:15.882] if (!has_future || version < "1.8.0") { [18:03:15.882] info <- base::c(r_version = base::gsub("R version ", [18:03:15.882] "", base::R.version$version.string), [18:03:15.882] platform = base::sprintf("%s (%s-bit)", [18:03:15.882] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.882] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.882] "release", "version")], collapse = " "), [18:03:15.882] hostname = base::Sys.info()[["nodename"]]) [18:03:15.882] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.882] info) [18:03:15.882] info <- base::paste(info, collapse = "; ") [18:03:15.882] if (!has_future) { [18:03:15.882] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.882] info) [18:03:15.882] } [18:03:15.882] else { [18:03:15.882] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.882] info, version) [18:03:15.882] } [18:03:15.882] base::stop(msg) [18:03:15.882] } [18:03:15.882] }) [18:03:15.882] } [18:03:15.882] options(future.plan = NULL) [18:03:15.882] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.882] future::plan("default", .cleanup = FALSE, [18:03:15.882] .init = FALSE) [18:03:15.882] } [18:03:15.882] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:15.882] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:15.882] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:15.882] } [18:03:15.882] ...future.workdir <- getwd() [18:03:15.882] } [18:03:15.882] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.882] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.882] } [18:03:15.882] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.882] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.882] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.882] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.882] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.882] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.882] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.882] base::names(...future.oldOptions)) [18:03:15.882] } [18:03:15.882] if (FALSE) { [18:03:15.882] } [18:03:15.882] else { [18:03:15.882] if (TRUE) { [18:03:15.882] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.882] open = "w") [18:03:15.882] } [18:03:15.882] else { [18:03:15.882] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.882] windows = "NUL", "/dev/null"), open = "w") [18:03:15.882] } [18:03:15.882] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.882] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.882] base::sink(type = "output", split = FALSE) [18:03:15.882] base::close(...future.stdout) [18:03:15.882] }, add = TRUE) [18:03:15.882] } [18:03:15.882] ...future.frame <- base::sys.nframe() [18:03:15.882] ...future.conditions <- base::list() [18:03:15.882] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.882] if (FALSE) { [18:03:15.882] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.882] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.882] } [18:03:15.882] ...future.result <- base::tryCatch({ [18:03:15.882] base::withCallingHandlers({ [18:03:15.882] ...future.value <- base::withVisible(base::local({ [18:03:15.882] sample(x, size = 1L) [18:03:15.882] })) [18:03:15.882] future::FutureResult(value = ...future.value$value, [18:03:15.882] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.882] ...future.rng), globalenv = if (FALSE) [18:03:15.882] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.882] ...future.globalenv.names)) [18:03:15.882] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.882] }, condition = base::local({ [18:03:15.882] c <- base::c [18:03:15.882] inherits <- base::inherits [18:03:15.882] invokeRestart <- base::invokeRestart [18:03:15.882] length <- base::length [18:03:15.882] list <- base::list [18:03:15.882] seq.int <- base::seq.int [18:03:15.882] signalCondition <- base::signalCondition [18:03:15.882] sys.calls <- base::sys.calls [18:03:15.882] `[[` <- base::`[[` [18:03:15.882] `+` <- base::`+` [18:03:15.882] `<<-` <- base::`<<-` [18:03:15.882] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.882] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.882] 3L)] [18:03:15.882] } [18:03:15.882] function(cond) { [18:03:15.882] is_error <- inherits(cond, "error") [18:03:15.882] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.882] NULL) [18:03:15.882] if (is_error) { [18:03:15.882] sessionInformation <- function() { [18:03:15.882] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.882] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.882] search = base::search(), system = base::Sys.info()) [18:03:15.882] } [18:03:15.882] ...future.conditions[[length(...future.conditions) + [18:03:15.882] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.882] cond$call), session = sessionInformation(), [18:03:15.882] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.882] signalCondition(cond) [18:03:15.882] } [18:03:15.882] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.882] "immediateCondition"))) { [18:03:15.882] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.882] ...future.conditions[[length(...future.conditions) + [18:03:15.882] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.882] if (TRUE && !signal) { [18:03:15.882] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.882] { [18:03:15.882] inherits <- base::inherits [18:03:15.882] invokeRestart <- base::invokeRestart [18:03:15.882] is.null <- base::is.null [18:03:15.882] muffled <- FALSE [18:03:15.882] if (inherits(cond, "message")) { [18:03:15.882] muffled <- grepl(pattern, "muffleMessage") [18:03:15.882] if (muffled) [18:03:15.882] invokeRestart("muffleMessage") [18:03:15.882] } [18:03:15.882] else if (inherits(cond, "warning")) { [18:03:15.882] muffled <- grepl(pattern, "muffleWarning") [18:03:15.882] if (muffled) [18:03:15.882] invokeRestart("muffleWarning") [18:03:15.882] } [18:03:15.882] else if (inherits(cond, "condition")) { [18:03:15.882] if (!is.null(pattern)) { [18:03:15.882] computeRestarts <- base::computeRestarts [18:03:15.882] grepl <- base::grepl [18:03:15.882] restarts <- computeRestarts(cond) [18:03:15.882] for (restart in restarts) { [18:03:15.882] name <- restart$name [18:03:15.882] if (is.null(name)) [18:03:15.882] next [18:03:15.882] if (!grepl(pattern, name)) [18:03:15.882] next [18:03:15.882] invokeRestart(restart) [18:03:15.882] muffled <- TRUE [18:03:15.882] break [18:03:15.882] } [18:03:15.882] } [18:03:15.882] } [18:03:15.882] invisible(muffled) [18:03:15.882] } [18:03:15.882] muffleCondition(cond, pattern = "^muffle") [18:03:15.882] } [18:03:15.882] } [18:03:15.882] else { [18:03:15.882] if (TRUE) { [18:03:15.882] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.882] { [18:03:15.882] inherits <- base::inherits [18:03:15.882] invokeRestart <- base::invokeRestart [18:03:15.882] is.null <- base::is.null [18:03:15.882] muffled <- FALSE [18:03:15.882] if (inherits(cond, "message")) { [18:03:15.882] muffled <- grepl(pattern, "muffleMessage") [18:03:15.882] if (muffled) [18:03:15.882] invokeRestart("muffleMessage") [18:03:15.882] } [18:03:15.882] else if (inherits(cond, "warning")) { [18:03:15.882] muffled <- grepl(pattern, "muffleWarning") [18:03:15.882] if (muffled) [18:03:15.882] invokeRestart("muffleWarning") [18:03:15.882] } [18:03:15.882] else if (inherits(cond, "condition")) { [18:03:15.882] if (!is.null(pattern)) { [18:03:15.882] computeRestarts <- base::computeRestarts [18:03:15.882] grepl <- base::grepl [18:03:15.882] restarts <- computeRestarts(cond) [18:03:15.882] for (restart in restarts) { [18:03:15.882] name <- restart$name [18:03:15.882] if (is.null(name)) [18:03:15.882] next [18:03:15.882] if (!grepl(pattern, name)) [18:03:15.882] next [18:03:15.882] invokeRestart(restart) [18:03:15.882] muffled <- TRUE [18:03:15.882] break [18:03:15.882] } [18:03:15.882] } [18:03:15.882] } [18:03:15.882] invisible(muffled) [18:03:15.882] } [18:03:15.882] muffleCondition(cond, pattern = "^muffle") [18:03:15.882] } [18:03:15.882] } [18:03:15.882] } [18:03:15.882] })) [18:03:15.882] }, error = function(ex) { [18:03:15.882] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.882] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.882] ...future.rng), started = ...future.startTime, [18:03:15.882] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.882] version = "1.8"), class = "FutureResult") [18:03:15.882] }, finally = { [18:03:15.882] if (!identical(...future.workdir, getwd())) [18:03:15.882] setwd(...future.workdir) [18:03:15.882] { [18:03:15.882] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.882] ...future.oldOptions$nwarnings <- NULL [18:03:15.882] } [18:03:15.882] base::options(...future.oldOptions) [18:03:15.882] if (.Platform$OS.type == "windows") { [18:03:15.882] old_names <- names(...future.oldEnvVars) [18:03:15.882] envs <- base::Sys.getenv() [18:03:15.882] names <- names(envs) [18:03:15.882] common <- intersect(names, old_names) [18:03:15.882] added <- setdiff(names, old_names) [18:03:15.882] removed <- setdiff(old_names, names) [18:03:15.882] changed <- common[...future.oldEnvVars[common] != [18:03:15.882] envs[common]] [18:03:15.882] NAMES <- toupper(changed) [18:03:15.882] args <- list() [18:03:15.882] for (kk in seq_along(NAMES)) { [18:03:15.882] name <- changed[[kk]] [18:03:15.882] NAME <- NAMES[[kk]] [18:03:15.882] if (name != NAME && is.element(NAME, old_names)) [18:03:15.882] next [18:03:15.882] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.882] } [18:03:15.882] NAMES <- toupper(added) [18:03:15.882] for (kk in seq_along(NAMES)) { [18:03:15.882] name <- added[[kk]] [18:03:15.882] NAME <- NAMES[[kk]] [18:03:15.882] if (name != NAME && is.element(NAME, old_names)) [18:03:15.882] next [18:03:15.882] args[[name]] <- "" [18:03:15.882] } [18:03:15.882] NAMES <- toupper(removed) [18:03:15.882] for (kk in seq_along(NAMES)) { [18:03:15.882] name <- removed[[kk]] [18:03:15.882] NAME <- NAMES[[kk]] [18:03:15.882] if (name != NAME && is.element(NAME, old_names)) [18:03:15.882] next [18:03:15.882] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.882] } [18:03:15.882] if (length(args) > 0) [18:03:15.882] base::do.call(base::Sys.setenv, args = args) [18:03:15.882] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.882] } [18:03:15.882] else { [18:03:15.882] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.882] } [18:03:15.882] { [18:03:15.882] if (base::length(...future.futureOptionsAdded) > [18:03:15.882] 0L) { [18:03:15.882] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.882] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.882] base::options(opts) [18:03:15.882] } [18:03:15.882] { [18:03:15.882] { [18:03:15.882] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.882] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.882] -1344458670L), envir = base::globalenv(), [18:03:15.882] inherits = FALSE) [18:03:15.882] NULL [18:03:15.882] } [18:03:15.882] options(future.plan = NULL) [18:03:15.882] if (is.na(NA_character_)) [18:03:15.882] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.882] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.882] future::plan(list(function (..., envir = parent.frame()) [18:03:15.882] { [18:03:15.882] future <- SequentialFuture(..., envir = envir) [18:03:15.882] if (!future$lazy) [18:03:15.882] future <- run(future) [18:03:15.882] invisible(future) [18:03:15.882] }), .cleanup = FALSE, .init = FALSE) [18:03:15.882] } [18:03:15.882] } [18:03:15.882] } [18:03:15.882] }) [18:03:15.882] if (TRUE) { [18:03:15.882] base::sink(type = "output", split = FALSE) [18:03:15.882] if (TRUE) { [18:03:15.882] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.882] } [18:03:15.882] else { [18:03:15.882] ...future.result["stdout"] <- base::list(NULL) [18:03:15.882] } [18:03:15.882] base::close(...future.stdout) [18:03:15.882] ...future.stdout <- NULL [18:03:15.882] } [18:03:15.882] ...future.result$conditions <- ...future.conditions [18:03:15.882] ...future.result$finished <- base::Sys.time() [18:03:15.882] ...future.result [18:03:15.882] } [18:03:15.886] assign_globals() ... [18:03:15.886] List of 1 [18:03:15.886] $ x: int [1:4] 0 1 2 3 [18:03:15.886] - attr(*, "where")=List of 1 [18:03:15.886] ..$ x: [18:03:15.886] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.886] - attr(*, "resolved")= logi FALSE [18:03:15.886] - attr(*, "total_size")= num 64 [18:03:15.886] - attr(*, "already-done")= logi TRUE [18:03:15.890] - copied 'x' to environment [18:03:15.890] assign_globals() ... done [18:03:15.891] plan(): Setting new future strategy stack: [18:03:15.891] List of future strategies: [18:03:15.891] 1. sequential: [18:03:15.891] - args: function (..., envir = parent.frame()) [18:03:15.891] - tweaked: FALSE [18:03:15.891] - call: NULL [18:03:15.891] plan(): nbrOfWorkers() = 1 [18:03:15.892] plan(): Setting new future strategy stack: [18:03:15.893] List of future strategies: [18:03:15.893] 1. sequential: [18:03:15.893] - args: function (..., envir = parent.frame()) [18:03:15.893] - tweaked: FALSE [18:03:15.893] - call: plan(strategy) [18:03:15.893] plan(): nbrOfWorkers() = 1 [18:03:15.893] SequentialFuture started (and completed) [18:03:15.894] - Launch lazy future ... done [18:03:15.894] run() for 'SequentialFuture' ... done [18:03:15.894] getGlobalsAndPackages() ... [18:03:15.894] Searching for globals... [18:03:15.895] - globals found: [3] '{', 'sample', 'x' [18:03:15.895] Searching for globals ... DONE [18:03:15.896] Resolving globals: FALSE [18:03:15.896] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.896] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.897] - globals: [1] 'x' [18:03:15.897] [18:03:15.897] getGlobalsAndPackages() ... DONE [18:03:15.897] run() for 'Future' ... [18:03:15.897] - state: 'created' [18:03:15.898] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.898] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.898] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.898] - Field: 'label' [18:03:15.899] - Field: 'local' [18:03:15.899] - Field: 'owner' [18:03:15.899] - Field: 'envir' [18:03:15.899] - Field: 'packages' [18:03:15.899] - Field: 'gc' [18:03:15.899] - Field: 'conditions' [18:03:15.900] - Field: 'expr' [18:03:15.900] - Field: 'uuid' [18:03:15.900] - Field: 'seed' [18:03:15.900] - Field: 'version' [18:03:15.900] - Field: 'result' [18:03:15.901] - Field: 'asynchronous' [18:03:15.901] - Field: 'calls' [18:03:15.901] - Field: 'globals' [18:03:15.901] - Field: 'stdout' [18:03:15.901] - Field: 'earlySignal' [18:03:15.901] - Field: 'lazy' [18:03:15.902] - Field: 'state' [18:03:15.902] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.902] - Launch lazy future ... [18:03:15.902] Packages needed by the future expression (n = 0): [18:03:15.902] Packages needed by future strategies (n = 0): [18:03:15.903] { [18:03:15.903] { [18:03:15.903] { [18:03:15.903] ...future.startTime <- base::Sys.time() [18:03:15.903] { [18:03:15.903] { [18:03:15.903] { [18:03:15.903] { [18:03:15.903] base::local({ [18:03:15.903] has_future <- base::requireNamespace("future", [18:03:15.903] quietly = TRUE) [18:03:15.903] if (has_future) { [18:03:15.903] ns <- base::getNamespace("future") [18:03:15.903] version <- ns[[".package"]][["version"]] [18:03:15.903] if (is.null(version)) [18:03:15.903] version <- utils::packageVersion("future") [18:03:15.903] } [18:03:15.903] else { [18:03:15.903] version <- NULL [18:03:15.903] } [18:03:15.903] if (!has_future || version < "1.8.0") { [18:03:15.903] info <- base::c(r_version = base::gsub("R version ", [18:03:15.903] "", base::R.version$version.string), [18:03:15.903] platform = base::sprintf("%s (%s-bit)", [18:03:15.903] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.903] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.903] "release", "version")], collapse = " "), [18:03:15.903] hostname = base::Sys.info()[["nodename"]]) [18:03:15.903] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.903] info) [18:03:15.903] info <- base::paste(info, collapse = "; ") [18:03:15.903] if (!has_future) { [18:03:15.903] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.903] info) [18:03:15.903] } [18:03:15.903] else { [18:03:15.903] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.903] info, version) [18:03:15.903] } [18:03:15.903] base::stop(msg) [18:03:15.903] } [18:03:15.903] }) [18:03:15.903] } [18:03:15.903] options(future.plan = NULL) [18:03:15.903] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.903] future::plan("default", .cleanup = FALSE, [18:03:15.903] .init = FALSE) [18:03:15.903] } [18:03:15.903] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:15.903] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:15.903] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:15.903] } [18:03:15.903] ...future.workdir <- getwd() [18:03:15.903] } [18:03:15.903] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.903] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.903] } [18:03:15.903] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.903] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.903] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.903] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.903] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.903] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.903] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.903] base::names(...future.oldOptions)) [18:03:15.903] } [18:03:15.903] if (FALSE) { [18:03:15.903] } [18:03:15.903] else { [18:03:15.903] if (TRUE) { [18:03:15.903] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.903] open = "w") [18:03:15.903] } [18:03:15.903] else { [18:03:15.903] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.903] windows = "NUL", "/dev/null"), open = "w") [18:03:15.903] } [18:03:15.903] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.903] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.903] base::sink(type = "output", split = FALSE) [18:03:15.903] base::close(...future.stdout) [18:03:15.903] }, add = TRUE) [18:03:15.903] } [18:03:15.903] ...future.frame <- base::sys.nframe() [18:03:15.903] ...future.conditions <- base::list() [18:03:15.903] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.903] if (FALSE) { [18:03:15.903] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.903] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.903] } [18:03:15.903] ...future.result <- base::tryCatch({ [18:03:15.903] base::withCallingHandlers({ [18:03:15.903] ...future.value <- base::withVisible(base::local({ [18:03:15.903] sample(x, size = 1L) [18:03:15.903] })) [18:03:15.903] future::FutureResult(value = ...future.value$value, [18:03:15.903] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.903] ...future.rng), globalenv = if (FALSE) [18:03:15.903] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.903] ...future.globalenv.names)) [18:03:15.903] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.903] }, condition = base::local({ [18:03:15.903] c <- base::c [18:03:15.903] inherits <- base::inherits [18:03:15.903] invokeRestart <- base::invokeRestart [18:03:15.903] length <- base::length [18:03:15.903] list <- base::list [18:03:15.903] seq.int <- base::seq.int [18:03:15.903] signalCondition <- base::signalCondition [18:03:15.903] sys.calls <- base::sys.calls [18:03:15.903] `[[` <- base::`[[` [18:03:15.903] `+` <- base::`+` [18:03:15.903] `<<-` <- base::`<<-` [18:03:15.903] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.903] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.903] 3L)] [18:03:15.903] } [18:03:15.903] function(cond) { [18:03:15.903] is_error <- inherits(cond, "error") [18:03:15.903] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.903] NULL) [18:03:15.903] if (is_error) { [18:03:15.903] sessionInformation <- function() { [18:03:15.903] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.903] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.903] search = base::search(), system = base::Sys.info()) [18:03:15.903] } [18:03:15.903] ...future.conditions[[length(...future.conditions) + [18:03:15.903] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.903] cond$call), session = sessionInformation(), [18:03:15.903] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.903] signalCondition(cond) [18:03:15.903] } [18:03:15.903] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.903] "immediateCondition"))) { [18:03:15.903] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.903] ...future.conditions[[length(...future.conditions) + [18:03:15.903] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.903] if (TRUE && !signal) { [18:03:15.903] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.903] { [18:03:15.903] inherits <- base::inherits [18:03:15.903] invokeRestart <- base::invokeRestart [18:03:15.903] is.null <- base::is.null [18:03:15.903] muffled <- FALSE [18:03:15.903] if (inherits(cond, "message")) { [18:03:15.903] muffled <- grepl(pattern, "muffleMessage") [18:03:15.903] if (muffled) [18:03:15.903] invokeRestart("muffleMessage") [18:03:15.903] } [18:03:15.903] else if (inherits(cond, "warning")) { [18:03:15.903] muffled <- grepl(pattern, "muffleWarning") [18:03:15.903] if (muffled) [18:03:15.903] invokeRestart("muffleWarning") [18:03:15.903] } [18:03:15.903] else if (inherits(cond, "condition")) { [18:03:15.903] if (!is.null(pattern)) { [18:03:15.903] computeRestarts <- base::computeRestarts [18:03:15.903] grepl <- base::grepl [18:03:15.903] restarts <- computeRestarts(cond) [18:03:15.903] for (restart in restarts) { [18:03:15.903] name <- restart$name [18:03:15.903] if (is.null(name)) [18:03:15.903] next [18:03:15.903] if (!grepl(pattern, name)) [18:03:15.903] next [18:03:15.903] invokeRestart(restart) [18:03:15.903] muffled <- TRUE [18:03:15.903] break [18:03:15.903] } [18:03:15.903] } [18:03:15.903] } [18:03:15.903] invisible(muffled) [18:03:15.903] } [18:03:15.903] muffleCondition(cond, pattern = "^muffle") [18:03:15.903] } [18:03:15.903] } [18:03:15.903] else { [18:03:15.903] if (TRUE) { [18:03:15.903] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.903] { [18:03:15.903] inherits <- base::inherits [18:03:15.903] invokeRestart <- base::invokeRestart [18:03:15.903] is.null <- base::is.null [18:03:15.903] muffled <- FALSE [18:03:15.903] if (inherits(cond, "message")) { [18:03:15.903] muffled <- grepl(pattern, "muffleMessage") [18:03:15.903] if (muffled) [18:03:15.903] invokeRestart("muffleMessage") [18:03:15.903] } [18:03:15.903] else if (inherits(cond, "warning")) { [18:03:15.903] muffled <- grepl(pattern, "muffleWarning") [18:03:15.903] if (muffled) [18:03:15.903] invokeRestart("muffleWarning") [18:03:15.903] } [18:03:15.903] else if (inherits(cond, "condition")) { [18:03:15.903] if (!is.null(pattern)) { [18:03:15.903] computeRestarts <- base::computeRestarts [18:03:15.903] grepl <- base::grepl [18:03:15.903] restarts <- computeRestarts(cond) [18:03:15.903] for (restart in restarts) { [18:03:15.903] name <- restart$name [18:03:15.903] if (is.null(name)) [18:03:15.903] next [18:03:15.903] if (!grepl(pattern, name)) [18:03:15.903] next [18:03:15.903] invokeRestart(restart) [18:03:15.903] muffled <- TRUE [18:03:15.903] break [18:03:15.903] } [18:03:15.903] } [18:03:15.903] } [18:03:15.903] invisible(muffled) [18:03:15.903] } [18:03:15.903] muffleCondition(cond, pattern = "^muffle") [18:03:15.903] } [18:03:15.903] } [18:03:15.903] } [18:03:15.903] })) [18:03:15.903] }, error = function(ex) { [18:03:15.903] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.903] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.903] ...future.rng), started = ...future.startTime, [18:03:15.903] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.903] version = "1.8"), class = "FutureResult") [18:03:15.903] }, finally = { [18:03:15.903] if (!identical(...future.workdir, getwd())) [18:03:15.903] setwd(...future.workdir) [18:03:15.903] { [18:03:15.903] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.903] ...future.oldOptions$nwarnings <- NULL [18:03:15.903] } [18:03:15.903] base::options(...future.oldOptions) [18:03:15.903] if (.Platform$OS.type == "windows") { [18:03:15.903] old_names <- names(...future.oldEnvVars) [18:03:15.903] envs <- base::Sys.getenv() [18:03:15.903] names <- names(envs) [18:03:15.903] common <- intersect(names, old_names) [18:03:15.903] added <- setdiff(names, old_names) [18:03:15.903] removed <- setdiff(old_names, names) [18:03:15.903] changed <- common[...future.oldEnvVars[common] != [18:03:15.903] envs[common]] [18:03:15.903] NAMES <- toupper(changed) [18:03:15.903] args <- list() [18:03:15.903] for (kk in seq_along(NAMES)) { [18:03:15.903] name <- changed[[kk]] [18:03:15.903] NAME <- NAMES[[kk]] [18:03:15.903] if (name != NAME && is.element(NAME, old_names)) [18:03:15.903] next [18:03:15.903] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.903] } [18:03:15.903] NAMES <- toupper(added) [18:03:15.903] for (kk in seq_along(NAMES)) { [18:03:15.903] name <- added[[kk]] [18:03:15.903] NAME <- NAMES[[kk]] [18:03:15.903] if (name != NAME && is.element(NAME, old_names)) [18:03:15.903] next [18:03:15.903] args[[name]] <- "" [18:03:15.903] } [18:03:15.903] NAMES <- toupper(removed) [18:03:15.903] for (kk in seq_along(NAMES)) { [18:03:15.903] name <- removed[[kk]] [18:03:15.903] NAME <- NAMES[[kk]] [18:03:15.903] if (name != NAME && is.element(NAME, old_names)) [18:03:15.903] next [18:03:15.903] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.903] } [18:03:15.903] if (length(args) > 0) [18:03:15.903] base::do.call(base::Sys.setenv, args = args) [18:03:15.903] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.903] } [18:03:15.903] else { [18:03:15.903] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.903] } [18:03:15.903] { [18:03:15.903] if (base::length(...future.futureOptionsAdded) > [18:03:15.903] 0L) { [18:03:15.903] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.903] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.903] base::options(opts) [18:03:15.903] } [18:03:15.903] { [18:03:15.903] { [18:03:15.903] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.903] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.903] -1344458670L), envir = base::globalenv(), [18:03:15.903] inherits = FALSE) [18:03:15.903] NULL [18:03:15.903] } [18:03:15.903] options(future.plan = NULL) [18:03:15.903] if (is.na(NA_character_)) [18:03:15.903] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.903] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.903] future::plan(list(function (..., envir = parent.frame()) [18:03:15.903] { [18:03:15.903] future <- SequentialFuture(..., envir = envir) [18:03:15.903] if (!future$lazy) [18:03:15.903] future <- run(future) [18:03:15.903] invisible(future) [18:03:15.903] }), .cleanup = FALSE, .init = FALSE) [18:03:15.903] } [18:03:15.903] } [18:03:15.903] } [18:03:15.903] }) [18:03:15.903] if (TRUE) { [18:03:15.903] base::sink(type = "output", split = FALSE) [18:03:15.903] if (TRUE) { [18:03:15.903] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.903] } [18:03:15.903] else { [18:03:15.903] ...future.result["stdout"] <- base::list(NULL) [18:03:15.903] } [18:03:15.903] base::close(...future.stdout) [18:03:15.903] ...future.stdout <- NULL [18:03:15.903] } [18:03:15.903] ...future.result$conditions <- ...future.conditions [18:03:15.903] ...future.result$finished <- base::Sys.time() [18:03:15.903] ...future.result [18:03:15.903] } [18:03:15.907] assign_globals() ... [18:03:15.907] List of 1 [18:03:15.907] $ x: int [1:4] 0 1 2 3 [18:03:15.907] - attr(*, "where")=List of 1 [18:03:15.907] ..$ x: [18:03:15.907] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.907] - attr(*, "resolved")= logi FALSE [18:03:15.907] - attr(*, "total_size")= num 64 [18:03:15.907] - attr(*, "already-done")= logi TRUE [18:03:15.910] - copied 'x' to environment [18:03:15.910] assign_globals() ... done [18:03:15.910] plan(): Setting new future strategy stack: [18:03:15.911] List of future strategies: [18:03:15.911] 1. sequential: [18:03:15.911] - args: function (..., envir = parent.frame()) [18:03:15.911] - tweaked: FALSE [18:03:15.911] - call: NULL [18:03:15.911] plan(): nbrOfWorkers() = 1 [18:03:15.912] plan(): Setting new future strategy stack: [18:03:15.912] List of future strategies: [18:03:15.912] 1. sequential: [18:03:15.912] - args: function (..., envir = parent.frame()) [18:03:15.912] - tweaked: FALSE [18:03:15.912] - call: plan(strategy) [18:03:15.913] plan(): nbrOfWorkers() = 1 [18:03:15.913] SequentialFuture started (and completed) [18:03:15.913] - Launch lazy future ... done [18:03:15.913] run() for 'SequentialFuture' ... done [18:03:15.914] getGlobalsAndPackages() ... [18:03:15.914] Searching for globals... [18:03:15.915] - globals found: [3] '{', 'sample', 'x' [18:03:15.915] Searching for globals ... DONE [18:03:15.915] Resolving globals: FALSE [18:03:15.916] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.916] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.916] - globals: [1] 'x' [18:03:15.917] [18:03:15.917] getGlobalsAndPackages() ... DONE [18:03:15.917] run() for 'Future' ... [18:03:15.917] - state: 'created' [18:03:15.918] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.918] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.918] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.918] - Field: 'label' [18:03:15.918] - Field: 'local' [18:03:15.919] - Field: 'owner' [18:03:15.919] - Field: 'envir' [18:03:15.919] - Field: 'packages' [18:03:15.919] - Field: 'gc' [18:03:15.919] - Field: 'conditions' [18:03:15.919] - Field: 'expr' [18:03:15.920] - Field: 'uuid' [18:03:15.920] - Field: 'seed' [18:03:15.920] - Field: 'version' [18:03:15.920] - Field: 'result' [18:03:15.920] - Field: 'asynchronous' [18:03:15.921] - Field: 'calls' [18:03:15.921] - Field: 'globals' [18:03:15.921] - Field: 'stdout' [18:03:15.921] - Field: 'earlySignal' [18:03:15.921] - Field: 'lazy' [18:03:15.921] - Field: 'state' [18:03:15.922] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.922] - Launch lazy future ... [18:03:15.922] Packages needed by the future expression (n = 0): [18:03:15.922] Packages needed by future strategies (n = 0): [18:03:15.923] { [18:03:15.923] { [18:03:15.923] { [18:03:15.923] ...future.startTime <- base::Sys.time() [18:03:15.923] { [18:03:15.923] { [18:03:15.923] { [18:03:15.923] { [18:03:15.923] base::local({ [18:03:15.923] has_future <- base::requireNamespace("future", [18:03:15.923] quietly = TRUE) [18:03:15.923] if (has_future) { [18:03:15.923] ns <- base::getNamespace("future") [18:03:15.923] version <- ns[[".package"]][["version"]] [18:03:15.923] if (is.null(version)) [18:03:15.923] version <- utils::packageVersion("future") [18:03:15.923] } [18:03:15.923] else { [18:03:15.923] version <- NULL [18:03:15.923] } [18:03:15.923] if (!has_future || version < "1.8.0") { [18:03:15.923] info <- base::c(r_version = base::gsub("R version ", [18:03:15.923] "", base::R.version$version.string), [18:03:15.923] platform = base::sprintf("%s (%s-bit)", [18:03:15.923] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.923] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.923] "release", "version")], collapse = " "), [18:03:15.923] hostname = base::Sys.info()[["nodename"]]) [18:03:15.923] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.923] info) [18:03:15.923] info <- base::paste(info, collapse = "; ") [18:03:15.923] if (!has_future) { [18:03:15.923] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.923] info) [18:03:15.923] } [18:03:15.923] else { [18:03:15.923] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.923] info, version) [18:03:15.923] } [18:03:15.923] base::stop(msg) [18:03:15.923] } [18:03:15.923] }) [18:03:15.923] } [18:03:15.923] options(future.plan = NULL) [18:03:15.923] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.923] future::plan("default", .cleanup = FALSE, [18:03:15.923] .init = FALSE) [18:03:15.923] } [18:03:15.923] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:15.923] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:15.923] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:15.923] } [18:03:15.923] ...future.workdir <- getwd() [18:03:15.923] } [18:03:15.923] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.923] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.923] } [18:03:15.923] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.923] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.923] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.923] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.923] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:03:15.923] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.923] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.923] base::names(...future.oldOptions)) [18:03:15.923] } [18:03:15.923] if (FALSE) { [18:03:15.923] } [18:03:15.923] else { [18:03:15.923] if (TRUE) { [18:03:15.923] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.923] open = "w") [18:03:15.923] } [18:03:15.923] else { [18:03:15.923] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.923] windows = "NUL", "/dev/null"), open = "w") [18:03:15.923] } [18:03:15.923] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.923] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.923] base::sink(type = "output", split = FALSE) [18:03:15.923] base::close(...future.stdout) [18:03:15.923] }, add = TRUE) [18:03:15.923] } [18:03:15.923] ...future.frame <- base::sys.nframe() [18:03:15.923] ...future.conditions <- base::list() [18:03:15.923] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.923] if (FALSE) { [18:03:15.923] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.923] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.923] } [18:03:15.923] ...future.result <- base::tryCatch({ [18:03:15.923] base::withCallingHandlers({ [18:03:15.923] ...future.value <- base::withVisible(base::local({ [18:03:15.923] sample(x, size = 1L) [18:03:15.923] })) [18:03:15.923] future::FutureResult(value = ...future.value$value, [18:03:15.923] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.923] ...future.rng), globalenv = if (FALSE) [18:03:15.923] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.923] ...future.globalenv.names)) [18:03:15.923] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.923] }, condition = base::local({ [18:03:15.923] c <- base::c [18:03:15.923] inherits <- base::inherits [18:03:15.923] invokeRestart <- base::invokeRestart [18:03:15.923] length <- base::length [18:03:15.923] list <- base::list [18:03:15.923] seq.int <- base::seq.int [18:03:15.923] signalCondition <- base::signalCondition [18:03:15.923] sys.calls <- base::sys.calls [18:03:15.923] `[[` <- base::`[[` [18:03:15.923] `+` <- base::`+` [18:03:15.923] `<<-` <- base::`<<-` [18:03:15.923] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.923] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.923] 3L)] [18:03:15.923] } [18:03:15.923] function(cond) { [18:03:15.923] is_error <- inherits(cond, "error") [18:03:15.923] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.923] NULL) [18:03:15.923] if (is_error) { [18:03:15.923] sessionInformation <- function() { [18:03:15.923] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.923] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.923] search = base::search(), system = base::Sys.info()) [18:03:15.923] } [18:03:15.923] ...future.conditions[[length(...future.conditions) + [18:03:15.923] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.923] cond$call), session = sessionInformation(), [18:03:15.923] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.923] signalCondition(cond) [18:03:15.923] } [18:03:15.923] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.923] "immediateCondition"))) { [18:03:15.923] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.923] ...future.conditions[[length(...future.conditions) + [18:03:15.923] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.923] if (TRUE && !signal) { [18:03:15.923] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.923] { [18:03:15.923] inherits <- base::inherits [18:03:15.923] invokeRestart <- base::invokeRestart [18:03:15.923] is.null <- base::is.null [18:03:15.923] muffled <- FALSE [18:03:15.923] if (inherits(cond, "message")) { [18:03:15.923] muffled <- grepl(pattern, "muffleMessage") [18:03:15.923] if (muffled) [18:03:15.923] invokeRestart("muffleMessage") [18:03:15.923] } [18:03:15.923] else if (inherits(cond, "warning")) { [18:03:15.923] muffled <- grepl(pattern, "muffleWarning") [18:03:15.923] if (muffled) [18:03:15.923] invokeRestart("muffleWarning") [18:03:15.923] } [18:03:15.923] else if (inherits(cond, "condition")) { [18:03:15.923] if (!is.null(pattern)) { [18:03:15.923] computeRestarts <- base::computeRestarts [18:03:15.923] grepl <- base::grepl [18:03:15.923] restarts <- computeRestarts(cond) [18:03:15.923] for (restart in restarts) { [18:03:15.923] name <- restart$name [18:03:15.923] if (is.null(name)) [18:03:15.923] next [18:03:15.923] if (!grepl(pattern, name)) [18:03:15.923] next [18:03:15.923] invokeRestart(restart) [18:03:15.923] muffled <- TRUE [18:03:15.923] break [18:03:15.923] } [18:03:15.923] } [18:03:15.923] } [18:03:15.923] invisible(muffled) [18:03:15.923] } [18:03:15.923] muffleCondition(cond, pattern = "^muffle") [18:03:15.923] } [18:03:15.923] } [18:03:15.923] else { [18:03:15.923] if (TRUE) { [18:03:15.923] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.923] { [18:03:15.923] inherits <- base::inherits [18:03:15.923] invokeRestart <- base::invokeRestart [18:03:15.923] is.null <- base::is.null [18:03:15.923] muffled <- FALSE [18:03:15.923] if (inherits(cond, "message")) { [18:03:15.923] muffled <- grepl(pattern, "muffleMessage") [18:03:15.923] if (muffled) [18:03:15.923] invokeRestart("muffleMessage") [18:03:15.923] } [18:03:15.923] else if (inherits(cond, "warning")) { [18:03:15.923] muffled <- grepl(pattern, "muffleWarning") [18:03:15.923] if (muffled) [18:03:15.923] invokeRestart("muffleWarning") [18:03:15.923] } [18:03:15.923] else if (inherits(cond, "condition")) { [18:03:15.923] if (!is.null(pattern)) { [18:03:15.923] computeRestarts <- base::computeRestarts [18:03:15.923] grepl <- base::grepl [18:03:15.923] restarts <- computeRestarts(cond) [18:03:15.923] for (restart in restarts) { [18:03:15.923] name <- restart$name [18:03:15.923] if (is.null(name)) [18:03:15.923] next [18:03:15.923] if (!grepl(pattern, name)) [18:03:15.923] next [18:03:15.923] invokeRestart(restart) [18:03:15.923] muffled <- TRUE [18:03:15.923] break [18:03:15.923] } [18:03:15.923] } [18:03:15.923] } [18:03:15.923] invisible(muffled) [18:03:15.923] } [18:03:15.923] muffleCondition(cond, pattern = "^muffle") [18:03:15.923] } [18:03:15.923] } [18:03:15.923] } [18:03:15.923] })) [18:03:15.923] }, error = function(ex) { [18:03:15.923] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.923] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.923] ...future.rng), started = ...future.startTime, [18:03:15.923] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.923] version = "1.8"), class = "FutureResult") [18:03:15.923] }, finally = { [18:03:15.923] if (!identical(...future.workdir, getwd())) [18:03:15.923] setwd(...future.workdir) [18:03:15.923] { [18:03:15.923] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.923] ...future.oldOptions$nwarnings <- NULL [18:03:15.923] } [18:03:15.923] base::options(...future.oldOptions) [18:03:15.923] if (.Platform$OS.type == "windows") { [18:03:15.923] old_names <- names(...future.oldEnvVars) [18:03:15.923] envs <- base::Sys.getenv() [18:03:15.923] names <- names(envs) [18:03:15.923] common <- intersect(names, old_names) [18:03:15.923] added <- setdiff(names, old_names) [18:03:15.923] removed <- setdiff(old_names, names) [18:03:15.923] changed <- common[...future.oldEnvVars[common] != [18:03:15.923] envs[common]] [18:03:15.923] NAMES <- toupper(changed) [18:03:15.923] args <- list() [18:03:15.923] for (kk in seq_along(NAMES)) { [18:03:15.923] name <- changed[[kk]] [18:03:15.923] NAME <- NAMES[[kk]] [18:03:15.923] if (name != NAME && is.element(NAME, old_names)) [18:03:15.923] next [18:03:15.923] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.923] } [18:03:15.923] NAMES <- toupper(added) [18:03:15.923] for (kk in seq_along(NAMES)) { [18:03:15.923] name <- added[[kk]] [18:03:15.923] NAME <- NAMES[[kk]] [18:03:15.923] if (name != NAME && is.element(NAME, old_names)) [18:03:15.923] next [18:03:15.923] args[[name]] <- "" [18:03:15.923] } [18:03:15.923] NAMES <- toupper(removed) [18:03:15.923] for (kk in seq_along(NAMES)) { [18:03:15.923] name <- removed[[kk]] [18:03:15.923] NAME <- NAMES[[kk]] [18:03:15.923] if (name != NAME && is.element(NAME, old_names)) [18:03:15.923] next [18:03:15.923] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.923] } [18:03:15.923] if (length(args) > 0) [18:03:15.923] base::do.call(base::Sys.setenv, args = args) [18:03:15.923] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.923] } [18:03:15.923] else { [18:03:15.923] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.923] } [18:03:15.923] { [18:03:15.923] if (base::length(...future.futureOptionsAdded) > [18:03:15.923] 0L) { [18:03:15.923] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.923] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.923] base::options(opts) [18:03:15.923] } [18:03:15.923] { [18:03:15.923] { [18:03:15.923] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:15.923] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:15.923] -1344458670L), envir = base::globalenv(), [18:03:15.923] inherits = FALSE) [18:03:15.923] NULL [18:03:15.923] } [18:03:15.923] options(future.plan = NULL) [18:03:15.923] if (is.na(NA_character_)) [18:03:15.923] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.923] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.923] future::plan(list(function (..., envir = parent.frame()) [18:03:15.923] { [18:03:15.923] future <- SequentialFuture(..., envir = envir) [18:03:15.923] if (!future$lazy) [18:03:15.923] future <- run(future) [18:03:15.923] invisible(future) [18:03:15.923] }), .cleanup = FALSE, .init = FALSE) [18:03:15.923] } [18:03:15.923] } [18:03:15.923] } [18:03:15.923] }) [18:03:15.923] if (TRUE) { [18:03:15.923] base::sink(type = "output", split = FALSE) [18:03:15.923] if (TRUE) { [18:03:15.923] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.923] } [18:03:15.923] else { [18:03:15.923] ...future.result["stdout"] <- base::list(NULL) [18:03:15.923] } [18:03:15.923] base::close(...future.stdout) [18:03:15.923] ...future.stdout <- NULL [18:03:15.923] } [18:03:15.923] ...future.result$conditions <- ...future.conditions [18:03:15.923] ...future.result$finished <- base::Sys.time() [18:03:15.923] ...future.result [18:03:15.923] } [18:03:15.927] assign_globals() ... [18:03:15.928] List of 1 [18:03:15.928] $ x: int [1:4] 0 1 2 3 [18:03:15.928] - attr(*, "where")=List of 1 [18:03:15.928] ..$ x: [18:03:15.928] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.928] - attr(*, "resolved")= logi FALSE [18:03:15.928] - attr(*, "total_size")= num 64 [18:03:15.928] - attr(*, "already-done")= logi TRUE [18:03:15.931] - copied 'x' to environment [18:03:15.931] assign_globals() ... done [18:03:15.931] plan(): Setting new future strategy stack: [18:03:15.931] List of future strategies: [18:03:15.931] 1. sequential: [18:03:15.931] - args: function (..., envir = parent.frame()) [18:03:15.931] - tweaked: FALSE [18:03:15.931] - call: NULL [18:03:15.932] plan(): nbrOfWorkers() = 1 [18:03:15.933] plan(): Setting new future strategy stack: [18:03:15.933] List of future strategies: [18:03:15.933] 1. sequential: [18:03:15.933] - args: function (..., envir = parent.frame()) [18:03:15.933] - tweaked: FALSE [18:03:15.933] - call: plan(strategy) [18:03:15.933] plan(): nbrOfWorkers() = 1 [18:03:15.934] SequentialFuture started (and completed) [18:03:15.934] - Launch lazy future ... done [18:03:15.934] run() for 'SequentialFuture' ... done [18:03:15.934] resolve() on list ... [18:03:15.935] recursive: 0 [18:03:15.935] length: 4 [18:03:15.935] [18:03:15.935] resolved() for 'SequentialFuture' ... [18:03:15.935] - state: 'finished' [18:03:15.936] - run: TRUE [18:03:15.936] - result: 'FutureResult' [18:03:15.936] resolved() for 'SequentialFuture' ... done [18:03:15.936] Future #1 [18:03:15.936] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:15.937] - nx: 4 [18:03:15.937] - relay: TRUE [18:03:15.937] - stdout: TRUE [18:03:15.937] - signal: TRUE [18:03:15.937] - resignal: FALSE [18:03:15.937] - force: TRUE [18:03:15.937] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:15.938] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:15.938] - until=1 [18:03:15.938] - relaying element #1 [18:03:15.938] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.938] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.939] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:03:15.939] length: 3 (resolved future 1) [18:03:15.939] resolved() for 'SequentialFuture' ... [18:03:15.939] - state: 'finished' [18:03:15.939] - run: TRUE [18:03:15.939] - result: 'FutureResult' [18:03:15.940] resolved() for 'SequentialFuture' ... done [18:03:15.940] Future #2 [18:03:15.940] signalConditionsASAP(SequentialFuture, pos=2) ... [18:03:15.940] - nx: 4 [18:03:15.940] - relay: TRUE [18:03:15.941] - stdout: TRUE [18:03:15.941] - signal: TRUE [18:03:15.941] - resignal: FALSE [18:03:15.941] - force: TRUE [18:03:15.941] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.941] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:15.941] - until=2 [18:03:15.942] - relaying element #2 [18:03:15.942] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.942] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.942] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:03:15.942] length: 2 (resolved future 2) [18:03:15.943] resolved() for 'SequentialFuture' ... [18:03:15.943] - state: 'finished' [18:03:15.943] - run: TRUE [18:03:15.943] - result: 'FutureResult' [18:03:15.943] resolved() for 'SequentialFuture' ... done [18:03:15.943] Future #3 [18:03:15.944] signalConditionsASAP(SequentialFuture, pos=3) ... [18:03:15.944] - nx: 4 [18:03:15.944] - relay: TRUE [18:03:15.944] - stdout: TRUE [18:03:15.944] - signal: TRUE [18:03:15.944] - resignal: FALSE [18:03:15.945] - force: TRUE [18:03:15.945] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.945] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:15.945] - until=3 [18:03:15.945] - relaying element #3 [18:03:15.945] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.946] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.946] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:03:15.946] length: 1 (resolved future 3) [18:03:15.946] resolved() for 'SequentialFuture' ... [18:03:15.946] - state: 'finished' [18:03:15.947] - run: TRUE [18:03:15.947] - result: 'FutureResult' [18:03:15.947] resolved() for 'SequentialFuture' ... done [18:03:15.947] Future #4 [18:03:15.947] signalConditionsASAP(SequentialFuture, pos=4) ... [18:03:15.947] - nx: 4 [18:03:15.948] - relay: TRUE [18:03:15.948] - stdout: TRUE [18:03:15.948] - signal: TRUE [18:03:15.948] - resignal: FALSE [18:03:15.948] - force: TRUE [18:03:15.948] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.948] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:15.949] - until=4 [18:03:15.949] - relaying element #4 [18:03:15.949] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.949] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.949] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:03:15.950] length: 0 (resolved future 4) [18:03:15.950] Relaying remaining futures [18:03:15.950] signalConditionsASAP(NULL, pos=0) ... [18:03:15.950] - nx: 4 [18:03:15.950] - relay: TRUE [18:03:15.950] - stdout: TRUE [18:03:15.950] - signal: TRUE [18:03:15.951] - resignal: FALSE [18:03:15.951] - force: TRUE [18:03:15.951] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.951] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:15.951] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.951] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:15.952] signalConditionsASAP(NULL, pos=0) ... done [18:03:15.952] resolve() on list ... DONE [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:15.952] getGlobalsAndPackages() ... [18:03:15.953] Searching for globals... [18:03:15.954] - globals found: [3] '{', 'sample', 'x' [18:03:15.954] Searching for globals ... DONE [18:03:15.954] Resolving globals: FALSE [18:03:15.955] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.955] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.955] - globals: [1] 'x' [18:03:15.955] [18:03:15.956] getGlobalsAndPackages() ... DONE [18:03:15.956] run() for 'Future' ... [18:03:15.956] - state: 'created' [18:03:15.956] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.957] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.957] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.957] - Field: 'label' [18:03:15.957] - Field: 'local' [18:03:15.957] - Field: 'owner' [18:03:15.958] - Field: 'envir' [18:03:15.958] - Field: 'packages' [18:03:15.958] - Field: 'gc' [18:03:15.958] - Field: 'conditions' [18:03:15.958] - Field: 'expr' [18:03:15.958] - Field: 'uuid' [18:03:15.959] - Field: 'seed' [18:03:15.959] - Field: 'version' [18:03:15.959] - Field: 'result' [18:03:15.959] - Field: 'asynchronous' [18:03:15.959] - Field: 'calls' [18:03:15.959] - Field: 'globals' [18:03:15.960] - Field: 'stdout' [18:03:15.960] - Field: 'earlySignal' [18:03:15.960] - Field: 'lazy' [18:03:15.960] - Field: 'state' [18:03:15.960] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.961] - Launch lazy future ... [18:03:15.961] Packages needed by the future expression (n = 0): [18:03:15.961] Packages needed by future strategies (n = 0): [18:03:15.962] { [18:03:15.962] { [18:03:15.962] { [18:03:15.962] ...future.startTime <- base::Sys.time() [18:03:15.962] { [18:03:15.962] { [18:03:15.962] { [18:03:15.962] base::local({ [18:03:15.962] has_future <- base::requireNamespace("future", [18:03:15.962] quietly = TRUE) [18:03:15.962] if (has_future) { [18:03:15.962] ns <- base::getNamespace("future") [18:03:15.962] version <- ns[[".package"]][["version"]] [18:03:15.962] if (is.null(version)) [18:03:15.962] version <- utils::packageVersion("future") [18:03:15.962] } [18:03:15.962] else { [18:03:15.962] version <- NULL [18:03:15.962] } [18:03:15.962] if (!has_future || version < "1.8.0") { [18:03:15.962] info <- base::c(r_version = base::gsub("R version ", [18:03:15.962] "", base::R.version$version.string), [18:03:15.962] platform = base::sprintf("%s (%s-bit)", [18:03:15.962] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.962] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.962] "release", "version")], collapse = " "), [18:03:15.962] hostname = base::Sys.info()[["nodename"]]) [18:03:15.962] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.962] info) [18:03:15.962] info <- base::paste(info, collapse = "; ") [18:03:15.962] if (!has_future) { [18:03:15.962] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.962] info) [18:03:15.962] } [18:03:15.962] else { [18:03:15.962] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.962] info, version) [18:03:15.962] } [18:03:15.962] base::stop(msg) [18:03:15.962] } [18:03:15.962] }) [18:03:15.962] } [18:03:15.962] options(future.plan = NULL) [18:03:15.962] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.962] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:15.962] } [18:03:15.962] ...future.workdir <- getwd() [18:03:15.962] } [18:03:15.962] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.962] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.962] } [18:03:15.962] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.962] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.962] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.962] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.962] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:15.962] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.962] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.962] base::names(...future.oldOptions)) [18:03:15.962] } [18:03:15.962] if (FALSE) { [18:03:15.962] } [18:03:15.962] else { [18:03:15.962] if (TRUE) { [18:03:15.962] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.962] open = "w") [18:03:15.962] } [18:03:15.962] else { [18:03:15.962] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.962] windows = "NUL", "/dev/null"), open = "w") [18:03:15.962] } [18:03:15.962] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.962] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.962] base::sink(type = "output", split = FALSE) [18:03:15.962] base::close(...future.stdout) [18:03:15.962] }, add = TRUE) [18:03:15.962] } [18:03:15.962] ...future.frame <- base::sys.nframe() [18:03:15.962] ...future.conditions <- base::list() [18:03:15.962] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.962] if (FALSE) { [18:03:15.962] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.962] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.962] } [18:03:15.962] ...future.result <- base::tryCatch({ [18:03:15.962] base::withCallingHandlers({ [18:03:15.962] ...future.value <- base::withVisible(base::local({ [18:03:15.962] sample(x, size = 1L) [18:03:15.962] })) [18:03:15.962] future::FutureResult(value = ...future.value$value, [18:03:15.962] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.962] ...future.rng), globalenv = if (FALSE) [18:03:15.962] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.962] ...future.globalenv.names)) [18:03:15.962] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.962] }, condition = base::local({ [18:03:15.962] c <- base::c [18:03:15.962] inherits <- base::inherits [18:03:15.962] invokeRestart <- base::invokeRestart [18:03:15.962] length <- base::length [18:03:15.962] list <- base::list [18:03:15.962] seq.int <- base::seq.int [18:03:15.962] signalCondition <- base::signalCondition [18:03:15.962] sys.calls <- base::sys.calls [18:03:15.962] `[[` <- base::`[[` [18:03:15.962] `+` <- base::`+` [18:03:15.962] `<<-` <- base::`<<-` [18:03:15.962] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.962] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.962] 3L)] [18:03:15.962] } [18:03:15.962] function(cond) { [18:03:15.962] is_error <- inherits(cond, "error") [18:03:15.962] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.962] NULL) [18:03:15.962] if (is_error) { [18:03:15.962] sessionInformation <- function() { [18:03:15.962] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.962] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.962] search = base::search(), system = base::Sys.info()) [18:03:15.962] } [18:03:15.962] ...future.conditions[[length(...future.conditions) + [18:03:15.962] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.962] cond$call), session = sessionInformation(), [18:03:15.962] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.962] signalCondition(cond) [18:03:15.962] } [18:03:15.962] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.962] "immediateCondition"))) { [18:03:15.962] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.962] ...future.conditions[[length(...future.conditions) + [18:03:15.962] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.962] if (TRUE && !signal) { [18:03:15.962] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.962] { [18:03:15.962] inherits <- base::inherits [18:03:15.962] invokeRestart <- base::invokeRestart [18:03:15.962] is.null <- base::is.null [18:03:15.962] muffled <- FALSE [18:03:15.962] if (inherits(cond, "message")) { [18:03:15.962] muffled <- grepl(pattern, "muffleMessage") [18:03:15.962] if (muffled) [18:03:15.962] invokeRestart("muffleMessage") [18:03:15.962] } [18:03:15.962] else if (inherits(cond, "warning")) { [18:03:15.962] muffled <- grepl(pattern, "muffleWarning") [18:03:15.962] if (muffled) [18:03:15.962] invokeRestart("muffleWarning") [18:03:15.962] } [18:03:15.962] else if (inherits(cond, "condition")) { [18:03:15.962] if (!is.null(pattern)) { [18:03:15.962] computeRestarts <- base::computeRestarts [18:03:15.962] grepl <- base::grepl [18:03:15.962] restarts <- computeRestarts(cond) [18:03:15.962] for (restart in restarts) { [18:03:15.962] name <- restart$name [18:03:15.962] if (is.null(name)) [18:03:15.962] next [18:03:15.962] if (!grepl(pattern, name)) [18:03:15.962] next [18:03:15.962] invokeRestart(restart) [18:03:15.962] muffled <- TRUE [18:03:15.962] break [18:03:15.962] } [18:03:15.962] } [18:03:15.962] } [18:03:15.962] invisible(muffled) [18:03:15.962] } [18:03:15.962] muffleCondition(cond, pattern = "^muffle") [18:03:15.962] } [18:03:15.962] } [18:03:15.962] else { [18:03:15.962] if (TRUE) { [18:03:15.962] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.962] { [18:03:15.962] inherits <- base::inherits [18:03:15.962] invokeRestart <- base::invokeRestart [18:03:15.962] is.null <- base::is.null [18:03:15.962] muffled <- FALSE [18:03:15.962] if (inherits(cond, "message")) { [18:03:15.962] muffled <- grepl(pattern, "muffleMessage") [18:03:15.962] if (muffled) [18:03:15.962] invokeRestart("muffleMessage") [18:03:15.962] } [18:03:15.962] else if (inherits(cond, "warning")) { [18:03:15.962] muffled <- grepl(pattern, "muffleWarning") [18:03:15.962] if (muffled) [18:03:15.962] invokeRestart("muffleWarning") [18:03:15.962] } [18:03:15.962] else if (inherits(cond, "condition")) { [18:03:15.962] if (!is.null(pattern)) { [18:03:15.962] computeRestarts <- base::computeRestarts [18:03:15.962] grepl <- base::grepl [18:03:15.962] restarts <- computeRestarts(cond) [18:03:15.962] for (restart in restarts) { [18:03:15.962] name <- restart$name [18:03:15.962] if (is.null(name)) [18:03:15.962] next [18:03:15.962] if (!grepl(pattern, name)) [18:03:15.962] next [18:03:15.962] invokeRestart(restart) [18:03:15.962] muffled <- TRUE [18:03:15.962] break [18:03:15.962] } [18:03:15.962] } [18:03:15.962] } [18:03:15.962] invisible(muffled) [18:03:15.962] } [18:03:15.962] muffleCondition(cond, pattern = "^muffle") [18:03:15.962] } [18:03:15.962] } [18:03:15.962] } [18:03:15.962] })) [18:03:15.962] }, error = function(ex) { [18:03:15.962] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.962] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.962] ...future.rng), started = ...future.startTime, [18:03:15.962] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.962] version = "1.8"), class = "FutureResult") [18:03:15.962] }, finally = { [18:03:15.962] if (!identical(...future.workdir, getwd())) [18:03:15.962] setwd(...future.workdir) [18:03:15.962] { [18:03:15.962] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.962] ...future.oldOptions$nwarnings <- NULL [18:03:15.962] } [18:03:15.962] base::options(...future.oldOptions) [18:03:15.962] if (.Platform$OS.type == "windows") { [18:03:15.962] old_names <- names(...future.oldEnvVars) [18:03:15.962] envs <- base::Sys.getenv() [18:03:15.962] names <- names(envs) [18:03:15.962] common <- intersect(names, old_names) [18:03:15.962] added <- setdiff(names, old_names) [18:03:15.962] removed <- setdiff(old_names, names) [18:03:15.962] changed <- common[...future.oldEnvVars[common] != [18:03:15.962] envs[common]] [18:03:15.962] NAMES <- toupper(changed) [18:03:15.962] args <- list() [18:03:15.962] for (kk in seq_along(NAMES)) { [18:03:15.962] name <- changed[[kk]] [18:03:15.962] NAME <- NAMES[[kk]] [18:03:15.962] if (name != NAME && is.element(NAME, old_names)) [18:03:15.962] next [18:03:15.962] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.962] } [18:03:15.962] NAMES <- toupper(added) [18:03:15.962] for (kk in seq_along(NAMES)) { [18:03:15.962] name <- added[[kk]] [18:03:15.962] NAME <- NAMES[[kk]] [18:03:15.962] if (name != NAME && is.element(NAME, old_names)) [18:03:15.962] next [18:03:15.962] args[[name]] <- "" [18:03:15.962] } [18:03:15.962] NAMES <- toupper(removed) [18:03:15.962] for (kk in seq_along(NAMES)) { [18:03:15.962] name <- removed[[kk]] [18:03:15.962] NAME <- NAMES[[kk]] [18:03:15.962] if (name != NAME && is.element(NAME, old_names)) [18:03:15.962] next [18:03:15.962] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.962] } [18:03:15.962] if (length(args) > 0) [18:03:15.962] base::do.call(base::Sys.setenv, args = args) [18:03:15.962] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.962] } [18:03:15.962] else { [18:03:15.962] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.962] } [18:03:15.962] { [18:03:15.962] if (base::length(...future.futureOptionsAdded) > [18:03:15.962] 0L) { [18:03:15.962] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.962] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.962] base::options(opts) [18:03:15.962] } [18:03:15.962] { [18:03:15.962] { [18:03:15.962] base::assign(".Random.seed", c(10407L, -1683821936L, [18:03:15.962] 1227100314L, 1967199548L, -1973854777L, 154975643L, [18:03:15.962] -417942709L), envir = base::globalenv(), [18:03:15.962] inherits = FALSE) [18:03:15.962] NULL [18:03:15.962] } [18:03:15.962] options(future.plan = NULL) [18:03:15.962] if (is.na(NA_character_)) [18:03:15.962] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.962] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.962] future::plan(list(function (..., envir = parent.frame()) [18:03:15.962] { [18:03:15.962] future <- SequentialFuture(..., envir = envir) [18:03:15.962] if (!future$lazy) [18:03:15.962] future <- run(future) [18:03:15.962] invisible(future) [18:03:15.962] }), .cleanup = FALSE, .init = FALSE) [18:03:15.962] } [18:03:15.962] } [18:03:15.962] } [18:03:15.962] }) [18:03:15.962] if (TRUE) { [18:03:15.962] base::sink(type = "output", split = FALSE) [18:03:15.962] if (TRUE) { [18:03:15.962] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.962] } [18:03:15.962] else { [18:03:15.962] ...future.result["stdout"] <- base::list(NULL) [18:03:15.962] } [18:03:15.962] base::close(...future.stdout) [18:03:15.962] ...future.stdout <- NULL [18:03:15.962] } [18:03:15.962] ...future.result$conditions <- ...future.conditions [18:03:15.962] ...future.result$finished <- base::Sys.time() [18:03:15.962] ...future.result [18:03:15.962] } [18:03:15.966] assign_globals() ... [18:03:15.966] List of 1 [18:03:15.966] $ x: int [1:4] 0 1 2 3 [18:03:15.966] - attr(*, "where")=List of 1 [18:03:15.966] ..$ x: [18:03:15.966] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.966] - attr(*, "resolved")= logi FALSE [18:03:15.966] - attr(*, "total_size")= num 64 [18:03:15.966] - attr(*, "already-done")= logi TRUE [18:03:15.969] - copied 'x' to environment [18:03:15.969] assign_globals() ... done [18:03:15.970] plan(): Setting new future strategy stack: [18:03:15.970] List of future strategies: [18:03:15.970] 1. sequential: [18:03:15.970] - args: function (..., envir = parent.frame()) [18:03:15.970] - tweaked: FALSE [18:03:15.970] - call: NULL [18:03:15.970] plan(): nbrOfWorkers() = 1 [18:03:15.971] plan(): Setting new future strategy stack: [18:03:15.972] List of future strategies: [18:03:15.972] 1. sequential: [18:03:15.972] - args: function (..., envir = parent.frame()) [18:03:15.972] - tweaked: FALSE [18:03:15.972] - call: plan(strategy) [18:03:15.972] plan(): nbrOfWorkers() = 1 [18:03:15.972] SequentialFuture started (and completed) [18:03:15.973] - Launch lazy future ... done [18:03:15.973] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_1-495147' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f470e458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.974] getGlobalsAndPackages() ... [18:03:15.974] Searching for globals... [18:03:15.975] - globals found: [3] '{', 'sample', 'x' [18:03:15.975] Searching for globals ... DONE [18:03:15.976] Resolving globals: FALSE [18:03:15.976] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.977] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.977] - globals: [1] 'x' [18:03:15.977] [18:03:15.977] getGlobalsAndPackages() ... DONE [18:03:15.977] run() for 'Future' ... [18:03:15.978] - state: 'created' [18:03:15.978] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.978] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.978] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.978] - Field: 'label' [18:03:15.979] - Field: 'local' [18:03:15.979] - Field: 'owner' [18:03:15.979] - Field: 'envir' [18:03:15.979] - Field: 'packages' [18:03:15.979] - Field: 'gc' [18:03:15.980] - Field: 'conditions' [18:03:15.980] - Field: 'expr' [18:03:15.980] - Field: 'uuid' [18:03:15.980] - Field: 'seed' [18:03:15.980] - Field: 'version' [18:03:15.980] - Field: 'result' [18:03:15.981] - Field: 'asynchronous' [18:03:15.981] - Field: 'calls' [18:03:15.981] - Field: 'globals' [18:03:15.981] - Field: 'stdout' [18:03:15.981] - Field: 'earlySignal' [18:03:15.981] - Field: 'lazy' [18:03:15.982] - Field: 'state' [18:03:15.982] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:15.982] - Launch lazy future ... [18:03:15.982] Packages needed by the future expression (n = 0): [18:03:15.982] Packages needed by future strategies (n = 0): [18:03:15.983] { [18:03:15.983] { [18:03:15.983] { [18:03:15.983] ...future.startTime <- base::Sys.time() [18:03:15.983] { [18:03:15.983] { [18:03:15.983] { [18:03:15.983] base::local({ [18:03:15.983] has_future <- base::requireNamespace("future", [18:03:15.983] quietly = TRUE) [18:03:15.983] if (has_future) { [18:03:15.983] ns <- base::getNamespace("future") [18:03:15.983] version <- ns[[".package"]][["version"]] [18:03:15.983] if (is.null(version)) [18:03:15.983] version <- utils::packageVersion("future") [18:03:15.983] } [18:03:15.983] else { [18:03:15.983] version <- NULL [18:03:15.983] } [18:03:15.983] if (!has_future || version < "1.8.0") { [18:03:15.983] info <- base::c(r_version = base::gsub("R version ", [18:03:15.983] "", base::R.version$version.string), [18:03:15.983] platform = base::sprintf("%s (%s-bit)", [18:03:15.983] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:15.983] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:15.983] "release", "version")], collapse = " "), [18:03:15.983] hostname = base::Sys.info()[["nodename"]]) [18:03:15.983] info <- base::sprintf("%s: %s", base::names(info), [18:03:15.983] info) [18:03:15.983] info <- base::paste(info, collapse = "; ") [18:03:15.983] if (!has_future) { [18:03:15.983] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:15.983] info) [18:03:15.983] } [18:03:15.983] else { [18:03:15.983] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:15.983] info, version) [18:03:15.983] } [18:03:15.983] base::stop(msg) [18:03:15.983] } [18:03:15.983] }) [18:03:15.983] } [18:03:15.983] options(future.plan = NULL) [18:03:15.983] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.983] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:15.983] } [18:03:15.983] ...future.workdir <- getwd() [18:03:15.983] } [18:03:15.983] ...future.oldOptions <- base::as.list(base::.Options) [18:03:15.983] ...future.oldEnvVars <- base::Sys.getenv() [18:03:15.983] } [18:03:15.983] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:15.983] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:15.983] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:15.983] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:15.983] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:15.983] future.stdout.windows.reencode = NULL, width = 80L) [18:03:15.983] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:15.983] base::names(...future.oldOptions)) [18:03:15.983] } [18:03:15.983] if (FALSE) { [18:03:15.983] } [18:03:15.983] else { [18:03:15.983] if (TRUE) { [18:03:15.983] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:15.983] open = "w") [18:03:15.983] } [18:03:15.983] else { [18:03:15.983] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:15.983] windows = "NUL", "/dev/null"), open = "w") [18:03:15.983] } [18:03:15.983] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:15.983] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:15.983] base::sink(type = "output", split = FALSE) [18:03:15.983] base::close(...future.stdout) [18:03:15.983] }, add = TRUE) [18:03:15.983] } [18:03:15.983] ...future.frame <- base::sys.nframe() [18:03:15.983] ...future.conditions <- base::list() [18:03:15.983] ...future.rng <- base::globalenv()$.Random.seed [18:03:15.983] if (FALSE) { [18:03:15.983] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:15.983] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:15.983] } [18:03:15.983] ...future.result <- base::tryCatch({ [18:03:15.983] base::withCallingHandlers({ [18:03:15.983] ...future.value <- base::withVisible(base::local({ [18:03:15.983] sample(x, size = 1L) [18:03:15.983] })) [18:03:15.983] future::FutureResult(value = ...future.value$value, [18:03:15.983] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.983] ...future.rng), globalenv = if (FALSE) [18:03:15.983] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:15.983] ...future.globalenv.names)) [18:03:15.983] else NULL, started = ...future.startTime, version = "1.8") [18:03:15.983] }, condition = base::local({ [18:03:15.983] c <- base::c [18:03:15.983] inherits <- base::inherits [18:03:15.983] invokeRestart <- base::invokeRestart [18:03:15.983] length <- base::length [18:03:15.983] list <- base::list [18:03:15.983] seq.int <- base::seq.int [18:03:15.983] signalCondition <- base::signalCondition [18:03:15.983] sys.calls <- base::sys.calls [18:03:15.983] `[[` <- base::`[[` [18:03:15.983] `+` <- base::`+` [18:03:15.983] `<<-` <- base::`<<-` [18:03:15.983] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:15.983] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:15.983] 3L)] [18:03:15.983] } [18:03:15.983] function(cond) { [18:03:15.983] is_error <- inherits(cond, "error") [18:03:15.983] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:15.983] NULL) [18:03:15.983] if (is_error) { [18:03:15.983] sessionInformation <- function() { [18:03:15.983] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:15.983] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:15.983] search = base::search(), system = base::Sys.info()) [18:03:15.983] } [18:03:15.983] ...future.conditions[[length(...future.conditions) + [18:03:15.983] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:15.983] cond$call), session = sessionInformation(), [18:03:15.983] timestamp = base::Sys.time(), signaled = 0L) [18:03:15.983] signalCondition(cond) [18:03:15.983] } [18:03:15.983] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:15.983] "immediateCondition"))) { [18:03:15.983] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:15.983] ...future.conditions[[length(...future.conditions) + [18:03:15.983] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:15.983] if (TRUE && !signal) { [18:03:15.983] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.983] { [18:03:15.983] inherits <- base::inherits [18:03:15.983] invokeRestart <- base::invokeRestart [18:03:15.983] is.null <- base::is.null [18:03:15.983] muffled <- FALSE [18:03:15.983] if (inherits(cond, "message")) { [18:03:15.983] muffled <- grepl(pattern, "muffleMessage") [18:03:15.983] if (muffled) [18:03:15.983] invokeRestart("muffleMessage") [18:03:15.983] } [18:03:15.983] else if (inherits(cond, "warning")) { [18:03:15.983] muffled <- grepl(pattern, "muffleWarning") [18:03:15.983] if (muffled) [18:03:15.983] invokeRestart("muffleWarning") [18:03:15.983] } [18:03:15.983] else if (inherits(cond, "condition")) { [18:03:15.983] if (!is.null(pattern)) { [18:03:15.983] computeRestarts <- base::computeRestarts [18:03:15.983] grepl <- base::grepl [18:03:15.983] restarts <- computeRestarts(cond) [18:03:15.983] for (restart in restarts) { [18:03:15.983] name <- restart$name [18:03:15.983] if (is.null(name)) [18:03:15.983] next [18:03:15.983] if (!grepl(pattern, name)) [18:03:15.983] next [18:03:15.983] invokeRestart(restart) [18:03:15.983] muffled <- TRUE [18:03:15.983] break [18:03:15.983] } [18:03:15.983] } [18:03:15.983] } [18:03:15.983] invisible(muffled) [18:03:15.983] } [18:03:15.983] muffleCondition(cond, pattern = "^muffle") [18:03:15.983] } [18:03:15.983] } [18:03:15.983] else { [18:03:15.983] if (TRUE) { [18:03:15.983] muffleCondition <- function (cond, pattern = "^muffle") [18:03:15.983] { [18:03:15.983] inherits <- base::inherits [18:03:15.983] invokeRestart <- base::invokeRestart [18:03:15.983] is.null <- base::is.null [18:03:15.983] muffled <- FALSE [18:03:15.983] if (inherits(cond, "message")) { [18:03:15.983] muffled <- grepl(pattern, "muffleMessage") [18:03:15.983] if (muffled) [18:03:15.983] invokeRestart("muffleMessage") [18:03:15.983] } [18:03:15.983] else if (inherits(cond, "warning")) { [18:03:15.983] muffled <- grepl(pattern, "muffleWarning") [18:03:15.983] if (muffled) [18:03:15.983] invokeRestart("muffleWarning") [18:03:15.983] } [18:03:15.983] else if (inherits(cond, "condition")) { [18:03:15.983] if (!is.null(pattern)) { [18:03:15.983] computeRestarts <- base::computeRestarts [18:03:15.983] grepl <- base::grepl [18:03:15.983] restarts <- computeRestarts(cond) [18:03:15.983] for (restart in restarts) { [18:03:15.983] name <- restart$name [18:03:15.983] if (is.null(name)) [18:03:15.983] next [18:03:15.983] if (!grepl(pattern, name)) [18:03:15.983] next [18:03:15.983] invokeRestart(restart) [18:03:15.983] muffled <- TRUE [18:03:15.983] break [18:03:15.983] } [18:03:15.983] } [18:03:15.983] } [18:03:15.983] invisible(muffled) [18:03:15.983] } [18:03:15.983] muffleCondition(cond, pattern = "^muffle") [18:03:15.983] } [18:03:15.983] } [18:03:15.983] } [18:03:15.983] })) [18:03:15.983] }, error = function(ex) { [18:03:15.983] base::structure(base::list(value = NULL, visible = NULL, [18:03:15.983] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:15.983] ...future.rng), started = ...future.startTime, [18:03:15.983] finished = Sys.time(), session_uuid = NA_character_, [18:03:15.983] version = "1.8"), class = "FutureResult") [18:03:15.983] }, finally = { [18:03:15.983] if (!identical(...future.workdir, getwd())) [18:03:15.983] setwd(...future.workdir) [18:03:15.983] { [18:03:15.983] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:15.983] ...future.oldOptions$nwarnings <- NULL [18:03:15.983] } [18:03:15.983] base::options(...future.oldOptions) [18:03:15.983] if (.Platform$OS.type == "windows") { [18:03:15.983] old_names <- names(...future.oldEnvVars) [18:03:15.983] envs <- base::Sys.getenv() [18:03:15.983] names <- names(envs) [18:03:15.983] common <- intersect(names, old_names) [18:03:15.983] added <- setdiff(names, old_names) [18:03:15.983] removed <- setdiff(old_names, names) [18:03:15.983] changed <- common[...future.oldEnvVars[common] != [18:03:15.983] envs[common]] [18:03:15.983] NAMES <- toupper(changed) [18:03:15.983] args <- list() [18:03:15.983] for (kk in seq_along(NAMES)) { [18:03:15.983] name <- changed[[kk]] [18:03:15.983] NAME <- NAMES[[kk]] [18:03:15.983] if (name != NAME && is.element(NAME, old_names)) [18:03:15.983] next [18:03:15.983] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.983] } [18:03:15.983] NAMES <- toupper(added) [18:03:15.983] for (kk in seq_along(NAMES)) { [18:03:15.983] name <- added[[kk]] [18:03:15.983] NAME <- NAMES[[kk]] [18:03:15.983] if (name != NAME && is.element(NAME, old_names)) [18:03:15.983] next [18:03:15.983] args[[name]] <- "" [18:03:15.983] } [18:03:15.983] NAMES <- toupper(removed) [18:03:15.983] for (kk in seq_along(NAMES)) { [18:03:15.983] name <- removed[[kk]] [18:03:15.983] NAME <- NAMES[[kk]] [18:03:15.983] if (name != NAME && is.element(NAME, old_names)) [18:03:15.983] next [18:03:15.983] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:15.983] } [18:03:15.983] if (length(args) > 0) [18:03:15.983] base::do.call(base::Sys.setenv, args = args) [18:03:15.983] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:15.983] } [18:03:15.983] else { [18:03:15.983] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:15.983] } [18:03:15.983] { [18:03:15.983] if (base::length(...future.futureOptionsAdded) > [18:03:15.983] 0L) { [18:03:15.983] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:15.983] base::names(opts) <- ...future.futureOptionsAdded [18:03:15.983] base::options(opts) [18:03:15.983] } [18:03:15.983] { [18:03:15.983] { [18:03:15.983] base::assign(".Random.seed", c(10407L, 1967199548L, [18:03:15.983] 609453078L, -2086513189L, -417942709L, -1546034481L, [18:03:15.983] 127407062L), envir = base::globalenv(), inherits = FALSE) [18:03:15.983] NULL [18:03:15.983] } [18:03:15.983] options(future.plan = NULL) [18:03:15.983] if (is.na(NA_character_)) [18:03:15.983] Sys.unsetenv("R_FUTURE_PLAN") [18:03:15.983] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:15.983] future::plan(list(function (..., envir = parent.frame()) [18:03:15.983] { [18:03:15.983] future <- SequentialFuture(..., envir = envir) [18:03:15.983] if (!future$lazy) [18:03:15.983] future <- run(future) [18:03:15.983] invisible(future) [18:03:15.983] }), .cleanup = FALSE, .init = FALSE) [18:03:15.983] } [18:03:15.983] } [18:03:15.983] } [18:03:15.983] }) [18:03:15.983] if (TRUE) { [18:03:15.983] base::sink(type = "output", split = FALSE) [18:03:15.983] if (TRUE) { [18:03:15.983] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:15.983] } [18:03:15.983] else { [18:03:15.983] ...future.result["stdout"] <- base::list(NULL) [18:03:15.983] } [18:03:15.983] base::close(...future.stdout) [18:03:15.983] ...future.stdout <- NULL [18:03:15.983] } [18:03:15.983] ...future.result$conditions <- ...future.conditions [18:03:15.983] ...future.result$finished <- base::Sys.time() [18:03:15.983] ...future.result [18:03:15.983] } [18:03:15.987] assign_globals() ... [18:03:15.987] List of 1 [18:03:15.987] $ x: int [1:4] 0 1 2 3 [18:03:15.987] - attr(*, "where")=List of 1 [18:03:15.987] ..$ x: [18:03:15.987] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:15.987] - attr(*, "resolved")= logi FALSE [18:03:15.987] - attr(*, "total_size")= num 64 [18:03:15.987] - attr(*, "already-done")= logi TRUE [18:03:15.990] - copied 'x' to environment [18:03:15.990] assign_globals() ... done [18:03:15.990] plan(): Setting new future strategy stack: [18:03:15.991] List of future strategies: [18:03:15.991] 1. sequential: [18:03:15.991] - args: function (..., envir = parent.frame()) [18:03:15.991] - tweaked: FALSE [18:03:15.991] - call: NULL [18:03:15.991] plan(): nbrOfWorkers() = 1 [18:03:15.992] plan(): Setting new future strategy stack: [18:03:15.992] List of future strategies: [18:03:15.992] 1. sequential: [18:03:15.992] - args: function (..., envir = parent.frame()) [18:03:15.992] - tweaked: FALSE [18:03:15.992] - call: plan(strategy) [18:03:15.993] plan(): nbrOfWorkers() = 1 [18:03:15.993] SequentialFuture started (and completed) [18:03:15.993] - Launch lazy future ... done [18:03:15.993] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_2-687115' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f470e458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.994] getGlobalsAndPackages() ... [18:03:15.995] Searching for globals... [18:03:15.996] - globals found: [3] '{', 'sample', 'x' [18:03:15.996] Searching for globals ... DONE [18:03:15.996] Resolving globals: FALSE [18:03:15.997] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:15.997] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:15.997] - globals: [1] 'x' [18:03:15.997] [18:03:15.998] getGlobalsAndPackages() ... DONE [18:03:15.998] run() for 'Future' ... [18:03:15.998] - state: 'created' [18:03:15.998] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:15.999] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:15.999] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:15.999] - Field: 'label' [18:03:15.999] - Field: 'local' [18:03:15.999] - Field: 'owner' [18:03:16.000] - Field: 'envir' [18:03:16.000] - Field: 'packages' [18:03:16.001] - Field: 'gc' [18:03:16.001] - Field: 'conditions' [18:03:16.001] - Field: 'expr' [18:03:16.001] - Field: 'uuid' [18:03:16.002] - Field: 'seed' [18:03:16.002] - Field: 'version' [18:03:16.002] - Field: 'result' [18:03:16.003] - Field: 'asynchronous' [18:03:16.003] - Field: 'calls' [18:03:16.003] - Field: 'globals' [18:03:16.003] - Field: 'stdout' [18:03:16.003] - Field: 'earlySignal' [18:03:16.004] - Field: 'lazy' [18:03:16.004] - Field: 'state' [18:03:16.004] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.004] - Launch lazy future ... [18:03:16.005] Packages needed by the future expression (n = 0): [18:03:16.005] Packages needed by future strategies (n = 0): [18:03:16.005] { [18:03:16.005] { [18:03:16.005] { [18:03:16.005] ...future.startTime <- base::Sys.time() [18:03:16.005] { [18:03:16.005] { [18:03:16.005] { [18:03:16.005] base::local({ [18:03:16.005] has_future <- base::requireNamespace("future", [18:03:16.005] quietly = TRUE) [18:03:16.005] if (has_future) { [18:03:16.005] ns <- base::getNamespace("future") [18:03:16.005] version <- ns[[".package"]][["version"]] [18:03:16.005] if (is.null(version)) [18:03:16.005] version <- utils::packageVersion("future") [18:03:16.005] } [18:03:16.005] else { [18:03:16.005] version <- NULL [18:03:16.005] } [18:03:16.005] if (!has_future || version < "1.8.0") { [18:03:16.005] info <- base::c(r_version = base::gsub("R version ", [18:03:16.005] "", base::R.version$version.string), [18:03:16.005] platform = base::sprintf("%s (%s-bit)", [18:03:16.005] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.005] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.005] "release", "version")], collapse = " "), [18:03:16.005] hostname = base::Sys.info()[["nodename"]]) [18:03:16.005] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.005] info) [18:03:16.005] info <- base::paste(info, collapse = "; ") [18:03:16.005] if (!has_future) { [18:03:16.005] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.005] info) [18:03:16.005] } [18:03:16.005] else { [18:03:16.005] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.005] info, version) [18:03:16.005] } [18:03:16.005] base::stop(msg) [18:03:16.005] } [18:03:16.005] }) [18:03:16.005] } [18:03:16.005] options(future.plan = NULL) [18:03:16.005] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.005] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.005] } [18:03:16.005] ...future.workdir <- getwd() [18:03:16.005] } [18:03:16.005] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.005] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.005] } [18:03:16.005] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.005] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.005] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.005] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.005] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.005] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.005] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.005] base::names(...future.oldOptions)) [18:03:16.005] } [18:03:16.005] if (FALSE) { [18:03:16.005] } [18:03:16.005] else { [18:03:16.005] if (TRUE) { [18:03:16.005] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.005] open = "w") [18:03:16.005] } [18:03:16.005] else { [18:03:16.005] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.005] windows = "NUL", "/dev/null"), open = "w") [18:03:16.005] } [18:03:16.005] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.005] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.005] base::sink(type = "output", split = FALSE) [18:03:16.005] base::close(...future.stdout) [18:03:16.005] }, add = TRUE) [18:03:16.005] } [18:03:16.005] ...future.frame <- base::sys.nframe() [18:03:16.005] ...future.conditions <- base::list() [18:03:16.005] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.005] if (FALSE) { [18:03:16.005] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.005] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.005] } [18:03:16.005] ...future.result <- base::tryCatch({ [18:03:16.005] base::withCallingHandlers({ [18:03:16.005] ...future.value <- base::withVisible(base::local({ [18:03:16.005] sample(x, size = 1L) [18:03:16.005] })) [18:03:16.005] future::FutureResult(value = ...future.value$value, [18:03:16.005] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.005] ...future.rng), globalenv = if (FALSE) [18:03:16.005] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.005] ...future.globalenv.names)) [18:03:16.005] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.005] }, condition = base::local({ [18:03:16.005] c <- base::c [18:03:16.005] inherits <- base::inherits [18:03:16.005] invokeRestart <- base::invokeRestart [18:03:16.005] length <- base::length [18:03:16.005] list <- base::list [18:03:16.005] seq.int <- base::seq.int [18:03:16.005] signalCondition <- base::signalCondition [18:03:16.005] sys.calls <- base::sys.calls [18:03:16.005] `[[` <- base::`[[` [18:03:16.005] `+` <- base::`+` [18:03:16.005] `<<-` <- base::`<<-` [18:03:16.005] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.005] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.005] 3L)] [18:03:16.005] } [18:03:16.005] function(cond) { [18:03:16.005] is_error <- inherits(cond, "error") [18:03:16.005] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.005] NULL) [18:03:16.005] if (is_error) { [18:03:16.005] sessionInformation <- function() { [18:03:16.005] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.005] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.005] search = base::search(), system = base::Sys.info()) [18:03:16.005] } [18:03:16.005] ...future.conditions[[length(...future.conditions) + [18:03:16.005] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.005] cond$call), session = sessionInformation(), [18:03:16.005] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.005] signalCondition(cond) [18:03:16.005] } [18:03:16.005] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.005] "immediateCondition"))) { [18:03:16.005] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.005] ...future.conditions[[length(...future.conditions) + [18:03:16.005] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.005] if (TRUE && !signal) { [18:03:16.005] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.005] { [18:03:16.005] inherits <- base::inherits [18:03:16.005] invokeRestart <- base::invokeRestart [18:03:16.005] is.null <- base::is.null [18:03:16.005] muffled <- FALSE [18:03:16.005] if (inherits(cond, "message")) { [18:03:16.005] muffled <- grepl(pattern, "muffleMessage") [18:03:16.005] if (muffled) [18:03:16.005] invokeRestart("muffleMessage") [18:03:16.005] } [18:03:16.005] else if (inherits(cond, "warning")) { [18:03:16.005] muffled <- grepl(pattern, "muffleWarning") [18:03:16.005] if (muffled) [18:03:16.005] invokeRestart("muffleWarning") [18:03:16.005] } [18:03:16.005] else if (inherits(cond, "condition")) { [18:03:16.005] if (!is.null(pattern)) { [18:03:16.005] computeRestarts <- base::computeRestarts [18:03:16.005] grepl <- base::grepl [18:03:16.005] restarts <- computeRestarts(cond) [18:03:16.005] for (restart in restarts) { [18:03:16.005] name <- restart$name [18:03:16.005] if (is.null(name)) [18:03:16.005] next [18:03:16.005] if (!grepl(pattern, name)) [18:03:16.005] next [18:03:16.005] invokeRestart(restart) [18:03:16.005] muffled <- TRUE [18:03:16.005] break [18:03:16.005] } [18:03:16.005] } [18:03:16.005] } [18:03:16.005] invisible(muffled) [18:03:16.005] } [18:03:16.005] muffleCondition(cond, pattern = "^muffle") [18:03:16.005] } [18:03:16.005] } [18:03:16.005] else { [18:03:16.005] if (TRUE) { [18:03:16.005] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.005] { [18:03:16.005] inherits <- base::inherits [18:03:16.005] invokeRestart <- base::invokeRestart [18:03:16.005] is.null <- base::is.null [18:03:16.005] muffled <- FALSE [18:03:16.005] if (inherits(cond, "message")) { [18:03:16.005] muffled <- grepl(pattern, "muffleMessage") [18:03:16.005] if (muffled) [18:03:16.005] invokeRestart("muffleMessage") [18:03:16.005] } [18:03:16.005] else if (inherits(cond, "warning")) { [18:03:16.005] muffled <- grepl(pattern, "muffleWarning") [18:03:16.005] if (muffled) [18:03:16.005] invokeRestart("muffleWarning") [18:03:16.005] } [18:03:16.005] else if (inherits(cond, "condition")) { [18:03:16.005] if (!is.null(pattern)) { [18:03:16.005] computeRestarts <- base::computeRestarts [18:03:16.005] grepl <- base::grepl [18:03:16.005] restarts <- computeRestarts(cond) [18:03:16.005] for (restart in restarts) { [18:03:16.005] name <- restart$name [18:03:16.005] if (is.null(name)) [18:03:16.005] next [18:03:16.005] if (!grepl(pattern, name)) [18:03:16.005] next [18:03:16.005] invokeRestart(restart) [18:03:16.005] muffled <- TRUE [18:03:16.005] break [18:03:16.005] } [18:03:16.005] } [18:03:16.005] } [18:03:16.005] invisible(muffled) [18:03:16.005] } [18:03:16.005] muffleCondition(cond, pattern = "^muffle") [18:03:16.005] } [18:03:16.005] } [18:03:16.005] } [18:03:16.005] })) [18:03:16.005] }, error = function(ex) { [18:03:16.005] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.005] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.005] ...future.rng), started = ...future.startTime, [18:03:16.005] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.005] version = "1.8"), class = "FutureResult") [18:03:16.005] }, finally = { [18:03:16.005] if (!identical(...future.workdir, getwd())) [18:03:16.005] setwd(...future.workdir) [18:03:16.005] { [18:03:16.005] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.005] ...future.oldOptions$nwarnings <- NULL [18:03:16.005] } [18:03:16.005] base::options(...future.oldOptions) [18:03:16.005] if (.Platform$OS.type == "windows") { [18:03:16.005] old_names <- names(...future.oldEnvVars) [18:03:16.005] envs <- base::Sys.getenv() [18:03:16.005] names <- names(envs) [18:03:16.005] common <- intersect(names, old_names) [18:03:16.005] added <- setdiff(names, old_names) [18:03:16.005] removed <- setdiff(old_names, names) [18:03:16.005] changed <- common[...future.oldEnvVars[common] != [18:03:16.005] envs[common]] [18:03:16.005] NAMES <- toupper(changed) [18:03:16.005] args <- list() [18:03:16.005] for (kk in seq_along(NAMES)) { [18:03:16.005] name <- changed[[kk]] [18:03:16.005] NAME <- NAMES[[kk]] [18:03:16.005] if (name != NAME && is.element(NAME, old_names)) [18:03:16.005] next [18:03:16.005] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.005] } [18:03:16.005] NAMES <- toupper(added) [18:03:16.005] for (kk in seq_along(NAMES)) { [18:03:16.005] name <- added[[kk]] [18:03:16.005] NAME <- NAMES[[kk]] [18:03:16.005] if (name != NAME && is.element(NAME, old_names)) [18:03:16.005] next [18:03:16.005] args[[name]] <- "" [18:03:16.005] } [18:03:16.005] NAMES <- toupper(removed) [18:03:16.005] for (kk in seq_along(NAMES)) { [18:03:16.005] name <- removed[[kk]] [18:03:16.005] NAME <- NAMES[[kk]] [18:03:16.005] if (name != NAME && is.element(NAME, old_names)) [18:03:16.005] next [18:03:16.005] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.005] } [18:03:16.005] if (length(args) > 0) [18:03:16.005] base::do.call(base::Sys.setenv, args = args) [18:03:16.005] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.005] } [18:03:16.005] else { [18:03:16.005] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.005] } [18:03:16.005] { [18:03:16.005] if (base::length(...future.futureOptionsAdded) > [18:03:16.005] 0L) { [18:03:16.005] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.005] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.005] base::options(opts) [18:03:16.005] } [18:03:16.005] { [18:03:16.005] { [18:03:16.005] base::assign(".Random.seed", c(10407L, -2086513189L, [18:03:16.005] -300431471L, 772910725L, 127407062L, -1883774256L, [18:03:16.005] 284069849L), envir = base::globalenv(), inherits = FALSE) [18:03:16.005] NULL [18:03:16.005] } [18:03:16.005] options(future.plan = NULL) [18:03:16.005] if (is.na(NA_character_)) [18:03:16.005] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.005] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.005] future::plan(list(function (..., envir = parent.frame()) [18:03:16.005] { [18:03:16.005] future <- SequentialFuture(..., envir = envir) [18:03:16.005] if (!future$lazy) [18:03:16.005] future <- run(future) [18:03:16.005] invisible(future) [18:03:16.005] }), .cleanup = FALSE, .init = FALSE) [18:03:16.005] } [18:03:16.005] } [18:03:16.005] } [18:03:16.005] }) [18:03:16.005] if (TRUE) { [18:03:16.005] base::sink(type = "output", split = FALSE) [18:03:16.005] if (TRUE) { [18:03:16.005] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.005] } [18:03:16.005] else { [18:03:16.005] ...future.result["stdout"] <- base::list(NULL) [18:03:16.005] } [18:03:16.005] base::close(...future.stdout) [18:03:16.005] ...future.stdout <- NULL [18:03:16.005] } [18:03:16.005] ...future.result$conditions <- ...future.conditions [18:03:16.005] ...future.result$finished <- base::Sys.time() [18:03:16.005] ...future.result [18:03:16.005] } [18:03:16.010] assign_globals() ... [18:03:16.010] List of 1 [18:03:16.010] $ x: int [1:4] 0 1 2 3 [18:03:16.010] - attr(*, "where")=List of 1 [18:03:16.010] ..$ x: [18:03:16.010] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.010] - attr(*, "resolved")= logi FALSE [18:03:16.010] - attr(*, "total_size")= num 64 [18:03:16.010] - attr(*, "already-done")= logi TRUE [18:03:16.013] - copied 'x' to environment [18:03:16.013] assign_globals() ... done [18:03:16.014] plan(): Setting new future strategy stack: [18:03:16.014] List of future strategies: [18:03:16.014] 1. sequential: [18:03:16.014] - args: function (..., envir = parent.frame()) [18:03:16.014] - tweaked: FALSE [18:03:16.014] - call: NULL [18:03:16.015] plan(): nbrOfWorkers() = 1 [18:03:16.016] plan(): Setting new future strategy stack: [18:03:16.016] List of future strategies: [18:03:16.016] 1. sequential: [18:03:16.016] - args: function (..., envir = parent.frame()) [18:03:16.016] - tweaked: FALSE [18:03:16.016] - call: plan(strategy) [18:03:16.017] plan(): nbrOfWorkers() = 1 [18:03:16.017] SequentialFuture started (and completed) [18:03:16.017] - Launch lazy future ... done [18:03:16.017] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_3-990500' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f470e458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.018] getGlobalsAndPackages() ... [18:03:16.019] Searching for globals... [18:03:16.020] - globals found: [3] '{', 'sample', 'x' [18:03:16.020] Searching for globals ... DONE [18:03:16.020] Resolving globals: FALSE [18:03:16.021] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.021] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.022] - globals: [1] 'x' [18:03:16.022] [18:03:16.022] getGlobalsAndPackages() ... DONE [18:03:16.022] run() for 'Future' ... [18:03:16.022] - state: 'created' [18:03:16.023] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.023] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.023] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.024] - Field: 'label' [18:03:16.024] - Field: 'local' [18:03:16.024] - Field: 'owner' [18:03:16.024] - Field: 'envir' [18:03:16.024] - Field: 'packages' [18:03:16.024] - Field: 'gc' [18:03:16.025] - Field: 'conditions' [18:03:16.025] - Field: 'expr' [18:03:16.025] - Field: 'uuid' [18:03:16.025] - Field: 'seed' [18:03:16.025] - Field: 'version' [18:03:16.026] - Field: 'result' [18:03:16.026] - Field: 'asynchronous' [18:03:16.026] - Field: 'calls' [18:03:16.026] - Field: 'globals' [18:03:16.026] - Field: 'stdout' [18:03:16.026] - Field: 'earlySignal' [18:03:16.027] - Field: 'lazy' [18:03:16.027] - Field: 'state' [18:03:16.027] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.027] - Launch lazy future ... [18:03:16.027] Packages needed by the future expression (n = 0): [18:03:16.028] Packages needed by future strategies (n = 0): [18:03:16.028] { [18:03:16.028] { [18:03:16.028] { [18:03:16.028] ...future.startTime <- base::Sys.time() [18:03:16.028] { [18:03:16.028] { [18:03:16.028] { [18:03:16.028] base::local({ [18:03:16.028] has_future <- base::requireNamespace("future", [18:03:16.028] quietly = TRUE) [18:03:16.028] if (has_future) { [18:03:16.028] ns <- base::getNamespace("future") [18:03:16.028] version <- ns[[".package"]][["version"]] [18:03:16.028] if (is.null(version)) [18:03:16.028] version <- utils::packageVersion("future") [18:03:16.028] } [18:03:16.028] else { [18:03:16.028] version <- NULL [18:03:16.028] } [18:03:16.028] if (!has_future || version < "1.8.0") { [18:03:16.028] info <- base::c(r_version = base::gsub("R version ", [18:03:16.028] "", base::R.version$version.string), [18:03:16.028] platform = base::sprintf("%s (%s-bit)", [18:03:16.028] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.028] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.028] "release", "version")], collapse = " "), [18:03:16.028] hostname = base::Sys.info()[["nodename"]]) [18:03:16.028] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.028] info) [18:03:16.028] info <- base::paste(info, collapse = "; ") [18:03:16.028] if (!has_future) { [18:03:16.028] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.028] info) [18:03:16.028] } [18:03:16.028] else { [18:03:16.028] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.028] info, version) [18:03:16.028] } [18:03:16.028] base::stop(msg) [18:03:16.028] } [18:03:16.028] }) [18:03:16.028] } [18:03:16.028] options(future.plan = NULL) [18:03:16.028] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.028] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.028] } [18:03:16.028] ...future.workdir <- getwd() [18:03:16.028] } [18:03:16.028] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.028] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.028] } [18:03:16.028] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.028] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.028] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.028] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.028] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.028] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.028] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.028] base::names(...future.oldOptions)) [18:03:16.028] } [18:03:16.028] if (FALSE) { [18:03:16.028] } [18:03:16.028] else { [18:03:16.028] if (TRUE) { [18:03:16.028] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.028] open = "w") [18:03:16.028] } [18:03:16.028] else { [18:03:16.028] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.028] windows = "NUL", "/dev/null"), open = "w") [18:03:16.028] } [18:03:16.028] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.028] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.028] base::sink(type = "output", split = FALSE) [18:03:16.028] base::close(...future.stdout) [18:03:16.028] }, add = TRUE) [18:03:16.028] } [18:03:16.028] ...future.frame <- base::sys.nframe() [18:03:16.028] ...future.conditions <- base::list() [18:03:16.028] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.028] if (FALSE) { [18:03:16.028] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.028] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.028] } [18:03:16.028] ...future.result <- base::tryCatch({ [18:03:16.028] base::withCallingHandlers({ [18:03:16.028] ...future.value <- base::withVisible(base::local({ [18:03:16.028] sample(x, size = 1L) [18:03:16.028] })) [18:03:16.028] future::FutureResult(value = ...future.value$value, [18:03:16.028] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.028] ...future.rng), globalenv = if (FALSE) [18:03:16.028] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.028] ...future.globalenv.names)) [18:03:16.028] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.028] }, condition = base::local({ [18:03:16.028] c <- base::c [18:03:16.028] inherits <- base::inherits [18:03:16.028] invokeRestart <- base::invokeRestart [18:03:16.028] length <- base::length [18:03:16.028] list <- base::list [18:03:16.028] seq.int <- base::seq.int [18:03:16.028] signalCondition <- base::signalCondition [18:03:16.028] sys.calls <- base::sys.calls [18:03:16.028] `[[` <- base::`[[` [18:03:16.028] `+` <- base::`+` [18:03:16.028] `<<-` <- base::`<<-` [18:03:16.028] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.028] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.028] 3L)] [18:03:16.028] } [18:03:16.028] function(cond) { [18:03:16.028] is_error <- inherits(cond, "error") [18:03:16.028] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.028] NULL) [18:03:16.028] if (is_error) { [18:03:16.028] sessionInformation <- function() { [18:03:16.028] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.028] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.028] search = base::search(), system = base::Sys.info()) [18:03:16.028] } [18:03:16.028] ...future.conditions[[length(...future.conditions) + [18:03:16.028] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.028] cond$call), session = sessionInformation(), [18:03:16.028] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.028] signalCondition(cond) [18:03:16.028] } [18:03:16.028] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.028] "immediateCondition"))) { [18:03:16.028] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.028] ...future.conditions[[length(...future.conditions) + [18:03:16.028] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.028] if (TRUE && !signal) { [18:03:16.028] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.028] { [18:03:16.028] inherits <- base::inherits [18:03:16.028] invokeRestart <- base::invokeRestart [18:03:16.028] is.null <- base::is.null [18:03:16.028] muffled <- FALSE [18:03:16.028] if (inherits(cond, "message")) { [18:03:16.028] muffled <- grepl(pattern, "muffleMessage") [18:03:16.028] if (muffled) [18:03:16.028] invokeRestart("muffleMessage") [18:03:16.028] } [18:03:16.028] else if (inherits(cond, "warning")) { [18:03:16.028] muffled <- grepl(pattern, "muffleWarning") [18:03:16.028] if (muffled) [18:03:16.028] invokeRestart("muffleWarning") [18:03:16.028] } [18:03:16.028] else if (inherits(cond, "condition")) { [18:03:16.028] if (!is.null(pattern)) { [18:03:16.028] computeRestarts <- base::computeRestarts [18:03:16.028] grepl <- base::grepl [18:03:16.028] restarts <- computeRestarts(cond) [18:03:16.028] for (restart in restarts) { [18:03:16.028] name <- restart$name [18:03:16.028] if (is.null(name)) [18:03:16.028] next [18:03:16.028] if (!grepl(pattern, name)) [18:03:16.028] next [18:03:16.028] invokeRestart(restart) [18:03:16.028] muffled <- TRUE [18:03:16.028] break [18:03:16.028] } [18:03:16.028] } [18:03:16.028] } [18:03:16.028] invisible(muffled) [18:03:16.028] } [18:03:16.028] muffleCondition(cond, pattern = "^muffle") [18:03:16.028] } [18:03:16.028] } [18:03:16.028] else { [18:03:16.028] if (TRUE) { [18:03:16.028] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.028] { [18:03:16.028] inherits <- base::inherits [18:03:16.028] invokeRestart <- base::invokeRestart [18:03:16.028] is.null <- base::is.null [18:03:16.028] muffled <- FALSE [18:03:16.028] if (inherits(cond, "message")) { [18:03:16.028] muffled <- grepl(pattern, "muffleMessage") [18:03:16.028] if (muffled) [18:03:16.028] invokeRestart("muffleMessage") [18:03:16.028] } [18:03:16.028] else if (inherits(cond, "warning")) { [18:03:16.028] muffled <- grepl(pattern, "muffleWarning") [18:03:16.028] if (muffled) [18:03:16.028] invokeRestart("muffleWarning") [18:03:16.028] } [18:03:16.028] else if (inherits(cond, "condition")) { [18:03:16.028] if (!is.null(pattern)) { [18:03:16.028] computeRestarts <- base::computeRestarts [18:03:16.028] grepl <- base::grepl [18:03:16.028] restarts <- computeRestarts(cond) [18:03:16.028] for (restart in restarts) { [18:03:16.028] name <- restart$name [18:03:16.028] if (is.null(name)) [18:03:16.028] next [18:03:16.028] if (!grepl(pattern, name)) [18:03:16.028] next [18:03:16.028] invokeRestart(restart) [18:03:16.028] muffled <- TRUE [18:03:16.028] break [18:03:16.028] } [18:03:16.028] } [18:03:16.028] } [18:03:16.028] invisible(muffled) [18:03:16.028] } [18:03:16.028] muffleCondition(cond, pattern = "^muffle") [18:03:16.028] } [18:03:16.028] } [18:03:16.028] } [18:03:16.028] })) [18:03:16.028] }, error = function(ex) { [18:03:16.028] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.028] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.028] ...future.rng), started = ...future.startTime, [18:03:16.028] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.028] version = "1.8"), class = "FutureResult") [18:03:16.028] }, finally = { [18:03:16.028] if (!identical(...future.workdir, getwd())) [18:03:16.028] setwd(...future.workdir) [18:03:16.028] { [18:03:16.028] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.028] ...future.oldOptions$nwarnings <- NULL [18:03:16.028] } [18:03:16.028] base::options(...future.oldOptions) [18:03:16.028] if (.Platform$OS.type == "windows") { [18:03:16.028] old_names <- names(...future.oldEnvVars) [18:03:16.028] envs <- base::Sys.getenv() [18:03:16.028] names <- names(envs) [18:03:16.028] common <- intersect(names, old_names) [18:03:16.028] added <- setdiff(names, old_names) [18:03:16.028] removed <- setdiff(old_names, names) [18:03:16.028] changed <- common[...future.oldEnvVars[common] != [18:03:16.028] envs[common]] [18:03:16.028] NAMES <- toupper(changed) [18:03:16.028] args <- list() [18:03:16.028] for (kk in seq_along(NAMES)) { [18:03:16.028] name <- changed[[kk]] [18:03:16.028] NAME <- NAMES[[kk]] [18:03:16.028] if (name != NAME && is.element(NAME, old_names)) [18:03:16.028] next [18:03:16.028] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.028] } [18:03:16.028] NAMES <- toupper(added) [18:03:16.028] for (kk in seq_along(NAMES)) { [18:03:16.028] name <- added[[kk]] [18:03:16.028] NAME <- NAMES[[kk]] [18:03:16.028] if (name != NAME && is.element(NAME, old_names)) [18:03:16.028] next [18:03:16.028] args[[name]] <- "" [18:03:16.028] } [18:03:16.028] NAMES <- toupper(removed) [18:03:16.028] for (kk in seq_along(NAMES)) { [18:03:16.028] name <- removed[[kk]] [18:03:16.028] NAME <- NAMES[[kk]] [18:03:16.028] if (name != NAME && is.element(NAME, old_names)) [18:03:16.028] next [18:03:16.028] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.028] } [18:03:16.028] if (length(args) > 0) [18:03:16.028] base::do.call(base::Sys.setenv, args = args) [18:03:16.028] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.028] } [18:03:16.028] else { [18:03:16.028] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.028] } [18:03:16.028] { [18:03:16.028] if (base::length(...future.futureOptionsAdded) > [18:03:16.028] 0L) { [18:03:16.028] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.028] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.028] base::options(opts) [18:03:16.028] } [18:03:16.028] { [18:03:16.028] { [18:03:16.028] base::assign(".Random.seed", c(10407L, 772910725L, [18:03:16.028] 791082755L, -1773599638L, 284069849L, -881615660L, [18:03:16.028] -1821822604L), envir = base::globalenv(), [18:03:16.028] inherits = FALSE) [18:03:16.028] NULL [18:03:16.028] } [18:03:16.028] options(future.plan = NULL) [18:03:16.028] if (is.na(NA_character_)) [18:03:16.028] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.028] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.028] future::plan(list(function (..., envir = parent.frame()) [18:03:16.028] { [18:03:16.028] future <- SequentialFuture(..., envir = envir) [18:03:16.028] if (!future$lazy) [18:03:16.028] future <- run(future) [18:03:16.028] invisible(future) [18:03:16.028] }), .cleanup = FALSE, .init = FALSE) [18:03:16.028] } [18:03:16.028] } [18:03:16.028] } [18:03:16.028] }) [18:03:16.028] if (TRUE) { [18:03:16.028] base::sink(type = "output", split = FALSE) [18:03:16.028] if (TRUE) { [18:03:16.028] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.028] } [18:03:16.028] else { [18:03:16.028] ...future.result["stdout"] <- base::list(NULL) [18:03:16.028] } [18:03:16.028] base::close(...future.stdout) [18:03:16.028] ...future.stdout <- NULL [18:03:16.028] } [18:03:16.028] ...future.result$conditions <- ...future.conditions [18:03:16.028] ...future.result$finished <- base::Sys.time() [18:03:16.028] ...future.result [18:03:16.028] } [18:03:16.032] assign_globals() ... [18:03:16.032] List of 1 [18:03:16.032] $ x: int [1:4] 0 1 2 3 [18:03:16.032] - attr(*, "where")=List of 1 [18:03:16.032] ..$ x: [18:03:16.032] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.032] - attr(*, "resolved")= logi FALSE [18:03:16.032] - attr(*, "total_size")= num 64 [18:03:16.032] - attr(*, "already-done")= logi TRUE [18:03:16.036] - copied 'x' to environment [18:03:16.036] assign_globals() ... done [18:03:16.036] plan(): Setting new future strategy stack: [18:03:16.036] List of future strategies: [18:03:16.036] 1. sequential: [18:03:16.036] - args: function (..., envir = parent.frame()) [18:03:16.036] - tweaked: FALSE [18:03:16.036] - call: NULL [18:03:16.037] plan(): nbrOfWorkers() = 1 [18:03:16.038] plan(): Setting new future strategy stack: [18:03:16.038] List of future strategies: [18:03:16.038] 1. sequential: [18:03:16.038] - args: function (..., envir = parent.frame()) [18:03:16.038] - tweaked: FALSE [18:03:16.038] - call: plan(strategy) [18:03:16.039] plan(): nbrOfWorkers() = 1 [18:03:16.039] SequentialFuture started (and completed) [18:03:16.039] - Launch lazy future ... done [18:03:16.039] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_4-197344' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f470e458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.041] resolve() on list ... [18:03:16.041] recursive: 0 [18:03:16.041] length: 4 [18:03:16.041] [18:03:16.041] resolved() for 'SequentialFuture' ... [18:03:16.041] - state: 'finished' [18:03:16.042] - run: TRUE [18:03:16.042] - result: 'FutureResult' [18:03:16.042] resolved() for 'SequentialFuture' ... done [18:03:16.042] Future #1 [18:03:16.043] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:16.043] - nx: 4 [18:03:16.043] - relay: TRUE [18:03:16.043] - stdout: TRUE [18:03:16.043] - signal: TRUE [18:03:16.043] - resignal: FALSE [18:03:16.046] - force: TRUE [18:03:16.046] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.046] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.046] - until=1 [18:03:16.047] - relaying element #1 [18:03:16.047] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.047] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.047] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:03:16.047] length: 3 (resolved future 1) [18:03:16.048] resolved() for 'SequentialFuture' ... [18:03:16.048] - state: 'finished' [18:03:16.048] - run: TRUE [18:03:16.048] - result: 'FutureResult' [18:03:16.048] resolved() for 'SequentialFuture' ... done [18:03:16.048] Future #2 [18:03:16.049] signalConditionsASAP(SequentialFuture, pos=2) ... [18:03:16.049] - nx: 4 [18:03:16.049] - relay: TRUE [18:03:16.049] - stdout: TRUE [18:03:16.049] - signal: TRUE [18:03:16.049] - resignal: FALSE [18:03:16.050] - force: TRUE [18:03:16.050] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.050] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.050] - until=2 [18:03:16.050] - relaying element #2 [18:03:16.051] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.051] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.051] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:03:16.051] length: 2 (resolved future 2) [18:03:16.051] resolved() for 'SequentialFuture' ... [18:03:16.051] - state: 'finished' [18:03:16.052] - run: TRUE [18:03:16.052] - result: 'FutureResult' [18:03:16.052] resolved() for 'SequentialFuture' ... done [18:03:16.052] Future #3 [18:03:16.052] signalConditionsASAP(SequentialFuture, pos=3) ... [18:03:16.053] - nx: 4 [18:03:16.053] - relay: TRUE [18:03:16.053] - stdout: TRUE [18:03:16.053] - signal: TRUE [18:03:16.053] - resignal: FALSE [18:03:16.053] - force: TRUE [18:03:16.053] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.054] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.054] - until=3 [18:03:16.054] - relaying element #3 [18:03:16.054] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.054] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.055] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:03:16.055] length: 1 (resolved future 3) [18:03:16.055] resolved() for 'SequentialFuture' ... [18:03:16.055] - state: 'finished' [18:03:16.055] - run: TRUE [18:03:16.055] - result: 'FutureResult' [18:03:16.056] resolved() for 'SequentialFuture' ... done [18:03:16.056] Future #4 [18:03:16.056] signalConditionsASAP(SequentialFuture, pos=4) ... [18:03:16.056] - nx: 4 [18:03:16.056] - relay: TRUE [18:03:16.056] - stdout: TRUE [18:03:16.057] - signal: TRUE [18:03:16.057] - resignal: FALSE [18:03:16.057] - force: TRUE [18:03:16.057] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.057] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.057] - until=4 [18:03:16.058] - relaying element #4 [18:03:16.058] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.058] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.058] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:03:16.058] length: 0 (resolved future 4) [18:03:16.058] Relaying remaining futures [18:03:16.059] signalConditionsASAP(NULL, pos=0) ... [18:03:16.059] - nx: 4 [18:03:16.059] - relay: TRUE [18:03:16.059] - stdout: TRUE [18:03:16.059] - signal: TRUE [18:03:16.059] - resignal: FALSE [18:03:16.059] - force: TRUE [18:03:16.060] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.060] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:16.060] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.060] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.060] signalConditionsASAP(NULL, pos=0) ... done [18:03:16.060] resolve() on list ... DONE [[1]] [1] 2 [[2]] [1] 3 [[3]] [1] 3 [[4]] [1] 1 [18:03:16.061] getGlobalsAndPackages() ... [18:03:16.061] Searching for globals... [18:03:16.062] - globals found: [3] '{', 'sample', 'x' [18:03:16.063] Searching for globals ... DONE [18:03:16.063] Resolving globals: FALSE [18:03:16.063] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.064] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.064] - globals: [1] 'x' [18:03:16.064] [18:03:16.064] getGlobalsAndPackages() ... DONE [18:03:16.065] run() for 'Future' ... [18:03:16.065] - state: 'created' [18:03:16.066] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.066] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.067] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.067] - Field: 'label' [18:03:16.067] - Field: 'local' [18:03:16.067] - Field: 'owner' [18:03:16.067] - Field: 'envir' [18:03:16.068] - Field: 'packages' [18:03:16.068] - Field: 'gc' [18:03:16.068] - Field: 'conditions' [18:03:16.068] - Field: 'expr' [18:03:16.068] - Field: 'uuid' [18:03:16.068] - Field: 'seed' [18:03:16.069] - Field: 'version' [18:03:16.069] - Field: 'result' [18:03:16.069] - Field: 'asynchronous' [18:03:16.069] - Field: 'calls' [18:03:16.069] - Field: 'globals' [18:03:16.070] - Field: 'stdout' [18:03:16.070] - Field: 'earlySignal' [18:03:16.070] - Field: 'lazy' [18:03:16.070] - Field: 'state' [18:03:16.070] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.071] - Launch lazy future ... [18:03:16.071] Packages needed by the future expression (n = 0): [18:03:16.071] Packages needed by future strategies (n = 0): [18:03:16.072] { [18:03:16.072] { [18:03:16.072] { [18:03:16.072] ...future.startTime <- base::Sys.time() [18:03:16.072] { [18:03:16.072] { [18:03:16.072] { [18:03:16.072] base::local({ [18:03:16.072] has_future <- base::requireNamespace("future", [18:03:16.072] quietly = TRUE) [18:03:16.072] if (has_future) { [18:03:16.072] ns <- base::getNamespace("future") [18:03:16.072] version <- ns[[".package"]][["version"]] [18:03:16.072] if (is.null(version)) [18:03:16.072] version <- utils::packageVersion("future") [18:03:16.072] } [18:03:16.072] else { [18:03:16.072] version <- NULL [18:03:16.072] } [18:03:16.072] if (!has_future || version < "1.8.0") { [18:03:16.072] info <- base::c(r_version = base::gsub("R version ", [18:03:16.072] "", base::R.version$version.string), [18:03:16.072] platform = base::sprintf("%s (%s-bit)", [18:03:16.072] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.072] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.072] "release", "version")], collapse = " "), [18:03:16.072] hostname = base::Sys.info()[["nodename"]]) [18:03:16.072] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.072] info) [18:03:16.072] info <- base::paste(info, collapse = "; ") [18:03:16.072] if (!has_future) { [18:03:16.072] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.072] info) [18:03:16.072] } [18:03:16.072] else { [18:03:16.072] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.072] info, version) [18:03:16.072] } [18:03:16.072] base::stop(msg) [18:03:16.072] } [18:03:16.072] }) [18:03:16.072] } [18:03:16.072] options(future.plan = NULL) [18:03:16.072] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.072] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.072] } [18:03:16.072] ...future.workdir <- getwd() [18:03:16.072] } [18:03:16.072] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.072] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.072] } [18:03:16.072] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.072] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.072] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.072] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.072] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.072] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.072] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.072] base::names(...future.oldOptions)) [18:03:16.072] } [18:03:16.072] if (FALSE) { [18:03:16.072] } [18:03:16.072] else { [18:03:16.072] if (TRUE) { [18:03:16.072] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.072] open = "w") [18:03:16.072] } [18:03:16.072] else { [18:03:16.072] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.072] windows = "NUL", "/dev/null"), open = "w") [18:03:16.072] } [18:03:16.072] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.072] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.072] base::sink(type = "output", split = FALSE) [18:03:16.072] base::close(...future.stdout) [18:03:16.072] }, add = TRUE) [18:03:16.072] } [18:03:16.072] ...future.frame <- base::sys.nframe() [18:03:16.072] ...future.conditions <- base::list() [18:03:16.072] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.072] if (FALSE) { [18:03:16.072] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.072] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.072] } [18:03:16.072] ...future.result <- base::tryCatch({ [18:03:16.072] base::withCallingHandlers({ [18:03:16.072] ...future.value <- base::withVisible(base::local({ [18:03:16.072] sample(x, size = 1L) [18:03:16.072] })) [18:03:16.072] future::FutureResult(value = ...future.value$value, [18:03:16.072] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.072] ...future.rng), globalenv = if (FALSE) [18:03:16.072] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.072] ...future.globalenv.names)) [18:03:16.072] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.072] }, condition = base::local({ [18:03:16.072] c <- base::c [18:03:16.072] inherits <- base::inherits [18:03:16.072] invokeRestart <- base::invokeRestart [18:03:16.072] length <- base::length [18:03:16.072] list <- base::list [18:03:16.072] seq.int <- base::seq.int [18:03:16.072] signalCondition <- base::signalCondition [18:03:16.072] sys.calls <- base::sys.calls [18:03:16.072] `[[` <- base::`[[` [18:03:16.072] `+` <- base::`+` [18:03:16.072] `<<-` <- base::`<<-` [18:03:16.072] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.072] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.072] 3L)] [18:03:16.072] } [18:03:16.072] function(cond) { [18:03:16.072] is_error <- inherits(cond, "error") [18:03:16.072] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.072] NULL) [18:03:16.072] if (is_error) { [18:03:16.072] sessionInformation <- function() { [18:03:16.072] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.072] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.072] search = base::search(), system = base::Sys.info()) [18:03:16.072] } [18:03:16.072] ...future.conditions[[length(...future.conditions) + [18:03:16.072] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.072] cond$call), session = sessionInformation(), [18:03:16.072] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.072] signalCondition(cond) [18:03:16.072] } [18:03:16.072] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.072] "immediateCondition"))) { [18:03:16.072] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.072] ...future.conditions[[length(...future.conditions) + [18:03:16.072] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.072] if (TRUE && !signal) { [18:03:16.072] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.072] { [18:03:16.072] inherits <- base::inherits [18:03:16.072] invokeRestart <- base::invokeRestart [18:03:16.072] is.null <- base::is.null [18:03:16.072] muffled <- FALSE [18:03:16.072] if (inherits(cond, "message")) { [18:03:16.072] muffled <- grepl(pattern, "muffleMessage") [18:03:16.072] if (muffled) [18:03:16.072] invokeRestart("muffleMessage") [18:03:16.072] } [18:03:16.072] else if (inherits(cond, "warning")) { [18:03:16.072] muffled <- grepl(pattern, "muffleWarning") [18:03:16.072] if (muffled) [18:03:16.072] invokeRestart("muffleWarning") [18:03:16.072] } [18:03:16.072] else if (inherits(cond, "condition")) { [18:03:16.072] if (!is.null(pattern)) { [18:03:16.072] computeRestarts <- base::computeRestarts [18:03:16.072] grepl <- base::grepl [18:03:16.072] restarts <- computeRestarts(cond) [18:03:16.072] for (restart in restarts) { [18:03:16.072] name <- restart$name [18:03:16.072] if (is.null(name)) [18:03:16.072] next [18:03:16.072] if (!grepl(pattern, name)) [18:03:16.072] next [18:03:16.072] invokeRestart(restart) [18:03:16.072] muffled <- TRUE [18:03:16.072] break [18:03:16.072] } [18:03:16.072] } [18:03:16.072] } [18:03:16.072] invisible(muffled) [18:03:16.072] } [18:03:16.072] muffleCondition(cond, pattern = "^muffle") [18:03:16.072] } [18:03:16.072] } [18:03:16.072] else { [18:03:16.072] if (TRUE) { [18:03:16.072] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.072] { [18:03:16.072] inherits <- base::inherits [18:03:16.072] invokeRestart <- base::invokeRestart [18:03:16.072] is.null <- base::is.null [18:03:16.072] muffled <- FALSE [18:03:16.072] if (inherits(cond, "message")) { [18:03:16.072] muffled <- grepl(pattern, "muffleMessage") [18:03:16.072] if (muffled) [18:03:16.072] invokeRestart("muffleMessage") [18:03:16.072] } [18:03:16.072] else if (inherits(cond, "warning")) { [18:03:16.072] muffled <- grepl(pattern, "muffleWarning") [18:03:16.072] if (muffled) [18:03:16.072] invokeRestart("muffleWarning") [18:03:16.072] } [18:03:16.072] else if (inherits(cond, "condition")) { [18:03:16.072] if (!is.null(pattern)) { [18:03:16.072] computeRestarts <- base::computeRestarts [18:03:16.072] grepl <- base::grepl [18:03:16.072] restarts <- computeRestarts(cond) [18:03:16.072] for (restart in restarts) { [18:03:16.072] name <- restart$name [18:03:16.072] if (is.null(name)) [18:03:16.072] next [18:03:16.072] if (!grepl(pattern, name)) [18:03:16.072] next [18:03:16.072] invokeRestart(restart) [18:03:16.072] muffled <- TRUE [18:03:16.072] break [18:03:16.072] } [18:03:16.072] } [18:03:16.072] } [18:03:16.072] invisible(muffled) [18:03:16.072] } [18:03:16.072] muffleCondition(cond, pattern = "^muffle") [18:03:16.072] } [18:03:16.072] } [18:03:16.072] } [18:03:16.072] })) [18:03:16.072] }, error = function(ex) { [18:03:16.072] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.072] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.072] ...future.rng), started = ...future.startTime, [18:03:16.072] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.072] version = "1.8"), class = "FutureResult") [18:03:16.072] }, finally = { [18:03:16.072] if (!identical(...future.workdir, getwd())) [18:03:16.072] setwd(...future.workdir) [18:03:16.072] { [18:03:16.072] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.072] ...future.oldOptions$nwarnings <- NULL [18:03:16.072] } [18:03:16.072] base::options(...future.oldOptions) [18:03:16.072] if (.Platform$OS.type == "windows") { [18:03:16.072] old_names <- names(...future.oldEnvVars) [18:03:16.072] envs <- base::Sys.getenv() [18:03:16.072] names <- names(envs) [18:03:16.072] common <- intersect(names, old_names) [18:03:16.072] added <- setdiff(names, old_names) [18:03:16.072] removed <- setdiff(old_names, names) [18:03:16.072] changed <- common[...future.oldEnvVars[common] != [18:03:16.072] envs[common]] [18:03:16.072] NAMES <- toupper(changed) [18:03:16.072] args <- list() [18:03:16.072] for (kk in seq_along(NAMES)) { [18:03:16.072] name <- changed[[kk]] [18:03:16.072] NAME <- NAMES[[kk]] [18:03:16.072] if (name != NAME && is.element(NAME, old_names)) [18:03:16.072] next [18:03:16.072] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.072] } [18:03:16.072] NAMES <- toupper(added) [18:03:16.072] for (kk in seq_along(NAMES)) { [18:03:16.072] name <- added[[kk]] [18:03:16.072] NAME <- NAMES[[kk]] [18:03:16.072] if (name != NAME && is.element(NAME, old_names)) [18:03:16.072] next [18:03:16.072] args[[name]] <- "" [18:03:16.072] } [18:03:16.072] NAMES <- toupper(removed) [18:03:16.072] for (kk in seq_along(NAMES)) { [18:03:16.072] name <- removed[[kk]] [18:03:16.072] NAME <- NAMES[[kk]] [18:03:16.072] if (name != NAME && is.element(NAME, old_names)) [18:03:16.072] next [18:03:16.072] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.072] } [18:03:16.072] if (length(args) > 0) [18:03:16.072] base::do.call(base::Sys.setenv, args = args) [18:03:16.072] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.072] } [18:03:16.072] else { [18:03:16.072] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.072] } [18:03:16.072] { [18:03:16.072] if (base::length(...future.futureOptionsAdded) > [18:03:16.072] 0L) { [18:03:16.072] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.072] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.072] base::options(opts) [18:03:16.072] } [18:03:16.072] { [18:03:16.072] { [18:03:16.072] base::assign(".Random.seed", c(10407L, -360425712L, [18:03:16.072] 1204573881L, 140613387L, -565828537L, 1595519908L, [18:03:16.072] 2092638744L), envir = base::globalenv(), [18:03:16.072] inherits = FALSE) [18:03:16.072] NULL [18:03:16.072] } [18:03:16.072] options(future.plan = NULL) [18:03:16.072] if (is.na(NA_character_)) [18:03:16.072] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.072] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.072] future::plan(list(function (..., envir = parent.frame()) [18:03:16.072] { [18:03:16.072] future <- SequentialFuture(..., envir = envir) [18:03:16.072] if (!future$lazy) [18:03:16.072] future <- run(future) [18:03:16.072] invisible(future) [18:03:16.072] }), .cleanup = FALSE, .init = FALSE) [18:03:16.072] } [18:03:16.072] } [18:03:16.072] } [18:03:16.072] }) [18:03:16.072] if (TRUE) { [18:03:16.072] base::sink(type = "output", split = FALSE) [18:03:16.072] if (TRUE) { [18:03:16.072] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.072] } [18:03:16.072] else { [18:03:16.072] ...future.result["stdout"] <- base::list(NULL) [18:03:16.072] } [18:03:16.072] base::close(...future.stdout) [18:03:16.072] ...future.stdout <- NULL [18:03:16.072] } [18:03:16.072] ...future.result$conditions <- ...future.conditions [18:03:16.072] ...future.result$finished <- base::Sys.time() [18:03:16.072] ...future.result [18:03:16.072] } [18:03:16.076] assign_globals() ... [18:03:16.076] List of 1 [18:03:16.076] $ x: int [1:4] 0 1 2 3 [18:03:16.076] - attr(*, "where")=List of 1 [18:03:16.076] ..$ x: [18:03:16.076] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.076] - attr(*, "resolved")= logi FALSE [18:03:16.076] - attr(*, "total_size")= num 64 [18:03:16.076] - attr(*, "already-done")= logi TRUE [18:03:16.079] - copied 'x' to environment [18:03:16.080] assign_globals() ... done [18:03:16.080] plan(): Setting new future strategy stack: [18:03:16.080] List of future strategies: [18:03:16.080] 1. sequential: [18:03:16.080] - args: function (..., envir = parent.frame()) [18:03:16.080] - tweaked: FALSE [18:03:16.080] - call: NULL [18:03:16.081] plan(): nbrOfWorkers() = 1 [18:03:16.082] plan(): Setting new future strategy stack: [18:03:16.082] List of future strategies: [18:03:16.082] 1. sequential: [18:03:16.082] - args: function (..., envir = parent.frame()) [18:03:16.082] - tweaked: FALSE [18:03:16.082] - call: plan(strategy) [18:03:16.083] plan(): nbrOfWorkers() = 1 [18:03:16.083] SequentialFuture started (and completed) [18:03:16.083] - Launch lazy future ... done [18:03:16.083] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_1-166823' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f429c458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.086] getGlobalsAndPackages() ... [18:03:16.086] Searching for globals... [18:03:16.088] - globals found: [3] '{', 'sample', 'x' [18:03:16.088] Searching for globals ... DONE [18:03:16.088] Resolving globals: FALSE [18:03:16.089] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.089] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.089] - globals: [1] 'x' [18:03:16.090] [18:03:16.090] getGlobalsAndPackages() ... DONE [18:03:16.090] run() for 'Future' ... [18:03:16.090] - state: 'created' [18:03:16.090] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.091] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.091] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.091] - Field: 'label' [18:03:16.091] - Field: 'local' [18:03:16.092] - Field: 'owner' [18:03:16.092] - Field: 'envir' [18:03:16.092] - Field: 'packages' [18:03:16.092] - Field: 'gc' [18:03:16.092] - Field: 'conditions' [18:03:16.093] - Field: 'expr' [18:03:16.093] - Field: 'uuid' [18:03:16.093] - Field: 'seed' [18:03:16.093] - Field: 'version' [18:03:16.093] - Field: 'result' [18:03:16.093] - Field: 'asynchronous' [18:03:16.094] - Field: 'calls' [18:03:16.094] - Field: 'globals' [18:03:16.094] - Field: 'stdout' [18:03:16.094] - Field: 'earlySignal' [18:03:16.094] - Field: 'lazy' [18:03:16.095] - Field: 'state' [18:03:16.095] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.095] - Launch lazy future ... [18:03:16.095] Packages needed by the future expression (n = 0): [18:03:16.095] Packages needed by future strategies (n = 0): [18:03:16.096] { [18:03:16.096] { [18:03:16.096] { [18:03:16.096] ...future.startTime <- base::Sys.time() [18:03:16.096] { [18:03:16.096] { [18:03:16.096] { [18:03:16.096] base::local({ [18:03:16.096] has_future <- base::requireNamespace("future", [18:03:16.096] quietly = TRUE) [18:03:16.096] if (has_future) { [18:03:16.096] ns <- base::getNamespace("future") [18:03:16.096] version <- ns[[".package"]][["version"]] [18:03:16.096] if (is.null(version)) [18:03:16.096] version <- utils::packageVersion("future") [18:03:16.096] } [18:03:16.096] else { [18:03:16.096] version <- NULL [18:03:16.096] } [18:03:16.096] if (!has_future || version < "1.8.0") { [18:03:16.096] info <- base::c(r_version = base::gsub("R version ", [18:03:16.096] "", base::R.version$version.string), [18:03:16.096] platform = base::sprintf("%s (%s-bit)", [18:03:16.096] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.096] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.096] "release", "version")], collapse = " "), [18:03:16.096] hostname = base::Sys.info()[["nodename"]]) [18:03:16.096] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.096] info) [18:03:16.096] info <- base::paste(info, collapse = "; ") [18:03:16.096] if (!has_future) { [18:03:16.096] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.096] info) [18:03:16.096] } [18:03:16.096] else { [18:03:16.096] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.096] info, version) [18:03:16.096] } [18:03:16.096] base::stop(msg) [18:03:16.096] } [18:03:16.096] }) [18:03:16.096] } [18:03:16.096] options(future.plan = NULL) [18:03:16.096] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.096] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.096] } [18:03:16.096] ...future.workdir <- getwd() [18:03:16.096] } [18:03:16.096] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.096] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.096] } [18:03:16.096] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.096] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.096] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.096] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.096] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.096] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.096] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.096] base::names(...future.oldOptions)) [18:03:16.096] } [18:03:16.096] if (FALSE) { [18:03:16.096] } [18:03:16.096] else { [18:03:16.096] if (TRUE) { [18:03:16.096] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.096] open = "w") [18:03:16.096] } [18:03:16.096] else { [18:03:16.096] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.096] windows = "NUL", "/dev/null"), open = "w") [18:03:16.096] } [18:03:16.096] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.096] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.096] base::sink(type = "output", split = FALSE) [18:03:16.096] base::close(...future.stdout) [18:03:16.096] }, add = TRUE) [18:03:16.096] } [18:03:16.096] ...future.frame <- base::sys.nframe() [18:03:16.096] ...future.conditions <- base::list() [18:03:16.096] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.096] if (FALSE) { [18:03:16.096] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.096] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.096] } [18:03:16.096] ...future.result <- base::tryCatch({ [18:03:16.096] base::withCallingHandlers({ [18:03:16.096] ...future.value <- base::withVisible(base::local({ [18:03:16.096] sample(x, size = 1L) [18:03:16.096] })) [18:03:16.096] future::FutureResult(value = ...future.value$value, [18:03:16.096] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.096] ...future.rng), globalenv = if (FALSE) [18:03:16.096] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.096] ...future.globalenv.names)) [18:03:16.096] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.096] }, condition = base::local({ [18:03:16.096] c <- base::c [18:03:16.096] inherits <- base::inherits [18:03:16.096] invokeRestart <- base::invokeRestart [18:03:16.096] length <- base::length [18:03:16.096] list <- base::list [18:03:16.096] seq.int <- base::seq.int [18:03:16.096] signalCondition <- base::signalCondition [18:03:16.096] sys.calls <- base::sys.calls [18:03:16.096] `[[` <- base::`[[` [18:03:16.096] `+` <- base::`+` [18:03:16.096] `<<-` <- base::`<<-` [18:03:16.096] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.096] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.096] 3L)] [18:03:16.096] } [18:03:16.096] function(cond) { [18:03:16.096] is_error <- inherits(cond, "error") [18:03:16.096] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.096] NULL) [18:03:16.096] if (is_error) { [18:03:16.096] sessionInformation <- function() { [18:03:16.096] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.096] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.096] search = base::search(), system = base::Sys.info()) [18:03:16.096] } [18:03:16.096] ...future.conditions[[length(...future.conditions) + [18:03:16.096] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.096] cond$call), session = sessionInformation(), [18:03:16.096] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.096] signalCondition(cond) [18:03:16.096] } [18:03:16.096] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.096] "immediateCondition"))) { [18:03:16.096] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.096] ...future.conditions[[length(...future.conditions) + [18:03:16.096] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.096] if (TRUE && !signal) { [18:03:16.096] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.096] { [18:03:16.096] inherits <- base::inherits [18:03:16.096] invokeRestart <- base::invokeRestart [18:03:16.096] is.null <- base::is.null [18:03:16.096] muffled <- FALSE [18:03:16.096] if (inherits(cond, "message")) { [18:03:16.096] muffled <- grepl(pattern, "muffleMessage") [18:03:16.096] if (muffled) [18:03:16.096] invokeRestart("muffleMessage") [18:03:16.096] } [18:03:16.096] else if (inherits(cond, "warning")) { [18:03:16.096] muffled <- grepl(pattern, "muffleWarning") [18:03:16.096] if (muffled) [18:03:16.096] invokeRestart("muffleWarning") [18:03:16.096] } [18:03:16.096] else if (inherits(cond, "condition")) { [18:03:16.096] if (!is.null(pattern)) { [18:03:16.096] computeRestarts <- base::computeRestarts [18:03:16.096] grepl <- base::grepl [18:03:16.096] restarts <- computeRestarts(cond) [18:03:16.096] for (restart in restarts) { [18:03:16.096] name <- restart$name [18:03:16.096] if (is.null(name)) [18:03:16.096] next [18:03:16.096] if (!grepl(pattern, name)) [18:03:16.096] next [18:03:16.096] invokeRestart(restart) [18:03:16.096] muffled <- TRUE [18:03:16.096] break [18:03:16.096] } [18:03:16.096] } [18:03:16.096] } [18:03:16.096] invisible(muffled) [18:03:16.096] } [18:03:16.096] muffleCondition(cond, pattern = "^muffle") [18:03:16.096] } [18:03:16.096] } [18:03:16.096] else { [18:03:16.096] if (TRUE) { [18:03:16.096] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.096] { [18:03:16.096] inherits <- base::inherits [18:03:16.096] invokeRestart <- base::invokeRestart [18:03:16.096] is.null <- base::is.null [18:03:16.096] muffled <- FALSE [18:03:16.096] if (inherits(cond, "message")) { [18:03:16.096] muffled <- grepl(pattern, "muffleMessage") [18:03:16.096] if (muffled) [18:03:16.096] invokeRestart("muffleMessage") [18:03:16.096] } [18:03:16.096] else if (inherits(cond, "warning")) { [18:03:16.096] muffled <- grepl(pattern, "muffleWarning") [18:03:16.096] if (muffled) [18:03:16.096] invokeRestart("muffleWarning") [18:03:16.096] } [18:03:16.096] else if (inherits(cond, "condition")) { [18:03:16.096] if (!is.null(pattern)) { [18:03:16.096] computeRestarts <- base::computeRestarts [18:03:16.096] grepl <- base::grepl [18:03:16.096] restarts <- computeRestarts(cond) [18:03:16.096] for (restart in restarts) { [18:03:16.096] name <- restart$name [18:03:16.096] if (is.null(name)) [18:03:16.096] next [18:03:16.096] if (!grepl(pattern, name)) [18:03:16.096] next [18:03:16.096] invokeRestart(restart) [18:03:16.096] muffled <- TRUE [18:03:16.096] break [18:03:16.096] } [18:03:16.096] } [18:03:16.096] } [18:03:16.096] invisible(muffled) [18:03:16.096] } [18:03:16.096] muffleCondition(cond, pattern = "^muffle") [18:03:16.096] } [18:03:16.096] } [18:03:16.096] } [18:03:16.096] })) [18:03:16.096] }, error = function(ex) { [18:03:16.096] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.096] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.096] ...future.rng), started = ...future.startTime, [18:03:16.096] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.096] version = "1.8"), class = "FutureResult") [18:03:16.096] }, finally = { [18:03:16.096] if (!identical(...future.workdir, getwd())) [18:03:16.096] setwd(...future.workdir) [18:03:16.096] { [18:03:16.096] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.096] ...future.oldOptions$nwarnings <- NULL [18:03:16.096] } [18:03:16.096] base::options(...future.oldOptions) [18:03:16.096] if (.Platform$OS.type == "windows") { [18:03:16.096] old_names <- names(...future.oldEnvVars) [18:03:16.096] envs <- base::Sys.getenv() [18:03:16.096] names <- names(envs) [18:03:16.096] common <- intersect(names, old_names) [18:03:16.096] added <- setdiff(names, old_names) [18:03:16.096] removed <- setdiff(old_names, names) [18:03:16.096] changed <- common[...future.oldEnvVars[common] != [18:03:16.096] envs[common]] [18:03:16.096] NAMES <- toupper(changed) [18:03:16.096] args <- list() [18:03:16.096] for (kk in seq_along(NAMES)) { [18:03:16.096] name <- changed[[kk]] [18:03:16.096] NAME <- NAMES[[kk]] [18:03:16.096] if (name != NAME && is.element(NAME, old_names)) [18:03:16.096] next [18:03:16.096] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.096] } [18:03:16.096] NAMES <- toupper(added) [18:03:16.096] for (kk in seq_along(NAMES)) { [18:03:16.096] name <- added[[kk]] [18:03:16.096] NAME <- NAMES[[kk]] [18:03:16.096] if (name != NAME && is.element(NAME, old_names)) [18:03:16.096] next [18:03:16.096] args[[name]] <- "" [18:03:16.096] } [18:03:16.096] NAMES <- toupper(removed) [18:03:16.096] for (kk in seq_along(NAMES)) { [18:03:16.096] name <- removed[[kk]] [18:03:16.096] NAME <- NAMES[[kk]] [18:03:16.096] if (name != NAME && is.element(NAME, old_names)) [18:03:16.096] next [18:03:16.096] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.096] } [18:03:16.096] if (length(args) > 0) [18:03:16.096] base::do.call(base::Sys.setenv, args = args) [18:03:16.096] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.096] } [18:03:16.096] else { [18:03:16.096] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.096] } [18:03:16.096] { [18:03:16.096] if (base::length(...future.futureOptionsAdded) > [18:03:16.096] 0L) { [18:03:16.096] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.096] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.096] base::options(opts) [18:03:16.096] } [18:03:16.096] { [18:03:16.096] { [18:03:16.096] base::assign(".Random.seed", c(10407L, 140613387L, [18:03:16.096] 975528569L, -936944055L, 2092638744L, 412926000L, [18:03:16.096] -1646547732L), envir = base::globalenv(), [18:03:16.096] inherits = FALSE) [18:03:16.096] NULL [18:03:16.096] } [18:03:16.096] options(future.plan = NULL) [18:03:16.096] if (is.na(NA_character_)) [18:03:16.096] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.096] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.096] future::plan(list(function (..., envir = parent.frame()) [18:03:16.096] { [18:03:16.096] future <- SequentialFuture(..., envir = envir) [18:03:16.096] if (!future$lazy) [18:03:16.096] future <- run(future) [18:03:16.096] invisible(future) [18:03:16.096] }), .cleanup = FALSE, .init = FALSE) [18:03:16.096] } [18:03:16.096] } [18:03:16.096] } [18:03:16.096] }) [18:03:16.096] if (TRUE) { [18:03:16.096] base::sink(type = "output", split = FALSE) [18:03:16.096] if (TRUE) { [18:03:16.096] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.096] } [18:03:16.096] else { [18:03:16.096] ...future.result["stdout"] <- base::list(NULL) [18:03:16.096] } [18:03:16.096] base::close(...future.stdout) [18:03:16.096] ...future.stdout <- NULL [18:03:16.096] } [18:03:16.096] ...future.result$conditions <- ...future.conditions [18:03:16.096] ...future.result$finished <- base::Sys.time() [18:03:16.096] ...future.result [18:03:16.096] } [18:03:16.100] assign_globals() ... [18:03:16.100] List of 1 [18:03:16.100] $ x: int [1:4] 0 1 2 3 [18:03:16.100] - attr(*, "where")=List of 1 [18:03:16.100] ..$ x: [18:03:16.100] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.100] - attr(*, "resolved")= logi FALSE [18:03:16.100] - attr(*, "total_size")= num 64 [18:03:16.100] - attr(*, "already-done")= logi TRUE [18:03:16.103] - copied 'x' to environment [18:03:16.103] assign_globals() ... done [18:03:16.104] plan(): Setting new future strategy stack: [18:03:16.104] List of future strategies: [18:03:16.104] 1. sequential: [18:03:16.104] - args: function (..., envir = parent.frame()) [18:03:16.104] - tweaked: FALSE [18:03:16.104] - call: NULL [18:03:16.104] plan(): nbrOfWorkers() = 1 [18:03:16.105] plan(): Setting new future strategy stack: [18:03:16.106] List of future strategies: [18:03:16.106] 1. sequential: [18:03:16.106] - args: function (..., envir = parent.frame()) [18:03:16.106] - tweaked: FALSE [18:03:16.106] - call: plan(strategy) [18:03:16.106] plan(): nbrOfWorkers() = 1 [18:03:16.106] SequentialFuture started (and completed) [18:03:16.107] - Launch lazy future ... done [18:03:16.107] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_2-535116' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f429c458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.108] getGlobalsAndPackages() ... [18:03:16.108] Searching for globals... [18:03:16.109] - globals found: [3] '{', 'sample', 'x' [18:03:16.109] Searching for globals ... DONE [18:03:16.110] Resolving globals: FALSE [18:03:16.110] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.110] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.111] - globals: [1] 'x' [18:03:16.111] [18:03:16.111] getGlobalsAndPackages() ... DONE [18:03:16.111] run() for 'Future' ... [18:03:16.111] - state: 'created' [18:03:16.112] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.112] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.112] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.112] - Field: 'label' [18:03:16.113] - Field: 'local' [18:03:16.113] - Field: 'owner' [18:03:16.113] - Field: 'envir' [18:03:16.113] - Field: 'packages' [18:03:16.113] - Field: 'gc' [18:03:16.113] - Field: 'conditions' [18:03:16.114] - Field: 'expr' [18:03:16.114] - Field: 'uuid' [18:03:16.114] - Field: 'seed' [18:03:16.114] - Field: 'version' [18:03:16.114] - Field: 'result' [18:03:16.114] - Field: 'asynchronous' [18:03:16.115] - Field: 'calls' [18:03:16.115] - Field: 'globals' [18:03:16.115] - Field: 'stdout' [18:03:16.115] - Field: 'earlySignal' [18:03:16.115] - Field: 'lazy' [18:03:16.116] - Field: 'state' [18:03:16.116] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.116] - Launch lazy future ... [18:03:16.116] Packages needed by the future expression (n = 0): [18:03:16.116] Packages needed by future strategies (n = 0): [18:03:16.117] { [18:03:16.117] { [18:03:16.117] { [18:03:16.117] ...future.startTime <- base::Sys.time() [18:03:16.117] { [18:03:16.117] { [18:03:16.117] { [18:03:16.117] base::local({ [18:03:16.117] has_future <- base::requireNamespace("future", [18:03:16.117] quietly = TRUE) [18:03:16.117] if (has_future) { [18:03:16.117] ns <- base::getNamespace("future") [18:03:16.117] version <- ns[[".package"]][["version"]] [18:03:16.117] if (is.null(version)) [18:03:16.117] version <- utils::packageVersion("future") [18:03:16.117] } [18:03:16.117] else { [18:03:16.117] version <- NULL [18:03:16.117] } [18:03:16.117] if (!has_future || version < "1.8.0") { [18:03:16.117] info <- base::c(r_version = base::gsub("R version ", [18:03:16.117] "", base::R.version$version.string), [18:03:16.117] platform = base::sprintf("%s (%s-bit)", [18:03:16.117] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.117] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.117] "release", "version")], collapse = " "), [18:03:16.117] hostname = base::Sys.info()[["nodename"]]) [18:03:16.117] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.117] info) [18:03:16.117] info <- base::paste(info, collapse = "; ") [18:03:16.117] if (!has_future) { [18:03:16.117] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.117] info) [18:03:16.117] } [18:03:16.117] else { [18:03:16.117] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.117] info, version) [18:03:16.117] } [18:03:16.117] base::stop(msg) [18:03:16.117] } [18:03:16.117] }) [18:03:16.117] } [18:03:16.117] options(future.plan = NULL) [18:03:16.117] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.117] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.117] } [18:03:16.117] ...future.workdir <- getwd() [18:03:16.117] } [18:03:16.117] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.117] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.117] } [18:03:16.117] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.117] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.117] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.117] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.117] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.117] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.117] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.117] base::names(...future.oldOptions)) [18:03:16.117] } [18:03:16.117] if (FALSE) { [18:03:16.117] } [18:03:16.117] else { [18:03:16.117] if (TRUE) { [18:03:16.117] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.117] open = "w") [18:03:16.117] } [18:03:16.117] else { [18:03:16.117] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.117] windows = "NUL", "/dev/null"), open = "w") [18:03:16.117] } [18:03:16.117] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.117] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.117] base::sink(type = "output", split = FALSE) [18:03:16.117] base::close(...future.stdout) [18:03:16.117] }, add = TRUE) [18:03:16.117] } [18:03:16.117] ...future.frame <- base::sys.nframe() [18:03:16.117] ...future.conditions <- base::list() [18:03:16.117] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.117] if (FALSE) { [18:03:16.117] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.117] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.117] } [18:03:16.117] ...future.result <- base::tryCatch({ [18:03:16.117] base::withCallingHandlers({ [18:03:16.117] ...future.value <- base::withVisible(base::local({ [18:03:16.117] sample(x, size = 1L) [18:03:16.117] })) [18:03:16.117] future::FutureResult(value = ...future.value$value, [18:03:16.117] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.117] ...future.rng), globalenv = if (FALSE) [18:03:16.117] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.117] ...future.globalenv.names)) [18:03:16.117] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.117] }, condition = base::local({ [18:03:16.117] c <- base::c [18:03:16.117] inherits <- base::inherits [18:03:16.117] invokeRestart <- base::invokeRestart [18:03:16.117] length <- base::length [18:03:16.117] list <- base::list [18:03:16.117] seq.int <- base::seq.int [18:03:16.117] signalCondition <- base::signalCondition [18:03:16.117] sys.calls <- base::sys.calls [18:03:16.117] `[[` <- base::`[[` [18:03:16.117] `+` <- base::`+` [18:03:16.117] `<<-` <- base::`<<-` [18:03:16.117] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.117] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.117] 3L)] [18:03:16.117] } [18:03:16.117] function(cond) { [18:03:16.117] is_error <- inherits(cond, "error") [18:03:16.117] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.117] NULL) [18:03:16.117] if (is_error) { [18:03:16.117] sessionInformation <- function() { [18:03:16.117] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.117] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.117] search = base::search(), system = base::Sys.info()) [18:03:16.117] } [18:03:16.117] ...future.conditions[[length(...future.conditions) + [18:03:16.117] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.117] cond$call), session = sessionInformation(), [18:03:16.117] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.117] signalCondition(cond) [18:03:16.117] } [18:03:16.117] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.117] "immediateCondition"))) { [18:03:16.117] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.117] ...future.conditions[[length(...future.conditions) + [18:03:16.117] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.117] if (TRUE && !signal) { [18:03:16.117] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.117] { [18:03:16.117] inherits <- base::inherits [18:03:16.117] invokeRestart <- base::invokeRestart [18:03:16.117] is.null <- base::is.null [18:03:16.117] muffled <- FALSE [18:03:16.117] if (inherits(cond, "message")) { [18:03:16.117] muffled <- grepl(pattern, "muffleMessage") [18:03:16.117] if (muffled) [18:03:16.117] invokeRestart("muffleMessage") [18:03:16.117] } [18:03:16.117] else if (inherits(cond, "warning")) { [18:03:16.117] muffled <- grepl(pattern, "muffleWarning") [18:03:16.117] if (muffled) [18:03:16.117] invokeRestart("muffleWarning") [18:03:16.117] } [18:03:16.117] else if (inherits(cond, "condition")) { [18:03:16.117] if (!is.null(pattern)) { [18:03:16.117] computeRestarts <- base::computeRestarts [18:03:16.117] grepl <- base::grepl [18:03:16.117] restarts <- computeRestarts(cond) [18:03:16.117] for (restart in restarts) { [18:03:16.117] name <- restart$name [18:03:16.117] if (is.null(name)) [18:03:16.117] next [18:03:16.117] if (!grepl(pattern, name)) [18:03:16.117] next [18:03:16.117] invokeRestart(restart) [18:03:16.117] muffled <- TRUE [18:03:16.117] break [18:03:16.117] } [18:03:16.117] } [18:03:16.117] } [18:03:16.117] invisible(muffled) [18:03:16.117] } [18:03:16.117] muffleCondition(cond, pattern = "^muffle") [18:03:16.117] } [18:03:16.117] } [18:03:16.117] else { [18:03:16.117] if (TRUE) { [18:03:16.117] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.117] { [18:03:16.117] inherits <- base::inherits [18:03:16.117] invokeRestart <- base::invokeRestart [18:03:16.117] is.null <- base::is.null [18:03:16.117] muffled <- FALSE [18:03:16.117] if (inherits(cond, "message")) { [18:03:16.117] muffled <- grepl(pattern, "muffleMessage") [18:03:16.117] if (muffled) [18:03:16.117] invokeRestart("muffleMessage") [18:03:16.117] } [18:03:16.117] else if (inherits(cond, "warning")) { [18:03:16.117] muffled <- grepl(pattern, "muffleWarning") [18:03:16.117] if (muffled) [18:03:16.117] invokeRestart("muffleWarning") [18:03:16.117] } [18:03:16.117] else if (inherits(cond, "condition")) { [18:03:16.117] if (!is.null(pattern)) { [18:03:16.117] computeRestarts <- base::computeRestarts [18:03:16.117] grepl <- base::grepl [18:03:16.117] restarts <- computeRestarts(cond) [18:03:16.117] for (restart in restarts) { [18:03:16.117] name <- restart$name [18:03:16.117] if (is.null(name)) [18:03:16.117] next [18:03:16.117] if (!grepl(pattern, name)) [18:03:16.117] next [18:03:16.117] invokeRestart(restart) [18:03:16.117] muffled <- TRUE [18:03:16.117] break [18:03:16.117] } [18:03:16.117] } [18:03:16.117] } [18:03:16.117] invisible(muffled) [18:03:16.117] } [18:03:16.117] muffleCondition(cond, pattern = "^muffle") [18:03:16.117] } [18:03:16.117] } [18:03:16.117] } [18:03:16.117] })) [18:03:16.117] }, error = function(ex) { [18:03:16.117] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.117] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.117] ...future.rng), started = ...future.startTime, [18:03:16.117] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.117] version = "1.8"), class = "FutureResult") [18:03:16.117] }, finally = { [18:03:16.117] if (!identical(...future.workdir, getwd())) [18:03:16.117] setwd(...future.workdir) [18:03:16.117] { [18:03:16.117] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.117] ...future.oldOptions$nwarnings <- NULL [18:03:16.117] } [18:03:16.117] base::options(...future.oldOptions) [18:03:16.117] if (.Platform$OS.type == "windows") { [18:03:16.117] old_names <- names(...future.oldEnvVars) [18:03:16.117] envs <- base::Sys.getenv() [18:03:16.117] names <- names(envs) [18:03:16.117] common <- intersect(names, old_names) [18:03:16.117] added <- setdiff(names, old_names) [18:03:16.117] removed <- setdiff(old_names, names) [18:03:16.117] changed <- common[...future.oldEnvVars[common] != [18:03:16.117] envs[common]] [18:03:16.117] NAMES <- toupper(changed) [18:03:16.117] args <- list() [18:03:16.117] for (kk in seq_along(NAMES)) { [18:03:16.117] name <- changed[[kk]] [18:03:16.117] NAME <- NAMES[[kk]] [18:03:16.117] if (name != NAME && is.element(NAME, old_names)) [18:03:16.117] next [18:03:16.117] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.117] } [18:03:16.117] NAMES <- toupper(added) [18:03:16.117] for (kk in seq_along(NAMES)) { [18:03:16.117] name <- added[[kk]] [18:03:16.117] NAME <- NAMES[[kk]] [18:03:16.117] if (name != NAME && is.element(NAME, old_names)) [18:03:16.117] next [18:03:16.117] args[[name]] <- "" [18:03:16.117] } [18:03:16.117] NAMES <- toupper(removed) [18:03:16.117] for (kk in seq_along(NAMES)) { [18:03:16.117] name <- removed[[kk]] [18:03:16.117] NAME <- NAMES[[kk]] [18:03:16.117] if (name != NAME && is.element(NAME, old_names)) [18:03:16.117] next [18:03:16.117] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.117] } [18:03:16.117] if (length(args) > 0) [18:03:16.117] base::do.call(base::Sys.setenv, args = args) [18:03:16.117] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.117] } [18:03:16.117] else { [18:03:16.117] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.117] } [18:03:16.117] { [18:03:16.117] if (base::length(...future.futureOptionsAdded) > [18:03:16.117] 0L) { [18:03:16.117] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.117] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.117] base::options(opts) [18:03:16.117] } [18:03:16.117] { [18:03:16.117] { [18:03:16.117] base::assign(".Random.seed", c(10407L, -936944055L, [18:03:16.117] -1017084284L, 127613059L, -1646547732L, -1681072108L, [18:03:16.117] 213234980L), envir = base::globalenv(), inherits = FALSE) [18:03:16.117] NULL [18:03:16.117] } [18:03:16.117] options(future.plan = NULL) [18:03:16.117] if (is.na(NA_character_)) [18:03:16.117] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.117] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.117] future::plan(list(function (..., envir = parent.frame()) [18:03:16.117] { [18:03:16.117] future <- SequentialFuture(..., envir = envir) [18:03:16.117] if (!future$lazy) [18:03:16.117] future <- run(future) [18:03:16.117] invisible(future) [18:03:16.117] }), .cleanup = FALSE, .init = FALSE) [18:03:16.117] } [18:03:16.117] } [18:03:16.117] } [18:03:16.117] }) [18:03:16.117] if (TRUE) { [18:03:16.117] base::sink(type = "output", split = FALSE) [18:03:16.117] if (TRUE) { [18:03:16.117] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.117] } [18:03:16.117] else { [18:03:16.117] ...future.result["stdout"] <- base::list(NULL) [18:03:16.117] } [18:03:16.117] base::close(...future.stdout) [18:03:16.117] ...future.stdout <- NULL [18:03:16.117] } [18:03:16.117] ...future.result$conditions <- ...future.conditions [18:03:16.117] ...future.result$finished <- base::Sys.time() [18:03:16.117] ...future.result [18:03:16.117] } [18:03:16.121] assign_globals() ... [18:03:16.121] List of 1 [18:03:16.121] $ x: int [1:4] 0 1 2 3 [18:03:16.121] - attr(*, "where")=List of 1 [18:03:16.121] ..$ x: [18:03:16.121] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.121] - attr(*, "resolved")= logi FALSE [18:03:16.121] - attr(*, "total_size")= num 64 [18:03:16.121] - attr(*, "already-done")= logi TRUE [18:03:16.124] - copied 'x' to environment [18:03:16.124] assign_globals() ... done [18:03:16.125] plan(): Setting new future strategy stack: [18:03:16.125] List of future strategies: [18:03:16.125] 1. sequential: [18:03:16.125] - args: function (..., envir = parent.frame()) [18:03:16.125] - tweaked: FALSE [18:03:16.125] - call: NULL [18:03:16.126] plan(): nbrOfWorkers() = 1 [18:03:16.127] plan(): Setting new future strategy stack: [18:03:16.127] List of future strategies: [18:03:16.127] 1. sequential: [18:03:16.127] - args: function (..., envir = parent.frame()) [18:03:16.127] - tweaked: FALSE [18:03:16.127] - call: plan(strategy) [18:03:16.128] plan(): nbrOfWorkers() = 1 [18:03:16.128] SequentialFuture started (and completed) [18:03:16.128] - Launch lazy future ... done [18:03:16.128] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_3-260838' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f429c458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.129] getGlobalsAndPackages() ... [18:03:16.130] Searching for globals... [18:03:16.131] - globals found: [3] '{', 'sample', 'x' [18:03:16.131] Searching for globals ... DONE [18:03:16.131] Resolving globals: FALSE [18:03:16.131] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.132] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.132] - globals: [1] 'x' [18:03:16.132] [18:03:16.132] getGlobalsAndPackages() ... DONE [18:03:16.133] run() for 'Future' ... [18:03:16.133] - state: 'created' [18:03:16.133] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.134] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.134] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.134] - Field: 'label' [18:03:16.134] - Field: 'local' [18:03:16.134] - Field: 'owner' [18:03:16.134] - Field: 'envir' [18:03:16.135] - Field: 'packages' [18:03:16.135] - Field: 'gc' [18:03:16.135] - Field: 'conditions' [18:03:16.135] - Field: 'expr' [18:03:16.135] - Field: 'uuid' [18:03:16.135] - Field: 'seed' [18:03:16.136] - Field: 'version' [18:03:16.136] - Field: 'result' [18:03:16.136] - Field: 'asynchronous' [18:03:16.136] - Field: 'calls' [18:03:16.136] - Field: 'globals' [18:03:16.136] - Field: 'stdout' [18:03:16.137] - Field: 'earlySignal' [18:03:16.137] - Field: 'lazy' [18:03:16.137] - Field: 'state' [18:03:16.137] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.137] - Launch lazy future ... [18:03:16.138] Packages needed by the future expression (n = 0): [18:03:16.138] Packages needed by future strategies (n = 0): [18:03:16.138] { [18:03:16.138] { [18:03:16.138] { [18:03:16.138] ...future.startTime <- base::Sys.time() [18:03:16.138] { [18:03:16.138] { [18:03:16.138] { [18:03:16.138] base::local({ [18:03:16.138] has_future <- base::requireNamespace("future", [18:03:16.138] quietly = TRUE) [18:03:16.138] if (has_future) { [18:03:16.138] ns <- base::getNamespace("future") [18:03:16.138] version <- ns[[".package"]][["version"]] [18:03:16.138] if (is.null(version)) [18:03:16.138] version <- utils::packageVersion("future") [18:03:16.138] } [18:03:16.138] else { [18:03:16.138] version <- NULL [18:03:16.138] } [18:03:16.138] if (!has_future || version < "1.8.0") { [18:03:16.138] info <- base::c(r_version = base::gsub("R version ", [18:03:16.138] "", base::R.version$version.string), [18:03:16.138] platform = base::sprintf("%s (%s-bit)", [18:03:16.138] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.138] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.138] "release", "version")], collapse = " "), [18:03:16.138] hostname = base::Sys.info()[["nodename"]]) [18:03:16.138] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.138] info) [18:03:16.138] info <- base::paste(info, collapse = "; ") [18:03:16.138] if (!has_future) { [18:03:16.138] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.138] info) [18:03:16.138] } [18:03:16.138] else { [18:03:16.138] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.138] info, version) [18:03:16.138] } [18:03:16.138] base::stop(msg) [18:03:16.138] } [18:03:16.138] }) [18:03:16.138] } [18:03:16.138] options(future.plan = NULL) [18:03:16.138] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.138] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.138] } [18:03:16.138] ...future.workdir <- getwd() [18:03:16.138] } [18:03:16.138] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.138] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.138] } [18:03:16.138] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.138] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.138] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.138] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.138] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.138] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.138] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.138] base::names(...future.oldOptions)) [18:03:16.138] } [18:03:16.138] if (FALSE) { [18:03:16.138] } [18:03:16.138] else { [18:03:16.138] if (TRUE) { [18:03:16.138] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.138] open = "w") [18:03:16.138] } [18:03:16.138] else { [18:03:16.138] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.138] windows = "NUL", "/dev/null"), open = "w") [18:03:16.138] } [18:03:16.138] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.138] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.138] base::sink(type = "output", split = FALSE) [18:03:16.138] base::close(...future.stdout) [18:03:16.138] }, add = TRUE) [18:03:16.138] } [18:03:16.138] ...future.frame <- base::sys.nframe() [18:03:16.138] ...future.conditions <- base::list() [18:03:16.138] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.138] if (FALSE) { [18:03:16.138] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.138] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.138] } [18:03:16.138] ...future.result <- base::tryCatch({ [18:03:16.138] base::withCallingHandlers({ [18:03:16.138] ...future.value <- base::withVisible(base::local({ [18:03:16.138] sample(x, size = 1L) [18:03:16.138] })) [18:03:16.138] future::FutureResult(value = ...future.value$value, [18:03:16.138] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.138] ...future.rng), globalenv = if (FALSE) [18:03:16.138] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.138] ...future.globalenv.names)) [18:03:16.138] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.138] }, condition = base::local({ [18:03:16.138] c <- base::c [18:03:16.138] inherits <- base::inherits [18:03:16.138] invokeRestart <- base::invokeRestart [18:03:16.138] length <- base::length [18:03:16.138] list <- base::list [18:03:16.138] seq.int <- base::seq.int [18:03:16.138] signalCondition <- base::signalCondition [18:03:16.138] sys.calls <- base::sys.calls [18:03:16.138] `[[` <- base::`[[` [18:03:16.138] `+` <- base::`+` [18:03:16.138] `<<-` <- base::`<<-` [18:03:16.138] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.138] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.138] 3L)] [18:03:16.138] } [18:03:16.138] function(cond) { [18:03:16.138] is_error <- inherits(cond, "error") [18:03:16.138] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.138] NULL) [18:03:16.138] if (is_error) { [18:03:16.138] sessionInformation <- function() { [18:03:16.138] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.138] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.138] search = base::search(), system = base::Sys.info()) [18:03:16.138] } [18:03:16.138] ...future.conditions[[length(...future.conditions) + [18:03:16.138] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.138] cond$call), session = sessionInformation(), [18:03:16.138] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.138] signalCondition(cond) [18:03:16.138] } [18:03:16.138] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.138] "immediateCondition"))) { [18:03:16.138] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.138] ...future.conditions[[length(...future.conditions) + [18:03:16.138] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.138] if (TRUE && !signal) { [18:03:16.138] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.138] { [18:03:16.138] inherits <- base::inherits [18:03:16.138] invokeRestart <- base::invokeRestart [18:03:16.138] is.null <- base::is.null [18:03:16.138] muffled <- FALSE [18:03:16.138] if (inherits(cond, "message")) { [18:03:16.138] muffled <- grepl(pattern, "muffleMessage") [18:03:16.138] if (muffled) [18:03:16.138] invokeRestart("muffleMessage") [18:03:16.138] } [18:03:16.138] else if (inherits(cond, "warning")) { [18:03:16.138] muffled <- grepl(pattern, "muffleWarning") [18:03:16.138] if (muffled) [18:03:16.138] invokeRestart("muffleWarning") [18:03:16.138] } [18:03:16.138] else if (inherits(cond, "condition")) { [18:03:16.138] if (!is.null(pattern)) { [18:03:16.138] computeRestarts <- base::computeRestarts [18:03:16.138] grepl <- base::grepl [18:03:16.138] restarts <- computeRestarts(cond) [18:03:16.138] for (restart in restarts) { [18:03:16.138] name <- restart$name [18:03:16.138] if (is.null(name)) [18:03:16.138] next [18:03:16.138] if (!grepl(pattern, name)) [18:03:16.138] next [18:03:16.138] invokeRestart(restart) [18:03:16.138] muffled <- TRUE [18:03:16.138] break [18:03:16.138] } [18:03:16.138] } [18:03:16.138] } [18:03:16.138] invisible(muffled) [18:03:16.138] } [18:03:16.138] muffleCondition(cond, pattern = "^muffle") [18:03:16.138] } [18:03:16.138] } [18:03:16.138] else { [18:03:16.138] if (TRUE) { [18:03:16.138] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.138] { [18:03:16.138] inherits <- base::inherits [18:03:16.138] invokeRestart <- base::invokeRestart [18:03:16.138] is.null <- base::is.null [18:03:16.138] muffled <- FALSE [18:03:16.138] if (inherits(cond, "message")) { [18:03:16.138] muffled <- grepl(pattern, "muffleMessage") [18:03:16.138] if (muffled) [18:03:16.138] invokeRestart("muffleMessage") [18:03:16.138] } [18:03:16.138] else if (inherits(cond, "warning")) { [18:03:16.138] muffled <- grepl(pattern, "muffleWarning") [18:03:16.138] if (muffled) [18:03:16.138] invokeRestart("muffleWarning") [18:03:16.138] } [18:03:16.138] else if (inherits(cond, "condition")) { [18:03:16.138] if (!is.null(pattern)) { [18:03:16.138] computeRestarts <- base::computeRestarts [18:03:16.138] grepl <- base::grepl [18:03:16.138] restarts <- computeRestarts(cond) [18:03:16.138] for (restart in restarts) { [18:03:16.138] name <- restart$name [18:03:16.138] if (is.null(name)) [18:03:16.138] next [18:03:16.138] if (!grepl(pattern, name)) [18:03:16.138] next [18:03:16.138] invokeRestart(restart) [18:03:16.138] muffled <- TRUE [18:03:16.138] break [18:03:16.138] } [18:03:16.138] } [18:03:16.138] } [18:03:16.138] invisible(muffled) [18:03:16.138] } [18:03:16.138] muffleCondition(cond, pattern = "^muffle") [18:03:16.138] } [18:03:16.138] } [18:03:16.138] } [18:03:16.138] })) [18:03:16.138] }, error = function(ex) { [18:03:16.138] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.138] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.138] ...future.rng), started = ...future.startTime, [18:03:16.138] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.138] version = "1.8"), class = "FutureResult") [18:03:16.138] }, finally = { [18:03:16.138] if (!identical(...future.workdir, getwd())) [18:03:16.138] setwd(...future.workdir) [18:03:16.138] { [18:03:16.138] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.138] ...future.oldOptions$nwarnings <- NULL [18:03:16.138] } [18:03:16.138] base::options(...future.oldOptions) [18:03:16.138] if (.Platform$OS.type == "windows") { [18:03:16.138] old_names <- names(...future.oldEnvVars) [18:03:16.138] envs <- base::Sys.getenv() [18:03:16.138] names <- names(envs) [18:03:16.138] common <- intersect(names, old_names) [18:03:16.138] added <- setdiff(names, old_names) [18:03:16.138] removed <- setdiff(old_names, names) [18:03:16.138] changed <- common[...future.oldEnvVars[common] != [18:03:16.138] envs[common]] [18:03:16.138] NAMES <- toupper(changed) [18:03:16.138] args <- list() [18:03:16.138] for (kk in seq_along(NAMES)) { [18:03:16.138] name <- changed[[kk]] [18:03:16.138] NAME <- NAMES[[kk]] [18:03:16.138] if (name != NAME && is.element(NAME, old_names)) [18:03:16.138] next [18:03:16.138] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.138] } [18:03:16.138] NAMES <- toupper(added) [18:03:16.138] for (kk in seq_along(NAMES)) { [18:03:16.138] name <- added[[kk]] [18:03:16.138] NAME <- NAMES[[kk]] [18:03:16.138] if (name != NAME && is.element(NAME, old_names)) [18:03:16.138] next [18:03:16.138] args[[name]] <- "" [18:03:16.138] } [18:03:16.138] NAMES <- toupper(removed) [18:03:16.138] for (kk in seq_along(NAMES)) { [18:03:16.138] name <- removed[[kk]] [18:03:16.138] NAME <- NAMES[[kk]] [18:03:16.138] if (name != NAME && is.element(NAME, old_names)) [18:03:16.138] next [18:03:16.138] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.138] } [18:03:16.138] if (length(args) > 0) [18:03:16.138] base::do.call(base::Sys.setenv, args = args) [18:03:16.138] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.138] } [18:03:16.138] else { [18:03:16.138] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.138] } [18:03:16.138] { [18:03:16.138] if (base::length(...future.futureOptionsAdded) > [18:03:16.138] 0L) { [18:03:16.138] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.138] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.138] base::options(opts) [18:03:16.138] } [18:03:16.138] { [18:03:16.138] { [18:03:16.138] base::assign(".Random.seed", c(10407L, 127613059L, [18:03:16.138] 1025761628L, -1478220506L, 213234980L, -1686519009L, [18:03:16.138] -1529045512L), envir = base::globalenv(), [18:03:16.138] inherits = FALSE) [18:03:16.138] NULL [18:03:16.138] } [18:03:16.138] options(future.plan = NULL) [18:03:16.138] if (is.na(NA_character_)) [18:03:16.138] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.138] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.138] future::plan(list(function (..., envir = parent.frame()) [18:03:16.138] { [18:03:16.138] future <- SequentialFuture(..., envir = envir) [18:03:16.138] if (!future$lazy) [18:03:16.138] future <- run(future) [18:03:16.138] invisible(future) [18:03:16.138] }), .cleanup = FALSE, .init = FALSE) [18:03:16.138] } [18:03:16.138] } [18:03:16.138] } [18:03:16.138] }) [18:03:16.138] if (TRUE) { [18:03:16.138] base::sink(type = "output", split = FALSE) [18:03:16.138] if (TRUE) { [18:03:16.138] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.138] } [18:03:16.138] else { [18:03:16.138] ...future.result["stdout"] <- base::list(NULL) [18:03:16.138] } [18:03:16.138] base::close(...future.stdout) [18:03:16.138] ...future.stdout <- NULL [18:03:16.138] } [18:03:16.138] ...future.result$conditions <- ...future.conditions [18:03:16.138] ...future.result$finished <- base::Sys.time() [18:03:16.138] ...future.result [18:03:16.138] } [18:03:16.142] assign_globals() ... [18:03:16.142] List of 1 [18:03:16.142] $ x: int [1:4] 0 1 2 3 [18:03:16.142] - attr(*, "where")=List of 1 [18:03:16.142] ..$ x: [18:03:16.142] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.142] - attr(*, "resolved")= logi FALSE [18:03:16.142] - attr(*, "total_size")= num 64 [18:03:16.142] - attr(*, "already-done")= logi TRUE [18:03:16.145] - copied 'x' to environment [18:03:16.145] assign_globals() ... done [18:03:16.146] plan(): Setting new future strategy stack: [18:03:16.146] List of future strategies: [18:03:16.146] 1. sequential: [18:03:16.146] - args: function (..., envir = parent.frame()) [18:03:16.146] - tweaked: FALSE [18:03:16.146] - call: NULL [18:03:16.146] plan(): nbrOfWorkers() = 1 [18:03:16.148] plan(): Setting new future strategy stack: [18:03:16.148] List of future strategies: [18:03:16.148] 1. sequential: [18:03:16.148] - args: function (..., envir = parent.frame()) [18:03:16.148] - tweaked: FALSE [18:03:16.148] - call: plan(strategy) [18:03:16.148] plan(): nbrOfWorkers() = 1 [18:03:16.148] SequentialFuture started (and completed) [18:03:16.149] - Launch lazy future ... done [18:03:16.149] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_4-656136' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f429c458 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.150] resolve() on list ... [18:03:16.150] recursive: 0 [18:03:16.150] length: 4 [18:03:16.150] [18:03:16.150] resolved() for 'SequentialFuture' ... [18:03:16.151] - state: 'finished' [18:03:16.151] - run: TRUE [18:03:16.151] - result: 'FutureResult' [18:03:16.151] resolved() for 'SequentialFuture' ... done [18:03:16.151] Future #1 [18:03:16.152] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:16.152] - nx: 4 [18:03:16.152] - relay: TRUE [18:03:16.152] - stdout: TRUE [18:03:16.152] - signal: TRUE [18:03:16.152] - resignal: FALSE [18:03:16.153] - force: TRUE [18:03:16.153] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.153] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.153] - until=1 [18:03:16.153] - relaying element #1 [18:03:16.153] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.154] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.154] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:03:16.154] length: 3 (resolved future 1) [18:03:16.154] resolved() for 'SequentialFuture' ... [18:03:16.154] - state: 'finished' [18:03:16.154] - run: TRUE [18:03:16.155] - result: 'FutureResult' [18:03:16.155] resolved() for 'SequentialFuture' ... done [18:03:16.155] Future #2 [18:03:16.155] signalConditionsASAP(SequentialFuture, pos=2) ... [18:03:16.155] - nx: 4 [18:03:16.156] - relay: TRUE [18:03:16.156] - stdout: TRUE [18:03:16.156] - signal: TRUE [18:03:16.156] - resignal: FALSE [18:03:16.156] - force: TRUE [18:03:16.156] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.156] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.157] - until=2 [18:03:16.157] - relaying element #2 [18:03:16.157] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.157] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.157] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:03:16.158] length: 2 (resolved future 2) [18:03:16.158] resolved() for 'SequentialFuture' ... [18:03:16.158] - state: 'finished' [18:03:16.158] - run: TRUE [18:03:16.158] - result: 'FutureResult' [18:03:16.158] resolved() for 'SequentialFuture' ... done [18:03:16.159] Future #3 [18:03:16.159] signalConditionsASAP(SequentialFuture, pos=3) ... [18:03:16.159] - nx: 4 [18:03:16.159] - relay: TRUE [18:03:16.159] - stdout: TRUE [18:03:16.159] - signal: TRUE [18:03:16.160] - resignal: FALSE [18:03:16.160] - force: TRUE [18:03:16.160] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.160] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.160] - until=3 [18:03:16.160] - relaying element #3 [18:03:16.161] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.162] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.162] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:03:16.162] length: 1 (resolved future 3) [18:03:16.162] resolved() for 'SequentialFuture' ... [18:03:16.163] - state: 'finished' [18:03:16.163] - run: TRUE [18:03:16.163] - result: 'FutureResult' [18:03:16.163] resolved() for 'SequentialFuture' ... done [18:03:16.163] Future #4 [18:03:16.163] signalConditionsASAP(SequentialFuture, pos=4) ... [18:03:16.164] - nx: 4 [18:03:16.164] - relay: TRUE [18:03:16.164] - stdout: TRUE [18:03:16.164] - signal: TRUE [18:03:16.164] - resignal: FALSE [18:03:16.164] - force: TRUE [18:03:16.165] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.165] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.165] - until=4 [18:03:16.165] - relaying element #4 [18:03:16.165] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.165] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.166] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:03:16.166] length: 0 (resolved future 4) [18:03:16.166] Relaying remaining futures [18:03:16.166] signalConditionsASAP(NULL, pos=0) ... [18:03:16.166] - nx: 4 [18:03:16.166] - relay: TRUE [18:03:16.167] - stdout: TRUE [18:03:16.167] - signal: TRUE [18:03:16.167] - resignal: FALSE [18:03:16.167] - force: TRUE [18:03:16.167] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.167] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:16.168] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.168] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.168] signalConditionsASAP(NULL, pos=0) ... done [18:03:16.168] resolve() on list ... DONE [[1]] [1] 0 [[2]] [1] 3 [[3]] [1] 2 [[4]] [1] 3 [18:03:16.169] getGlobalsAndPackages() ... [18:03:16.169] Searching for globals... [18:03:16.170] - globals found: [3] '{', 'sample', 'x' [18:03:16.170] Searching for globals ... DONE [18:03:16.170] Resolving globals: FALSE [18:03:16.171] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.171] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.171] - globals: [1] 'x' [18:03:16.172] [18:03:16.172] getGlobalsAndPackages() ... DONE [18:03:16.172] run() for 'Future' ... [18:03:16.172] - state: 'created' [18:03:16.172] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.173] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.173] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.173] - Field: 'label' [18:03:16.173] - Field: 'local' [18:03:16.174] - Field: 'owner' [18:03:16.174] - Field: 'envir' [18:03:16.174] - Field: 'packages' [18:03:16.174] - Field: 'gc' [18:03:16.174] - Field: 'conditions' [18:03:16.174] - Field: 'expr' [18:03:16.175] - Field: 'uuid' [18:03:16.175] - Field: 'seed' [18:03:16.175] - Field: 'version' [18:03:16.175] - Field: 'result' [18:03:16.175] - Field: 'asynchronous' [18:03:16.175] - Field: 'calls' [18:03:16.176] - Field: 'globals' [18:03:16.176] - Field: 'stdout' [18:03:16.176] - Field: 'earlySignal' [18:03:16.176] - Field: 'lazy' [18:03:16.176] - Field: 'state' [18:03:16.177] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.177] - Launch lazy future ... [18:03:16.177] Packages needed by the future expression (n = 0): [18:03:16.177] Packages needed by future strategies (n = 0): [18:03:16.178] { [18:03:16.178] { [18:03:16.178] { [18:03:16.178] ...future.startTime <- base::Sys.time() [18:03:16.178] { [18:03:16.178] { [18:03:16.178] { [18:03:16.178] base::local({ [18:03:16.178] has_future <- base::requireNamespace("future", [18:03:16.178] quietly = TRUE) [18:03:16.178] if (has_future) { [18:03:16.178] ns <- base::getNamespace("future") [18:03:16.178] version <- ns[[".package"]][["version"]] [18:03:16.178] if (is.null(version)) [18:03:16.178] version <- utils::packageVersion("future") [18:03:16.178] } [18:03:16.178] else { [18:03:16.178] version <- NULL [18:03:16.178] } [18:03:16.178] if (!has_future || version < "1.8.0") { [18:03:16.178] info <- base::c(r_version = base::gsub("R version ", [18:03:16.178] "", base::R.version$version.string), [18:03:16.178] platform = base::sprintf("%s (%s-bit)", [18:03:16.178] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.178] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.178] "release", "version")], collapse = " "), [18:03:16.178] hostname = base::Sys.info()[["nodename"]]) [18:03:16.178] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.178] info) [18:03:16.178] info <- base::paste(info, collapse = "; ") [18:03:16.178] if (!has_future) { [18:03:16.178] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.178] info) [18:03:16.178] } [18:03:16.178] else { [18:03:16.178] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.178] info, version) [18:03:16.178] } [18:03:16.178] base::stop(msg) [18:03:16.178] } [18:03:16.178] }) [18:03:16.178] } [18:03:16.178] options(future.plan = NULL) [18:03:16.178] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.178] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.178] } [18:03:16.178] ...future.workdir <- getwd() [18:03:16.178] } [18:03:16.178] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.178] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.178] } [18:03:16.178] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.178] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.178] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.178] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.178] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.178] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.178] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.178] base::names(...future.oldOptions)) [18:03:16.178] } [18:03:16.178] if (FALSE) { [18:03:16.178] } [18:03:16.178] else { [18:03:16.178] if (TRUE) { [18:03:16.178] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.178] open = "w") [18:03:16.178] } [18:03:16.178] else { [18:03:16.178] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.178] windows = "NUL", "/dev/null"), open = "w") [18:03:16.178] } [18:03:16.178] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.178] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.178] base::sink(type = "output", split = FALSE) [18:03:16.178] base::close(...future.stdout) [18:03:16.178] }, add = TRUE) [18:03:16.178] } [18:03:16.178] ...future.frame <- base::sys.nframe() [18:03:16.178] ...future.conditions <- base::list() [18:03:16.178] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.178] if (FALSE) { [18:03:16.178] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.178] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.178] } [18:03:16.178] ...future.result <- base::tryCatch({ [18:03:16.178] base::withCallingHandlers({ [18:03:16.178] ...future.value <- base::withVisible(base::local({ [18:03:16.178] sample(x, size = 1L) [18:03:16.178] })) [18:03:16.178] future::FutureResult(value = ...future.value$value, [18:03:16.178] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.178] ...future.rng), globalenv = if (FALSE) [18:03:16.178] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.178] ...future.globalenv.names)) [18:03:16.178] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.178] }, condition = base::local({ [18:03:16.178] c <- base::c [18:03:16.178] inherits <- base::inherits [18:03:16.178] invokeRestart <- base::invokeRestart [18:03:16.178] length <- base::length [18:03:16.178] list <- base::list [18:03:16.178] seq.int <- base::seq.int [18:03:16.178] signalCondition <- base::signalCondition [18:03:16.178] sys.calls <- base::sys.calls [18:03:16.178] `[[` <- base::`[[` [18:03:16.178] `+` <- base::`+` [18:03:16.178] `<<-` <- base::`<<-` [18:03:16.178] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.178] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.178] 3L)] [18:03:16.178] } [18:03:16.178] function(cond) { [18:03:16.178] is_error <- inherits(cond, "error") [18:03:16.178] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.178] NULL) [18:03:16.178] if (is_error) { [18:03:16.178] sessionInformation <- function() { [18:03:16.178] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.178] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.178] search = base::search(), system = base::Sys.info()) [18:03:16.178] } [18:03:16.178] ...future.conditions[[length(...future.conditions) + [18:03:16.178] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.178] cond$call), session = sessionInformation(), [18:03:16.178] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.178] signalCondition(cond) [18:03:16.178] } [18:03:16.178] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.178] "immediateCondition"))) { [18:03:16.178] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.178] ...future.conditions[[length(...future.conditions) + [18:03:16.178] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.178] if (TRUE && !signal) { [18:03:16.178] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.178] { [18:03:16.178] inherits <- base::inherits [18:03:16.178] invokeRestart <- base::invokeRestart [18:03:16.178] is.null <- base::is.null [18:03:16.178] muffled <- FALSE [18:03:16.178] if (inherits(cond, "message")) { [18:03:16.178] muffled <- grepl(pattern, "muffleMessage") [18:03:16.178] if (muffled) [18:03:16.178] invokeRestart("muffleMessage") [18:03:16.178] } [18:03:16.178] else if (inherits(cond, "warning")) { [18:03:16.178] muffled <- grepl(pattern, "muffleWarning") [18:03:16.178] if (muffled) [18:03:16.178] invokeRestart("muffleWarning") [18:03:16.178] } [18:03:16.178] else if (inherits(cond, "condition")) { [18:03:16.178] if (!is.null(pattern)) { [18:03:16.178] computeRestarts <- base::computeRestarts [18:03:16.178] grepl <- base::grepl [18:03:16.178] restarts <- computeRestarts(cond) [18:03:16.178] for (restart in restarts) { [18:03:16.178] name <- restart$name [18:03:16.178] if (is.null(name)) [18:03:16.178] next [18:03:16.178] if (!grepl(pattern, name)) [18:03:16.178] next [18:03:16.178] invokeRestart(restart) [18:03:16.178] muffled <- TRUE [18:03:16.178] break [18:03:16.178] } [18:03:16.178] } [18:03:16.178] } [18:03:16.178] invisible(muffled) [18:03:16.178] } [18:03:16.178] muffleCondition(cond, pattern = "^muffle") [18:03:16.178] } [18:03:16.178] } [18:03:16.178] else { [18:03:16.178] if (TRUE) { [18:03:16.178] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.178] { [18:03:16.178] inherits <- base::inherits [18:03:16.178] invokeRestart <- base::invokeRestart [18:03:16.178] is.null <- base::is.null [18:03:16.178] muffled <- FALSE [18:03:16.178] if (inherits(cond, "message")) { [18:03:16.178] muffled <- grepl(pattern, "muffleMessage") [18:03:16.178] if (muffled) [18:03:16.178] invokeRestart("muffleMessage") [18:03:16.178] } [18:03:16.178] else if (inherits(cond, "warning")) { [18:03:16.178] muffled <- grepl(pattern, "muffleWarning") [18:03:16.178] if (muffled) [18:03:16.178] invokeRestart("muffleWarning") [18:03:16.178] } [18:03:16.178] else if (inherits(cond, "condition")) { [18:03:16.178] if (!is.null(pattern)) { [18:03:16.178] computeRestarts <- base::computeRestarts [18:03:16.178] grepl <- base::grepl [18:03:16.178] restarts <- computeRestarts(cond) [18:03:16.178] for (restart in restarts) { [18:03:16.178] name <- restart$name [18:03:16.178] if (is.null(name)) [18:03:16.178] next [18:03:16.178] if (!grepl(pattern, name)) [18:03:16.178] next [18:03:16.178] invokeRestart(restart) [18:03:16.178] muffled <- TRUE [18:03:16.178] break [18:03:16.178] } [18:03:16.178] } [18:03:16.178] } [18:03:16.178] invisible(muffled) [18:03:16.178] } [18:03:16.178] muffleCondition(cond, pattern = "^muffle") [18:03:16.178] } [18:03:16.178] } [18:03:16.178] } [18:03:16.178] })) [18:03:16.178] }, error = function(ex) { [18:03:16.178] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.178] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.178] ...future.rng), started = ...future.startTime, [18:03:16.178] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.178] version = "1.8"), class = "FutureResult") [18:03:16.178] }, finally = { [18:03:16.178] if (!identical(...future.workdir, getwd())) [18:03:16.178] setwd(...future.workdir) [18:03:16.178] { [18:03:16.178] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.178] ...future.oldOptions$nwarnings <- NULL [18:03:16.178] } [18:03:16.178] base::options(...future.oldOptions) [18:03:16.178] if (.Platform$OS.type == "windows") { [18:03:16.178] old_names <- names(...future.oldEnvVars) [18:03:16.178] envs <- base::Sys.getenv() [18:03:16.178] names <- names(envs) [18:03:16.178] common <- intersect(names, old_names) [18:03:16.178] added <- setdiff(names, old_names) [18:03:16.178] removed <- setdiff(old_names, names) [18:03:16.178] changed <- common[...future.oldEnvVars[common] != [18:03:16.178] envs[common]] [18:03:16.178] NAMES <- toupper(changed) [18:03:16.178] args <- list() [18:03:16.178] for (kk in seq_along(NAMES)) { [18:03:16.178] name <- changed[[kk]] [18:03:16.178] NAME <- NAMES[[kk]] [18:03:16.178] if (name != NAME && is.element(NAME, old_names)) [18:03:16.178] next [18:03:16.178] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.178] } [18:03:16.178] NAMES <- toupper(added) [18:03:16.178] for (kk in seq_along(NAMES)) { [18:03:16.178] name <- added[[kk]] [18:03:16.178] NAME <- NAMES[[kk]] [18:03:16.178] if (name != NAME && is.element(NAME, old_names)) [18:03:16.178] next [18:03:16.178] args[[name]] <- "" [18:03:16.178] } [18:03:16.178] NAMES <- toupper(removed) [18:03:16.178] for (kk in seq_along(NAMES)) { [18:03:16.178] name <- removed[[kk]] [18:03:16.178] NAME <- NAMES[[kk]] [18:03:16.178] if (name != NAME && is.element(NAME, old_names)) [18:03:16.178] next [18:03:16.178] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.178] } [18:03:16.178] if (length(args) > 0) [18:03:16.178] base::do.call(base::Sys.setenv, args = args) [18:03:16.178] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.178] } [18:03:16.178] else { [18:03:16.178] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.178] } [18:03:16.178] { [18:03:16.178] if (base::length(...future.futureOptionsAdded) > [18:03:16.178] 0L) { [18:03:16.178] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.178] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.178] base::options(opts) [18:03:16.178] } [18:03:16.178] { [18:03:16.178] { [18:03:16.178] base::assign(".Random.seed", c(10407L, 1798063976L, [18:03:16.178] -1999661904L, 17592362L, -826890881L, 1066014190L, [18:03:16.178] -643378345L), envir = base::globalenv(), [18:03:16.178] inherits = FALSE) [18:03:16.178] NULL [18:03:16.178] } [18:03:16.178] options(future.plan = NULL) [18:03:16.178] if (is.na(NA_character_)) [18:03:16.178] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.178] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.178] future::plan(list(function (..., envir = parent.frame()) [18:03:16.178] { [18:03:16.178] future <- SequentialFuture(..., envir = envir) [18:03:16.178] if (!future$lazy) [18:03:16.178] future <- run(future) [18:03:16.178] invisible(future) [18:03:16.178] }), .cleanup = FALSE, .init = FALSE) [18:03:16.178] } [18:03:16.178] } [18:03:16.178] } [18:03:16.178] }) [18:03:16.178] if (TRUE) { [18:03:16.178] base::sink(type = "output", split = FALSE) [18:03:16.178] if (TRUE) { [18:03:16.178] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.178] } [18:03:16.178] else { [18:03:16.178] ...future.result["stdout"] <- base::list(NULL) [18:03:16.178] } [18:03:16.178] base::close(...future.stdout) [18:03:16.178] ...future.stdout <- NULL [18:03:16.178] } [18:03:16.178] ...future.result$conditions <- ...future.conditions [18:03:16.178] ...future.result$finished <- base::Sys.time() [18:03:16.178] ...future.result [18:03:16.178] } [18:03:16.181] assign_globals() ... [18:03:16.182] List of 1 [18:03:16.182] $ x: int [1:4] 0 1 2 3 [18:03:16.182] - attr(*, "where")=List of 1 [18:03:16.182] ..$ x: [18:03:16.182] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.182] - attr(*, "resolved")= logi FALSE [18:03:16.182] - attr(*, "total_size")= num 64 [18:03:16.182] - attr(*, "already-done")= logi TRUE [18:03:16.184] - copied 'x' to environment [18:03:16.185] assign_globals() ... done [18:03:16.185] plan(): Setting new future strategy stack: [18:03:16.185] List of future strategies: [18:03:16.185] 1. sequential: [18:03:16.185] - args: function (..., envir = parent.frame()) [18:03:16.185] - tweaked: FALSE [18:03:16.185] - call: NULL [18:03:16.186] plan(): nbrOfWorkers() = 1 [18:03:16.187] plan(): Setting new future strategy stack: [18:03:16.187] List of future strategies: [18:03:16.187] 1. sequential: [18:03:16.187] - args: function (..., envir = parent.frame()) [18:03:16.187] - tweaked: FALSE [18:03:16.187] - call: plan(strategy) [18:03:16.187] plan(): nbrOfWorkers() = 1 [18:03:16.188] SequentialFuture started (and completed) [18:03:16.188] - Launch lazy future ... done [18:03:16.188] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_1-337766' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e2d680 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.189] getGlobalsAndPackages() ... [18:03:16.189] Searching for globals... [18:03:16.190] - globals found: [3] '{', 'sample', 'x' [18:03:16.191] Searching for globals ... DONE [18:03:16.191] Resolving globals: FALSE [18:03:16.191] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.192] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.192] - globals: [1] 'x' [18:03:16.192] [18:03:16.192] getGlobalsAndPackages() ... DONE [18:03:16.192] run() for 'Future' ... [18:03:16.193] - state: 'created' [18:03:16.193] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.193] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.193] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.194] - Field: 'label' [18:03:16.194] - Field: 'local' [18:03:16.194] - Field: 'owner' [18:03:16.194] - Field: 'envir' [18:03:16.194] - Field: 'packages' [18:03:16.194] - Field: 'gc' [18:03:16.195] - Field: 'conditions' [18:03:16.195] - Field: 'expr' [18:03:16.195] - Field: 'uuid' [18:03:16.195] - Field: 'seed' [18:03:16.195] - Field: 'version' [18:03:16.196] - Field: 'result' [18:03:16.196] - Field: 'asynchronous' [18:03:16.196] - Field: 'calls' [18:03:16.196] - Field: 'globals' [18:03:16.197] - Field: 'stdout' [18:03:16.197] - Field: 'earlySignal' [18:03:16.198] - Field: 'lazy' [18:03:16.198] - Field: 'state' [18:03:16.198] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.198] - Launch lazy future ... [18:03:16.198] Packages needed by the future expression (n = 0): [18:03:16.198] Packages needed by future strategies (n = 0): [18:03:16.199] { [18:03:16.199] { [18:03:16.199] { [18:03:16.199] ...future.startTime <- base::Sys.time() [18:03:16.199] { [18:03:16.199] { [18:03:16.199] { [18:03:16.199] base::local({ [18:03:16.199] has_future <- base::requireNamespace("future", [18:03:16.199] quietly = TRUE) [18:03:16.199] if (has_future) { [18:03:16.199] ns <- base::getNamespace("future") [18:03:16.199] version <- ns[[".package"]][["version"]] [18:03:16.199] if (is.null(version)) [18:03:16.199] version <- utils::packageVersion("future") [18:03:16.199] } [18:03:16.199] else { [18:03:16.199] version <- NULL [18:03:16.199] } [18:03:16.199] if (!has_future || version < "1.8.0") { [18:03:16.199] info <- base::c(r_version = base::gsub("R version ", [18:03:16.199] "", base::R.version$version.string), [18:03:16.199] platform = base::sprintf("%s (%s-bit)", [18:03:16.199] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.199] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.199] "release", "version")], collapse = " "), [18:03:16.199] hostname = base::Sys.info()[["nodename"]]) [18:03:16.199] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.199] info) [18:03:16.199] info <- base::paste(info, collapse = "; ") [18:03:16.199] if (!has_future) { [18:03:16.199] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.199] info) [18:03:16.199] } [18:03:16.199] else { [18:03:16.199] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.199] info, version) [18:03:16.199] } [18:03:16.199] base::stop(msg) [18:03:16.199] } [18:03:16.199] }) [18:03:16.199] } [18:03:16.199] options(future.plan = NULL) [18:03:16.199] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.199] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.199] } [18:03:16.199] ...future.workdir <- getwd() [18:03:16.199] } [18:03:16.199] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.199] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.199] } [18:03:16.199] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.199] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.199] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.199] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.199] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.199] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.199] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.199] base::names(...future.oldOptions)) [18:03:16.199] } [18:03:16.199] if (FALSE) { [18:03:16.199] } [18:03:16.199] else { [18:03:16.199] if (TRUE) { [18:03:16.199] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.199] open = "w") [18:03:16.199] } [18:03:16.199] else { [18:03:16.199] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.199] windows = "NUL", "/dev/null"), open = "w") [18:03:16.199] } [18:03:16.199] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.199] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.199] base::sink(type = "output", split = FALSE) [18:03:16.199] base::close(...future.stdout) [18:03:16.199] }, add = TRUE) [18:03:16.199] } [18:03:16.199] ...future.frame <- base::sys.nframe() [18:03:16.199] ...future.conditions <- base::list() [18:03:16.199] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.199] if (FALSE) { [18:03:16.199] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.199] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.199] } [18:03:16.199] ...future.result <- base::tryCatch({ [18:03:16.199] base::withCallingHandlers({ [18:03:16.199] ...future.value <- base::withVisible(base::local({ [18:03:16.199] sample(x, size = 1L) [18:03:16.199] })) [18:03:16.199] future::FutureResult(value = ...future.value$value, [18:03:16.199] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.199] ...future.rng), globalenv = if (FALSE) [18:03:16.199] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.199] ...future.globalenv.names)) [18:03:16.199] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.199] }, condition = base::local({ [18:03:16.199] c <- base::c [18:03:16.199] inherits <- base::inherits [18:03:16.199] invokeRestart <- base::invokeRestart [18:03:16.199] length <- base::length [18:03:16.199] list <- base::list [18:03:16.199] seq.int <- base::seq.int [18:03:16.199] signalCondition <- base::signalCondition [18:03:16.199] sys.calls <- base::sys.calls [18:03:16.199] `[[` <- base::`[[` [18:03:16.199] `+` <- base::`+` [18:03:16.199] `<<-` <- base::`<<-` [18:03:16.199] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.199] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.199] 3L)] [18:03:16.199] } [18:03:16.199] function(cond) { [18:03:16.199] is_error <- inherits(cond, "error") [18:03:16.199] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.199] NULL) [18:03:16.199] if (is_error) { [18:03:16.199] sessionInformation <- function() { [18:03:16.199] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.199] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.199] search = base::search(), system = base::Sys.info()) [18:03:16.199] } [18:03:16.199] ...future.conditions[[length(...future.conditions) + [18:03:16.199] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.199] cond$call), session = sessionInformation(), [18:03:16.199] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.199] signalCondition(cond) [18:03:16.199] } [18:03:16.199] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.199] "immediateCondition"))) { [18:03:16.199] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.199] ...future.conditions[[length(...future.conditions) + [18:03:16.199] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.199] if (TRUE && !signal) { [18:03:16.199] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.199] { [18:03:16.199] inherits <- base::inherits [18:03:16.199] invokeRestart <- base::invokeRestart [18:03:16.199] is.null <- base::is.null [18:03:16.199] muffled <- FALSE [18:03:16.199] if (inherits(cond, "message")) { [18:03:16.199] muffled <- grepl(pattern, "muffleMessage") [18:03:16.199] if (muffled) [18:03:16.199] invokeRestart("muffleMessage") [18:03:16.199] } [18:03:16.199] else if (inherits(cond, "warning")) { [18:03:16.199] muffled <- grepl(pattern, "muffleWarning") [18:03:16.199] if (muffled) [18:03:16.199] invokeRestart("muffleWarning") [18:03:16.199] } [18:03:16.199] else if (inherits(cond, "condition")) { [18:03:16.199] if (!is.null(pattern)) { [18:03:16.199] computeRestarts <- base::computeRestarts [18:03:16.199] grepl <- base::grepl [18:03:16.199] restarts <- computeRestarts(cond) [18:03:16.199] for (restart in restarts) { [18:03:16.199] name <- restart$name [18:03:16.199] if (is.null(name)) [18:03:16.199] next [18:03:16.199] if (!grepl(pattern, name)) [18:03:16.199] next [18:03:16.199] invokeRestart(restart) [18:03:16.199] muffled <- TRUE [18:03:16.199] break [18:03:16.199] } [18:03:16.199] } [18:03:16.199] } [18:03:16.199] invisible(muffled) [18:03:16.199] } [18:03:16.199] muffleCondition(cond, pattern = "^muffle") [18:03:16.199] } [18:03:16.199] } [18:03:16.199] else { [18:03:16.199] if (TRUE) { [18:03:16.199] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.199] { [18:03:16.199] inherits <- base::inherits [18:03:16.199] invokeRestart <- base::invokeRestart [18:03:16.199] is.null <- base::is.null [18:03:16.199] muffled <- FALSE [18:03:16.199] if (inherits(cond, "message")) { [18:03:16.199] muffled <- grepl(pattern, "muffleMessage") [18:03:16.199] if (muffled) [18:03:16.199] invokeRestart("muffleMessage") [18:03:16.199] } [18:03:16.199] else if (inherits(cond, "warning")) { [18:03:16.199] muffled <- grepl(pattern, "muffleWarning") [18:03:16.199] if (muffled) [18:03:16.199] invokeRestart("muffleWarning") [18:03:16.199] } [18:03:16.199] else if (inherits(cond, "condition")) { [18:03:16.199] if (!is.null(pattern)) { [18:03:16.199] computeRestarts <- base::computeRestarts [18:03:16.199] grepl <- base::grepl [18:03:16.199] restarts <- computeRestarts(cond) [18:03:16.199] for (restart in restarts) { [18:03:16.199] name <- restart$name [18:03:16.199] if (is.null(name)) [18:03:16.199] next [18:03:16.199] if (!grepl(pattern, name)) [18:03:16.199] next [18:03:16.199] invokeRestart(restart) [18:03:16.199] muffled <- TRUE [18:03:16.199] break [18:03:16.199] } [18:03:16.199] } [18:03:16.199] } [18:03:16.199] invisible(muffled) [18:03:16.199] } [18:03:16.199] muffleCondition(cond, pattern = "^muffle") [18:03:16.199] } [18:03:16.199] } [18:03:16.199] } [18:03:16.199] })) [18:03:16.199] }, error = function(ex) { [18:03:16.199] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.199] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.199] ...future.rng), started = ...future.startTime, [18:03:16.199] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.199] version = "1.8"), class = "FutureResult") [18:03:16.199] }, finally = { [18:03:16.199] if (!identical(...future.workdir, getwd())) [18:03:16.199] setwd(...future.workdir) [18:03:16.199] { [18:03:16.199] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.199] ...future.oldOptions$nwarnings <- NULL [18:03:16.199] } [18:03:16.199] base::options(...future.oldOptions) [18:03:16.199] if (.Platform$OS.type == "windows") { [18:03:16.199] old_names <- names(...future.oldEnvVars) [18:03:16.199] envs <- base::Sys.getenv() [18:03:16.199] names <- names(envs) [18:03:16.199] common <- intersect(names, old_names) [18:03:16.199] added <- setdiff(names, old_names) [18:03:16.199] removed <- setdiff(old_names, names) [18:03:16.199] changed <- common[...future.oldEnvVars[common] != [18:03:16.199] envs[common]] [18:03:16.199] NAMES <- toupper(changed) [18:03:16.199] args <- list() [18:03:16.199] for (kk in seq_along(NAMES)) { [18:03:16.199] name <- changed[[kk]] [18:03:16.199] NAME <- NAMES[[kk]] [18:03:16.199] if (name != NAME && is.element(NAME, old_names)) [18:03:16.199] next [18:03:16.199] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.199] } [18:03:16.199] NAMES <- toupper(added) [18:03:16.199] for (kk in seq_along(NAMES)) { [18:03:16.199] name <- added[[kk]] [18:03:16.199] NAME <- NAMES[[kk]] [18:03:16.199] if (name != NAME && is.element(NAME, old_names)) [18:03:16.199] next [18:03:16.199] args[[name]] <- "" [18:03:16.199] } [18:03:16.199] NAMES <- toupper(removed) [18:03:16.199] for (kk in seq_along(NAMES)) { [18:03:16.199] name <- removed[[kk]] [18:03:16.199] NAME <- NAMES[[kk]] [18:03:16.199] if (name != NAME && is.element(NAME, old_names)) [18:03:16.199] next [18:03:16.199] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.199] } [18:03:16.199] if (length(args) > 0) [18:03:16.199] base::do.call(base::Sys.setenv, args = args) [18:03:16.199] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.199] } [18:03:16.199] else { [18:03:16.199] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.199] } [18:03:16.199] { [18:03:16.199] if (base::length(...future.futureOptionsAdded) > [18:03:16.199] 0L) { [18:03:16.199] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.199] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.199] base::options(opts) [18:03:16.199] } [18:03:16.199] { [18:03:16.199] { [18:03:16.199] base::assign(".Random.seed", c(10407L, 17592362L, [18:03:16.199] -396958494L, -323289559L, -643378345L, -1910361370L, [18:03:16.199] -1675698073L), envir = base::globalenv(), [18:03:16.199] inherits = FALSE) [18:03:16.199] NULL [18:03:16.199] } [18:03:16.199] options(future.plan = NULL) [18:03:16.199] if (is.na(NA_character_)) [18:03:16.199] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.199] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.199] future::plan(list(function (..., envir = parent.frame()) [18:03:16.199] { [18:03:16.199] future <- SequentialFuture(..., envir = envir) [18:03:16.199] if (!future$lazy) [18:03:16.199] future <- run(future) [18:03:16.199] invisible(future) [18:03:16.199] }), .cleanup = FALSE, .init = FALSE) [18:03:16.199] } [18:03:16.199] } [18:03:16.199] } [18:03:16.199] }) [18:03:16.199] if (TRUE) { [18:03:16.199] base::sink(type = "output", split = FALSE) [18:03:16.199] if (TRUE) { [18:03:16.199] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.199] } [18:03:16.199] else { [18:03:16.199] ...future.result["stdout"] <- base::list(NULL) [18:03:16.199] } [18:03:16.199] base::close(...future.stdout) [18:03:16.199] ...future.stdout <- NULL [18:03:16.199] } [18:03:16.199] ...future.result$conditions <- ...future.conditions [18:03:16.199] ...future.result$finished <- base::Sys.time() [18:03:16.199] ...future.result [18:03:16.199] } [18:03:16.203] assign_globals() ... [18:03:16.203] List of 1 [18:03:16.203] $ x: int [1:4] 0 1 2 3 [18:03:16.203] - attr(*, "where")=List of 1 [18:03:16.203] ..$ x: [18:03:16.203] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.203] - attr(*, "resolved")= logi FALSE [18:03:16.203] - attr(*, "total_size")= num 64 [18:03:16.203] - attr(*, "already-done")= logi TRUE [18:03:16.206] - copied 'x' to environment [18:03:16.206] assign_globals() ... done [18:03:16.207] plan(): Setting new future strategy stack: [18:03:16.207] List of future strategies: [18:03:16.207] 1. sequential: [18:03:16.207] - args: function (..., envir = parent.frame()) [18:03:16.207] - tweaked: FALSE [18:03:16.207] - call: NULL [18:03:16.207] plan(): nbrOfWorkers() = 1 [18:03:16.208] plan(): Setting new future strategy stack: [18:03:16.208] List of future strategies: [18:03:16.208] 1. sequential: [18:03:16.208] - args: function (..., envir = parent.frame()) [18:03:16.208] - tweaked: FALSE [18:03:16.208] - call: plan(strategy) [18:03:16.209] plan(): nbrOfWorkers() = 1 [18:03:16.209] SequentialFuture started (and completed) [18:03:16.209] - Launch lazy future ... done [18:03:16.210] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_2-282781' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e2d680 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.211] getGlobalsAndPackages() ... [18:03:16.211] Searching for globals... [18:03:16.212] - globals found: [3] '{', 'sample', 'x' [18:03:16.212] Searching for globals ... DONE [18:03:16.212] Resolving globals: FALSE [18:03:16.213] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.213] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.213] - globals: [1] 'x' [18:03:16.214] [18:03:16.214] getGlobalsAndPackages() ... DONE [18:03:16.214] run() for 'Future' ... [18:03:16.214] - state: 'created' [18:03:16.214] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.215] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.215] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.215] - Field: 'label' [18:03:16.215] - Field: 'local' [18:03:16.216] - Field: 'owner' [18:03:16.216] - Field: 'envir' [18:03:16.216] - Field: 'packages' [18:03:16.216] - Field: 'gc' [18:03:16.216] - Field: 'conditions' [18:03:16.216] - Field: 'expr' [18:03:16.217] - Field: 'uuid' [18:03:16.217] - Field: 'seed' [18:03:16.217] - Field: 'version' [18:03:16.217] - Field: 'result' [18:03:16.217] - Field: 'asynchronous' [18:03:16.217] - Field: 'calls' [18:03:16.218] - Field: 'globals' [18:03:16.218] - Field: 'stdout' [18:03:16.218] - Field: 'earlySignal' [18:03:16.218] - Field: 'lazy' [18:03:16.218] - Field: 'state' [18:03:16.218] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.219] - Launch lazy future ... [18:03:16.219] Packages needed by the future expression (n = 0): [18:03:16.219] Packages needed by future strategies (n = 0): [18:03:16.220] { [18:03:16.220] { [18:03:16.220] { [18:03:16.220] ...future.startTime <- base::Sys.time() [18:03:16.220] { [18:03:16.220] { [18:03:16.220] { [18:03:16.220] base::local({ [18:03:16.220] has_future <- base::requireNamespace("future", [18:03:16.220] quietly = TRUE) [18:03:16.220] if (has_future) { [18:03:16.220] ns <- base::getNamespace("future") [18:03:16.220] version <- ns[[".package"]][["version"]] [18:03:16.220] if (is.null(version)) [18:03:16.220] version <- utils::packageVersion("future") [18:03:16.220] } [18:03:16.220] else { [18:03:16.220] version <- NULL [18:03:16.220] } [18:03:16.220] if (!has_future || version < "1.8.0") { [18:03:16.220] info <- base::c(r_version = base::gsub("R version ", [18:03:16.220] "", base::R.version$version.string), [18:03:16.220] platform = base::sprintf("%s (%s-bit)", [18:03:16.220] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.220] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.220] "release", "version")], collapse = " "), [18:03:16.220] hostname = base::Sys.info()[["nodename"]]) [18:03:16.220] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.220] info) [18:03:16.220] info <- base::paste(info, collapse = "; ") [18:03:16.220] if (!has_future) { [18:03:16.220] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.220] info) [18:03:16.220] } [18:03:16.220] else { [18:03:16.220] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.220] info, version) [18:03:16.220] } [18:03:16.220] base::stop(msg) [18:03:16.220] } [18:03:16.220] }) [18:03:16.220] } [18:03:16.220] options(future.plan = NULL) [18:03:16.220] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.220] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.220] } [18:03:16.220] ...future.workdir <- getwd() [18:03:16.220] } [18:03:16.220] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.220] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.220] } [18:03:16.220] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.220] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.220] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.220] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.220] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.220] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.220] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.220] base::names(...future.oldOptions)) [18:03:16.220] } [18:03:16.220] if (FALSE) { [18:03:16.220] } [18:03:16.220] else { [18:03:16.220] if (TRUE) { [18:03:16.220] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.220] open = "w") [18:03:16.220] } [18:03:16.220] else { [18:03:16.220] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.220] windows = "NUL", "/dev/null"), open = "w") [18:03:16.220] } [18:03:16.220] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.220] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.220] base::sink(type = "output", split = FALSE) [18:03:16.220] base::close(...future.stdout) [18:03:16.220] }, add = TRUE) [18:03:16.220] } [18:03:16.220] ...future.frame <- base::sys.nframe() [18:03:16.220] ...future.conditions <- base::list() [18:03:16.220] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.220] if (FALSE) { [18:03:16.220] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.220] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.220] } [18:03:16.220] ...future.result <- base::tryCatch({ [18:03:16.220] base::withCallingHandlers({ [18:03:16.220] ...future.value <- base::withVisible(base::local({ [18:03:16.220] sample(x, size = 1L) [18:03:16.220] })) [18:03:16.220] future::FutureResult(value = ...future.value$value, [18:03:16.220] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.220] ...future.rng), globalenv = if (FALSE) [18:03:16.220] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.220] ...future.globalenv.names)) [18:03:16.220] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.220] }, condition = base::local({ [18:03:16.220] c <- base::c [18:03:16.220] inherits <- base::inherits [18:03:16.220] invokeRestart <- base::invokeRestart [18:03:16.220] length <- base::length [18:03:16.220] list <- base::list [18:03:16.220] seq.int <- base::seq.int [18:03:16.220] signalCondition <- base::signalCondition [18:03:16.220] sys.calls <- base::sys.calls [18:03:16.220] `[[` <- base::`[[` [18:03:16.220] `+` <- base::`+` [18:03:16.220] `<<-` <- base::`<<-` [18:03:16.220] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.220] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.220] 3L)] [18:03:16.220] } [18:03:16.220] function(cond) { [18:03:16.220] is_error <- inherits(cond, "error") [18:03:16.220] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.220] NULL) [18:03:16.220] if (is_error) { [18:03:16.220] sessionInformation <- function() { [18:03:16.220] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.220] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.220] search = base::search(), system = base::Sys.info()) [18:03:16.220] } [18:03:16.220] ...future.conditions[[length(...future.conditions) + [18:03:16.220] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.220] cond$call), session = sessionInformation(), [18:03:16.220] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.220] signalCondition(cond) [18:03:16.220] } [18:03:16.220] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.220] "immediateCondition"))) { [18:03:16.220] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.220] ...future.conditions[[length(...future.conditions) + [18:03:16.220] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.220] if (TRUE && !signal) { [18:03:16.220] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.220] { [18:03:16.220] inherits <- base::inherits [18:03:16.220] invokeRestart <- base::invokeRestart [18:03:16.220] is.null <- base::is.null [18:03:16.220] muffled <- FALSE [18:03:16.220] if (inherits(cond, "message")) { [18:03:16.220] muffled <- grepl(pattern, "muffleMessage") [18:03:16.220] if (muffled) [18:03:16.220] invokeRestart("muffleMessage") [18:03:16.220] } [18:03:16.220] else if (inherits(cond, "warning")) { [18:03:16.220] muffled <- grepl(pattern, "muffleWarning") [18:03:16.220] if (muffled) [18:03:16.220] invokeRestart("muffleWarning") [18:03:16.220] } [18:03:16.220] else if (inherits(cond, "condition")) { [18:03:16.220] if (!is.null(pattern)) { [18:03:16.220] computeRestarts <- base::computeRestarts [18:03:16.220] grepl <- base::grepl [18:03:16.220] restarts <- computeRestarts(cond) [18:03:16.220] for (restart in restarts) { [18:03:16.220] name <- restart$name [18:03:16.220] if (is.null(name)) [18:03:16.220] next [18:03:16.220] if (!grepl(pattern, name)) [18:03:16.220] next [18:03:16.220] invokeRestart(restart) [18:03:16.220] muffled <- TRUE [18:03:16.220] break [18:03:16.220] } [18:03:16.220] } [18:03:16.220] } [18:03:16.220] invisible(muffled) [18:03:16.220] } [18:03:16.220] muffleCondition(cond, pattern = "^muffle") [18:03:16.220] } [18:03:16.220] } [18:03:16.220] else { [18:03:16.220] if (TRUE) { [18:03:16.220] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.220] { [18:03:16.220] inherits <- base::inherits [18:03:16.220] invokeRestart <- base::invokeRestart [18:03:16.220] is.null <- base::is.null [18:03:16.220] muffled <- FALSE [18:03:16.220] if (inherits(cond, "message")) { [18:03:16.220] muffled <- grepl(pattern, "muffleMessage") [18:03:16.220] if (muffled) [18:03:16.220] invokeRestart("muffleMessage") [18:03:16.220] } [18:03:16.220] else if (inherits(cond, "warning")) { [18:03:16.220] muffled <- grepl(pattern, "muffleWarning") [18:03:16.220] if (muffled) [18:03:16.220] invokeRestart("muffleWarning") [18:03:16.220] } [18:03:16.220] else if (inherits(cond, "condition")) { [18:03:16.220] if (!is.null(pattern)) { [18:03:16.220] computeRestarts <- base::computeRestarts [18:03:16.220] grepl <- base::grepl [18:03:16.220] restarts <- computeRestarts(cond) [18:03:16.220] for (restart in restarts) { [18:03:16.220] name <- restart$name [18:03:16.220] if (is.null(name)) [18:03:16.220] next [18:03:16.220] if (!grepl(pattern, name)) [18:03:16.220] next [18:03:16.220] invokeRestart(restart) [18:03:16.220] muffled <- TRUE [18:03:16.220] break [18:03:16.220] } [18:03:16.220] } [18:03:16.220] } [18:03:16.220] invisible(muffled) [18:03:16.220] } [18:03:16.220] muffleCondition(cond, pattern = "^muffle") [18:03:16.220] } [18:03:16.220] } [18:03:16.220] } [18:03:16.220] })) [18:03:16.220] }, error = function(ex) { [18:03:16.220] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.220] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.220] ...future.rng), started = ...future.startTime, [18:03:16.220] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.220] version = "1.8"), class = "FutureResult") [18:03:16.220] }, finally = { [18:03:16.220] if (!identical(...future.workdir, getwd())) [18:03:16.220] setwd(...future.workdir) [18:03:16.220] { [18:03:16.220] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.220] ...future.oldOptions$nwarnings <- NULL [18:03:16.220] } [18:03:16.220] base::options(...future.oldOptions) [18:03:16.220] if (.Platform$OS.type == "windows") { [18:03:16.220] old_names <- names(...future.oldEnvVars) [18:03:16.220] envs <- base::Sys.getenv() [18:03:16.220] names <- names(envs) [18:03:16.220] common <- intersect(names, old_names) [18:03:16.220] added <- setdiff(names, old_names) [18:03:16.220] removed <- setdiff(old_names, names) [18:03:16.220] changed <- common[...future.oldEnvVars[common] != [18:03:16.220] envs[common]] [18:03:16.220] NAMES <- toupper(changed) [18:03:16.220] args <- list() [18:03:16.220] for (kk in seq_along(NAMES)) { [18:03:16.220] name <- changed[[kk]] [18:03:16.220] NAME <- NAMES[[kk]] [18:03:16.220] if (name != NAME && is.element(NAME, old_names)) [18:03:16.220] next [18:03:16.220] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.220] } [18:03:16.220] NAMES <- toupper(added) [18:03:16.220] for (kk in seq_along(NAMES)) { [18:03:16.220] name <- added[[kk]] [18:03:16.220] NAME <- NAMES[[kk]] [18:03:16.220] if (name != NAME && is.element(NAME, old_names)) [18:03:16.220] next [18:03:16.220] args[[name]] <- "" [18:03:16.220] } [18:03:16.220] NAMES <- toupper(removed) [18:03:16.220] for (kk in seq_along(NAMES)) { [18:03:16.220] name <- removed[[kk]] [18:03:16.220] NAME <- NAMES[[kk]] [18:03:16.220] if (name != NAME && is.element(NAME, old_names)) [18:03:16.220] next [18:03:16.220] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.220] } [18:03:16.220] if (length(args) > 0) [18:03:16.220] base::do.call(base::Sys.setenv, args = args) [18:03:16.220] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.220] } [18:03:16.220] else { [18:03:16.220] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.220] } [18:03:16.220] { [18:03:16.220] if (base::length(...future.futureOptionsAdded) > [18:03:16.220] 0L) { [18:03:16.220] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.220] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.220] base::options(opts) [18:03:16.220] } [18:03:16.220] { [18:03:16.220] { [18:03:16.220] base::assign(".Random.seed", c(10407L, -323289559L, [18:03:16.220] -1434030130L, -175446176L, -1675698073L, [18:03:16.220] 1761082697L, 714521354L), envir = base::globalenv(), [18:03:16.220] inherits = FALSE) [18:03:16.220] NULL [18:03:16.220] } [18:03:16.220] options(future.plan = NULL) [18:03:16.220] if (is.na(NA_character_)) [18:03:16.220] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.220] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.220] future::plan(list(function (..., envir = parent.frame()) [18:03:16.220] { [18:03:16.220] future <- SequentialFuture(..., envir = envir) [18:03:16.220] if (!future$lazy) [18:03:16.220] future <- run(future) [18:03:16.220] invisible(future) [18:03:16.220] }), .cleanup = FALSE, .init = FALSE) [18:03:16.220] } [18:03:16.220] } [18:03:16.220] } [18:03:16.220] }) [18:03:16.220] if (TRUE) { [18:03:16.220] base::sink(type = "output", split = FALSE) [18:03:16.220] if (TRUE) { [18:03:16.220] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.220] } [18:03:16.220] else { [18:03:16.220] ...future.result["stdout"] <- base::list(NULL) [18:03:16.220] } [18:03:16.220] base::close(...future.stdout) [18:03:16.220] ...future.stdout <- NULL [18:03:16.220] } [18:03:16.220] ...future.result$conditions <- ...future.conditions [18:03:16.220] ...future.result$finished <- base::Sys.time() [18:03:16.220] ...future.result [18:03:16.220] } [18:03:16.223] assign_globals() ... [18:03:16.223] List of 1 [18:03:16.223] $ x: int [1:4] 0 1 2 3 [18:03:16.223] - attr(*, "where")=List of 1 [18:03:16.223] ..$ x: [18:03:16.223] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.223] - attr(*, "resolved")= logi FALSE [18:03:16.223] - attr(*, "total_size")= num 64 [18:03:16.223] - attr(*, "already-done")= logi TRUE [18:03:16.226] - copied 'x' to environment [18:03:16.227] assign_globals() ... done [18:03:16.227] plan(): Setting new future strategy stack: [18:03:16.227] List of future strategies: [18:03:16.227] 1. sequential: [18:03:16.227] - args: function (..., envir = parent.frame()) [18:03:16.227] - tweaked: FALSE [18:03:16.227] - call: NULL [18:03:16.228] plan(): nbrOfWorkers() = 1 [18:03:16.229] plan(): Setting new future strategy stack: [18:03:16.229] List of future strategies: [18:03:16.229] 1. sequential: [18:03:16.229] - args: function (..., envir = parent.frame()) [18:03:16.229] - tweaked: FALSE [18:03:16.229] - call: plan(strategy) [18:03:16.229] plan(): nbrOfWorkers() = 1 [18:03:16.230] SequentialFuture started (and completed) [18:03:16.230] - Launch lazy future ... done [18:03:16.230] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_3-969461' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e2d680 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.231] getGlobalsAndPackages() ... [18:03:16.231] Searching for globals... [18:03:16.232] - globals found: [3] '{', 'sample', 'x' [18:03:16.233] Searching for globals ... DONE [18:03:16.233] Resolving globals: FALSE [18:03:16.233] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.235] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.235] - globals: [1] 'x' [18:03:16.235] [18:03:16.235] getGlobalsAndPackages() ... DONE [18:03:16.235] run() for 'Future' ... [18:03:16.236] - state: 'created' [18:03:16.236] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.236] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.236] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.237] - Field: 'label' [18:03:16.237] - Field: 'local' [18:03:16.237] - Field: 'owner' [18:03:16.237] - Field: 'envir' [18:03:16.237] - Field: 'packages' [18:03:16.238] - Field: 'gc' [18:03:16.238] - Field: 'conditions' [18:03:16.238] - Field: 'expr' [18:03:16.238] - Field: 'uuid' [18:03:16.238] - Field: 'seed' [18:03:16.238] - Field: 'version' [18:03:16.239] - Field: 'result' [18:03:16.239] - Field: 'asynchronous' [18:03:16.239] - Field: 'calls' [18:03:16.239] - Field: 'globals' [18:03:16.239] - Field: 'stdout' [18:03:16.239] - Field: 'earlySignal' [18:03:16.240] - Field: 'lazy' [18:03:16.240] - Field: 'state' [18:03:16.240] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.240] - Launch lazy future ... [18:03:16.240] Packages needed by the future expression (n = 0): [18:03:16.241] Packages needed by future strategies (n = 0): [18:03:16.241] { [18:03:16.241] { [18:03:16.241] { [18:03:16.241] ...future.startTime <- base::Sys.time() [18:03:16.241] { [18:03:16.241] { [18:03:16.241] { [18:03:16.241] base::local({ [18:03:16.241] has_future <- base::requireNamespace("future", [18:03:16.241] quietly = TRUE) [18:03:16.241] if (has_future) { [18:03:16.241] ns <- base::getNamespace("future") [18:03:16.241] version <- ns[[".package"]][["version"]] [18:03:16.241] if (is.null(version)) [18:03:16.241] version <- utils::packageVersion("future") [18:03:16.241] } [18:03:16.241] else { [18:03:16.241] version <- NULL [18:03:16.241] } [18:03:16.241] if (!has_future || version < "1.8.0") { [18:03:16.241] info <- base::c(r_version = base::gsub("R version ", [18:03:16.241] "", base::R.version$version.string), [18:03:16.241] platform = base::sprintf("%s (%s-bit)", [18:03:16.241] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.241] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.241] "release", "version")], collapse = " "), [18:03:16.241] hostname = base::Sys.info()[["nodename"]]) [18:03:16.241] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.241] info) [18:03:16.241] info <- base::paste(info, collapse = "; ") [18:03:16.241] if (!has_future) { [18:03:16.241] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.241] info) [18:03:16.241] } [18:03:16.241] else { [18:03:16.241] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.241] info, version) [18:03:16.241] } [18:03:16.241] base::stop(msg) [18:03:16.241] } [18:03:16.241] }) [18:03:16.241] } [18:03:16.241] options(future.plan = NULL) [18:03:16.241] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.241] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.241] } [18:03:16.241] ...future.workdir <- getwd() [18:03:16.241] } [18:03:16.241] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.241] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.241] } [18:03:16.241] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.241] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.241] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.241] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.241] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.241] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.241] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.241] base::names(...future.oldOptions)) [18:03:16.241] } [18:03:16.241] if (FALSE) { [18:03:16.241] } [18:03:16.241] else { [18:03:16.241] if (TRUE) { [18:03:16.241] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.241] open = "w") [18:03:16.241] } [18:03:16.241] else { [18:03:16.241] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.241] windows = "NUL", "/dev/null"), open = "w") [18:03:16.241] } [18:03:16.241] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.241] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.241] base::sink(type = "output", split = FALSE) [18:03:16.241] base::close(...future.stdout) [18:03:16.241] }, add = TRUE) [18:03:16.241] } [18:03:16.241] ...future.frame <- base::sys.nframe() [18:03:16.241] ...future.conditions <- base::list() [18:03:16.241] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.241] if (FALSE) { [18:03:16.241] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.241] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.241] } [18:03:16.241] ...future.result <- base::tryCatch({ [18:03:16.241] base::withCallingHandlers({ [18:03:16.241] ...future.value <- base::withVisible(base::local({ [18:03:16.241] sample(x, size = 1L) [18:03:16.241] })) [18:03:16.241] future::FutureResult(value = ...future.value$value, [18:03:16.241] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.241] ...future.rng), globalenv = if (FALSE) [18:03:16.241] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.241] ...future.globalenv.names)) [18:03:16.241] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.241] }, condition = base::local({ [18:03:16.241] c <- base::c [18:03:16.241] inherits <- base::inherits [18:03:16.241] invokeRestart <- base::invokeRestart [18:03:16.241] length <- base::length [18:03:16.241] list <- base::list [18:03:16.241] seq.int <- base::seq.int [18:03:16.241] signalCondition <- base::signalCondition [18:03:16.241] sys.calls <- base::sys.calls [18:03:16.241] `[[` <- base::`[[` [18:03:16.241] `+` <- base::`+` [18:03:16.241] `<<-` <- base::`<<-` [18:03:16.241] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.241] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.241] 3L)] [18:03:16.241] } [18:03:16.241] function(cond) { [18:03:16.241] is_error <- inherits(cond, "error") [18:03:16.241] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.241] NULL) [18:03:16.241] if (is_error) { [18:03:16.241] sessionInformation <- function() { [18:03:16.241] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.241] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.241] search = base::search(), system = base::Sys.info()) [18:03:16.241] } [18:03:16.241] ...future.conditions[[length(...future.conditions) + [18:03:16.241] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.241] cond$call), session = sessionInformation(), [18:03:16.241] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.241] signalCondition(cond) [18:03:16.241] } [18:03:16.241] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.241] "immediateCondition"))) { [18:03:16.241] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.241] ...future.conditions[[length(...future.conditions) + [18:03:16.241] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.241] if (TRUE && !signal) { [18:03:16.241] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.241] { [18:03:16.241] inherits <- base::inherits [18:03:16.241] invokeRestart <- base::invokeRestart [18:03:16.241] is.null <- base::is.null [18:03:16.241] muffled <- FALSE [18:03:16.241] if (inherits(cond, "message")) { [18:03:16.241] muffled <- grepl(pattern, "muffleMessage") [18:03:16.241] if (muffled) [18:03:16.241] invokeRestart("muffleMessage") [18:03:16.241] } [18:03:16.241] else if (inherits(cond, "warning")) { [18:03:16.241] muffled <- grepl(pattern, "muffleWarning") [18:03:16.241] if (muffled) [18:03:16.241] invokeRestart("muffleWarning") [18:03:16.241] } [18:03:16.241] else if (inherits(cond, "condition")) { [18:03:16.241] if (!is.null(pattern)) { [18:03:16.241] computeRestarts <- base::computeRestarts [18:03:16.241] grepl <- base::grepl [18:03:16.241] restarts <- computeRestarts(cond) [18:03:16.241] for (restart in restarts) { [18:03:16.241] name <- restart$name [18:03:16.241] if (is.null(name)) [18:03:16.241] next [18:03:16.241] if (!grepl(pattern, name)) [18:03:16.241] next [18:03:16.241] invokeRestart(restart) [18:03:16.241] muffled <- TRUE [18:03:16.241] break [18:03:16.241] } [18:03:16.241] } [18:03:16.241] } [18:03:16.241] invisible(muffled) [18:03:16.241] } [18:03:16.241] muffleCondition(cond, pattern = "^muffle") [18:03:16.241] } [18:03:16.241] } [18:03:16.241] else { [18:03:16.241] if (TRUE) { [18:03:16.241] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.241] { [18:03:16.241] inherits <- base::inherits [18:03:16.241] invokeRestart <- base::invokeRestart [18:03:16.241] is.null <- base::is.null [18:03:16.241] muffled <- FALSE [18:03:16.241] if (inherits(cond, "message")) { [18:03:16.241] muffled <- grepl(pattern, "muffleMessage") [18:03:16.241] if (muffled) [18:03:16.241] invokeRestart("muffleMessage") [18:03:16.241] } [18:03:16.241] else if (inherits(cond, "warning")) { [18:03:16.241] muffled <- grepl(pattern, "muffleWarning") [18:03:16.241] if (muffled) [18:03:16.241] invokeRestart("muffleWarning") [18:03:16.241] } [18:03:16.241] else if (inherits(cond, "condition")) { [18:03:16.241] if (!is.null(pattern)) { [18:03:16.241] computeRestarts <- base::computeRestarts [18:03:16.241] grepl <- base::grepl [18:03:16.241] restarts <- computeRestarts(cond) [18:03:16.241] for (restart in restarts) { [18:03:16.241] name <- restart$name [18:03:16.241] if (is.null(name)) [18:03:16.241] next [18:03:16.241] if (!grepl(pattern, name)) [18:03:16.241] next [18:03:16.241] invokeRestart(restart) [18:03:16.241] muffled <- TRUE [18:03:16.241] break [18:03:16.241] } [18:03:16.241] } [18:03:16.241] } [18:03:16.241] invisible(muffled) [18:03:16.241] } [18:03:16.241] muffleCondition(cond, pattern = "^muffle") [18:03:16.241] } [18:03:16.241] } [18:03:16.241] } [18:03:16.241] })) [18:03:16.241] }, error = function(ex) { [18:03:16.241] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.241] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.241] ...future.rng), started = ...future.startTime, [18:03:16.241] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.241] version = "1.8"), class = "FutureResult") [18:03:16.241] }, finally = { [18:03:16.241] if (!identical(...future.workdir, getwd())) [18:03:16.241] setwd(...future.workdir) [18:03:16.241] { [18:03:16.241] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.241] ...future.oldOptions$nwarnings <- NULL [18:03:16.241] } [18:03:16.241] base::options(...future.oldOptions) [18:03:16.241] if (.Platform$OS.type == "windows") { [18:03:16.241] old_names <- names(...future.oldEnvVars) [18:03:16.241] envs <- base::Sys.getenv() [18:03:16.241] names <- names(envs) [18:03:16.241] common <- intersect(names, old_names) [18:03:16.241] added <- setdiff(names, old_names) [18:03:16.241] removed <- setdiff(old_names, names) [18:03:16.241] changed <- common[...future.oldEnvVars[common] != [18:03:16.241] envs[common]] [18:03:16.241] NAMES <- toupper(changed) [18:03:16.241] args <- list() [18:03:16.241] for (kk in seq_along(NAMES)) { [18:03:16.241] name <- changed[[kk]] [18:03:16.241] NAME <- NAMES[[kk]] [18:03:16.241] if (name != NAME && is.element(NAME, old_names)) [18:03:16.241] next [18:03:16.241] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.241] } [18:03:16.241] NAMES <- toupper(added) [18:03:16.241] for (kk in seq_along(NAMES)) { [18:03:16.241] name <- added[[kk]] [18:03:16.241] NAME <- NAMES[[kk]] [18:03:16.241] if (name != NAME && is.element(NAME, old_names)) [18:03:16.241] next [18:03:16.241] args[[name]] <- "" [18:03:16.241] } [18:03:16.241] NAMES <- toupper(removed) [18:03:16.241] for (kk in seq_along(NAMES)) { [18:03:16.241] name <- removed[[kk]] [18:03:16.241] NAME <- NAMES[[kk]] [18:03:16.241] if (name != NAME && is.element(NAME, old_names)) [18:03:16.241] next [18:03:16.241] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.241] } [18:03:16.241] if (length(args) > 0) [18:03:16.241] base::do.call(base::Sys.setenv, args = args) [18:03:16.241] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.241] } [18:03:16.241] else { [18:03:16.241] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.241] } [18:03:16.241] { [18:03:16.241] if (base::length(...future.futureOptionsAdded) > [18:03:16.241] 0L) { [18:03:16.241] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.241] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.241] base::options(opts) [18:03:16.241] } [18:03:16.241] { [18:03:16.241] { [18:03:16.241] base::assign(".Random.seed", c(10407L, -1238383553L, [18:03:16.241] -1380181231L, 1603896375L, 831768359L, -1216777860L, [18:03:16.241] -29476210L), envir = base::globalenv(), inherits = FALSE) [18:03:16.241] NULL [18:03:16.241] } [18:03:16.241] options(future.plan = NULL) [18:03:16.241] if (is.na(NA_character_)) [18:03:16.241] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.241] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.241] future::plan(list(function (..., envir = parent.frame()) [18:03:16.241] { [18:03:16.241] future <- SequentialFuture(..., envir = envir) [18:03:16.241] if (!future$lazy) [18:03:16.241] future <- run(future) [18:03:16.241] invisible(future) [18:03:16.241] }), .cleanup = FALSE, .init = FALSE) [18:03:16.241] } [18:03:16.241] } [18:03:16.241] } [18:03:16.241] }) [18:03:16.241] if (TRUE) { [18:03:16.241] base::sink(type = "output", split = FALSE) [18:03:16.241] if (TRUE) { [18:03:16.241] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.241] } [18:03:16.241] else { [18:03:16.241] ...future.result["stdout"] <- base::list(NULL) [18:03:16.241] } [18:03:16.241] base::close(...future.stdout) [18:03:16.241] ...future.stdout <- NULL [18:03:16.241] } [18:03:16.241] ...future.result$conditions <- ...future.conditions [18:03:16.241] ...future.result$finished <- base::Sys.time() [18:03:16.241] ...future.result [18:03:16.241] } [18:03:16.245] assign_globals() ... [18:03:16.245] List of 1 [18:03:16.245] $ x: int [1:4] 0 1 2 3 [18:03:16.245] - attr(*, "where")=List of 1 [18:03:16.245] ..$ x: [18:03:16.245] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.245] - attr(*, "resolved")= logi FALSE [18:03:16.245] - attr(*, "total_size")= num 64 [18:03:16.245] - attr(*, "already-done")= logi TRUE [18:03:16.248] - copied 'x' to environment [18:03:16.248] assign_globals() ... done [18:03:16.248] plan(): Setting new future strategy stack: [18:03:16.249] List of future strategies: [18:03:16.249] 1. sequential: [18:03:16.249] - args: function (..., envir = parent.frame()) [18:03:16.249] - tweaked: FALSE [18:03:16.249] - call: NULL [18:03:16.249] plan(): nbrOfWorkers() = 1 [18:03:16.250] plan(): Setting new future strategy stack: [18:03:16.250] List of future strategies: [18:03:16.250] 1. sequential: [18:03:16.250] - args: function (..., envir = parent.frame()) [18:03:16.250] - tweaked: FALSE [18:03:16.250] - call: plan(strategy) [18:03:16.251] plan(): nbrOfWorkers() = 1 [18:03:16.251] SequentialFuture started (and completed) [18:03:16.251] - Launch lazy future ... done [18:03:16.251] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_4-155996' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e2d680 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.253] resolve() on list ... [18:03:16.253] recursive: 0 [18:03:16.253] length: 4 [18:03:16.253] [18:03:16.253] resolved() for 'SequentialFuture' ... [18:03:16.253] - state: 'finished' [18:03:16.254] - run: TRUE [18:03:16.254] - result: 'FutureResult' [18:03:16.254] resolved() for 'SequentialFuture' ... done [18:03:16.254] Future #1 [18:03:16.255] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:16.255] - nx: 4 [18:03:16.255] - relay: TRUE [18:03:16.255] - stdout: TRUE [18:03:16.255] - signal: TRUE [18:03:16.256] - resignal: FALSE [18:03:16.256] - force: TRUE [18:03:16.256] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.256] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.256] - until=1 [18:03:16.256] - relaying element #1 [18:03:16.257] signalConditions() ... [18:03:16.257] - include = 'immediateCondition' [18:03:16.257] - exclude = [18:03:16.257] - resignal = FALSE [18:03:16.257] - Number of conditions: 1 [18:03:16.257] signalConditions() ... done [18:03:16.258] signalConditions() ... [18:03:16.258] - include = 'immediateCondition' [18:03:16.258] - exclude = [18:03:16.258] - resignal = FALSE [18:03:16.258] - Number of conditions: 1 [18:03:16.258] signalConditions() ... done [18:03:16.259] signalConditions() ... [18:03:16.259] - include = 'condition' [18:03:16.259] - exclude = 'immediateCondition' [18:03:16.259] - resignal = TRUE [18:03:16.259] - Number of conditions: 1 [18:03:16.259] - Condition #1: 'RngFutureWarning', 'FutureWarning', 'warning', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:16.260] signalConditions() ... done [18:03:16.260] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.260] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.260] signalConditionsASAP(SequentialFuture, pos=1) ... done Future UUID: c81e510f-8567-5490-50d4-030a36f6b9a2 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: SequentialFuture: Label: 'fsample_1-337766' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e2d680 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureWarning' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:16.261] getGlobalsAndPackages() ... [18:03:16.262] Searching for globals... [18:03:16.263] - globals found: [3] '{', 'sample', 'x' [18:03:16.263] Searching for globals ... DONE [18:03:16.263] Resolving globals: FALSE [18:03:16.264] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.264] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.264] - globals: [1] 'x' [18:03:16.264] [18:03:16.265] getGlobalsAndPackages() ... DONE [18:03:16.265] run() for 'Future' ... [18:03:16.265] - state: 'created' [18:03:16.265] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.266] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.266] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.266] - Field: 'label' [18:03:16.266] - Field: 'local' [18:03:16.266] - Field: 'owner' [18:03:16.267] - Field: 'envir' [18:03:16.267] - Field: 'packages' [18:03:16.267] - Field: 'gc' [18:03:16.267] - Field: 'conditions' [18:03:16.267] - Field: 'expr' [18:03:16.267] - Field: 'uuid' [18:03:16.268] - Field: 'seed' [18:03:16.268] - Field: 'version' [18:03:16.268] - Field: 'result' [18:03:16.268] - Field: 'asynchronous' [18:03:16.268] - Field: 'calls' [18:03:16.269] - Field: 'globals' [18:03:16.269] - Field: 'stdout' [18:03:16.269] - Field: 'earlySignal' [18:03:16.269] - Field: 'lazy' [18:03:16.269] - Field: 'state' [18:03:16.269] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.270] - Launch lazy future ... [18:03:16.296] Packages needed by the future expression (n = 0): [18:03:16.297] Packages needed by future strategies (n = 0): [18:03:16.297] { [18:03:16.297] { [18:03:16.297] { [18:03:16.297] ...future.startTime <- base::Sys.time() [18:03:16.297] { [18:03:16.297] { [18:03:16.297] { [18:03:16.297] base::local({ [18:03:16.297] has_future <- base::requireNamespace("future", [18:03:16.297] quietly = TRUE) [18:03:16.297] if (has_future) { [18:03:16.297] ns <- base::getNamespace("future") [18:03:16.297] version <- ns[[".package"]][["version"]] [18:03:16.297] if (is.null(version)) [18:03:16.297] version <- utils::packageVersion("future") [18:03:16.297] } [18:03:16.297] else { [18:03:16.297] version <- NULL [18:03:16.297] } [18:03:16.297] if (!has_future || version < "1.8.0") { [18:03:16.297] info <- base::c(r_version = base::gsub("R version ", [18:03:16.297] "", base::R.version$version.string), [18:03:16.297] platform = base::sprintf("%s (%s-bit)", [18:03:16.297] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.297] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.297] "release", "version")], collapse = " "), [18:03:16.297] hostname = base::Sys.info()[["nodename"]]) [18:03:16.297] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.297] info) [18:03:16.297] info <- base::paste(info, collapse = "; ") [18:03:16.297] if (!has_future) { [18:03:16.297] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.297] info) [18:03:16.297] } [18:03:16.297] else { [18:03:16.297] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.297] info, version) [18:03:16.297] } [18:03:16.297] base::stop(msg) [18:03:16.297] } [18:03:16.297] }) [18:03:16.297] } [18:03:16.297] options(future.plan = NULL) [18:03:16.297] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.297] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.297] } [18:03:16.297] ...future.workdir <- getwd() [18:03:16.297] } [18:03:16.297] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.297] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.297] } [18:03:16.297] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.297] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.297] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.297] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.297] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.297] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.297] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.297] base::names(...future.oldOptions)) [18:03:16.297] } [18:03:16.297] if (FALSE) { [18:03:16.297] } [18:03:16.297] else { [18:03:16.297] if (TRUE) { [18:03:16.297] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.297] open = "w") [18:03:16.297] } [18:03:16.297] else { [18:03:16.297] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.297] windows = "NUL", "/dev/null"), open = "w") [18:03:16.297] } [18:03:16.297] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.297] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.297] base::sink(type = "output", split = FALSE) [18:03:16.297] base::close(...future.stdout) [18:03:16.297] }, add = TRUE) [18:03:16.297] } [18:03:16.297] ...future.frame <- base::sys.nframe() [18:03:16.297] ...future.conditions <- base::list() [18:03:16.297] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.297] if (FALSE) { [18:03:16.297] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.297] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.297] } [18:03:16.297] ...future.result <- base::tryCatch({ [18:03:16.297] base::withCallingHandlers({ [18:03:16.297] ...future.value <- base::withVisible(base::local({ [18:03:16.297] sample(x, size = 1L) [18:03:16.297] })) [18:03:16.297] future::FutureResult(value = ...future.value$value, [18:03:16.297] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.297] ...future.rng), globalenv = if (FALSE) [18:03:16.297] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.297] ...future.globalenv.names)) [18:03:16.297] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.297] }, condition = base::local({ [18:03:16.297] c <- base::c [18:03:16.297] inherits <- base::inherits [18:03:16.297] invokeRestart <- base::invokeRestart [18:03:16.297] length <- base::length [18:03:16.297] list <- base::list [18:03:16.297] seq.int <- base::seq.int [18:03:16.297] signalCondition <- base::signalCondition [18:03:16.297] sys.calls <- base::sys.calls [18:03:16.297] `[[` <- base::`[[` [18:03:16.297] `+` <- base::`+` [18:03:16.297] `<<-` <- base::`<<-` [18:03:16.297] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.297] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.297] 3L)] [18:03:16.297] } [18:03:16.297] function(cond) { [18:03:16.297] is_error <- inherits(cond, "error") [18:03:16.297] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.297] NULL) [18:03:16.297] if (is_error) { [18:03:16.297] sessionInformation <- function() { [18:03:16.297] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.297] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.297] search = base::search(), system = base::Sys.info()) [18:03:16.297] } [18:03:16.297] ...future.conditions[[length(...future.conditions) + [18:03:16.297] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.297] cond$call), session = sessionInformation(), [18:03:16.297] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.297] signalCondition(cond) [18:03:16.297] } [18:03:16.297] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.297] "immediateCondition"))) { [18:03:16.297] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.297] ...future.conditions[[length(...future.conditions) + [18:03:16.297] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.297] if (TRUE && !signal) { [18:03:16.297] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.297] { [18:03:16.297] inherits <- base::inherits [18:03:16.297] invokeRestart <- base::invokeRestart [18:03:16.297] is.null <- base::is.null [18:03:16.297] muffled <- FALSE [18:03:16.297] if (inherits(cond, "message")) { [18:03:16.297] muffled <- grepl(pattern, "muffleMessage") [18:03:16.297] if (muffled) [18:03:16.297] invokeRestart("muffleMessage") [18:03:16.297] } [18:03:16.297] else if (inherits(cond, "warning")) { [18:03:16.297] muffled <- grepl(pattern, "muffleWarning") [18:03:16.297] if (muffled) [18:03:16.297] invokeRestart("muffleWarning") [18:03:16.297] } [18:03:16.297] else if (inherits(cond, "condition")) { [18:03:16.297] if (!is.null(pattern)) { [18:03:16.297] computeRestarts <- base::computeRestarts [18:03:16.297] grepl <- base::grepl [18:03:16.297] restarts <- computeRestarts(cond) [18:03:16.297] for (restart in restarts) { [18:03:16.297] name <- restart$name [18:03:16.297] if (is.null(name)) [18:03:16.297] next [18:03:16.297] if (!grepl(pattern, name)) [18:03:16.297] next [18:03:16.297] invokeRestart(restart) [18:03:16.297] muffled <- TRUE [18:03:16.297] break [18:03:16.297] } [18:03:16.297] } [18:03:16.297] } [18:03:16.297] invisible(muffled) [18:03:16.297] } [18:03:16.297] muffleCondition(cond, pattern = "^muffle") [18:03:16.297] } [18:03:16.297] } [18:03:16.297] else { [18:03:16.297] if (TRUE) { [18:03:16.297] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.297] { [18:03:16.297] inherits <- base::inherits [18:03:16.297] invokeRestart <- base::invokeRestart [18:03:16.297] is.null <- base::is.null [18:03:16.297] muffled <- FALSE [18:03:16.297] if (inherits(cond, "message")) { [18:03:16.297] muffled <- grepl(pattern, "muffleMessage") [18:03:16.297] if (muffled) [18:03:16.297] invokeRestart("muffleMessage") [18:03:16.297] } [18:03:16.297] else if (inherits(cond, "warning")) { [18:03:16.297] muffled <- grepl(pattern, "muffleWarning") [18:03:16.297] if (muffled) [18:03:16.297] invokeRestart("muffleWarning") [18:03:16.297] } [18:03:16.297] else if (inherits(cond, "condition")) { [18:03:16.297] if (!is.null(pattern)) { [18:03:16.297] computeRestarts <- base::computeRestarts [18:03:16.297] grepl <- base::grepl [18:03:16.297] restarts <- computeRestarts(cond) [18:03:16.297] for (restart in restarts) { [18:03:16.297] name <- restart$name [18:03:16.297] if (is.null(name)) [18:03:16.297] next [18:03:16.297] if (!grepl(pattern, name)) [18:03:16.297] next [18:03:16.297] invokeRestart(restart) [18:03:16.297] muffled <- TRUE [18:03:16.297] break [18:03:16.297] } [18:03:16.297] } [18:03:16.297] } [18:03:16.297] invisible(muffled) [18:03:16.297] } [18:03:16.297] muffleCondition(cond, pattern = "^muffle") [18:03:16.297] } [18:03:16.297] } [18:03:16.297] } [18:03:16.297] })) [18:03:16.297] }, error = function(ex) { [18:03:16.297] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.297] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.297] ...future.rng), started = ...future.startTime, [18:03:16.297] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.297] version = "1.8"), class = "FutureResult") [18:03:16.297] }, finally = { [18:03:16.297] if (!identical(...future.workdir, getwd())) [18:03:16.297] setwd(...future.workdir) [18:03:16.297] { [18:03:16.297] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.297] ...future.oldOptions$nwarnings <- NULL [18:03:16.297] } [18:03:16.297] base::options(...future.oldOptions) [18:03:16.297] if (.Platform$OS.type == "windows") { [18:03:16.297] old_names <- names(...future.oldEnvVars) [18:03:16.297] envs <- base::Sys.getenv() [18:03:16.297] names <- names(envs) [18:03:16.297] common <- intersect(names, old_names) [18:03:16.297] added <- setdiff(names, old_names) [18:03:16.297] removed <- setdiff(old_names, names) [18:03:16.297] changed <- common[...future.oldEnvVars[common] != [18:03:16.297] envs[common]] [18:03:16.297] NAMES <- toupper(changed) [18:03:16.297] args <- list() [18:03:16.297] for (kk in seq_along(NAMES)) { [18:03:16.297] name <- changed[[kk]] [18:03:16.297] NAME <- NAMES[[kk]] [18:03:16.297] if (name != NAME && is.element(NAME, old_names)) [18:03:16.297] next [18:03:16.297] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.297] } [18:03:16.297] NAMES <- toupper(added) [18:03:16.297] for (kk in seq_along(NAMES)) { [18:03:16.297] name <- added[[kk]] [18:03:16.297] NAME <- NAMES[[kk]] [18:03:16.297] if (name != NAME && is.element(NAME, old_names)) [18:03:16.297] next [18:03:16.297] args[[name]] <- "" [18:03:16.297] } [18:03:16.297] NAMES <- toupper(removed) [18:03:16.297] for (kk in seq_along(NAMES)) { [18:03:16.297] name <- removed[[kk]] [18:03:16.297] NAME <- NAMES[[kk]] [18:03:16.297] if (name != NAME && is.element(NAME, old_names)) [18:03:16.297] next [18:03:16.297] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.297] } [18:03:16.297] if (length(args) > 0) [18:03:16.297] base::do.call(base::Sys.setenv, args = args) [18:03:16.297] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.297] } [18:03:16.297] else { [18:03:16.297] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.297] } [18:03:16.297] { [18:03:16.297] if (base::length(...future.futureOptionsAdded) > [18:03:16.297] 0L) { [18:03:16.297] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.297] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.297] base::options(opts) [18:03:16.297] } [18:03:16.297] { [18:03:16.297] { [18:03:16.297] base::assign(".Random.seed", c(10407L, -1128540126L, [18:03:16.297] -952246999L, 139006239L, -761127359L, 1614120285L, [18:03:16.297] -193196834L), envir = base::globalenv(), [18:03:16.297] inherits = FALSE) [18:03:16.297] NULL [18:03:16.297] } [18:03:16.297] options(future.plan = NULL) [18:03:16.297] if (is.na(NA_character_)) [18:03:16.297] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.297] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.297] future::plan(list(function (..., envir = parent.frame()) [18:03:16.297] { [18:03:16.297] future <- SequentialFuture(..., envir = envir) [18:03:16.297] if (!future$lazy) [18:03:16.297] future <- run(future) [18:03:16.297] invisible(future) [18:03:16.297] }), .cleanup = FALSE, .init = FALSE) [18:03:16.297] } [18:03:16.297] } [18:03:16.297] } [18:03:16.297] }) [18:03:16.297] if (TRUE) { [18:03:16.297] base::sink(type = "output", split = FALSE) [18:03:16.297] if (TRUE) { [18:03:16.297] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.297] } [18:03:16.297] else { [18:03:16.297] ...future.result["stdout"] <- base::list(NULL) [18:03:16.297] } [18:03:16.297] base::close(...future.stdout) [18:03:16.297] ...future.stdout <- NULL [18:03:16.297] } [18:03:16.297] ...future.result$conditions <- ...future.conditions [18:03:16.297] ...future.result$finished <- base::Sys.time() [18:03:16.297] ...future.result [18:03:16.297] } [18:03:16.302] assign_globals() ... [18:03:16.302] List of 1 [18:03:16.302] $ x: int [1:4] 0 1 2 3 [18:03:16.302] - attr(*, "where")=List of 1 [18:03:16.302] ..$ x: [18:03:16.302] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.302] - attr(*, "resolved")= logi FALSE [18:03:16.302] - attr(*, "total_size")= num 64 [18:03:16.302] - attr(*, "already-done")= logi TRUE [18:03:16.305] - copied 'x' to environment [18:03:16.305] assign_globals() ... done [18:03:16.306] plan(): Setting new future strategy stack: [18:03:16.306] List of future strategies: [18:03:16.306] 1. sequential: [18:03:16.306] - args: function (..., envir = parent.frame()) [18:03:16.306] - tweaked: FALSE [18:03:16.306] - call: NULL [18:03:16.306] plan(): nbrOfWorkers() = 1 [18:03:16.307] plan(): Setting new future strategy stack: [18:03:16.308] List of future strategies: [18:03:16.308] 1. sequential: [18:03:16.308] - args: function (..., envir = parent.frame()) [18:03:16.308] - tweaked: FALSE [18:03:16.308] - call: plan(strategy) [18:03:16.308] plan(): nbrOfWorkers() = 1 [18:03:16.308] SequentialFuture started (and completed) [18:03:16.309] - Launch lazy future ... done [18:03:16.309] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_1-529358' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f467dab0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.310] getGlobalsAndPackages() ... [18:03:16.310] Searching for globals... [18:03:16.311] - globals found: [3] '{', 'sample', 'x' [18:03:16.311] Searching for globals ... DONE [18:03:16.312] Resolving globals: FALSE [18:03:16.312] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.312] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.313] - globals: [1] 'x' [18:03:16.313] [18:03:16.313] getGlobalsAndPackages() ... DONE [18:03:16.313] run() for 'Future' ... [18:03:16.314] - state: 'created' [18:03:16.314] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.314] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.314] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.314] - Field: 'label' [18:03:16.315] - Field: 'local' [18:03:16.315] - Field: 'owner' [18:03:16.315] - Field: 'envir' [18:03:16.315] - Field: 'packages' [18:03:16.315] - Field: 'gc' [18:03:16.316] - Field: 'conditions' [18:03:16.316] - Field: 'expr' [18:03:16.316] - Field: 'uuid' [18:03:16.316] - Field: 'seed' [18:03:16.316] - Field: 'version' [18:03:16.316] - Field: 'result' [18:03:16.317] - Field: 'asynchronous' [18:03:16.317] - Field: 'calls' [18:03:16.317] - Field: 'globals' [18:03:16.317] - Field: 'stdout' [18:03:16.317] - Field: 'earlySignal' [18:03:16.318] - Field: 'lazy' [18:03:16.318] - Field: 'state' [18:03:16.318] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.318] - Launch lazy future ... [18:03:16.318] Packages needed by the future expression (n = 0): [18:03:16.318] Packages needed by future strategies (n = 0): [18:03:16.319] { [18:03:16.319] { [18:03:16.319] { [18:03:16.319] ...future.startTime <- base::Sys.time() [18:03:16.319] { [18:03:16.319] { [18:03:16.319] { [18:03:16.319] base::local({ [18:03:16.319] has_future <- base::requireNamespace("future", [18:03:16.319] quietly = TRUE) [18:03:16.319] if (has_future) { [18:03:16.319] ns <- base::getNamespace("future") [18:03:16.319] version <- ns[[".package"]][["version"]] [18:03:16.319] if (is.null(version)) [18:03:16.319] version <- utils::packageVersion("future") [18:03:16.319] } [18:03:16.319] else { [18:03:16.319] version <- NULL [18:03:16.319] } [18:03:16.319] if (!has_future || version < "1.8.0") { [18:03:16.319] info <- base::c(r_version = base::gsub("R version ", [18:03:16.319] "", base::R.version$version.string), [18:03:16.319] platform = base::sprintf("%s (%s-bit)", [18:03:16.319] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.319] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.319] "release", "version")], collapse = " "), [18:03:16.319] hostname = base::Sys.info()[["nodename"]]) [18:03:16.319] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.319] info) [18:03:16.319] info <- base::paste(info, collapse = "; ") [18:03:16.319] if (!has_future) { [18:03:16.319] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.319] info) [18:03:16.319] } [18:03:16.319] else { [18:03:16.319] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.319] info, version) [18:03:16.319] } [18:03:16.319] base::stop(msg) [18:03:16.319] } [18:03:16.319] }) [18:03:16.319] } [18:03:16.319] options(future.plan = NULL) [18:03:16.319] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.319] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.319] } [18:03:16.319] ...future.workdir <- getwd() [18:03:16.319] } [18:03:16.319] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.319] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.319] } [18:03:16.319] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.319] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.319] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.319] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.319] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.319] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.319] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.319] base::names(...future.oldOptions)) [18:03:16.319] } [18:03:16.319] if (FALSE) { [18:03:16.319] } [18:03:16.319] else { [18:03:16.319] if (TRUE) { [18:03:16.319] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.319] open = "w") [18:03:16.319] } [18:03:16.319] else { [18:03:16.319] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.319] windows = "NUL", "/dev/null"), open = "w") [18:03:16.319] } [18:03:16.319] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.319] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.319] base::sink(type = "output", split = FALSE) [18:03:16.319] base::close(...future.stdout) [18:03:16.319] }, add = TRUE) [18:03:16.319] } [18:03:16.319] ...future.frame <- base::sys.nframe() [18:03:16.319] ...future.conditions <- base::list() [18:03:16.319] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.319] if (FALSE) { [18:03:16.319] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.319] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.319] } [18:03:16.319] ...future.result <- base::tryCatch({ [18:03:16.319] base::withCallingHandlers({ [18:03:16.319] ...future.value <- base::withVisible(base::local({ [18:03:16.319] sample(x, size = 1L) [18:03:16.319] })) [18:03:16.319] future::FutureResult(value = ...future.value$value, [18:03:16.319] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.319] ...future.rng), globalenv = if (FALSE) [18:03:16.319] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.319] ...future.globalenv.names)) [18:03:16.319] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.319] }, condition = base::local({ [18:03:16.319] c <- base::c [18:03:16.319] inherits <- base::inherits [18:03:16.319] invokeRestart <- base::invokeRestart [18:03:16.319] length <- base::length [18:03:16.319] list <- base::list [18:03:16.319] seq.int <- base::seq.int [18:03:16.319] signalCondition <- base::signalCondition [18:03:16.319] sys.calls <- base::sys.calls [18:03:16.319] `[[` <- base::`[[` [18:03:16.319] `+` <- base::`+` [18:03:16.319] `<<-` <- base::`<<-` [18:03:16.319] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.319] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.319] 3L)] [18:03:16.319] } [18:03:16.319] function(cond) { [18:03:16.319] is_error <- inherits(cond, "error") [18:03:16.319] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.319] NULL) [18:03:16.319] if (is_error) { [18:03:16.319] sessionInformation <- function() { [18:03:16.319] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.319] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.319] search = base::search(), system = base::Sys.info()) [18:03:16.319] } [18:03:16.319] ...future.conditions[[length(...future.conditions) + [18:03:16.319] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.319] cond$call), session = sessionInformation(), [18:03:16.319] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.319] signalCondition(cond) [18:03:16.319] } [18:03:16.319] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.319] "immediateCondition"))) { [18:03:16.319] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.319] ...future.conditions[[length(...future.conditions) + [18:03:16.319] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.319] if (TRUE && !signal) { [18:03:16.319] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.319] { [18:03:16.319] inherits <- base::inherits [18:03:16.319] invokeRestart <- base::invokeRestart [18:03:16.319] is.null <- base::is.null [18:03:16.319] muffled <- FALSE [18:03:16.319] if (inherits(cond, "message")) { [18:03:16.319] muffled <- grepl(pattern, "muffleMessage") [18:03:16.319] if (muffled) [18:03:16.319] invokeRestart("muffleMessage") [18:03:16.319] } [18:03:16.319] else if (inherits(cond, "warning")) { [18:03:16.319] muffled <- grepl(pattern, "muffleWarning") [18:03:16.319] if (muffled) [18:03:16.319] invokeRestart("muffleWarning") [18:03:16.319] } [18:03:16.319] else if (inherits(cond, "condition")) { [18:03:16.319] if (!is.null(pattern)) { [18:03:16.319] computeRestarts <- base::computeRestarts [18:03:16.319] grepl <- base::grepl [18:03:16.319] restarts <- computeRestarts(cond) [18:03:16.319] for (restart in restarts) { [18:03:16.319] name <- restart$name [18:03:16.319] if (is.null(name)) [18:03:16.319] next [18:03:16.319] if (!grepl(pattern, name)) [18:03:16.319] next [18:03:16.319] invokeRestart(restart) [18:03:16.319] muffled <- TRUE [18:03:16.319] break [18:03:16.319] } [18:03:16.319] } [18:03:16.319] } [18:03:16.319] invisible(muffled) [18:03:16.319] } [18:03:16.319] muffleCondition(cond, pattern = "^muffle") [18:03:16.319] } [18:03:16.319] } [18:03:16.319] else { [18:03:16.319] if (TRUE) { [18:03:16.319] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.319] { [18:03:16.319] inherits <- base::inherits [18:03:16.319] invokeRestart <- base::invokeRestart [18:03:16.319] is.null <- base::is.null [18:03:16.319] muffled <- FALSE [18:03:16.319] if (inherits(cond, "message")) { [18:03:16.319] muffled <- grepl(pattern, "muffleMessage") [18:03:16.319] if (muffled) [18:03:16.319] invokeRestart("muffleMessage") [18:03:16.319] } [18:03:16.319] else if (inherits(cond, "warning")) { [18:03:16.319] muffled <- grepl(pattern, "muffleWarning") [18:03:16.319] if (muffled) [18:03:16.319] invokeRestart("muffleWarning") [18:03:16.319] } [18:03:16.319] else if (inherits(cond, "condition")) { [18:03:16.319] if (!is.null(pattern)) { [18:03:16.319] computeRestarts <- base::computeRestarts [18:03:16.319] grepl <- base::grepl [18:03:16.319] restarts <- computeRestarts(cond) [18:03:16.319] for (restart in restarts) { [18:03:16.319] name <- restart$name [18:03:16.319] if (is.null(name)) [18:03:16.319] next [18:03:16.319] if (!grepl(pattern, name)) [18:03:16.319] next [18:03:16.319] invokeRestart(restart) [18:03:16.319] muffled <- TRUE [18:03:16.319] break [18:03:16.319] } [18:03:16.319] } [18:03:16.319] } [18:03:16.319] invisible(muffled) [18:03:16.319] } [18:03:16.319] muffleCondition(cond, pattern = "^muffle") [18:03:16.319] } [18:03:16.319] } [18:03:16.319] } [18:03:16.319] })) [18:03:16.319] }, error = function(ex) { [18:03:16.319] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.319] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.319] ...future.rng), started = ...future.startTime, [18:03:16.319] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.319] version = "1.8"), class = "FutureResult") [18:03:16.319] }, finally = { [18:03:16.319] if (!identical(...future.workdir, getwd())) [18:03:16.319] setwd(...future.workdir) [18:03:16.319] { [18:03:16.319] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.319] ...future.oldOptions$nwarnings <- NULL [18:03:16.319] } [18:03:16.319] base::options(...future.oldOptions) [18:03:16.319] if (.Platform$OS.type == "windows") { [18:03:16.319] old_names <- names(...future.oldEnvVars) [18:03:16.319] envs <- base::Sys.getenv() [18:03:16.319] names <- names(envs) [18:03:16.319] common <- intersect(names, old_names) [18:03:16.319] added <- setdiff(names, old_names) [18:03:16.319] removed <- setdiff(old_names, names) [18:03:16.319] changed <- common[...future.oldEnvVars[common] != [18:03:16.319] envs[common]] [18:03:16.319] NAMES <- toupper(changed) [18:03:16.319] args <- list() [18:03:16.319] for (kk in seq_along(NAMES)) { [18:03:16.319] name <- changed[[kk]] [18:03:16.319] NAME <- NAMES[[kk]] [18:03:16.319] if (name != NAME && is.element(NAME, old_names)) [18:03:16.319] next [18:03:16.319] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.319] } [18:03:16.319] NAMES <- toupper(added) [18:03:16.319] for (kk in seq_along(NAMES)) { [18:03:16.319] name <- added[[kk]] [18:03:16.319] NAME <- NAMES[[kk]] [18:03:16.319] if (name != NAME && is.element(NAME, old_names)) [18:03:16.319] next [18:03:16.319] args[[name]] <- "" [18:03:16.319] } [18:03:16.319] NAMES <- toupper(removed) [18:03:16.319] for (kk in seq_along(NAMES)) { [18:03:16.319] name <- removed[[kk]] [18:03:16.319] NAME <- NAMES[[kk]] [18:03:16.319] if (name != NAME && is.element(NAME, old_names)) [18:03:16.319] next [18:03:16.319] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.319] } [18:03:16.319] if (length(args) > 0) [18:03:16.319] base::do.call(base::Sys.setenv, args = args) [18:03:16.319] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.319] } [18:03:16.319] else { [18:03:16.319] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.319] } [18:03:16.319] { [18:03:16.319] if (base::length(...future.futureOptionsAdded) > [18:03:16.319] 0L) { [18:03:16.319] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.319] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.319] base::options(opts) [18:03:16.319] } [18:03:16.319] { [18:03:16.319] { [18:03:16.319] base::assign(".Random.seed", c(10407L, 298683515L, [18:03:16.319] -257106736L, 2003180683L, -1427480851L, 591762006L, [18:03:16.319] 2139143346L), envir = base::globalenv(), [18:03:16.319] inherits = FALSE) [18:03:16.319] NULL [18:03:16.319] } [18:03:16.319] options(future.plan = NULL) [18:03:16.319] if (is.na(NA_character_)) [18:03:16.319] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.319] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.319] future::plan(list(function (..., envir = parent.frame()) [18:03:16.319] { [18:03:16.319] future <- SequentialFuture(..., envir = envir) [18:03:16.319] if (!future$lazy) [18:03:16.319] future <- run(future) [18:03:16.319] invisible(future) [18:03:16.319] }), .cleanup = FALSE, .init = FALSE) [18:03:16.319] } [18:03:16.319] } [18:03:16.319] } [18:03:16.319] }) [18:03:16.319] if (TRUE) { [18:03:16.319] base::sink(type = "output", split = FALSE) [18:03:16.319] if (TRUE) { [18:03:16.319] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.319] } [18:03:16.319] else { [18:03:16.319] ...future.result["stdout"] <- base::list(NULL) [18:03:16.319] } [18:03:16.319] base::close(...future.stdout) [18:03:16.319] ...future.stdout <- NULL [18:03:16.319] } [18:03:16.319] ...future.result$conditions <- ...future.conditions [18:03:16.319] ...future.result$finished <- base::Sys.time() [18:03:16.319] ...future.result [18:03:16.319] } [18:03:16.323] assign_globals() ... [18:03:16.323] List of 1 [18:03:16.323] $ x: int [1:4] 0 1 2 3 [18:03:16.323] - attr(*, "where")=List of 1 [18:03:16.323] ..$ x: [18:03:16.323] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.323] - attr(*, "resolved")= logi FALSE [18:03:16.323] - attr(*, "total_size")= num 64 [18:03:16.323] - attr(*, "already-done")= logi TRUE [18:03:16.326] - copied 'x' to environment [18:03:16.326] assign_globals() ... done [18:03:16.326] plan(): Setting new future strategy stack: [18:03:16.327] List of future strategies: [18:03:16.327] 1. sequential: [18:03:16.327] - args: function (..., envir = parent.frame()) [18:03:16.327] - tweaked: FALSE [18:03:16.327] - call: NULL [18:03:16.327] plan(): nbrOfWorkers() = 1 [18:03:16.328] plan(): Setting new future strategy stack: [18:03:16.328] List of future strategies: [18:03:16.328] 1. sequential: [18:03:16.328] - args: function (..., envir = parent.frame()) [18:03:16.328] - tweaked: FALSE [18:03:16.328] - call: plan(strategy) [18:03:16.329] plan(): nbrOfWorkers() = 1 [18:03:16.329] SequentialFuture started (and completed) [18:03:16.329] - Launch lazy future ... done [18:03:16.330] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_2-522214' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f467dab0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.331] getGlobalsAndPackages() ... [18:03:16.331] Searching for globals... [18:03:16.332] - globals found: [3] '{', 'sample', 'x' [18:03:16.332] Searching for globals ... DONE [18:03:16.332] Resolving globals: FALSE [18:03:16.333] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.333] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.333] - globals: [1] 'x' [18:03:16.334] [18:03:16.334] getGlobalsAndPackages() ... DONE [18:03:16.334] run() for 'Future' ... [18:03:16.334] - state: 'created' [18:03:16.334] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.335] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.335] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.335] - Field: 'label' [18:03:16.335] - Field: 'local' [18:03:16.336] - Field: 'owner' [18:03:16.336] - Field: 'envir' [18:03:16.336] - Field: 'packages' [18:03:16.336] - Field: 'gc' [18:03:16.336] - Field: 'conditions' [18:03:16.336] - Field: 'expr' [18:03:16.337] - Field: 'uuid' [18:03:16.337] - Field: 'seed' [18:03:16.337] - Field: 'version' [18:03:16.337] - Field: 'result' [18:03:16.337] - Field: 'asynchronous' [18:03:16.338] - Field: 'calls' [18:03:16.338] - Field: 'globals' [18:03:16.338] - Field: 'stdout' [18:03:16.338] - Field: 'earlySignal' [18:03:16.338] - Field: 'lazy' [18:03:16.338] - Field: 'state' [18:03:16.339] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.339] - Launch lazy future ... [18:03:16.340] Packages needed by the future expression (n = 0): [18:03:16.340] Packages needed by future strategies (n = 0): [18:03:16.341] { [18:03:16.341] { [18:03:16.341] { [18:03:16.341] ...future.startTime <- base::Sys.time() [18:03:16.341] { [18:03:16.341] { [18:03:16.341] { [18:03:16.341] base::local({ [18:03:16.341] has_future <- base::requireNamespace("future", [18:03:16.341] quietly = TRUE) [18:03:16.341] if (has_future) { [18:03:16.341] ns <- base::getNamespace("future") [18:03:16.341] version <- ns[[".package"]][["version"]] [18:03:16.341] if (is.null(version)) [18:03:16.341] version <- utils::packageVersion("future") [18:03:16.341] } [18:03:16.341] else { [18:03:16.341] version <- NULL [18:03:16.341] } [18:03:16.341] if (!has_future || version < "1.8.0") { [18:03:16.341] info <- base::c(r_version = base::gsub("R version ", [18:03:16.341] "", base::R.version$version.string), [18:03:16.341] platform = base::sprintf("%s (%s-bit)", [18:03:16.341] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.341] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.341] "release", "version")], collapse = " "), [18:03:16.341] hostname = base::Sys.info()[["nodename"]]) [18:03:16.341] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.341] info) [18:03:16.341] info <- base::paste(info, collapse = "; ") [18:03:16.341] if (!has_future) { [18:03:16.341] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.341] info) [18:03:16.341] } [18:03:16.341] else { [18:03:16.341] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.341] info, version) [18:03:16.341] } [18:03:16.341] base::stop(msg) [18:03:16.341] } [18:03:16.341] }) [18:03:16.341] } [18:03:16.341] options(future.plan = NULL) [18:03:16.341] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.341] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.341] } [18:03:16.341] ...future.workdir <- getwd() [18:03:16.341] } [18:03:16.341] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.341] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.341] } [18:03:16.341] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.341] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.341] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.341] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.341] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.341] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.341] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.341] base::names(...future.oldOptions)) [18:03:16.341] } [18:03:16.341] if (FALSE) { [18:03:16.341] } [18:03:16.341] else { [18:03:16.341] if (TRUE) { [18:03:16.341] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.341] open = "w") [18:03:16.341] } [18:03:16.341] else { [18:03:16.341] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.341] windows = "NUL", "/dev/null"), open = "w") [18:03:16.341] } [18:03:16.341] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.341] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.341] base::sink(type = "output", split = FALSE) [18:03:16.341] base::close(...future.stdout) [18:03:16.341] }, add = TRUE) [18:03:16.341] } [18:03:16.341] ...future.frame <- base::sys.nframe() [18:03:16.341] ...future.conditions <- base::list() [18:03:16.341] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.341] if (FALSE) { [18:03:16.341] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.341] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.341] } [18:03:16.341] ...future.result <- base::tryCatch({ [18:03:16.341] base::withCallingHandlers({ [18:03:16.341] ...future.value <- base::withVisible(base::local({ [18:03:16.341] sample(x, size = 1L) [18:03:16.341] })) [18:03:16.341] future::FutureResult(value = ...future.value$value, [18:03:16.341] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.341] ...future.rng), globalenv = if (FALSE) [18:03:16.341] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.341] ...future.globalenv.names)) [18:03:16.341] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.341] }, condition = base::local({ [18:03:16.341] c <- base::c [18:03:16.341] inherits <- base::inherits [18:03:16.341] invokeRestart <- base::invokeRestart [18:03:16.341] length <- base::length [18:03:16.341] list <- base::list [18:03:16.341] seq.int <- base::seq.int [18:03:16.341] signalCondition <- base::signalCondition [18:03:16.341] sys.calls <- base::sys.calls [18:03:16.341] `[[` <- base::`[[` [18:03:16.341] `+` <- base::`+` [18:03:16.341] `<<-` <- base::`<<-` [18:03:16.341] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.341] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.341] 3L)] [18:03:16.341] } [18:03:16.341] function(cond) { [18:03:16.341] is_error <- inherits(cond, "error") [18:03:16.341] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.341] NULL) [18:03:16.341] if (is_error) { [18:03:16.341] sessionInformation <- function() { [18:03:16.341] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.341] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.341] search = base::search(), system = base::Sys.info()) [18:03:16.341] } [18:03:16.341] ...future.conditions[[length(...future.conditions) + [18:03:16.341] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.341] cond$call), session = sessionInformation(), [18:03:16.341] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.341] signalCondition(cond) [18:03:16.341] } [18:03:16.341] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.341] "immediateCondition"))) { [18:03:16.341] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.341] ...future.conditions[[length(...future.conditions) + [18:03:16.341] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.341] if (TRUE && !signal) { [18:03:16.341] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.341] { [18:03:16.341] inherits <- base::inherits [18:03:16.341] invokeRestart <- base::invokeRestart [18:03:16.341] is.null <- base::is.null [18:03:16.341] muffled <- FALSE [18:03:16.341] if (inherits(cond, "message")) { [18:03:16.341] muffled <- grepl(pattern, "muffleMessage") [18:03:16.341] if (muffled) [18:03:16.341] invokeRestart("muffleMessage") [18:03:16.341] } [18:03:16.341] else if (inherits(cond, "warning")) { [18:03:16.341] muffled <- grepl(pattern, "muffleWarning") [18:03:16.341] if (muffled) [18:03:16.341] invokeRestart("muffleWarning") [18:03:16.341] } [18:03:16.341] else if (inherits(cond, "condition")) { [18:03:16.341] if (!is.null(pattern)) { [18:03:16.341] computeRestarts <- base::computeRestarts [18:03:16.341] grepl <- base::grepl [18:03:16.341] restarts <- computeRestarts(cond) [18:03:16.341] for (restart in restarts) { [18:03:16.341] name <- restart$name [18:03:16.341] if (is.null(name)) [18:03:16.341] next [18:03:16.341] if (!grepl(pattern, name)) [18:03:16.341] next [18:03:16.341] invokeRestart(restart) [18:03:16.341] muffled <- TRUE [18:03:16.341] break [18:03:16.341] } [18:03:16.341] } [18:03:16.341] } [18:03:16.341] invisible(muffled) [18:03:16.341] } [18:03:16.341] muffleCondition(cond, pattern = "^muffle") [18:03:16.341] } [18:03:16.341] } [18:03:16.341] else { [18:03:16.341] if (TRUE) { [18:03:16.341] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.341] { [18:03:16.341] inherits <- base::inherits [18:03:16.341] invokeRestart <- base::invokeRestart [18:03:16.341] is.null <- base::is.null [18:03:16.341] muffled <- FALSE [18:03:16.341] if (inherits(cond, "message")) { [18:03:16.341] muffled <- grepl(pattern, "muffleMessage") [18:03:16.341] if (muffled) [18:03:16.341] invokeRestart("muffleMessage") [18:03:16.341] } [18:03:16.341] else if (inherits(cond, "warning")) { [18:03:16.341] muffled <- grepl(pattern, "muffleWarning") [18:03:16.341] if (muffled) [18:03:16.341] invokeRestart("muffleWarning") [18:03:16.341] } [18:03:16.341] else if (inherits(cond, "condition")) { [18:03:16.341] if (!is.null(pattern)) { [18:03:16.341] computeRestarts <- base::computeRestarts [18:03:16.341] grepl <- base::grepl [18:03:16.341] restarts <- computeRestarts(cond) [18:03:16.341] for (restart in restarts) { [18:03:16.341] name <- restart$name [18:03:16.341] if (is.null(name)) [18:03:16.341] next [18:03:16.341] if (!grepl(pattern, name)) [18:03:16.341] next [18:03:16.341] invokeRestart(restart) [18:03:16.341] muffled <- TRUE [18:03:16.341] break [18:03:16.341] } [18:03:16.341] } [18:03:16.341] } [18:03:16.341] invisible(muffled) [18:03:16.341] } [18:03:16.341] muffleCondition(cond, pattern = "^muffle") [18:03:16.341] } [18:03:16.341] } [18:03:16.341] } [18:03:16.341] })) [18:03:16.341] }, error = function(ex) { [18:03:16.341] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.341] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.341] ...future.rng), started = ...future.startTime, [18:03:16.341] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.341] version = "1.8"), class = "FutureResult") [18:03:16.341] }, finally = { [18:03:16.341] if (!identical(...future.workdir, getwd())) [18:03:16.341] setwd(...future.workdir) [18:03:16.341] { [18:03:16.341] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.341] ...future.oldOptions$nwarnings <- NULL [18:03:16.341] } [18:03:16.341] base::options(...future.oldOptions) [18:03:16.341] if (.Platform$OS.type == "windows") { [18:03:16.341] old_names <- names(...future.oldEnvVars) [18:03:16.341] envs <- base::Sys.getenv() [18:03:16.341] names <- names(envs) [18:03:16.341] common <- intersect(names, old_names) [18:03:16.341] added <- setdiff(names, old_names) [18:03:16.341] removed <- setdiff(old_names, names) [18:03:16.341] changed <- common[...future.oldEnvVars[common] != [18:03:16.341] envs[common]] [18:03:16.341] NAMES <- toupper(changed) [18:03:16.341] args <- list() [18:03:16.341] for (kk in seq_along(NAMES)) { [18:03:16.341] name <- changed[[kk]] [18:03:16.341] NAME <- NAMES[[kk]] [18:03:16.341] if (name != NAME && is.element(NAME, old_names)) [18:03:16.341] next [18:03:16.341] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.341] } [18:03:16.341] NAMES <- toupper(added) [18:03:16.341] for (kk in seq_along(NAMES)) { [18:03:16.341] name <- added[[kk]] [18:03:16.341] NAME <- NAMES[[kk]] [18:03:16.341] if (name != NAME && is.element(NAME, old_names)) [18:03:16.341] next [18:03:16.341] args[[name]] <- "" [18:03:16.341] } [18:03:16.341] NAMES <- toupper(removed) [18:03:16.341] for (kk in seq_along(NAMES)) { [18:03:16.341] name <- removed[[kk]] [18:03:16.341] NAME <- NAMES[[kk]] [18:03:16.341] if (name != NAME && is.element(NAME, old_names)) [18:03:16.341] next [18:03:16.341] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.341] } [18:03:16.341] if (length(args) > 0) [18:03:16.341] base::do.call(base::Sys.setenv, args = args) [18:03:16.341] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.341] } [18:03:16.341] else { [18:03:16.341] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.341] } [18:03:16.341] { [18:03:16.341] if (base::length(...future.futureOptionsAdded) > [18:03:16.341] 0L) { [18:03:16.341] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.341] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.341] base::options(opts) [18:03:16.341] } [18:03:16.341] { [18:03:16.341] { [18:03:16.341] base::assign(".Random.seed", c(10407L, 2003180683L, [18:03:16.341] 1301033394L, 1566703528L, 2139143346L, -1318839166L, [18:03:16.341] -255827950L), envir = base::globalenv(), [18:03:16.341] inherits = FALSE) [18:03:16.341] NULL [18:03:16.341] } [18:03:16.341] options(future.plan = NULL) [18:03:16.341] if (is.na(NA_character_)) [18:03:16.341] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.341] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.341] future::plan(list(function (..., envir = parent.frame()) [18:03:16.341] { [18:03:16.341] future <- SequentialFuture(..., envir = envir) [18:03:16.341] if (!future$lazy) [18:03:16.341] future <- run(future) [18:03:16.341] invisible(future) [18:03:16.341] }), .cleanup = FALSE, .init = FALSE) [18:03:16.341] } [18:03:16.341] } [18:03:16.341] } [18:03:16.341] }) [18:03:16.341] if (TRUE) { [18:03:16.341] base::sink(type = "output", split = FALSE) [18:03:16.341] if (TRUE) { [18:03:16.341] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.341] } [18:03:16.341] else { [18:03:16.341] ...future.result["stdout"] <- base::list(NULL) [18:03:16.341] } [18:03:16.341] base::close(...future.stdout) [18:03:16.341] ...future.stdout <- NULL [18:03:16.341] } [18:03:16.341] ...future.result$conditions <- ...future.conditions [18:03:16.341] ...future.result$finished <- base::Sys.time() [18:03:16.341] ...future.result [18:03:16.341] } [18:03:16.344] assign_globals() ... [18:03:16.345] List of 1 [18:03:16.345] $ x: int [1:4] 0 1 2 3 [18:03:16.345] - attr(*, "where")=List of 1 [18:03:16.345] ..$ x: [18:03:16.345] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.345] - attr(*, "resolved")= logi FALSE [18:03:16.345] - attr(*, "total_size")= num 64 [18:03:16.345] - attr(*, "already-done")= logi TRUE [18:03:16.348] - copied 'x' to environment [18:03:16.348] assign_globals() ... done [18:03:16.348] plan(): Setting new future strategy stack: [18:03:16.348] List of future strategies: [18:03:16.348] 1. sequential: [18:03:16.348] - args: function (..., envir = parent.frame()) [18:03:16.348] - tweaked: FALSE [18:03:16.348] - call: NULL [18:03:16.349] plan(): nbrOfWorkers() = 1 [18:03:16.350] plan(): Setting new future strategy stack: [18:03:16.350] List of future strategies: [18:03:16.350] 1. sequential: [18:03:16.350] - args: function (..., envir = parent.frame()) [18:03:16.350] - tweaked: FALSE [18:03:16.350] - call: plan(strategy) [18:03:16.351] plan(): nbrOfWorkers() = 1 [18:03:16.351] SequentialFuture started (and completed) [18:03:16.351] - Launch lazy future ... done [18:03:16.351] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_3-552098' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f467dab0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.352] getGlobalsAndPackages() ... [18:03:16.352] Searching for globals... [18:03:16.354] - globals found: [3] '{', 'sample', 'x' [18:03:16.354] Searching for globals ... DONE [18:03:16.354] Resolving globals: FALSE [18:03:16.354] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.355] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.355] - globals: [1] 'x' [18:03:16.355] [18:03:16.355] getGlobalsAndPackages() ... DONE [18:03:16.356] run() for 'Future' ... [18:03:16.356] - state: 'created' [18:03:16.356] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.357] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.357] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.357] - Field: 'label' [18:03:16.357] - Field: 'local' [18:03:16.357] - Field: 'owner' [18:03:16.357] - Field: 'envir' [18:03:16.358] - Field: 'packages' [18:03:16.358] - Field: 'gc' [18:03:16.358] - Field: 'conditions' [18:03:16.358] - Field: 'expr' [18:03:16.358] - Field: 'uuid' [18:03:16.359] - Field: 'seed' [18:03:16.359] - Field: 'version' [18:03:16.359] - Field: 'result' [18:03:16.359] - Field: 'asynchronous' [18:03:16.359] - Field: 'calls' [18:03:16.359] - Field: 'globals' [18:03:16.360] - Field: 'stdout' [18:03:16.360] - Field: 'earlySignal' [18:03:16.360] - Field: 'lazy' [18:03:16.360] - Field: 'state' [18:03:16.360] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.360] - Launch lazy future ... [18:03:16.361] Packages needed by the future expression (n = 0): [18:03:16.361] Packages needed by future strategies (n = 0): [18:03:16.362] { [18:03:16.362] { [18:03:16.362] { [18:03:16.362] ...future.startTime <- base::Sys.time() [18:03:16.362] { [18:03:16.362] { [18:03:16.362] { [18:03:16.362] base::local({ [18:03:16.362] has_future <- base::requireNamespace("future", [18:03:16.362] quietly = TRUE) [18:03:16.362] if (has_future) { [18:03:16.362] ns <- base::getNamespace("future") [18:03:16.362] version <- ns[[".package"]][["version"]] [18:03:16.362] if (is.null(version)) [18:03:16.362] version <- utils::packageVersion("future") [18:03:16.362] } [18:03:16.362] else { [18:03:16.362] version <- NULL [18:03:16.362] } [18:03:16.362] if (!has_future || version < "1.8.0") { [18:03:16.362] info <- base::c(r_version = base::gsub("R version ", [18:03:16.362] "", base::R.version$version.string), [18:03:16.362] platform = base::sprintf("%s (%s-bit)", [18:03:16.362] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.362] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.362] "release", "version")], collapse = " "), [18:03:16.362] hostname = base::Sys.info()[["nodename"]]) [18:03:16.362] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.362] info) [18:03:16.362] info <- base::paste(info, collapse = "; ") [18:03:16.362] if (!has_future) { [18:03:16.362] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.362] info) [18:03:16.362] } [18:03:16.362] else { [18:03:16.362] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.362] info, version) [18:03:16.362] } [18:03:16.362] base::stop(msg) [18:03:16.362] } [18:03:16.362] }) [18:03:16.362] } [18:03:16.362] options(future.plan = NULL) [18:03:16.362] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.362] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.362] } [18:03:16.362] ...future.workdir <- getwd() [18:03:16.362] } [18:03:16.362] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.362] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.362] } [18:03:16.362] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.362] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.362] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.362] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.362] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.362] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.362] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.362] base::names(...future.oldOptions)) [18:03:16.362] } [18:03:16.362] if (FALSE) { [18:03:16.362] } [18:03:16.362] else { [18:03:16.362] if (TRUE) { [18:03:16.362] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.362] open = "w") [18:03:16.362] } [18:03:16.362] else { [18:03:16.362] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.362] windows = "NUL", "/dev/null"), open = "w") [18:03:16.362] } [18:03:16.362] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.362] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.362] base::sink(type = "output", split = FALSE) [18:03:16.362] base::close(...future.stdout) [18:03:16.362] }, add = TRUE) [18:03:16.362] } [18:03:16.362] ...future.frame <- base::sys.nframe() [18:03:16.362] ...future.conditions <- base::list() [18:03:16.362] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.362] if (FALSE) { [18:03:16.362] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.362] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.362] } [18:03:16.362] ...future.result <- base::tryCatch({ [18:03:16.362] base::withCallingHandlers({ [18:03:16.362] ...future.value <- base::withVisible(base::local({ [18:03:16.362] sample(x, size = 1L) [18:03:16.362] })) [18:03:16.362] future::FutureResult(value = ...future.value$value, [18:03:16.362] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.362] ...future.rng), globalenv = if (FALSE) [18:03:16.362] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.362] ...future.globalenv.names)) [18:03:16.362] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.362] }, condition = base::local({ [18:03:16.362] c <- base::c [18:03:16.362] inherits <- base::inherits [18:03:16.362] invokeRestart <- base::invokeRestart [18:03:16.362] length <- base::length [18:03:16.362] list <- base::list [18:03:16.362] seq.int <- base::seq.int [18:03:16.362] signalCondition <- base::signalCondition [18:03:16.362] sys.calls <- base::sys.calls [18:03:16.362] `[[` <- base::`[[` [18:03:16.362] `+` <- base::`+` [18:03:16.362] `<<-` <- base::`<<-` [18:03:16.362] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.362] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.362] 3L)] [18:03:16.362] } [18:03:16.362] function(cond) { [18:03:16.362] is_error <- inherits(cond, "error") [18:03:16.362] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.362] NULL) [18:03:16.362] if (is_error) { [18:03:16.362] sessionInformation <- function() { [18:03:16.362] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.362] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.362] search = base::search(), system = base::Sys.info()) [18:03:16.362] } [18:03:16.362] ...future.conditions[[length(...future.conditions) + [18:03:16.362] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.362] cond$call), session = sessionInformation(), [18:03:16.362] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.362] signalCondition(cond) [18:03:16.362] } [18:03:16.362] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.362] "immediateCondition"))) { [18:03:16.362] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.362] ...future.conditions[[length(...future.conditions) + [18:03:16.362] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.362] if (TRUE && !signal) { [18:03:16.362] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.362] { [18:03:16.362] inherits <- base::inherits [18:03:16.362] invokeRestart <- base::invokeRestart [18:03:16.362] is.null <- base::is.null [18:03:16.362] muffled <- FALSE [18:03:16.362] if (inherits(cond, "message")) { [18:03:16.362] muffled <- grepl(pattern, "muffleMessage") [18:03:16.362] if (muffled) [18:03:16.362] invokeRestart("muffleMessage") [18:03:16.362] } [18:03:16.362] else if (inherits(cond, "warning")) { [18:03:16.362] muffled <- grepl(pattern, "muffleWarning") [18:03:16.362] if (muffled) [18:03:16.362] invokeRestart("muffleWarning") [18:03:16.362] } [18:03:16.362] else if (inherits(cond, "condition")) { [18:03:16.362] if (!is.null(pattern)) { [18:03:16.362] computeRestarts <- base::computeRestarts [18:03:16.362] grepl <- base::grepl [18:03:16.362] restarts <- computeRestarts(cond) [18:03:16.362] for (restart in restarts) { [18:03:16.362] name <- restart$name [18:03:16.362] if (is.null(name)) [18:03:16.362] next [18:03:16.362] if (!grepl(pattern, name)) [18:03:16.362] next [18:03:16.362] invokeRestart(restart) [18:03:16.362] muffled <- TRUE [18:03:16.362] break [18:03:16.362] } [18:03:16.362] } [18:03:16.362] } [18:03:16.362] invisible(muffled) [18:03:16.362] } [18:03:16.362] muffleCondition(cond, pattern = "^muffle") [18:03:16.362] } [18:03:16.362] } [18:03:16.362] else { [18:03:16.362] if (TRUE) { [18:03:16.362] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.362] { [18:03:16.362] inherits <- base::inherits [18:03:16.362] invokeRestart <- base::invokeRestart [18:03:16.362] is.null <- base::is.null [18:03:16.362] muffled <- FALSE [18:03:16.362] if (inherits(cond, "message")) { [18:03:16.362] muffled <- grepl(pattern, "muffleMessage") [18:03:16.362] if (muffled) [18:03:16.362] invokeRestart("muffleMessage") [18:03:16.362] } [18:03:16.362] else if (inherits(cond, "warning")) { [18:03:16.362] muffled <- grepl(pattern, "muffleWarning") [18:03:16.362] if (muffled) [18:03:16.362] invokeRestart("muffleWarning") [18:03:16.362] } [18:03:16.362] else if (inherits(cond, "condition")) { [18:03:16.362] if (!is.null(pattern)) { [18:03:16.362] computeRestarts <- base::computeRestarts [18:03:16.362] grepl <- base::grepl [18:03:16.362] restarts <- computeRestarts(cond) [18:03:16.362] for (restart in restarts) { [18:03:16.362] name <- restart$name [18:03:16.362] if (is.null(name)) [18:03:16.362] next [18:03:16.362] if (!grepl(pattern, name)) [18:03:16.362] next [18:03:16.362] invokeRestart(restart) [18:03:16.362] muffled <- TRUE [18:03:16.362] break [18:03:16.362] } [18:03:16.362] } [18:03:16.362] } [18:03:16.362] invisible(muffled) [18:03:16.362] } [18:03:16.362] muffleCondition(cond, pattern = "^muffle") [18:03:16.362] } [18:03:16.362] } [18:03:16.362] } [18:03:16.362] })) [18:03:16.362] }, error = function(ex) { [18:03:16.362] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.362] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.362] ...future.rng), started = ...future.startTime, [18:03:16.362] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.362] version = "1.8"), class = "FutureResult") [18:03:16.362] }, finally = { [18:03:16.362] if (!identical(...future.workdir, getwd())) [18:03:16.362] setwd(...future.workdir) [18:03:16.362] { [18:03:16.362] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.362] ...future.oldOptions$nwarnings <- NULL [18:03:16.362] } [18:03:16.362] base::options(...future.oldOptions) [18:03:16.362] if (.Platform$OS.type == "windows") { [18:03:16.362] old_names <- names(...future.oldEnvVars) [18:03:16.362] envs <- base::Sys.getenv() [18:03:16.362] names <- names(envs) [18:03:16.362] common <- intersect(names, old_names) [18:03:16.362] added <- setdiff(names, old_names) [18:03:16.362] removed <- setdiff(old_names, names) [18:03:16.362] changed <- common[...future.oldEnvVars[common] != [18:03:16.362] envs[common]] [18:03:16.362] NAMES <- toupper(changed) [18:03:16.362] args <- list() [18:03:16.362] for (kk in seq_along(NAMES)) { [18:03:16.362] name <- changed[[kk]] [18:03:16.362] NAME <- NAMES[[kk]] [18:03:16.362] if (name != NAME && is.element(NAME, old_names)) [18:03:16.362] next [18:03:16.362] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.362] } [18:03:16.362] NAMES <- toupper(added) [18:03:16.362] for (kk in seq_along(NAMES)) { [18:03:16.362] name <- added[[kk]] [18:03:16.362] NAME <- NAMES[[kk]] [18:03:16.362] if (name != NAME && is.element(NAME, old_names)) [18:03:16.362] next [18:03:16.362] args[[name]] <- "" [18:03:16.362] } [18:03:16.362] NAMES <- toupper(removed) [18:03:16.362] for (kk in seq_along(NAMES)) { [18:03:16.362] name <- removed[[kk]] [18:03:16.362] NAME <- NAMES[[kk]] [18:03:16.362] if (name != NAME && is.element(NAME, old_names)) [18:03:16.362] next [18:03:16.362] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.362] } [18:03:16.362] if (length(args) > 0) [18:03:16.362] base::do.call(base::Sys.setenv, args = args) [18:03:16.362] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.362] } [18:03:16.362] else { [18:03:16.362] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.362] } [18:03:16.362] { [18:03:16.362] if (base::length(...future.futureOptionsAdded) > [18:03:16.362] 0L) { [18:03:16.362] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.362] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.362] base::options(opts) [18:03:16.362] } [18:03:16.362] { [18:03:16.362] { [18:03:16.362] base::assign(".Random.seed", c(10407L, 1566703528L, [18:03:16.362] 170874120L, 239632999L, -255827950L, 145623865L, [18:03:16.362] -1664332594L), envir = base::globalenv(), [18:03:16.362] inherits = FALSE) [18:03:16.362] NULL [18:03:16.362] } [18:03:16.362] options(future.plan = NULL) [18:03:16.362] if (is.na(NA_character_)) [18:03:16.362] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.362] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.362] future::plan(list(function (..., envir = parent.frame()) [18:03:16.362] { [18:03:16.362] future <- SequentialFuture(..., envir = envir) [18:03:16.362] if (!future$lazy) [18:03:16.362] future <- run(future) [18:03:16.362] invisible(future) [18:03:16.362] }), .cleanup = FALSE, .init = FALSE) [18:03:16.362] } [18:03:16.362] } [18:03:16.362] } [18:03:16.362] }) [18:03:16.362] if (TRUE) { [18:03:16.362] base::sink(type = "output", split = FALSE) [18:03:16.362] if (TRUE) { [18:03:16.362] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.362] } [18:03:16.362] else { [18:03:16.362] ...future.result["stdout"] <- base::list(NULL) [18:03:16.362] } [18:03:16.362] base::close(...future.stdout) [18:03:16.362] ...future.stdout <- NULL [18:03:16.362] } [18:03:16.362] ...future.result$conditions <- ...future.conditions [18:03:16.362] ...future.result$finished <- base::Sys.time() [18:03:16.362] ...future.result [18:03:16.362] } [18:03:16.366] assign_globals() ... [18:03:16.366] List of 1 [18:03:16.366] $ x: int [1:4] 0 1 2 3 [18:03:16.366] - attr(*, "where")=List of 1 [18:03:16.366] ..$ x: [18:03:16.366] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.366] - attr(*, "resolved")= logi FALSE [18:03:16.366] - attr(*, "total_size")= num 64 [18:03:16.366] - attr(*, "already-done")= logi TRUE [18:03:16.369] - copied 'x' to environment [18:03:16.369] assign_globals() ... done [18:03:16.369] plan(): Setting new future strategy stack: [18:03:16.369] List of future strategies: [18:03:16.369] 1. sequential: [18:03:16.369] - args: function (..., envir = parent.frame()) [18:03:16.369] - tweaked: FALSE [18:03:16.369] - call: NULL [18:03:16.370] plan(): nbrOfWorkers() = 1 [18:03:16.371] plan(): Setting new future strategy stack: [18:03:16.371] List of future strategies: [18:03:16.371] 1. sequential: [18:03:16.371] - args: function (..., envir = parent.frame()) [18:03:16.371] - tweaked: FALSE [18:03:16.371] - call: plan(strategy) [18:03:16.372] plan(): nbrOfWorkers() = 1 [18:03:16.372] SequentialFuture started (and completed) [18:03:16.372] - Launch lazy future ... done [18:03:16.372] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_4-94589' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f467dab0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.373] resolve() on list ... [18:03:16.374] recursive: 0 [18:03:16.374] length: 4 [18:03:16.374] [18:03:16.374] resolved() for 'SequentialFuture' ... [18:03:16.374] - state: 'finished' [18:03:16.375] - run: TRUE [18:03:16.375] - result: 'FutureResult' [18:03:16.375] resolved() for 'SequentialFuture' ... done [18:03:16.375] Future #1 [18:03:16.375] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:16.376] - nx: 4 [18:03:16.376] - relay: TRUE [18:03:16.376] - stdout: TRUE [18:03:16.376] - signal: TRUE [18:03:16.376] - resignal: FALSE [18:03:16.376] - force: TRUE [18:03:16.376] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.377] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.377] - until=1 [18:03:16.377] - relaying element #1 [18:03:16.377] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.377] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.378] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:03:16.378] length: 3 (resolved future 1) [18:03:16.378] resolved() for 'SequentialFuture' ... [18:03:16.378] - state: 'finished' [18:03:16.378] - run: TRUE [18:03:16.379] - result: 'FutureResult' [18:03:16.379] resolved() for 'SequentialFuture' ... done [18:03:16.379] Future #2 [18:03:16.379] signalConditionsASAP(SequentialFuture, pos=2) ... [18:03:16.379] - nx: 4 [18:03:16.379] - relay: TRUE [18:03:16.380] - stdout: TRUE [18:03:16.380] - signal: TRUE [18:03:16.380] - resignal: FALSE [18:03:16.380] - force: TRUE [18:03:16.380] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.380] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.381] - until=2 [18:03:16.381] - relaying element #2 [18:03:16.381] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.381] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.381] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:03:16.381] length: 2 (resolved future 2) [18:03:16.382] resolved() for 'SequentialFuture' ... [18:03:16.382] - state: 'finished' [18:03:16.382] - run: TRUE [18:03:16.382] - result: 'FutureResult' [18:03:16.382] resolved() for 'SequentialFuture' ... done [18:03:16.383] Future #3 [18:03:16.384] signalConditionsASAP(SequentialFuture, pos=3) ... [18:03:16.384] - nx: 4 [18:03:16.384] - relay: TRUE [18:03:16.384] - stdout: TRUE [18:03:16.384] - signal: TRUE [18:03:16.384] - resignal: FALSE [18:03:16.385] - force: TRUE [18:03:16.385] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.385] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.385] - until=3 [18:03:16.385] - relaying element #3 [18:03:16.386] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.386] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.386] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:03:16.386] length: 1 (resolved future 3) [18:03:16.386] resolved() for 'SequentialFuture' ... [18:03:16.386] - state: 'finished' [18:03:16.387] - run: TRUE [18:03:16.387] - result: 'FutureResult' [18:03:16.387] resolved() for 'SequentialFuture' ... done [18:03:16.387] Future #4 [18:03:16.387] signalConditionsASAP(SequentialFuture, pos=4) ... [18:03:16.388] - nx: 4 [18:03:16.388] - relay: TRUE [18:03:16.388] - stdout: TRUE [18:03:16.388] - signal: TRUE [18:03:16.388] - resignal: FALSE [18:03:16.388] - force: TRUE [18:03:16.388] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.389] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.389] - until=4 [18:03:16.389] - relaying element #4 [18:03:16.389] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.389] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.390] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:03:16.390] length: 0 (resolved future 4) [18:03:16.390] Relaying remaining futures [18:03:16.390] signalConditionsASAP(NULL, pos=0) ... [18:03:16.390] - nx: 4 [18:03:16.390] - relay: TRUE [18:03:16.390] - stdout: TRUE [18:03:16.391] - signal: TRUE [18:03:16.391] - resignal: FALSE [18:03:16.391] - force: TRUE [18:03:16.391] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.391] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:16.391] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.392] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.392] signalConditionsASAP(NULL, pos=0) ... done [18:03:16.392] resolve() on list ... DONE [[1]] [1] 3 [[2]] [1] 0 [[3]] [1] 1 [[4]] [1] 3 [18:03:16.393] getGlobalsAndPackages() ... [18:03:16.393] Searching for globals... [18:03:16.394] - globals found: [3] '{', 'sample', 'x' [18:03:16.394] Searching for globals ... DONE [18:03:16.394] Resolving globals: FALSE [18:03:16.395] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.395] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.395] - globals: [1] 'x' [18:03:16.396] [18:03:16.396] getGlobalsAndPackages() ... DONE [18:03:16.396] run() for 'Future' ... [18:03:16.396] - state: 'created' [18:03:16.396] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.397] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.397] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.397] - Field: 'label' [18:03:16.397] - Field: 'local' [18:03:16.398] - Field: 'owner' [18:03:16.398] - Field: 'envir' [18:03:16.398] - Field: 'packages' [18:03:16.398] - Field: 'gc' [18:03:16.398] - Field: 'conditions' [18:03:16.398] - Field: 'expr' [18:03:16.399] - Field: 'uuid' [18:03:16.399] - Field: 'seed' [18:03:16.399] - Field: 'version' [18:03:16.399] - Field: 'result' [18:03:16.399] - Field: 'asynchronous' [18:03:16.400] - Field: 'calls' [18:03:16.400] - Field: 'globals' [18:03:16.400] - Field: 'stdout' [18:03:16.400] - Field: 'earlySignal' [18:03:16.400] - Field: 'lazy' [18:03:16.400] - Field: 'state' [18:03:16.401] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.401] - Launch lazy future ... [18:03:16.401] Packages needed by the future expression (n = 0): [18:03:16.401] Packages needed by future strategies (n = 0): [18:03:16.402] { [18:03:16.402] { [18:03:16.402] { [18:03:16.402] ...future.startTime <- base::Sys.time() [18:03:16.402] { [18:03:16.402] { [18:03:16.402] { [18:03:16.402] base::local({ [18:03:16.402] has_future <- base::requireNamespace("future", [18:03:16.402] quietly = TRUE) [18:03:16.402] if (has_future) { [18:03:16.402] ns <- base::getNamespace("future") [18:03:16.402] version <- ns[[".package"]][["version"]] [18:03:16.402] if (is.null(version)) [18:03:16.402] version <- utils::packageVersion("future") [18:03:16.402] } [18:03:16.402] else { [18:03:16.402] version <- NULL [18:03:16.402] } [18:03:16.402] if (!has_future || version < "1.8.0") { [18:03:16.402] info <- base::c(r_version = base::gsub("R version ", [18:03:16.402] "", base::R.version$version.string), [18:03:16.402] platform = base::sprintf("%s (%s-bit)", [18:03:16.402] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.402] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.402] "release", "version")], collapse = " "), [18:03:16.402] hostname = base::Sys.info()[["nodename"]]) [18:03:16.402] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.402] info) [18:03:16.402] info <- base::paste(info, collapse = "; ") [18:03:16.402] if (!has_future) { [18:03:16.402] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.402] info) [18:03:16.402] } [18:03:16.402] else { [18:03:16.402] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.402] info, version) [18:03:16.402] } [18:03:16.402] base::stop(msg) [18:03:16.402] } [18:03:16.402] }) [18:03:16.402] } [18:03:16.402] options(future.plan = NULL) [18:03:16.402] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.402] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.402] } [18:03:16.402] ...future.workdir <- getwd() [18:03:16.402] } [18:03:16.402] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.402] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.402] } [18:03:16.402] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.402] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.402] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.402] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.402] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.402] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.402] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.402] base::names(...future.oldOptions)) [18:03:16.402] } [18:03:16.402] if (FALSE) { [18:03:16.402] } [18:03:16.402] else { [18:03:16.402] if (TRUE) { [18:03:16.402] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.402] open = "w") [18:03:16.402] } [18:03:16.402] else { [18:03:16.402] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.402] windows = "NUL", "/dev/null"), open = "w") [18:03:16.402] } [18:03:16.402] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.402] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.402] base::sink(type = "output", split = FALSE) [18:03:16.402] base::close(...future.stdout) [18:03:16.402] }, add = TRUE) [18:03:16.402] } [18:03:16.402] ...future.frame <- base::sys.nframe() [18:03:16.402] ...future.conditions <- base::list() [18:03:16.402] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.402] if (FALSE) { [18:03:16.402] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.402] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.402] } [18:03:16.402] ...future.result <- base::tryCatch({ [18:03:16.402] base::withCallingHandlers({ [18:03:16.402] ...future.value <- base::withVisible(base::local({ [18:03:16.402] sample(x, size = 1L) [18:03:16.402] })) [18:03:16.402] future::FutureResult(value = ...future.value$value, [18:03:16.402] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.402] ...future.rng), globalenv = if (FALSE) [18:03:16.402] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.402] ...future.globalenv.names)) [18:03:16.402] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.402] }, condition = base::local({ [18:03:16.402] c <- base::c [18:03:16.402] inherits <- base::inherits [18:03:16.402] invokeRestart <- base::invokeRestart [18:03:16.402] length <- base::length [18:03:16.402] list <- base::list [18:03:16.402] seq.int <- base::seq.int [18:03:16.402] signalCondition <- base::signalCondition [18:03:16.402] sys.calls <- base::sys.calls [18:03:16.402] `[[` <- base::`[[` [18:03:16.402] `+` <- base::`+` [18:03:16.402] `<<-` <- base::`<<-` [18:03:16.402] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.402] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.402] 3L)] [18:03:16.402] } [18:03:16.402] function(cond) { [18:03:16.402] is_error <- inherits(cond, "error") [18:03:16.402] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.402] NULL) [18:03:16.402] if (is_error) { [18:03:16.402] sessionInformation <- function() { [18:03:16.402] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.402] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.402] search = base::search(), system = base::Sys.info()) [18:03:16.402] } [18:03:16.402] ...future.conditions[[length(...future.conditions) + [18:03:16.402] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.402] cond$call), session = sessionInformation(), [18:03:16.402] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.402] signalCondition(cond) [18:03:16.402] } [18:03:16.402] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.402] "immediateCondition"))) { [18:03:16.402] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.402] ...future.conditions[[length(...future.conditions) + [18:03:16.402] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.402] if (TRUE && !signal) { [18:03:16.402] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.402] { [18:03:16.402] inherits <- base::inherits [18:03:16.402] invokeRestart <- base::invokeRestart [18:03:16.402] is.null <- base::is.null [18:03:16.402] muffled <- FALSE [18:03:16.402] if (inherits(cond, "message")) { [18:03:16.402] muffled <- grepl(pattern, "muffleMessage") [18:03:16.402] if (muffled) [18:03:16.402] invokeRestart("muffleMessage") [18:03:16.402] } [18:03:16.402] else if (inherits(cond, "warning")) { [18:03:16.402] muffled <- grepl(pattern, "muffleWarning") [18:03:16.402] if (muffled) [18:03:16.402] invokeRestart("muffleWarning") [18:03:16.402] } [18:03:16.402] else if (inherits(cond, "condition")) { [18:03:16.402] if (!is.null(pattern)) { [18:03:16.402] computeRestarts <- base::computeRestarts [18:03:16.402] grepl <- base::grepl [18:03:16.402] restarts <- computeRestarts(cond) [18:03:16.402] for (restart in restarts) { [18:03:16.402] name <- restart$name [18:03:16.402] if (is.null(name)) [18:03:16.402] next [18:03:16.402] if (!grepl(pattern, name)) [18:03:16.402] next [18:03:16.402] invokeRestart(restart) [18:03:16.402] muffled <- TRUE [18:03:16.402] break [18:03:16.402] } [18:03:16.402] } [18:03:16.402] } [18:03:16.402] invisible(muffled) [18:03:16.402] } [18:03:16.402] muffleCondition(cond, pattern = "^muffle") [18:03:16.402] } [18:03:16.402] } [18:03:16.402] else { [18:03:16.402] if (TRUE) { [18:03:16.402] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.402] { [18:03:16.402] inherits <- base::inherits [18:03:16.402] invokeRestart <- base::invokeRestart [18:03:16.402] is.null <- base::is.null [18:03:16.402] muffled <- FALSE [18:03:16.402] if (inherits(cond, "message")) { [18:03:16.402] muffled <- grepl(pattern, "muffleMessage") [18:03:16.402] if (muffled) [18:03:16.402] invokeRestart("muffleMessage") [18:03:16.402] } [18:03:16.402] else if (inherits(cond, "warning")) { [18:03:16.402] muffled <- grepl(pattern, "muffleWarning") [18:03:16.402] if (muffled) [18:03:16.402] invokeRestart("muffleWarning") [18:03:16.402] } [18:03:16.402] else if (inherits(cond, "condition")) { [18:03:16.402] if (!is.null(pattern)) { [18:03:16.402] computeRestarts <- base::computeRestarts [18:03:16.402] grepl <- base::grepl [18:03:16.402] restarts <- computeRestarts(cond) [18:03:16.402] for (restart in restarts) { [18:03:16.402] name <- restart$name [18:03:16.402] if (is.null(name)) [18:03:16.402] next [18:03:16.402] if (!grepl(pattern, name)) [18:03:16.402] next [18:03:16.402] invokeRestart(restart) [18:03:16.402] muffled <- TRUE [18:03:16.402] break [18:03:16.402] } [18:03:16.402] } [18:03:16.402] } [18:03:16.402] invisible(muffled) [18:03:16.402] } [18:03:16.402] muffleCondition(cond, pattern = "^muffle") [18:03:16.402] } [18:03:16.402] } [18:03:16.402] } [18:03:16.402] })) [18:03:16.402] }, error = function(ex) { [18:03:16.402] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.402] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.402] ...future.rng), started = ...future.startTime, [18:03:16.402] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.402] version = "1.8"), class = "FutureResult") [18:03:16.402] }, finally = { [18:03:16.402] if (!identical(...future.workdir, getwd())) [18:03:16.402] setwd(...future.workdir) [18:03:16.402] { [18:03:16.402] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.402] ...future.oldOptions$nwarnings <- NULL [18:03:16.402] } [18:03:16.402] base::options(...future.oldOptions) [18:03:16.402] if (.Platform$OS.type == "windows") { [18:03:16.402] old_names <- names(...future.oldEnvVars) [18:03:16.402] envs <- base::Sys.getenv() [18:03:16.402] names <- names(envs) [18:03:16.402] common <- intersect(names, old_names) [18:03:16.402] added <- setdiff(names, old_names) [18:03:16.402] removed <- setdiff(old_names, names) [18:03:16.402] changed <- common[...future.oldEnvVars[common] != [18:03:16.402] envs[common]] [18:03:16.402] NAMES <- toupper(changed) [18:03:16.402] args <- list() [18:03:16.402] for (kk in seq_along(NAMES)) { [18:03:16.402] name <- changed[[kk]] [18:03:16.402] NAME <- NAMES[[kk]] [18:03:16.402] if (name != NAME && is.element(NAME, old_names)) [18:03:16.402] next [18:03:16.402] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.402] } [18:03:16.402] NAMES <- toupper(added) [18:03:16.402] for (kk in seq_along(NAMES)) { [18:03:16.402] name <- added[[kk]] [18:03:16.402] NAME <- NAMES[[kk]] [18:03:16.402] if (name != NAME && is.element(NAME, old_names)) [18:03:16.402] next [18:03:16.402] args[[name]] <- "" [18:03:16.402] } [18:03:16.402] NAMES <- toupper(removed) [18:03:16.402] for (kk in seq_along(NAMES)) { [18:03:16.402] name <- removed[[kk]] [18:03:16.402] NAME <- NAMES[[kk]] [18:03:16.402] if (name != NAME && is.element(NAME, old_names)) [18:03:16.402] next [18:03:16.402] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.402] } [18:03:16.402] if (length(args) > 0) [18:03:16.402] base::do.call(base::Sys.setenv, args = args) [18:03:16.402] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.402] } [18:03:16.402] else { [18:03:16.402] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.402] } [18:03:16.402] { [18:03:16.402] if (base::length(...future.futureOptionsAdded) > [18:03:16.402] 0L) { [18:03:16.402] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.402] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.402] base::options(opts) [18:03:16.402] } [18:03:16.402] { [18:03:16.402] { [18:03:16.402] base::assign(".Random.seed", c(10407L, -1977649478L, [18:03:16.402] 1197805051L, 1439847754L, -405710151L, -386021683L, [18:03:16.402] 1294114928L), envir = base::globalenv(), [18:03:16.402] inherits = FALSE) [18:03:16.402] NULL [18:03:16.402] } [18:03:16.402] options(future.plan = NULL) [18:03:16.402] if (is.na(NA_character_)) [18:03:16.402] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.402] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.402] future::plan(list(function (..., envir = parent.frame()) [18:03:16.402] { [18:03:16.402] future <- SequentialFuture(..., envir = envir) [18:03:16.402] if (!future$lazy) [18:03:16.402] future <- run(future) [18:03:16.402] invisible(future) [18:03:16.402] }), .cleanup = FALSE, .init = FALSE) [18:03:16.402] } [18:03:16.402] } [18:03:16.402] } [18:03:16.402] }) [18:03:16.402] if (TRUE) { [18:03:16.402] base::sink(type = "output", split = FALSE) [18:03:16.402] if (TRUE) { [18:03:16.402] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.402] } [18:03:16.402] else { [18:03:16.402] ...future.result["stdout"] <- base::list(NULL) [18:03:16.402] } [18:03:16.402] base::close(...future.stdout) [18:03:16.402] ...future.stdout <- NULL [18:03:16.402] } [18:03:16.402] ...future.result$conditions <- ...future.conditions [18:03:16.402] ...future.result$finished <- base::Sys.time() [18:03:16.402] ...future.result [18:03:16.402] } [18:03:16.405] assign_globals() ... [18:03:16.406] List of 1 [18:03:16.406] $ x: int [1:4] 0 1 2 3 [18:03:16.406] - attr(*, "where")=List of 1 [18:03:16.406] ..$ x: [18:03:16.406] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.406] - attr(*, "resolved")= logi FALSE [18:03:16.406] - attr(*, "total_size")= num 64 [18:03:16.406] - attr(*, "already-done")= logi TRUE [18:03:16.409] - copied 'x' to environment [18:03:16.409] assign_globals() ... done [18:03:16.409] plan(): Setting new future strategy stack: [18:03:16.410] List of future strategies: [18:03:16.410] 1. sequential: [18:03:16.410] - args: function (..., envir = parent.frame()) [18:03:16.410] - tweaked: FALSE [18:03:16.410] - call: NULL [18:03:16.410] plan(): nbrOfWorkers() = 1 [18:03:16.411] plan(): Setting new future strategy stack: [18:03:16.411] List of future strategies: [18:03:16.411] 1. sequential: [18:03:16.411] - args: function (..., envir = parent.frame()) [18:03:16.411] - tweaked: FALSE [18:03:16.411] - call: plan(strategy) [18:03:16.412] plan(): nbrOfWorkers() = 1 [18:03:16.412] SequentialFuture started (and completed) [18:03:16.412] - Launch lazy future ... done [18:03:16.413] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_1-460976' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e38f48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.414] getGlobalsAndPackages() ... [18:03:16.414] Searching for globals... [18:03:16.415] - globals found: [3] '{', 'sample', 'x' [18:03:16.415] Searching for globals ... DONE [18:03:16.415] Resolving globals: FALSE [18:03:16.416] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.416] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.416] - globals: [1] 'x' [18:03:16.417] [18:03:16.417] getGlobalsAndPackages() ... DONE [18:03:16.417] run() for 'Future' ... [18:03:16.417] - state: 'created' [18:03:16.417] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.418] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.418] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.418] - Field: 'label' [18:03:16.418] - Field: 'local' [18:03:16.419] - Field: 'owner' [18:03:16.419] - Field: 'envir' [18:03:16.419] - Field: 'packages' [18:03:16.419] - Field: 'gc' [18:03:16.419] - Field: 'conditions' [18:03:16.419] - Field: 'expr' [18:03:16.420] - Field: 'uuid' [18:03:16.420] - Field: 'seed' [18:03:16.420] - Field: 'version' [18:03:16.420] - Field: 'result' [18:03:16.420] - Field: 'asynchronous' [18:03:16.421] - Field: 'calls' [18:03:16.421] - Field: 'globals' [18:03:16.421] - Field: 'stdout' [18:03:16.421] - Field: 'earlySignal' [18:03:16.421] - Field: 'lazy' [18:03:16.421] - Field: 'state' [18:03:16.422] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.422] - Launch lazy future ... [18:03:16.422] Packages needed by the future expression (n = 0): [18:03:16.422] Packages needed by future strategies (n = 0): [18:03:16.424] { [18:03:16.424] { [18:03:16.424] { [18:03:16.424] ...future.startTime <- base::Sys.time() [18:03:16.424] { [18:03:16.424] { [18:03:16.424] { [18:03:16.424] base::local({ [18:03:16.424] has_future <- base::requireNamespace("future", [18:03:16.424] quietly = TRUE) [18:03:16.424] if (has_future) { [18:03:16.424] ns <- base::getNamespace("future") [18:03:16.424] version <- ns[[".package"]][["version"]] [18:03:16.424] if (is.null(version)) [18:03:16.424] version <- utils::packageVersion("future") [18:03:16.424] } [18:03:16.424] else { [18:03:16.424] version <- NULL [18:03:16.424] } [18:03:16.424] if (!has_future || version < "1.8.0") { [18:03:16.424] info <- base::c(r_version = base::gsub("R version ", [18:03:16.424] "", base::R.version$version.string), [18:03:16.424] platform = base::sprintf("%s (%s-bit)", [18:03:16.424] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.424] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.424] "release", "version")], collapse = " "), [18:03:16.424] hostname = base::Sys.info()[["nodename"]]) [18:03:16.424] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.424] info) [18:03:16.424] info <- base::paste(info, collapse = "; ") [18:03:16.424] if (!has_future) { [18:03:16.424] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.424] info) [18:03:16.424] } [18:03:16.424] else { [18:03:16.424] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.424] info, version) [18:03:16.424] } [18:03:16.424] base::stop(msg) [18:03:16.424] } [18:03:16.424] }) [18:03:16.424] } [18:03:16.424] options(future.plan = NULL) [18:03:16.424] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.424] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.424] } [18:03:16.424] ...future.workdir <- getwd() [18:03:16.424] } [18:03:16.424] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.424] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.424] } [18:03:16.424] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.424] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.424] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.424] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.424] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.424] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.424] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.424] base::names(...future.oldOptions)) [18:03:16.424] } [18:03:16.424] if (FALSE) { [18:03:16.424] } [18:03:16.424] else { [18:03:16.424] if (TRUE) { [18:03:16.424] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.424] open = "w") [18:03:16.424] } [18:03:16.424] else { [18:03:16.424] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.424] windows = "NUL", "/dev/null"), open = "w") [18:03:16.424] } [18:03:16.424] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.424] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.424] base::sink(type = "output", split = FALSE) [18:03:16.424] base::close(...future.stdout) [18:03:16.424] }, add = TRUE) [18:03:16.424] } [18:03:16.424] ...future.frame <- base::sys.nframe() [18:03:16.424] ...future.conditions <- base::list() [18:03:16.424] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.424] if (FALSE) { [18:03:16.424] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.424] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.424] } [18:03:16.424] ...future.result <- base::tryCatch({ [18:03:16.424] base::withCallingHandlers({ [18:03:16.424] ...future.value <- base::withVisible(base::local({ [18:03:16.424] sample(x, size = 1L) [18:03:16.424] })) [18:03:16.424] future::FutureResult(value = ...future.value$value, [18:03:16.424] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.424] ...future.rng), globalenv = if (FALSE) [18:03:16.424] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.424] ...future.globalenv.names)) [18:03:16.424] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.424] }, condition = base::local({ [18:03:16.424] c <- base::c [18:03:16.424] inherits <- base::inherits [18:03:16.424] invokeRestart <- base::invokeRestart [18:03:16.424] length <- base::length [18:03:16.424] list <- base::list [18:03:16.424] seq.int <- base::seq.int [18:03:16.424] signalCondition <- base::signalCondition [18:03:16.424] sys.calls <- base::sys.calls [18:03:16.424] `[[` <- base::`[[` [18:03:16.424] `+` <- base::`+` [18:03:16.424] `<<-` <- base::`<<-` [18:03:16.424] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.424] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.424] 3L)] [18:03:16.424] } [18:03:16.424] function(cond) { [18:03:16.424] is_error <- inherits(cond, "error") [18:03:16.424] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.424] NULL) [18:03:16.424] if (is_error) { [18:03:16.424] sessionInformation <- function() { [18:03:16.424] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.424] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.424] search = base::search(), system = base::Sys.info()) [18:03:16.424] } [18:03:16.424] ...future.conditions[[length(...future.conditions) + [18:03:16.424] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.424] cond$call), session = sessionInformation(), [18:03:16.424] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.424] signalCondition(cond) [18:03:16.424] } [18:03:16.424] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.424] "immediateCondition"))) { [18:03:16.424] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.424] ...future.conditions[[length(...future.conditions) + [18:03:16.424] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.424] if (TRUE && !signal) { [18:03:16.424] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.424] { [18:03:16.424] inherits <- base::inherits [18:03:16.424] invokeRestart <- base::invokeRestart [18:03:16.424] is.null <- base::is.null [18:03:16.424] muffled <- FALSE [18:03:16.424] if (inherits(cond, "message")) { [18:03:16.424] muffled <- grepl(pattern, "muffleMessage") [18:03:16.424] if (muffled) [18:03:16.424] invokeRestart("muffleMessage") [18:03:16.424] } [18:03:16.424] else if (inherits(cond, "warning")) { [18:03:16.424] muffled <- grepl(pattern, "muffleWarning") [18:03:16.424] if (muffled) [18:03:16.424] invokeRestart("muffleWarning") [18:03:16.424] } [18:03:16.424] else if (inherits(cond, "condition")) { [18:03:16.424] if (!is.null(pattern)) { [18:03:16.424] computeRestarts <- base::computeRestarts [18:03:16.424] grepl <- base::grepl [18:03:16.424] restarts <- computeRestarts(cond) [18:03:16.424] for (restart in restarts) { [18:03:16.424] name <- restart$name [18:03:16.424] if (is.null(name)) [18:03:16.424] next [18:03:16.424] if (!grepl(pattern, name)) [18:03:16.424] next [18:03:16.424] invokeRestart(restart) [18:03:16.424] muffled <- TRUE [18:03:16.424] break [18:03:16.424] } [18:03:16.424] } [18:03:16.424] } [18:03:16.424] invisible(muffled) [18:03:16.424] } [18:03:16.424] muffleCondition(cond, pattern = "^muffle") [18:03:16.424] } [18:03:16.424] } [18:03:16.424] else { [18:03:16.424] if (TRUE) { [18:03:16.424] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.424] { [18:03:16.424] inherits <- base::inherits [18:03:16.424] invokeRestart <- base::invokeRestart [18:03:16.424] is.null <- base::is.null [18:03:16.424] muffled <- FALSE [18:03:16.424] if (inherits(cond, "message")) { [18:03:16.424] muffled <- grepl(pattern, "muffleMessage") [18:03:16.424] if (muffled) [18:03:16.424] invokeRestart("muffleMessage") [18:03:16.424] } [18:03:16.424] else if (inherits(cond, "warning")) { [18:03:16.424] muffled <- grepl(pattern, "muffleWarning") [18:03:16.424] if (muffled) [18:03:16.424] invokeRestart("muffleWarning") [18:03:16.424] } [18:03:16.424] else if (inherits(cond, "condition")) { [18:03:16.424] if (!is.null(pattern)) { [18:03:16.424] computeRestarts <- base::computeRestarts [18:03:16.424] grepl <- base::grepl [18:03:16.424] restarts <- computeRestarts(cond) [18:03:16.424] for (restart in restarts) { [18:03:16.424] name <- restart$name [18:03:16.424] if (is.null(name)) [18:03:16.424] next [18:03:16.424] if (!grepl(pattern, name)) [18:03:16.424] next [18:03:16.424] invokeRestart(restart) [18:03:16.424] muffled <- TRUE [18:03:16.424] break [18:03:16.424] } [18:03:16.424] } [18:03:16.424] } [18:03:16.424] invisible(muffled) [18:03:16.424] } [18:03:16.424] muffleCondition(cond, pattern = "^muffle") [18:03:16.424] } [18:03:16.424] } [18:03:16.424] } [18:03:16.424] })) [18:03:16.424] }, error = function(ex) { [18:03:16.424] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.424] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.424] ...future.rng), started = ...future.startTime, [18:03:16.424] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.424] version = "1.8"), class = "FutureResult") [18:03:16.424] }, finally = { [18:03:16.424] if (!identical(...future.workdir, getwd())) [18:03:16.424] setwd(...future.workdir) [18:03:16.424] { [18:03:16.424] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.424] ...future.oldOptions$nwarnings <- NULL [18:03:16.424] } [18:03:16.424] base::options(...future.oldOptions) [18:03:16.424] if (.Platform$OS.type == "windows") { [18:03:16.424] old_names <- names(...future.oldEnvVars) [18:03:16.424] envs <- base::Sys.getenv() [18:03:16.424] names <- names(envs) [18:03:16.424] common <- intersect(names, old_names) [18:03:16.424] added <- setdiff(names, old_names) [18:03:16.424] removed <- setdiff(old_names, names) [18:03:16.424] changed <- common[...future.oldEnvVars[common] != [18:03:16.424] envs[common]] [18:03:16.424] NAMES <- toupper(changed) [18:03:16.424] args <- list() [18:03:16.424] for (kk in seq_along(NAMES)) { [18:03:16.424] name <- changed[[kk]] [18:03:16.424] NAME <- NAMES[[kk]] [18:03:16.424] if (name != NAME && is.element(NAME, old_names)) [18:03:16.424] next [18:03:16.424] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.424] } [18:03:16.424] NAMES <- toupper(added) [18:03:16.424] for (kk in seq_along(NAMES)) { [18:03:16.424] name <- added[[kk]] [18:03:16.424] NAME <- NAMES[[kk]] [18:03:16.424] if (name != NAME && is.element(NAME, old_names)) [18:03:16.424] next [18:03:16.424] args[[name]] <- "" [18:03:16.424] } [18:03:16.424] NAMES <- toupper(removed) [18:03:16.424] for (kk in seq_along(NAMES)) { [18:03:16.424] name <- removed[[kk]] [18:03:16.424] NAME <- NAMES[[kk]] [18:03:16.424] if (name != NAME && is.element(NAME, old_names)) [18:03:16.424] next [18:03:16.424] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.424] } [18:03:16.424] if (length(args) > 0) [18:03:16.424] base::do.call(base::Sys.setenv, args = args) [18:03:16.424] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.424] } [18:03:16.424] else { [18:03:16.424] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.424] } [18:03:16.424] { [18:03:16.424] if (base::length(...future.futureOptionsAdded) > [18:03:16.424] 0L) { [18:03:16.424] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.424] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.424] base::options(opts) [18:03:16.424] } [18:03:16.424] { [18:03:16.424] { [18:03:16.424] base::assign(".Random.seed", c(10407L, 1439847754L, [18:03:16.424] 540059684L, -1452673036L, 1294114928L, 223164867L, [18:03:16.424] 1643713775L), envir = base::globalenv(), [18:03:16.424] inherits = FALSE) [18:03:16.424] NULL [18:03:16.424] } [18:03:16.424] options(future.plan = NULL) [18:03:16.424] if (is.na(NA_character_)) [18:03:16.424] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.424] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.424] future::plan(list(function (..., envir = parent.frame()) [18:03:16.424] { [18:03:16.424] future <- SequentialFuture(..., envir = envir) [18:03:16.424] if (!future$lazy) [18:03:16.424] future <- run(future) [18:03:16.424] invisible(future) [18:03:16.424] }), .cleanup = FALSE, .init = FALSE) [18:03:16.424] } [18:03:16.424] } [18:03:16.424] } [18:03:16.424] }) [18:03:16.424] if (TRUE) { [18:03:16.424] base::sink(type = "output", split = FALSE) [18:03:16.424] if (TRUE) { [18:03:16.424] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.424] } [18:03:16.424] else { [18:03:16.424] ...future.result["stdout"] <- base::list(NULL) [18:03:16.424] } [18:03:16.424] base::close(...future.stdout) [18:03:16.424] ...future.stdout <- NULL [18:03:16.424] } [18:03:16.424] ...future.result$conditions <- ...future.conditions [18:03:16.424] ...future.result$finished <- base::Sys.time() [18:03:16.424] ...future.result [18:03:16.424] } [18:03:16.427] assign_globals() ... [18:03:16.428] List of 1 [18:03:16.428] $ x: int [1:4] 0 1 2 3 [18:03:16.428] - attr(*, "where")=List of 1 [18:03:16.428] ..$ x: [18:03:16.428] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.428] - attr(*, "resolved")= logi FALSE [18:03:16.428] - attr(*, "total_size")= num 64 [18:03:16.428] - attr(*, "already-done")= logi TRUE [18:03:16.431] - copied 'x' to environment [18:03:16.431] assign_globals() ... done [18:03:16.431] plan(): Setting new future strategy stack: [18:03:16.431] List of future strategies: [18:03:16.431] 1. sequential: [18:03:16.431] - args: function (..., envir = parent.frame()) [18:03:16.431] - tweaked: FALSE [18:03:16.431] - call: NULL [18:03:16.432] plan(): nbrOfWorkers() = 1 [18:03:16.433] plan(): Setting new future strategy stack: [18:03:16.433] List of future strategies: [18:03:16.433] 1. sequential: [18:03:16.433] - args: function (..., envir = parent.frame()) [18:03:16.433] - tweaked: FALSE [18:03:16.433] - call: plan(strategy) [18:03:16.434] plan(): nbrOfWorkers() = 1 [18:03:16.434] SequentialFuture started (and completed) [18:03:16.434] - Launch lazy future ... done [18:03:16.434] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_2-214897' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e38f48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.435] getGlobalsAndPackages() ... [18:03:16.435] Searching for globals... [18:03:16.436] - globals found: [3] '{', 'sample', 'x' [18:03:16.437] Searching for globals ... DONE [18:03:16.437] Resolving globals: FALSE [18:03:16.437] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.438] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.438] - globals: [1] 'x' [18:03:16.438] [18:03:16.438] getGlobalsAndPackages() ... DONE [18:03:16.439] run() for 'Future' ... [18:03:16.439] - state: 'created' [18:03:16.439] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.439] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.440] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.440] - Field: 'label' [18:03:16.440] - Field: 'local' [18:03:16.440] - Field: 'owner' [18:03:16.440] - Field: 'envir' [18:03:16.440] - Field: 'packages' [18:03:16.441] - Field: 'gc' [18:03:16.441] - Field: 'conditions' [18:03:16.441] - Field: 'expr' [18:03:16.441] - Field: 'uuid' [18:03:16.441] - Field: 'seed' [18:03:16.442] - Field: 'version' [18:03:16.442] - Field: 'result' [18:03:16.442] - Field: 'asynchronous' [18:03:16.442] - Field: 'calls' [18:03:16.442] - Field: 'globals' [18:03:16.442] - Field: 'stdout' [18:03:16.443] - Field: 'earlySignal' [18:03:16.443] - Field: 'lazy' [18:03:16.443] - Field: 'state' [18:03:16.443] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.443] - Launch lazy future ... [18:03:16.443] Packages needed by the future expression (n = 0): [18:03:16.444] Packages needed by future strategies (n = 0): [18:03:16.444] { [18:03:16.444] { [18:03:16.444] { [18:03:16.444] ...future.startTime <- base::Sys.time() [18:03:16.444] { [18:03:16.444] { [18:03:16.444] { [18:03:16.444] base::local({ [18:03:16.444] has_future <- base::requireNamespace("future", [18:03:16.444] quietly = TRUE) [18:03:16.444] if (has_future) { [18:03:16.444] ns <- base::getNamespace("future") [18:03:16.444] version <- ns[[".package"]][["version"]] [18:03:16.444] if (is.null(version)) [18:03:16.444] version <- utils::packageVersion("future") [18:03:16.444] } [18:03:16.444] else { [18:03:16.444] version <- NULL [18:03:16.444] } [18:03:16.444] if (!has_future || version < "1.8.0") { [18:03:16.444] info <- base::c(r_version = base::gsub("R version ", [18:03:16.444] "", base::R.version$version.string), [18:03:16.444] platform = base::sprintf("%s (%s-bit)", [18:03:16.444] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.444] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.444] "release", "version")], collapse = " "), [18:03:16.444] hostname = base::Sys.info()[["nodename"]]) [18:03:16.444] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.444] info) [18:03:16.444] info <- base::paste(info, collapse = "; ") [18:03:16.444] if (!has_future) { [18:03:16.444] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.444] info) [18:03:16.444] } [18:03:16.444] else { [18:03:16.444] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.444] info, version) [18:03:16.444] } [18:03:16.444] base::stop(msg) [18:03:16.444] } [18:03:16.444] }) [18:03:16.444] } [18:03:16.444] options(future.plan = NULL) [18:03:16.444] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.444] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.444] } [18:03:16.444] ...future.workdir <- getwd() [18:03:16.444] } [18:03:16.444] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.444] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.444] } [18:03:16.444] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.444] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.444] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.444] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.444] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.444] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.444] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.444] base::names(...future.oldOptions)) [18:03:16.444] } [18:03:16.444] if (FALSE) { [18:03:16.444] } [18:03:16.444] else { [18:03:16.444] if (TRUE) { [18:03:16.444] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.444] open = "w") [18:03:16.444] } [18:03:16.444] else { [18:03:16.444] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.444] windows = "NUL", "/dev/null"), open = "w") [18:03:16.444] } [18:03:16.444] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.444] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.444] base::sink(type = "output", split = FALSE) [18:03:16.444] base::close(...future.stdout) [18:03:16.444] }, add = TRUE) [18:03:16.444] } [18:03:16.444] ...future.frame <- base::sys.nframe() [18:03:16.444] ...future.conditions <- base::list() [18:03:16.444] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.444] if (FALSE) { [18:03:16.444] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.444] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.444] } [18:03:16.444] ...future.result <- base::tryCatch({ [18:03:16.444] base::withCallingHandlers({ [18:03:16.444] ...future.value <- base::withVisible(base::local({ [18:03:16.444] sample(x, size = 1L) [18:03:16.444] })) [18:03:16.444] future::FutureResult(value = ...future.value$value, [18:03:16.444] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.444] ...future.rng), globalenv = if (FALSE) [18:03:16.444] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.444] ...future.globalenv.names)) [18:03:16.444] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.444] }, condition = base::local({ [18:03:16.444] c <- base::c [18:03:16.444] inherits <- base::inherits [18:03:16.444] invokeRestart <- base::invokeRestart [18:03:16.444] length <- base::length [18:03:16.444] list <- base::list [18:03:16.444] seq.int <- base::seq.int [18:03:16.444] signalCondition <- base::signalCondition [18:03:16.444] sys.calls <- base::sys.calls [18:03:16.444] `[[` <- base::`[[` [18:03:16.444] `+` <- base::`+` [18:03:16.444] `<<-` <- base::`<<-` [18:03:16.444] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.444] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.444] 3L)] [18:03:16.444] } [18:03:16.444] function(cond) { [18:03:16.444] is_error <- inherits(cond, "error") [18:03:16.444] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.444] NULL) [18:03:16.444] if (is_error) { [18:03:16.444] sessionInformation <- function() { [18:03:16.444] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.444] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.444] search = base::search(), system = base::Sys.info()) [18:03:16.444] } [18:03:16.444] ...future.conditions[[length(...future.conditions) + [18:03:16.444] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.444] cond$call), session = sessionInformation(), [18:03:16.444] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.444] signalCondition(cond) [18:03:16.444] } [18:03:16.444] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.444] "immediateCondition"))) { [18:03:16.444] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.444] ...future.conditions[[length(...future.conditions) + [18:03:16.444] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.444] if (TRUE && !signal) { [18:03:16.444] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.444] { [18:03:16.444] inherits <- base::inherits [18:03:16.444] invokeRestart <- base::invokeRestart [18:03:16.444] is.null <- base::is.null [18:03:16.444] muffled <- FALSE [18:03:16.444] if (inherits(cond, "message")) { [18:03:16.444] muffled <- grepl(pattern, "muffleMessage") [18:03:16.444] if (muffled) [18:03:16.444] invokeRestart("muffleMessage") [18:03:16.444] } [18:03:16.444] else if (inherits(cond, "warning")) { [18:03:16.444] muffled <- grepl(pattern, "muffleWarning") [18:03:16.444] if (muffled) [18:03:16.444] invokeRestart("muffleWarning") [18:03:16.444] } [18:03:16.444] else if (inherits(cond, "condition")) { [18:03:16.444] if (!is.null(pattern)) { [18:03:16.444] computeRestarts <- base::computeRestarts [18:03:16.444] grepl <- base::grepl [18:03:16.444] restarts <- computeRestarts(cond) [18:03:16.444] for (restart in restarts) { [18:03:16.444] name <- restart$name [18:03:16.444] if (is.null(name)) [18:03:16.444] next [18:03:16.444] if (!grepl(pattern, name)) [18:03:16.444] next [18:03:16.444] invokeRestart(restart) [18:03:16.444] muffled <- TRUE [18:03:16.444] break [18:03:16.444] } [18:03:16.444] } [18:03:16.444] } [18:03:16.444] invisible(muffled) [18:03:16.444] } [18:03:16.444] muffleCondition(cond, pattern = "^muffle") [18:03:16.444] } [18:03:16.444] } [18:03:16.444] else { [18:03:16.444] if (TRUE) { [18:03:16.444] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.444] { [18:03:16.444] inherits <- base::inherits [18:03:16.444] invokeRestart <- base::invokeRestart [18:03:16.444] is.null <- base::is.null [18:03:16.444] muffled <- FALSE [18:03:16.444] if (inherits(cond, "message")) { [18:03:16.444] muffled <- grepl(pattern, "muffleMessage") [18:03:16.444] if (muffled) [18:03:16.444] invokeRestart("muffleMessage") [18:03:16.444] } [18:03:16.444] else if (inherits(cond, "warning")) { [18:03:16.444] muffled <- grepl(pattern, "muffleWarning") [18:03:16.444] if (muffled) [18:03:16.444] invokeRestart("muffleWarning") [18:03:16.444] } [18:03:16.444] else if (inherits(cond, "condition")) { [18:03:16.444] if (!is.null(pattern)) { [18:03:16.444] computeRestarts <- base::computeRestarts [18:03:16.444] grepl <- base::grepl [18:03:16.444] restarts <- computeRestarts(cond) [18:03:16.444] for (restart in restarts) { [18:03:16.444] name <- restart$name [18:03:16.444] if (is.null(name)) [18:03:16.444] next [18:03:16.444] if (!grepl(pattern, name)) [18:03:16.444] next [18:03:16.444] invokeRestart(restart) [18:03:16.444] muffled <- TRUE [18:03:16.444] break [18:03:16.444] } [18:03:16.444] } [18:03:16.444] } [18:03:16.444] invisible(muffled) [18:03:16.444] } [18:03:16.444] muffleCondition(cond, pattern = "^muffle") [18:03:16.444] } [18:03:16.444] } [18:03:16.444] } [18:03:16.444] })) [18:03:16.444] }, error = function(ex) { [18:03:16.444] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.444] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.444] ...future.rng), started = ...future.startTime, [18:03:16.444] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.444] version = "1.8"), class = "FutureResult") [18:03:16.444] }, finally = { [18:03:16.444] if (!identical(...future.workdir, getwd())) [18:03:16.444] setwd(...future.workdir) [18:03:16.444] { [18:03:16.444] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.444] ...future.oldOptions$nwarnings <- NULL [18:03:16.444] } [18:03:16.444] base::options(...future.oldOptions) [18:03:16.444] if (.Platform$OS.type == "windows") { [18:03:16.444] old_names <- names(...future.oldEnvVars) [18:03:16.444] envs <- base::Sys.getenv() [18:03:16.444] names <- names(envs) [18:03:16.444] common <- intersect(names, old_names) [18:03:16.444] added <- setdiff(names, old_names) [18:03:16.444] removed <- setdiff(old_names, names) [18:03:16.444] changed <- common[...future.oldEnvVars[common] != [18:03:16.444] envs[common]] [18:03:16.444] NAMES <- toupper(changed) [18:03:16.444] args <- list() [18:03:16.444] for (kk in seq_along(NAMES)) { [18:03:16.444] name <- changed[[kk]] [18:03:16.444] NAME <- NAMES[[kk]] [18:03:16.444] if (name != NAME && is.element(NAME, old_names)) [18:03:16.444] next [18:03:16.444] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.444] } [18:03:16.444] NAMES <- toupper(added) [18:03:16.444] for (kk in seq_along(NAMES)) { [18:03:16.444] name <- added[[kk]] [18:03:16.444] NAME <- NAMES[[kk]] [18:03:16.444] if (name != NAME && is.element(NAME, old_names)) [18:03:16.444] next [18:03:16.444] args[[name]] <- "" [18:03:16.444] } [18:03:16.444] NAMES <- toupper(removed) [18:03:16.444] for (kk in seq_along(NAMES)) { [18:03:16.444] name <- removed[[kk]] [18:03:16.444] NAME <- NAMES[[kk]] [18:03:16.444] if (name != NAME && is.element(NAME, old_names)) [18:03:16.444] next [18:03:16.444] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.444] } [18:03:16.444] if (length(args) > 0) [18:03:16.444] base::do.call(base::Sys.setenv, args = args) [18:03:16.444] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.444] } [18:03:16.444] else { [18:03:16.444] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.444] } [18:03:16.444] { [18:03:16.444] if (base::length(...future.futureOptionsAdded) > [18:03:16.444] 0L) { [18:03:16.444] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.444] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.444] base::options(opts) [18:03:16.444] } [18:03:16.444] { [18:03:16.444] { [18:03:16.444] base::assign(".Random.seed", c(10407L, -1452673036L, [18:03:16.444] -1850212388L, -1068983444L, 1643713775L, [18:03:16.444] 41786744L, -1605661862L), envir = base::globalenv(), [18:03:16.444] inherits = FALSE) [18:03:16.444] NULL [18:03:16.444] } [18:03:16.444] options(future.plan = NULL) [18:03:16.444] if (is.na(NA_character_)) [18:03:16.444] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.444] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.444] future::plan(list(function (..., envir = parent.frame()) [18:03:16.444] { [18:03:16.444] future <- SequentialFuture(..., envir = envir) [18:03:16.444] if (!future$lazy) [18:03:16.444] future <- run(future) [18:03:16.444] invisible(future) [18:03:16.444] }), .cleanup = FALSE, .init = FALSE) [18:03:16.444] } [18:03:16.444] } [18:03:16.444] } [18:03:16.444] }) [18:03:16.444] if (TRUE) { [18:03:16.444] base::sink(type = "output", split = FALSE) [18:03:16.444] if (TRUE) { [18:03:16.444] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.444] } [18:03:16.444] else { [18:03:16.444] ...future.result["stdout"] <- base::list(NULL) [18:03:16.444] } [18:03:16.444] base::close(...future.stdout) [18:03:16.444] ...future.stdout <- NULL [18:03:16.444] } [18:03:16.444] ...future.result$conditions <- ...future.conditions [18:03:16.444] ...future.result$finished <- base::Sys.time() [18:03:16.444] ...future.result [18:03:16.444] } [18:03:16.448] assign_globals() ... [18:03:16.448] List of 1 [18:03:16.448] $ x: int [1:4] 0 1 2 3 [18:03:16.448] - attr(*, "where")=List of 1 [18:03:16.448] ..$ x: [18:03:16.448] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.448] - attr(*, "resolved")= logi FALSE [18:03:16.448] - attr(*, "total_size")= num 64 [18:03:16.448] - attr(*, "already-done")= logi TRUE [18:03:16.451] - copied 'x' to environment [18:03:16.451] assign_globals() ... done [18:03:16.452] plan(): Setting new future strategy stack: [18:03:16.452] List of future strategies: [18:03:16.452] 1. sequential: [18:03:16.452] - args: function (..., envir = parent.frame()) [18:03:16.452] - tweaked: FALSE [18:03:16.452] - call: NULL [18:03:16.452] plan(): nbrOfWorkers() = 1 [18:03:16.453] plan(): Setting new future strategy stack: [18:03:16.454] List of future strategies: [18:03:16.454] 1. sequential: [18:03:16.454] - args: function (..., envir = parent.frame()) [18:03:16.454] - tweaked: FALSE [18:03:16.454] - call: plan(strategy) [18:03:16.454] plan(): nbrOfWorkers() = 1 [18:03:16.454] SequentialFuture started (and completed) [18:03:16.455] - Launch lazy future ... done [18:03:16.455] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_3-663550' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e38f48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.456] getGlobalsAndPackages() ... [18:03:16.456] Searching for globals... [18:03:16.457] - globals found: [3] '{', 'sample', 'x' [18:03:16.458] Searching for globals ... DONE [18:03:16.458] Resolving globals: FALSE [18:03:16.458] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.459] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.459] - globals: [1] 'x' [18:03:16.459] [18:03:16.459] getGlobalsAndPackages() ... DONE [18:03:16.459] run() for 'Future' ... [18:03:16.460] - state: 'created' [18:03:16.460] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.460] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.460] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.461] - Field: 'label' [18:03:16.461] - Field: 'local' [18:03:16.461] - Field: 'owner' [18:03:16.461] - Field: 'envir' [18:03:16.461] - Field: 'packages' [18:03:16.462] - Field: 'gc' [18:03:16.462] - Field: 'conditions' [18:03:16.462] - Field: 'expr' [18:03:16.462] - Field: 'uuid' [18:03:16.462] - Field: 'seed' [18:03:16.462] - Field: 'version' [18:03:16.463] - Field: 'result' [18:03:16.463] - Field: 'asynchronous' [18:03:16.463] - Field: 'calls' [18:03:16.463] - Field: 'globals' [18:03:16.463] - Field: 'stdout' [18:03:16.463] - Field: 'earlySignal' [18:03:16.464] - Field: 'lazy' [18:03:16.464] - Field: 'state' [18:03:16.465] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.465] - Launch lazy future ... [18:03:16.465] Packages needed by the future expression (n = 0): [18:03:16.465] Packages needed by future strategies (n = 0): [18:03:16.466] { [18:03:16.466] { [18:03:16.466] { [18:03:16.466] ...future.startTime <- base::Sys.time() [18:03:16.466] { [18:03:16.466] { [18:03:16.466] { [18:03:16.466] base::local({ [18:03:16.466] has_future <- base::requireNamespace("future", [18:03:16.466] quietly = TRUE) [18:03:16.466] if (has_future) { [18:03:16.466] ns <- base::getNamespace("future") [18:03:16.466] version <- ns[[".package"]][["version"]] [18:03:16.466] if (is.null(version)) [18:03:16.466] version <- utils::packageVersion("future") [18:03:16.466] } [18:03:16.466] else { [18:03:16.466] version <- NULL [18:03:16.466] } [18:03:16.466] if (!has_future || version < "1.8.0") { [18:03:16.466] info <- base::c(r_version = base::gsub("R version ", [18:03:16.466] "", base::R.version$version.string), [18:03:16.466] platform = base::sprintf("%s (%s-bit)", [18:03:16.466] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.466] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.466] "release", "version")], collapse = " "), [18:03:16.466] hostname = base::Sys.info()[["nodename"]]) [18:03:16.466] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.466] info) [18:03:16.466] info <- base::paste(info, collapse = "; ") [18:03:16.466] if (!has_future) { [18:03:16.466] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.466] info) [18:03:16.466] } [18:03:16.466] else { [18:03:16.466] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.466] info, version) [18:03:16.466] } [18:03:16.466] base::stop(msg) [18:03:16.466] } [18:03:16.466] }) [18:03:16.466] } [18:03:16.466] options(future.plan = NULL) [18:03:16.466] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.466] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.466] } [18:03:16.466] ...future.workdir <- getwd() [18:03:16.466] } [18:03:16.466] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.466] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.466] } [18:03:16.466] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.466] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.466] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.466] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.466] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.466] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.466] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.466] base::names(...future.oldOptions)) [18:03:16.466] } [18:03:16.466] if (FALSE) { [18:03:16.466] } [18:03:16.466] else { [18:03:16.466] if (TRUE) { [18:03:16.466] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.466] open = "w") [18:03:16.466] } [18:03:16.466] else { [18:03:16.466] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.466] windows = "NUL", "/dev/null"), open = "w") [18:03:16.466] } [18:03:16.466] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.466] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.466] base::sink(type = "output", split = FALSE) [18:03:16.466] base::close(...future.stdout) [18:03:16.466] }, add = TRUE) [18:03:16.466] } [18:03:16.466] ...future.frame <- base::sys.nframe() [18:03:16.466] ...future.conditions <- base::list() [18:03:16.466] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.466] if (FALSE) { [18:03:16.466] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.466] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.466] } [18:03:16.466] ...future.result <- base::tryCatch({ [18:03:16.466] base::withCallingHandlers({ [18:03:16.466] ...future.value <- base::withVisible(base::local({ [18:03:16.466] sample(x, size = 1L) [18:03:16.466] })) [18:03:16.466] future::FutureResult(value = ...future.value$value, [18:03:16.466] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.466] ...future.rng), globalenv = if (FALSE) [18:03:16.466] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.466] ...future.globalenv.names)) [18:03:16.466] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.466] }, condition = base::local({ [18:03:16.466] c <- base::c [18:03:16.466] inherits <- base::inherits [18:03:16.466] invokeRestart <- base::invokeRestart [18:03:16.466] length <- base::length [18:03:16.466] list <- base::list [18:03:16.466] seq.int <- base::seq.int [18:03:16.466] signalCondition <- base::signalCondition [18:03:16.466] sys.calls <- base::sys.calls [18:03:16.466] `[[` <- base::`[[` [18:03:16.466] `+` <- base::`+` [18:03:16.466] `<<-` <- base::`<<-` [18:03:16.466] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.466] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.466] 3L)] [18:03:16.466] } [18:03:16.466] function(cond) { [18:03:16.466] is_error <- inherits(cond, "error") [18:03:16.466] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.466] NULL) [18:03:16.466] if (is_error) { [18:03:16.466] sessionInformation <- function() { [18:03:16.466] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.466] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.466] search = base::search(), system = base::Sys.info()) [18:03:16.466] } [18:03:16.466] ...future.conditions[[length(...future.conditions) + [18:03:16.466] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.466] cond$call), session = sessionInformation(), [18:03:16.466] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.466] signalCondition(cond) [18:03:16.466] } [18:03:16.466] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.466] "immediateCondition"))) { [18:03:16.466] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.466] ...future.conditions[[length(...future.conditions) + [18:03:16.466] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.466] if (TRUE && !signal) { [18:03:16.466] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.466] { [18:03:16.466] inherits <- base::inherits [18:03:16.466] invokeRestart <- base::invokeRestart [18:03:16.466] is.null <- base::is.null [18:03:16.466] muffled <- FALSE [18:03:16.466] if (inherits(cond, "message")) { [18:03:16.466] muffled <- grepl(pattern, "muffleMessage") [18:03:16.466] if (muffled) [18:03:16.466] invokeRestart("muffleMessage") [18:03:16.466] } [18:03:16.466] else if (inherits(cond, "warning")) { [18:03:16.466] muffled <- grepl(pattern, "muffleWarning") [18:03:16.466] if (muffled) [18:03:16.466] invokeRestart("muffleWarning") [18:03:16.466] } [18:03:16.466] else if (inherits(cond, "condition")) { [18:03:16.466] if (!is.null(pattern)) { [18:03:16.466] computeRestarts <- base::computeRestarts [18:03:16.466] grepl <- base::grepl [18:03:16.466] restarts <- computeRestarts(cond) [18:03:16.466] for (restart in restarts) { [18:03:16.466] name <- restart$name [18:03:16.466] if (is.null(name)) [18:03:16.466] next [18:03:16.466] if (!grepl(pattern, name)) [18:03:16.466] next [18:03:16.466] invokeRestart(restart) [18:03:16.466] muffled <- TRUE [18:03:16.466] break [18:03:16.466] } [18:03:16.466] } [18:03:16.466] } [18:03:16.466] invisible(muffled) [18:03:16.466] } [18:03:16.466] muffleCondition(cond, pattern = "^muffle") [18:03:16.466] } [18:03:16.466] } [18:03:16.466] else { [18:03:16.466] if (TRUE) { [18:03:16.466] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.466] { [18:03:16.466] inherits <- base::inherits [18:03:16.466] invokeRestart <- base::invokeRestart [18:03:16.466] is.null <- base::is.null [18:03:16.466] muffled <- FALSE [18:03:16.466] if (inherits(cond, "message")) { [18:03:16.466] muffled <- grepl(pattern, "muffleMessage") [18:03:16.466] if (muffled) [18:03:16.466] invokeRestart("muffleMessage") [18:03:16.466] } [18:03:16.466] else if (inherits(cond, "warning")) { [18:03:16.466] muffled <- grepl(pattern, "muffleWarning") [18:03:16.466] if (muffled) [18:03:16.466] invokeRestart("muffleWarning") [18:03:16.466] } [18:03:16.466] else if (inherits(cond, "condition")) { [18:03:16.466] if (!is.null(pattern)) { [18:03:16.466] computeRestarts <- base::computeRestarts [18:03:16.466] grepl <- base::grepl [18:03:16.466] restarts <- computeRestarts(cond) [18:03:16.466] for (restart in restarts) { [18:03:16.466] name <- restart$name [18:03:16.466] if (is.null(name)) [18:03:16.466] next [18:03:16.466] if (!grepl(pattern, name)) [18:03:16.466] next [18:03:16.466] invokeRestart(restart) [18:03:16.466] muffled <- TRUE [18:03:16.466] break [18:03:16.466] } [18:03:16.466] } [18:03:16.466] } [18:03:16.466] invisible(muffled) [18:03:16.466] } [18:03:16.466] muffleCondition(cond, pattern = "^muffle") [18:03:16.466] } [18:03:16.466] } [18:03:16.466] } [18:03:16.466] })) [18:03:16.466] }, error = function(ex) { [18:03:16.466] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.466] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.466] ...future.rng), started = ...future.startTime, [18:03:16.466] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.466] version = "1.8"), class = "FutureResult") [18:03:16.466] }, finally = { [18:03:16.466] if (!identical(...future.workdir, getwd())) [18:03:16.466] setwd(...future.workdir) [18:03:16.466] { [18:03:16.466] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.466] ...future.oldOptions$nwarnings <- NULL [18:03:16.466] } [18:03:16.466] base::options(...future.oldOptions) [18:03:16.466] if (.Platform$OS.type == "windows") { [18:03:16.466] old_names <- names(...future.oldEnvVars) [18:03:16.466] envs <- base::Sys.getenv() [18:03:16.466] names <- names(envs) [18:03:16.466] common <- intersect(names, old_names) [18:03:16.466] added <- setdiff(names, old_names) [18:03:16.466] removed <- setdiff(old_names, names) [18:03:16.466] changed <- common[...future.oldEnvVars[common] != [18:03:16.466] envs[common]] [18:03:16.466] NAMES <- toupper(changed) [18:03:16.466] args <- list() [18:03:16.466] for (kk in seq_along(NAMES)) { [18:03:16.466] name <- changed[[kk]] [18:03:16.466] NAME <- NAMES[[kk]] [18:03:16.466] if (name != NAME && is.element(NAME, old_names)) [18:03:16.466] next [18:03:16.466] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.466] } [18:03:16.466] NAMES <- toupper(added) [18:03:16.466] for (kk in seq_along(NAMES)) { [18:03:16.466] name <- added[[kk]] [18:03:16.466] NAME <- NAMES[[kk]] [18:03:16.466] if (name != NAME && is.element(NAME, old_names)) [18:03:16.466] next [18:03:16.466] args[[name]] <- "" [18:03:16.466] } [18:03:16.466] NAMES <- toupper(removed) [18:03:16.466] for (kk in seq_along(NAMES)) { [18:03:16.466] name <- removed[[kk]] [18:03:16.466] NAME <- NAMES[[kk]] [18:03:16.466] if (name != NAME && is.element(NAME, old_names)) [18:03:16.466] next [18:03:16.466] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.466] } [18:03:16.466] if (length(args) > 0) [18:03:16.466] base::do.call(base::Sys.setenv, args = args) [18:03:16.466] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.466] } [18:03:16.466] else { [18:03:16.466] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.466] } [18:03:16.466] { [18:03:16.466] if (base::length(...future.futureOptionsAdded) > [18:03:16.466] 0L) { [18:03:16.466] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.466] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.466] base::options(opts) [18:03:16.466] } [18:03:16.466] { [18:03:16.466] { [18:03:16.466] base::assign(".Random.seed", c(10407L, -1068983444L, [18:03:16.466] 584945907L, 1877512842L, -1605661862L, -1132989853L, [18:03:16.466] -279719367L), envir = base::globalenv(), [18:03:16.466] inherits = FALSE) [18:03:16.466] NULL [18:03:16.466] } [18:03:16.466] options(future.plan = NULL) [18:03:16.466] if (is.na(NA_character_)) [18:03:16.466] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.466] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.466] future::plan(list(function (..., envir = parent.frame()) [18:03:16.466] { [18:03:16.466] future <- SequentialFuture(..., envir = envir) [18:03:16.466] if (!future$lazy) [18:03:16.466] future <- run(future) [18:03:16.466] invisible(future) [18:03:16.466] }), .cleanup = FALSE, .init = FALSE) [18:03:16.466] } [18:03:16.466] } [18:03:16.466] } [18:03:16.466] }) [18:03:16.466] if (TRUE) { [18:03:16.466] base::sink(type = "output", split = FALSE) [18:03:16.466] if (TRUE) { [18:03:16.466] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.466] } [18:03:16.466] else { [18:03:16.466] ...future.result["stdout"] <- base::list(NULL) [18:03:16.466] } [18:03:16.466] base::close(...future.stdout) [18:03:16.466] ...future.stdout <- NULL [18:03:16.466] } [18:03:16.466] ...future.result$conditions <- ...future.conditions [18:03:16.466] ...future.result$finished <- base::Sys.time() [18:03:16.466] ...future.result [18:03:16.466] } [18:03:16.470] assign_globals() ... [18:03:16.470] List of 1 [18:03:16.470] $ x: int [1:4] 0 1 2 3 [18:03:16.470] - attr(*, "where")=List of 1 [18:03:16.470] ..$ x: [18:03:16.470] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.470] - attr(*, "resolved")= logi FALSE [18:03:16.470] - attr(*, "total_size")= num 64 [18:03:16.470] - attr(*, "already-done")= logi TRUE [18:03:16.473] - copied 'x' to environment [18:03:16.473] assign_globals() ... done [18:03:16.473] plan(): Setting new future strategy stack: [18:03:16.474] List of future strategies: [18:03:16.474] 1. sequential: [18:03:16.474] - args: function (..., envir = parent.frame()) [18:03:16.474] - tweaked: FALSE [18:03:16.474] - call: NULL [18:03:16.474] plan(): nbrOfWorkers() = 1 [18:03:16.475] plan(): Setting new future strategy stack: [18:03:16.475] List of future strategies: [18:03:16.475] 1. sequential: [18:03:16.475] - args: function (..., envir = parent.frame()) [18:03:16.475] - tweaked: FALSE [18:03:16.475] - call: plan(strategy) [18:03:16.476] plan(): nbrOfWorkers() = 1 [18:03:16.476] SequentialFuture started (and completed) [18:03:16.476] - Launch lazy future ... done [18:03:16.477] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_4-360597' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e38f48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.478] resolve() on list ... [18:03:16.478] recursive: 0 [18:03:16.478] length: 4 [18:03:16.478] [18:03:16.478] resolved() for 'SequentialFuture' ... [18:03:16.478] - state: 'finished' [18:03:16.479] - run: TRUE [18:03:16.479] - result: 'FutureResult' [18:03:16.479] resolved() for 'SequentialFuture' ... done [18:03:16.479] Future #1 [18:03:16.480] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:16.480] - nx: 4 [18:03:16.480] - relay: TRUE [18:03:16.480] - stdout: TRUE [18:03:16.480] - signal: TRUE [18:03:16.480] - resignal: FALSE [18:03:16.480] - force: TRUE [18:03:16.481] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.481] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.481] - until=1 [18:03:16.481] - relaying element #1 [18:03:16.481] signalConditions() ... [18:03:16.481] - include = 'immediateCondition' [18:03:16.482] - exclude = [18:03:16.482] - resignal = FALSE [18:03:16.482] - Number of conditions: 1 [18:03:16.482] signalConditions() ... done [18:03:16.482] signalConditions() ... [18:03:16.483] - include = 'immediateCondition' [18:03:16.483] - exclude = [18:03:16.483] - resignal = FALSE [18:03:16.483] - Number of conditions: 1 [18:03:16.483] signalConditions() ... done [18:03:16.483] signalConditions() ... [18:03:16.483] - include = 'condition' [18:03:16.484] - exclude = 'immediateCondition' [18:03:16.484] - resignal = TRUE [18:03:16.484] - Number of conditions: 1 [18:03:16.484] - Condition #1: 'RngFutureError', 'FutureError', 'error', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:16.484] signalConditions() ... done [18:03:16.485] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.485] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.485] signalConditionsASAP(SequentialFuture, pos=1) ... done Future UUID: 3e3cc08d-ce1d-6efb-25c7-3b7d0e7069f3 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: SequentialFuture: Label: 'fsample_1-460976' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f0e38f48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureError' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:16.486] getGlobalsAndPackages() ... [18:03:16.486] Searching for globals... [18:03:16.487] - globals found: [3] '{', 'sample', 'x' [18:03:16.488] Searching for globals ... DONE [18:03:16.488] Resolving globals: FALSE [18:03:16.488] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.489] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.489] - globals: [1] 'x' [18:03:16.489] [18:03:16.489] getGlobalsAndPackages() ... DONE [18:03:16.489] run() for 'Future' ... [18:03:16.490] - state: 'created' [18:03:16.490] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.490] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.490] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.491] - Field: 'label' [18:03:16.491] - Field: 'local' [18:03:16.491] - Field: 'owner' [18:03:16.491] - Field: 'envir' [18:03:16.491] - Field: 'packages' [18:03:16.491] - Field: 'gc' [18:03:16.492] - Field: 'conditions' [18:03:16.492] - Field: 'expr' [18:03:16.492] - Field: 'uuid' [18:03:16.492] - Field: 'seed' [18:03:16.492] - Field: 'version' [18:03:16.493] - Field: 'result' [18:03:16.493] - Field: 'asynchronous' [18:03:16.493] - Field: 'calls' [18:03:16.493] - Field: 'globals' [18:03:16.493] - Field: 'stdout' [18:03:16.493] - Field: 'earlySignal' [18:03:16.494] - Field: 'lazy' [18:03:16.494] - Field: 'state' [18:03:16.494] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.494] - Launch lazy future ... [18:03:16.494] Packages needed by the future expression (n = 0): [18:03:16.494] Packages needed by future strategies (n = 0): [18:03:16.495] { [18:03:16.495] { [18:03:16.495] { [18:03:16.495] ...future.startTime <- base::Sys.time() [18:03:16.495] { [18:03:16.495] { [18:03:16.495] { [18:03:16.495] base::local({ [18:03:16.495] has_future <- base::requireNamespace("future", [18:03:16.495] quietly = TRUE) [18:03:16.495] if (has_future) { [18:03:16.495] ns <- base::getNamespace("future") [18:03:16.495] version <- ns[[".package"]][["version"]] [18:03:16.495] if (is.null(version)) [18:03:16.495] version <- utils::packageVersion("future") [18:03:16.495] } [18:03:16.495] else { [18:03:16.495] version <- NULL [18:03:16.495] } [18:03:16.495] if (!has_future || version < "1.8.0") { [18:03:16.495] info <- base::c(r_version = base::gsub("R version ", [18:03:16.495] "", base::R.version$version.string), [18:03:16.495] platform = base::sprintf("%s (%s-bit)", [18:03:16.495] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.495] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.495] "release", "version")], collapse = " "), [18:03:16.495] hostname = base::Sys.info()[["nodename"]]) [18:03:16.495] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.495] info) [18:03:16.495] info <- base::paste(info, collapse = "; ") [18:03:16.495] if (!has_future) { [18:03:16.495] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.495] info) [18:03:16.495] } [18:03:16.495] else { [18:03:16.495] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.495] info, version) [18:03:16.495] } [18:03:16.495] base::stop(msg) [18:03:16.495] } [18:03:16.495] }) [18:03:16.495] } [18:03:16.495] options(future.plan = NULL) [18:03:16.495] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.495] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.495] } [18:03:16.495] ...future.workdir <- getwd() [18:03:16.495] } [18:03:16.495] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.495] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.495] } [18:03:16.495] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.495] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.495] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.495] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.495] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.495] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.495] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.495] base::names(...future.oldOptions)) [18:03:16.495] } [18:03:16.495] if (FALSE) { [18:03:16.495] } [18:03:16.495] else { [18:03:16.495] if (TRUE) { [18:03:16.495] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.495] open = "w") [18:03:16.495] } [18:03:16.495] else { [18:03:16.495] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.495] windows = "NUL", "/dev/null"), open = "w") [18:03:16.495] } [18:03:16.495] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.495] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.495] base::sink(type = "output", split = FALSE) [18:03:16.495] base::close(...future.stdout) [18:03:16.495] }, add = TRUE) [18:03:16.495] } [18:03:16.495] ...future.frame <- base::sys.nframe() [18:03:16.495] ...future.conditions <- base::list() [18:03:16.495] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.495] if (FALSE) { [18:03:16.495] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.495] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.495] } [18:03:16.495] ...future.result <- base::tryCatch({ [18:03:16.495] base::withCallingHandlers({ [18:03:16.495] ...future.value <- base::withVisible(base::local({ [18:03:16.495] sample(x, size = 1L) [18:03:16.495] })) [18:03:16.495] future::FutureResult(value = ...future.value$value, [18:03:16.495] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.495] ...future.rng), globalenv = if (FALSE) [18:03:16.495] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.495] ...future.globalenv.names)) [18:03:16.495] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.495] }, condition = base::local({ [18:03:16.495] c <- base::c [18:03:16.495] inherits <- base::inherits [18:03:16.495] invokeRestart <- base::invokeRestart [18:03:16.495] length <- base::length [18:03:16.495] list <- base::list [18:03:16.495] seq.int <- base::seq.int [18:03:16.495] signalCondition <- base::signalCondition [18:03:16.495] sys.calls <- base::sys.calls [18:03:16.495] `[[` <- base::`[[` [18:03:16.495] `+` <- base::`+` [18:03:16.495] `<<-` <- base::`<<-` [18:03:16.495] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.495] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.495] 3L)] [18:03:16.495] } [18:03:16.495] function(cond) { [18:03:16.495] is_error <- inherits(cond, "error") [18:03:16.495] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.495] NULL) [18:03:16.495] if (is_error) { [18:03:16.495] sessionInformation <- function() { [18:03:16.495] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.495] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.495] search = base::search(), system = base::Sys.info()) [18:03:16.495] } [18:03:16.495] ...future.conditions[[length(...future.conditions) + [18:03:16.495] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.495] cond$call), session = sessionInformation(), [18:03:16.495] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.495] signalCondition(cond) [18:03:16.495] } [18:03:16.495] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.495] "immediateCondition"))) { [18:03:16.495] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.495] ...future.conditions[[length(...future.conditions) + [18:03:16.495] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.495] if (TRUE && !signal) { [18:03:16.495] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.495] { [18:03:16.495] inherits <- base::inherits [18:03:16.495] invokeRestart <- base::invokeRestart [18:03:16.495] is.null <- base::is.null [18:03:16.495] muffled <- FALSE [18:03:16.495] if (inherits(cond, "message")) { [18:03:16.495] muffled <- grepl(pattern, "muffleMessage") [18:03:16.495] if (muffled) [18:03:16.495] invokeRestart("muffleMessage") [18:03:16.495] } [18:03:16.495] else if (inherits(cond, "warning")) { [18:03:16.495] muffled <- grepl(pattern, "muffleWarning") [18:03:16.495] if (muffled) [18:03:16.495] invokeRestart("muffleWarning") [18:03:16.495] } [18:03:16.495] else if (inherits(cond, "condition")) { [18:03:16.495] if (!is.null(pattern)) { [18:03:16.495] computeRestarts <- base::computeRestarts [18:03:16.495] grepl <- base::grepl [18:03:16.495] restarts <- computeRestarts(cond) [18:03:16.495] for (restart in restarts) { [18:03:16.495] name <- restart$name [18:03:16.495] if (is.null(name)) [18:03:16.495] next [18:03:16.495] if (!grepl(pattern, name)) [18:03:16.495] next [18:03:16.495] invokeRestart(restart) [18:03:16.495] muffled <- TRUE [18:03:16.495] break [18:03:16.495] } [18:03:16.495] } [18:03:16.495] } [18:03:16.495] invisible(muffled) [18:03:16.495] } [18:03:16.495] muffleCondition(cond, pattern = "^muffle") [18:03:16.495] } [18:03:16.495] } [18:03:16.495] else { [18:03:16.495] if (TRUE) { [18:03:16.495] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.495] { [18:03:16.495] inherits <- base::inherits [18:03:16.495] invokeRestart <- base::invokeRestart [18:03:16.495] is.null <- base::is.null [18:03:16.495] muffled <- FALSE [18:03:16.495] if (inherits(cond, "message")) { [18:03:16.495] muffled <- grepl(pattern, "muffleMessage") [18:03:16.495] if (muffled) [18:03:16.495] invokeRestart("muffleMessage") [18:03:16.495] } [18:03:16.495] else if (inherits(cond, "warning")) { [18:03:16.495] muffled <- grepl(pattern, "muffleWarning") [18:03:16.495] if (muffled) [18:03:16.495] invokeRestart("muffleWarning") [18:03:16.495] } [18:03:16.495] else if (inherits(cond, "condition")) { [18:03:16.495] if (!is.null(pattern)) { [18:03:16.495] computeRestarts <- base::computeRestarts [18:03:16.495] grepl <- base::grepl [18:03:16.495] restarts <- computeRestarts(cond) [18:03:16.495] for (restart in restarts) { [18:03:16.495] name <- restart$name [18:03:16.495] if (is.null(name)) [18:03:16.495] next [18:03:16.495] if (!grepl(pattern, name)) [18:03:16.495] next [18:03:16.495] invokeRestart(restart) [18:03:16.495] muffled <- TRUE [18:03:16.495] break [18:03:16.495] } [18:03:16.495] } [18:03:16.495] } [18:03:16.495] invisible(muffled) [18:03:16.495] } [18:03:16.495] muffleCondition(cond, pattern = "^muffle") [18:03:16.495] } [18:03:16.495] } [18:03:16.495] } [18:03:16.495] })) [18:03:16.495] }, error = function(ex) { [18:03:16.495] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.495] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.495] ...future.rng), started = ...future.startTime, [18:03:16.495] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.495] version = "1.8"), class = "FutureResult") [18:03:16.495] }, finally = { [18:03:16.495] if (!identical(...future.workdir, getwd())) [18:03:16.495] setwd(...future.workdir) [18:03:16.495] { [18:03:16.495] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.495] ...future.oldOptions$nwarnings <- NULL [18:03:16.495] } [18:03:16.495] base::options(...future.oldOptions) [18:03:16.495] if (.Platform$OS.type == "windows") { [18:03:16.495] old_names <- names(...future.oldEnvVars) [18:03:16.495] envs <- base::Sys.getenv() [18:03:16.495] names <- names(envs) [18:03:16.495] common <- intersect(names, old_names) [18:03:16.495] added <- setdiff(names, old_names) [18:03:16.495] removed <- setdiff(old_names, names) [18:03:16.495] changed <- common[...future.oldEnvVars[common] != [18:03:16.495] envs[common]] [18:03:16.495] NAMES <- toupper(changed) [18:03:16.495] args <- list() [18:03:16.495] for (kk in seq_along(NAMES)) { [18:03:16.495] name <- changed[[kk]] [18:03:16.495] NAME <- NAMES[[kk]] [18:03:16.495] if (name != NAME && is.element(NAME, old_names)) [18:03:16.495] next [18:03:16.495] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.495] } [18:03:16.495] NAMES <- toupper(added) [18:03:16.495] for (kk in seq_along(NAMES)) { [18:03:16.495] name <- added[[kk]] [18:03:16.495] NAME <- NAMES[[kk]] [18:03:16.495] if (name != NAME && is.element(NAME, old_names)) [18:03:16.495] next [18:03:16.495] args[[name]] <- "" [18:03:16.495] } [18:03:16.495] NAMES <- toupper(removed) [18:03:16.495] for (kk in seq_along(NAMES)) { [18:03:16.495] name <- removed[[kk]] [18:03:16.495] NAME <- NAMES[[kk]] [18:03:16.495] if (name != NAME && is.element(NAME, old_names)) [18:03:16.495] next [18:03:16.495] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.495] } [18:03:16.495] if (length(args) > 0) [18:03:16.495] base::do.call(base::Sys.setenv, args = args) [18:03:16.495] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.495] } [18:03:16.495] else { [18:03:16.495] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.495] } [18:03:16.495] { [18:03:16.495] if (base::length(...future.futureOptionsAdded) > [18:03:16.495] 0L) { [18:03:16.495] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.495] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.495] base::options(opts) [18:03:16.495] } [18:03:16.495] { [18:03:16.495] { [18:03:16.495] base::assign(".Random.seed", c(10407L, 1414277416L, [18:03:16.495] 1948718110L, -2082974517L, 1867954751L, -648911549L, [18:03:16.495] 1923131391L), envir = base::globalenv(), [18:03:16.495] inherits = FALSE) [18:03:16.495] NULL [18:03:16.495] } [18:03:16.495] options(future.plan = NULL) [18:03:16.495] if (is.na(NA_character_)) [18:03:16.495] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.495] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.495] future::plan(list(function (..., envir = parent.frame()) [18:03:16.495] { [18:03:16.495] future <- SequentialFuture(..., envir = envir) [18:03:16.495] if (!future$lazy) [18:03:16.495] future <- run(future) [18:03:16.495] invisible(future) [18:03:16.495] }), .cleanup = FALSE, .init = FALSE) [18:03:16.495] } [18:03:16.495] } [18:03:16.495] } [18:03:16.495] }) [18:03:16.495] if (TRUE) { [18:03:16.495] base::sink(type = "output", split = FALSE) [18:03:16.495] if (TRUE) { [18:03:16.495] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.495] } [18:03:16.495] else { [18:03:16.495] ...future.result["stdout"] <- base::list(NULL) [18:03:16.495] } [18:03:16.495] base::close(...future.stdout) [18:03:16.495] ...future.stdout <- NULL [18:03:16.495] } [18:03:16.495] ...future.result$conditions <- ...future.conditions [18:03:16.495] ...future.result$finished <- base::Sys.time() [18:03:16.495] ...future.result [18:03:16.495] } [18:03:16.499] assign_globals() ... [18:03:16.499] List of 1 [18:03:16.499] $ x: int [1:4] 0 1 2 3 [18:03:16.499] - attr(*, "where")=List of 1 [18:03:16.499] ..$ x: [18:03:16.499] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.499] - attr(*, "resolved")= logi FALSE [18:03:16.499] - attr(*, "total_size")= num 64 [18:03:16.499] - attr(*, "already-done")= logi TRUE [18:03:16.502] - copied 'x' to environment [18:03:16.502] assign_globals() ... done [18:03:16.503] plan(): Setting new future strategy stack: [18:03:16.503] List of future strategies: [18:03:16.503] 1. sequential: [18:03:16.503] - args: function (..., envir = parent.frame()) [18:03:16.503] - tweaked: FALSE [18:03:16.503] - call: NULL [18:03:16.503] plan(): nbrOfWorkers() = 1 [18:03:16.505] plan(): Setting new future strategy stack: [18:03:16.505] List of future strategies: [18:03:16.505] 1. sequential: [18:03:16.505] - args: function (..., envir = parent.frame()) [18:03:16.505] - tweaked: FALSE [18:03:16.505] - call: plan(strategy) [18:03:16.505] plan(): nbrOfWorkers() = 1 [18:03:16.505] SequentialFuture started (and completed) [18:03:16.506] - Launch lazy future ... done [18:03:16.506] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_1-266552' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f433aca8 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.508] getGlobalsAndPackages() ... [18:03:16.508] Searching for globals... [18:03:16.509] - globals found: [3] '{', 'sample', 'x' [18:03:16.509] Searching for globals ... DONE [18:03:16.509] Resolving globals: FALSE [18:03:16.510] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.510] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.511] - globals: [1] 'x' [18:03:16.511] [18:03:16.511] getGlobalsAndPackages() ... DONE [18:03:16.511] run() for 'Future' ... [18:03:16.511] - state: 'created' [18:03:16.512] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.512] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.512] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.512] - Field: 'label' [18:03:16.513] - Field: 'local' [18:03:16.513] - Field: 'owner' [18:03:16.513] - Field: 'envir' [18:03:16.513] - Field: 'packages' [18:03:16.513] - Field: 'gc' [18:03:16.513] - Field: 'conditions' [18:03:16.514] - Field: 'expr' [18:03:16.514] - Field: 'uuid' [18:03:16.514] - Field: 'seed' [18:03:16.514] - Field: 'version' [18:03:16.514] - Field: 'result' [18:03:16.514] - Field: 'asynchronous' [18:03:16.515] - Field: 'calls' [18:03:16.515] - Field: 'globals' [18:03:16.515] - Field: 'stdout' [18:03:16.515] - Field: 'earlySignal' [18:03:16.515] - Field: 'lazy' [18:03:16.516] - Field: 'state' [18:03:16.516] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.516] - Launch lazy future ... [18:03:16.516] Packages needed by the future expression (n = 0): [18:03:16.516] Packages needed by future strategies (n = 0): [18:03:16.517] { [18:03:16.517] { [18:03:16.517] { [18:03:16.517] ...future.startTime <- base::Sys.time() [18:03:16.517] { [18:03:16.517] { [18:03:16.517] { [18:03:16.517] base::local({ [18:03:16.517] has_future <- base::requireNamespace("future", [18:03:16.517] quietly = TRUE) [18:03:16.517] if (has_future) { [18:03:16.517] ns <- base::getNamespace("future") [18:03:16.517] version <- ns[[".package"]][["version"]] [18:03:16.517] if (is.null(version)) [18:03:16.517] version <- utils::packageVersion("future") [18:03:16.517] } [18:03:16.517] else { [18:03:16.517] version <- NULL [18:03:16.517] } [18:03:16.517] if (!has_future || version < "1.8.0") { [18:03:16.517] info <- base::c(r_version = base::gsub("R version ", [18:03:16.517] "", base::R.version$version.string), [18:03:16.517] platform = base::sprintf("%s (%s-bit)", [18:03:16.517] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.517] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.517] "release", "version")], collapse = " "), [18:03:16.517] hostname = base::Sys.info()[["nodename"]]) [18:03:16.517] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.517] info) [18:03:16.517] info <- base::paste(info, collapse = "; ") [18:03:16.517] if (!has_future) { [18:03:16.517] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.517] info) [18:03:16.517] } [18:03:16.517] else { [18:03:16.517] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.517] info, version) [18:03:16.517] } [18:03:16.517] base::stop(msg) [18:03:16.517] } [18:03:16.517] }) [18:03:16.517] } [18:03:16.517] options(future.plan = NULL) [18:03:16.517] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.517] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.517] } [18:03:16.517] ...future.workdir <- getwd() [18:03:16.517] } [18:03:16.517] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.517] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.517] } [18:03:16.517] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.517] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.517] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.517] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.517] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.517] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.517] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.517] base::names(...future.oldOptions)) [18:03:16.517] } [18:03:16.517] if (FALSE) { [18:03:16.517] } [18:03:16.517] else { [18:03:16.517] if (TRUE) { [18:03:16.517] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.517] open = "w") [18:03:16.517] } [18:03:16.517] else { [18:03:16.517] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.517] windows = "NUL", "/dev/null"), open = "w") [18:03:16.517] } [18:03:16.517] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.517] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.517] base::sink(type = "output", split = FALSE) [18:03:16.517] base::close(...future.stdout) [18:03:16.517] }, add = TRUE) [18:03:16.517] } [18:03:16.517] ...future.frame <- base::sys.nframe() [18:03:16.517] ...future.conditions <- base::list() [18:03:16.517] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.517] if (FALSE) { [18:03:16.517] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.517] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.517] } [18:03:16.517] ...future.result <- base::tryCatch({ [18:03:16.517] base::withCallingHandlers({ [18:03:16.517] ...future.value <- base::withVisible(base::local({ [18:03:16.517] sample(x, size = 1L) [18:03:16.517] })) [18:03:16.517] future::FutureResult(value = ...future.value$value, [18:03:16.517] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.517] ...future.rng), globalenv = if (FALSE) [18:03:16.517] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.517] ...future.globalenv.names)) [18:03:16.517] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.517] }, condition = base::local({ [18:03:16.517] c <- base::c [18:03:16.517] inherits <- base::inherits [18:03:16.517] invokeRestart <- base::invokeRestart [18:03:16.517] length <- base::length [18:03:16.517] list <- base::list [18:03:16.517] seq.int <- base::seq.int [18:03:16.517] signalCondition <- base::signalCondition [18:03:16.517] sys.calls <- base::sys.calls [18:03:16.517] `[[` <- base::`[[` [18:03:16.517] `+` <- base::`+` [18:03:16.517] `<<-` <- base::`<<-` [18:03:16.517] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.517] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.517] 3L)] [18:03:16.517] } [18:03:16.517] function(cond) { [18:03:16.517] is_error <- inherits(cond, "error") [18:03:16.517] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.517] NULL) [18:03:16.517] if (is_error) { [18:03:16.517] sessionInformation <- function() { [18:03:16.517] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.517] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.517] search = base::search(), system = base::Sys.info()) [18:03:16.517] } [18:03:16.517] ...future.conditions[[length(...future.conditions) + [18:03:16.517] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.517] cond$call), session = sessionInformation(), [18:03:16.517] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.517] signalCondition(cond) [18:03:16.517] } [18:03:16.517] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.517] "immediateCondition"))) { [18:03:16.517] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.517] ...future.conditions[[length(...future.conditions) + [18:03:16.517] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.517] if (TRUE && !signal) { [18:03:16.517] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.517] { [18:03:16.517] inherits <- base::inherits [18:03:16.517] invokeRestart <- base::invokeRestart [18:03:16.517] is.null <- base::is.null [18:03:16.517] muffled <- FALSE [18:03:16.517] if (inherits(cond, "message")) { [18:03:16.517] muffled <- grepl(pattern, "muffleMessage") [18:03:16.517] if (muffled) [18:03:16.517] invokeRestart("muffleMessage") [18:03:16.517] } [18:03:16.517] else if (inherits(cond, "warning")) { [18:03:16.517] muffled <- grepl(pattern, "muffleWarning") [18:03:16.517] if (muffled) [18:03:16.517] invokeRestart("muffleWarning") [18:03:16.517] } [18:03:16.517] else if (inherits(cond, "condition")) { [18:03:16.517] if (!is.null(pattern)) { [18:03:16.517] computeRestarts <- base::computeRestarts [18:03:16.517] grepl <- base::grepl [18:03:16.517] restarts <- computeRestarts(cond) [18:03:16.517] for (restart in restarts) { [18:03:16.517] name <- restart$name [18:03:16.517] if (is.null(name)) [18:03:16.517] next [18:03:16.517] if (!grepl(pattern, name)) [18:03:16.517] next [18:03:16.517] invokeRestart(restart) [18:03:16.517] muffled <- TRUE [18:03:16.517] break [18:03:16.517] } [18:03:16.517] } [18:03:16.517] } [18:03:16.517] invisible(muffled) [18:03:16.517] } [18:03:16.517] muffleCondition(cond, pattern = "^muffle") [18:03:16.517] } [18:03:16.517] } [18:03:16.517] else { [18:03:16.517] if (TRUE) { [18:03:16.517] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.517] { [18:03:16.517] inherits <- base::inherits [18:03:16.517] invokeRestart <- base::invokeRestart [18:03:16.517] is.null <- base::is.null [18:03:16.517] muffled <- FALSE [18:03:16.517] if (inherits(cond, "message")) { [18:03:16.517] muffled <- grepl(pattern, "muffleMessage") [18:03:16.517] if (muffled) [18:03:16.517] invokeRestart("muffleMessage") [18:03:16.517] } [18:03:16.517] else if (inherits(cond, "warning")) { [18:03:16.517] muffled <- grepl(pattern, "muffleWarning") [18:03:16.517] if (muffled) [18:03:16.517] invokeRestart("muffleWarning") [18:03:16.517] } [18:03:16.517] else if (inherits(cond, "condition")) { [18:03:16.517] if (!is.null(pattern)) { [18:03:16.517] computeRestarts <- base::computeRestarts [18:03:16.517] grepl <- base::grepl [18:03:16.517] restarts <- computeRestarts(cond) [18:03:16.517] for (restart in restarts) { [18:03:16.517] name <- restart$name [18:03:16.517] if (is.null(name)) [18:03:16.517] next [18:03:16.517] if (!grepl(pattern, name)) [18:03:16.517] next [18:03:16.517] invokeRestart(restart) [18:03:16.517] muffled <- TRUE [18:03:16.517] break [18:03:16.517] } [18:03:16.517] } [18:03:16.517] } [18:03:16.517] invisible(muffled) [18:03:16.517] } [18:03:16.517] muffleCondition(cond, pattern = "^muffle") [18:03:16.517] } [18:03:16.517] } [18:03:16.517] } [18:03:16.517] })) [18:03:16.517] }, error = function(ex) { [18:03:16.517] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.517] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.517] ...future.rng), started = ...future.startTime, [18:03:16.517] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.517] version = "1.8"), class = "FutureResult") [18:03:16.517] }, finally = { [18:03:16.517] if (!identical(...future.workdir, getwd())) [18:03:16.517] setwd(...future.workdir) [18:03:16.517] { [18:03:16.517] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.517] ...future.oldOptions$nwarnings <- NULL [18:03:16.517] } [18:03:16.517] base::options(...future.oldOptions) [18:03:16.517] if (.Platform$OS.type == "windows") { [18:03:16.517] old_names <- names(...future.oldEnvVars) [18:03:16.517] envs <- base::Sys.getenv() [18:03:16.517] names <- names(envs) [18:03:16.517] common <- intersect(names, old_names) [18:03:16.517] added <- setdiff(names, old_names) [18:03:16.517] removed <- setdiff(old_names, names) [18:03:16.517] changed <- common[...future.oldEnvVars[common] != [18:03:16.517] envs[common]] [18:03:16.517] NAMES <- toupper(changed) [18:03:16.517] args <- list() [18:03:16.517] for (kk in seq_along(NAMES)) { [18:03:16.517] name <- changed[[kk]] [18:03:16.517] NAME <- NAMES[[kk]] [18:03:16.517] if (name != NAME && is.element(NAME, old_names)) [18:03:16.517] next [18:03:16.517] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.517] } [18:03:16.517] NAMES <- toupper(added) [18:03:16.517] for (kk in seq_along(NAMES)) { [18:03:16.517] name <- added[[kk]] [18:03:16.517] NAME <- NAMES[[kk]] [18:03:16.517] if (name != NAME && is.element(NAME, old_names)) [18:03:16.517] next [18:03:16.517] args[[name]] <- "" [18:03:16.517] } [18:03:16.517] NAMES <- toupper(removed) [18:03:16.517] for (kk in seq_along(NAMES)) { [18:03:16.517] name <- removed[[kk]] [18:03:16.517] NAME <- NAMES[[kk]] [18:03:16.517] if (name != NAME && is.element(NAME, old_names)) [18:03:16.517] next [18:03:16.517] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.517] } [18:03:16.517] if (length(args) > 0) [18:03:16.517] base::do.call(base::Sys.setenv, args = args) [18:03:16.517] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.517] } [18:03:16.517] else { [18:03:16.517] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.517] } [18:03:16.517] { [18:03:16.517] if (base::length(...future.futureOptionsAdded) > [18:03:16.517] 0L) { [18:03:16.517] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.517] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.517] base::options(opts) [18:03:16.517] } [18:03:16.517] { [18:03:16.517] { [18:03:16.517] base::assign(".Random.seed", c(10407L, -2082974517L, [18:03:16.517] -602488121L, -791131818L, 1923131391L, 428119060L, [18:03:16.517] -1991423341L), envir = base::globalenv(), [18:03:16.517] inherits = FALSE) [18:03:16.517] NULL [18:03:16.517] } [18:03:16.517] options(future.plan = NULL) [18:03:16.517] if (is.na(NA_character_)) [18:03:16.517] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.517] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.517] future::plan(list(function (..., envir = parent.frame()) [18:03:16.517] { [18:03:16.517] future <- SequentialFuture(..., envir = envir) [18:03:16.517] if (!future$lazy) [18:03:16.517] future <- run(future) [18:03:16.517] invisible(future) [18:03:16.517] }), .cleanup = FALSE, .init = FALSE) [18:03:16.517] } [18:03:16.517] } [18:03:16.517] } [18:03:16.517] }) [18:03:16.517] if (TRUE) { [18:03:16.517] base::sink(type = "output", split = FALSE) [18:03:16.517] if (TRUE) { [18:03:16.517] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.517] } [18:03:16.517] else { [18:03:16.517] ...future.result["stdout"] <- base::list(NULL) [18:03:16.517] } [18:03:16.517] base::close(...future.stdout) [18:03:16.517] ...future.stdout <- NULL [18:03:16.517] } [18:03:16.517] ...future.result$conditions <- ...future.conditions [18:03:16.517] ...future.result$finished <- base::Sys.time() [18:03:16.517] ...future.result [18:03:16.517] } [18:03:16.521] assign_globals() ... [18:03:16.521] List of 1 [18:03:16.521] $ x: int [1:4] 0 1 2 3 [18:03:16.521] - attr(*, "where")=List of 1 [18:03:16.521] ..$ x: [18:03:16.521] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.521] - attr(*, "resolved")= logi FALSE [18:03:16.521] - attr(*, "total_size")= num 64 [18:03:16.521] - attr(*, "already-done")= logi TRUE [18:03:16.524] - copied 'x' to environment [18:03:16.524] assign_globals() ... done [18:03:16.524] plan(): Setting new future strategy stack: [18:03:16.524] List of future strategies: [18:03:16.524] 1. sequential: [18:03:16.524] - args: function (..., envir = parent.frame()) [18:03:16.524] - tweaked: FALSE [18:03:16.524] - call: NULL [18:03:16.525] plan(): nbrOfWorkers() = 1 [18:03:16.526] plan(): Setting new future strategy stack: [18:03:16.526] List of future strategies: [18:03:16.526] 1. sequential: [18:03:16.526] - args: function (..., envir = parent.frame()) [18:03:16.526] - tweaked: FALSE [18:03:16.526] - call: plan(strategy) [18:03:16.527] plan(): nbrOfWorkers() = 1 [18:03:16.527] SequentialFuture started (and completed) [18:03:16.527] - Launch lazy future ... done [18:03:16.527] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_2-149387' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f433aca8 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.528] getGlobalsAndPackages() ... [18:03:16.528] Searching for globals... [18:03:16.530] - globals found: [3] '{', 'sample', 'x' [18:03:16.530] Searching for globals ... DONE [18:03:16.530] Resolving globals: FALSE [18:03:16.530] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.531] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.531] - globals: [1] 'x' [18:03:16.531] [18:03:16.531] getGlobalsAndPackages() ... DONE [18:03:16.532] run() for 'Future' ... [18:03:16.532] - state: 'created' [18:03:16.532] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.532] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.533] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.533] - Field: 'label' [18:03:16.533] - Field: 'local' [18:03:16.533] - Field: 'owner' [18:03:16.533] - Field: 'envir' [18:03:16.534] - Field: 'packages' [18:03:16.534] - Field: 'gc' [18:03:16.534] - Field: 'conditions' [18:03:16.534] - Field: 'expr' [18:03:16.534] - Field: 'uuid' [18:03:16.534] - Field: 'seed' [18:03:16.535] - Field: 'version' [18:03:16.535] - Field: 'result' [18:03:16.535] - Field: 'asynchronous' [18:03:16.535] - Field: 'calls' [18:03:16.535] - Field: 'globals' [18:03:16.535] - Field: 'stdout' [18:03:16.536] - Field: 'earlySignal' [18:03:16.536] - Field: 'lazy' [18:03:16.536] - Field: 'state' [18:03:16.536] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.536] - Launch lazy future ... [18:03:16.537] Packages needed by the future expression (n = 0): [18:03:16.537] Packages needed by future strategies (n = 0): [18:03:16.537] { [18:03:16.537] { [18:03:16.537] { [18:03:16.537] ...future.startTime <- base::Sys.time() [18:03:16.537] { [18:03:16.537] { [18:03:16.537] { [18:03:16.537] base::local({ [18:03:16.537] has_future <- base::requireNamespace("future", [18:03:16.537] quietly = TRUE) [18:03:16.537] if (has_future) { [18:03:16.537] ns <- base::getNamespace("future") [18:03:16.537] version <- ns[[".package"]][["version"]] [18:03:16.537] if (is.null(version)) [18:03:16.537] version <- utils::packageVersion("future") [18:03:16.537] } [18:03:16.537] else { [18:03:16.537] version <- NULL [18:03:16.537] } [18:03:16.537] if (!has_future || version < "1.8.0") { [18:03:16.537] info <- base::c(r_version = base::gsub("R version ", [18:03:16.537] "", base::R.version$version.string), [18:03:16.537] platform = base::sprintf("%s (%s-bit)", [18:03:16.537] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.537] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.537] "release", "version")], collapse = " "), [18:03:16.537] hostname = base::Sys.info()[["nodename"]]) [18:03:16.537] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.537] info) [18:03:16.537] info <- base::paste(info, collapse = "; ") [18:03:16.537] if (!has_future) { [18:03:16.537] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.537] info) [18:03:16.537] } [18:03:16.537] else { [18:03:16.537] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.537] info, version) [18:03:16.537] } [18:03:16.537] base::stop(msg) [18:03:16.537] } [18:03:16.537] }) [18:03:16.537] } [18:03:16.537] options(future.plan = NULL) [18:03:16.537] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.537] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.537] } [18:03:16.537] ...future.workdir <- getwd() [18:03:16.537] } [18:03:16.537] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.537] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.537] } [18:03:16.537] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.537] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.537] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.537] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.537] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.537] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.537] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.537] base::names(...future.oldOptions)) [18:03:16.537] } [18:03:16.537] if (FALSE) { [18:03:16.537] } [18:03:16.537] else { [18:03:16.537] if (TRUE) { [18:03:16.537] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.537] open = "w") [18:03:16.537] } [18:03:16.537] else { [18:03:16.537] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.537] windows = "NUL", "/dev/null"), open = "w") [18:03:16.537] } [18:03:16.537] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.537] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.537] base::sink(type = "output", split = FALSE) [18:03:16.537] base::close(...future.stdout) [18:03:16.537] }, add = TRUE) [18:03:16.537] } [18:03:16.537] ...future.frame <- base::sys.nframe() [18:03:16.537] ...future.conditions <- base::list() [18:03:16.537] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.537] if (FALSE) { [18:03:16.537] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.537] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.537] } [18:03:16.537] ...future.result <- base::tryCatch({ [18:03:16.537] base::withCallingHandlers({ [18:03:16.537] ...future.value <- base::withVisible(base::local({ [18:03:16.537] sample(x, size = 1L) [18:03:16.537] })) [18:03:16.537] future::FutureResult(value = ...future.value$value, [18:03:16.537] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.537] ...future.rng), globalenv = if (FALSE) [18:03:16.537] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.537] ...future.globalenv.names)) [18:03:16.537] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.537] }, condition = base::local({ [18:03:16.537] c <- base::c [18:03:16.537] inherits <- base::inherits [18:03:16.537] invokeRestart <- base::invokeRestart [18:03:16.537] length <- base::length [18:03:16.537] list <- base::list [18:03:16.537] seq.int <- base::seq.int [18:03:16.537] signalCondition <- base::signalCondition [18:03:16.537] sys.calls <- base::sys.calls [18:03:16.537] `[[` <- base::`[[` [18:03:16.537] `+` <- base::`+` [18:03:16.537] `<<-` <- base::`<<-` [18:03:16.537] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.537] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.537] 3L)] [18:03:16.537] } [18:03:16.537] function(cond) { [18:03:16.537] is_error <- inherits(cond, "error") [18:03:16.537] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.537] NULL) [18:03:16.537] if (is_error) { [18:03:16.537] sessionInformation <- function() { [18:03:16.537] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.537] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.537] search = base::search(), system = base::Sys.info()) [18:03:16.537] } [18:03:16.537] ...future.conditions[[length(...future.conditions) + [18:03:16.537] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.537] cond$call), session = sessionInformation(), [18:03:16.537] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.537] signalCondition(cond) [18:03:16.537] } [18:03:16.537] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.537] "immediateCondition"))) { [18:03:16.537] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.537] ...future.conditions[[length(...future.conditions) + [18:03:16.537] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.537] if (TRUE && !signal) { [18:03:16.537] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.537] { [18:03:16.537] inherits <- base::inherits [18:03:16.537] invokeRestart <- base::invokeRestart [18:03:16.537] is.null <- base::is.null [18:03:16.537] muffled <- FALSE [18:03:16.537] if (inherits(cond, "message")) { [18:03:16.537] muffled <- grepl(pattern, "muffleMessage") [18:03:16.537] if (muffled) [18:03:16.537] invokeRestart("muffleMessage") [18:03:16.537] } [18:03:16.537] else if (inherits(cond, "warning")) { [18:03:16.537] muffled <- grepl(pattern, "muffleWarning") [18:03:16.537] if (muffled) [18:03:16.537] invokeRestart("muffleWarning") [18:03:16.537] } [18:03:16.537] else if (inherits(cond, "condition")) { [18:03:16.537] if (!is.null(pattern)) { [18:03:16.537] computeRestarts <- base::computeRestarts [18:03:16.537] grepl <- base::grepl [18:03:16.537] restarts <- computeRestarts(cond) [18:03:16.537] for (restart in restarts) { [18:03:16.537] name <- restart$name [18:03:16.537] if (is.null(name)) [18:03:16.537] next [18:03:16.537] if (!grepl(pattern, name)) [18:03:16.537] next [18:03:16.537] invokeRestart(restart) [18:03:16.537] muffled <- TRUE [18:03:16.537] break [18:03:16.537] } [18:03:16.537] } [18:03:16.537] } [18:03:16.537] invisible(muffled) [18:03:16.537] } [18:03:16.537] muffleCondition(cond, pattern = "^muffle") [18:03:16.537] } [18:03:16.537] } [18:03:16.537] else { [18:03:16.537] if (TRUE) { [18:03:16.537] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.537] { [18:03:16.537] inherits <- base::inherits [18:03:16.537] invokeRestart <- base::invokeRestart [18:03:16.537] is.null <- base::is.null [18:03:16.537] muffled <- FALSE [18:03:16.537] if (inherits(cond, "message")) { [18:03:16.537] muffled <- grepl(pattern, "muffleMessage") [18:03:16.537] if (muffled) [18:03:16.537] invokeRestart("muffleMessage") [18:03:16.537] } [18:03:16.537] else if (inherits(cond, "warning")) { [18:03:16.537] muffled <- grepl(pattern, "muffleWarning") [18:03:16.537] if (muffled) [18:03:16.537] invokeRestart("muffleWarning") [18:03:16.537] } [18:03:16.537] else if (inherits(cond, "condition")) { [18:03:16.537] if (!is.null(pattern)) { [18:03:16.537] computeRestarts <- base::computeRestarts [18:03:16.537] grepl <- base::grepl [18:03:16.537] restarts <- computeRestarts(cond) [18:03:16.537] for (restart in restarts) { [18:03:16.537] name <- restart$name [18:03:16.537] if (is.null(name)) [18:03:16.537] next [18:03:16.537] if (!grepl(pattern, name)) [18:03:16.537] next [18:03:16.537] invokeRestart(restart) [18:03:16.537] muffled <- TRUE [18:03:16.537] break [18:03:16.537] } [18:03:16.537] } [18:03:16.537] } [18:03:16.537] invisible(muffled) [18:03:16.537] } [18:03:16.537] muffleCondition(cond, pattern = "^muffle") [18:03:16.537] } [18:03:16.537] } [18:03:16.537] } [18:03:16.537] })) [18:03:16.537] }, error = function(ex) { [18:03:16.537] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.537] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.537] ...future.rng), started = ...future.startTime, [18:03:16.537] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.537] version = "1.8"), class = "FutureResult") [18:03:16.537] }, finally = { [18:03:16.537] if (!identical(...future.workdir, getwd())) [18:03:16.537] setwd(...future.workdir) [18:03:16.537] { [18:03:16.537] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.537] ...future.oldOptions$nwarnings <- NULL [18:03:16.537] } [18:03:16.537] base::options(...future.oldOptions) [18:03:16.537] if (.Platform$OS.type == "windows") { [18:03:16.537] old_names <- names(...future.oldEnvVars) [18:03:16.537] envs <- base::Sys.getenv() [18:03:16.537] names <- names(envs) [18:03:16.537] common <- intersect(names, old_names) [18:03:16.537] added <- setdiff(names, old_names) [18:03:16.537] removed <- setdiff(old_names, names) [18:03:16.537] changed <- common[...future.oldEnvVars[common] != [18:03:16.537] envs[common]] [18:03:16.537] NAMES <- toupper(changed) [18:03:16.537] args <- list() [18:03:16.537] for (kk in seq_along(NAMES)) { [18:03:16.537] name <- changed[[kk]] [18:03:16.537] NAME <- NAMES[[kk]] [18:03:16.537] if (name != NAME && is.element(NAME, old_names)) [18:03:16.537] next [18:03:16.537] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.537] } [18:03:16.537] NAMES <- toupper(added) [18:03:16.537] for (kk in seq_along(NAMES)) { [18:03:16.537] name <- added[[kk]] [18:03:16.537] NAME <- NAMES[[kk]] [18:03:16.537] if (name != NAME && is.element(NAME, old_names)) [18:03:16.537] next [18:03:16.537] args[[name]] <- "" [18:03:16.537] } [18:03:16.537] NAMES <- toupper(removed) [18:03:16.537] for (kk in seq_along(NAMES)) { [18:03:16.537] name <- removed[[kk]] [18:03:16.537] NAME <- NAMES[[kk]] [18:03:16.537] if (name != NAME && is.element(NAME, old_names)) [18:03:16.537] next [18:03:16.537] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.537] } [18:03:16.537] if (length(args) > 0) [18:03:16.537] base::do.call(base::Sys.setenv, args = args) [18:03:16.537] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.537] } [18:03:16.537] else { [18:03:16.537] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.537] } [18:03:16.537] { [18:03:16.537] if (base::length(...future.futureOptionsAdded) > [18:03:16.537] 0L) { [18:03:16.537] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.537] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.537] base::options(opts) [18:03:16.537] } [18:03:16.537] { [18:03:16.537] { [18:03:16.537] base::assign(".Random.seed", c(10407L, -791131818L, [18:03:16.537] 751941512L, 89962360L, -1991423341L, 204037336L, [18:03:16.537] -200088696L), envir = base::globalenv(), [18:03:16.537] inherits = FALSE) [18:03:16.537] NULL [18:03:16.537] } [18:03:16.537] options(future.plan = NULL) [18:03:16.537] if (is.na(NA_character_)) [18:03:16.537] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.537] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.537] future::plan(list(function (..., envir = parent.frame()) [18:03:16.537] { [18:03:16.537] future <- SequentialFuture(..., envir = envir) [18:03:16.537] if (!future$lazy) [18:03:16.537] future <- run(future) [18:03:16.537] invisible(future) [18:03:16.537] }), .cleanup = FALSE, .init = FALSE) [18:03:16.537] } [18:03:16.537] } [18:03:16.537] } [18:03:16.537] }) [18:03:16.537] if (TRUE) { [18:03:16.537] base::sink(type = "output", split = FALSE) [18:03:16.537] if (TRUE) { [18:03:16.537] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.537] } [18:03:16.537] else { [18:03:16.537] ...future.result["stdout"] <- base::list(NULL) [18:03:16.537] } [18:03:16.537] base::close(...future.stdout) [18:03:16.537] ...future.stdout <- NULL [18:03:16.537] } [18:03:16.537] ...future.result$conditions <- ...future.conditions [18:03:16.537] ...future.result$finished <- base::Sys.time() [18:03:16.537] ...future.result [18:03:16.537] } [18:03:16.541] assign_globals() ... [18:03:16.541] List of 1 [18:03:16.541] $ x: int [1:4] 0 1 2 3 [18:03:16.541] - attr(*, "where")=List of 1 [18:03:16.541] ..$ x: [18:03:16.541] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.541] - attr(*, "resolved")= logi FALSE [18:03:16.541] - attr(*, "total_size")= num 64 [18:03:16.541] - attr(*, "already-done")= logi TRUE [18:03:16.544] - copied 'x' to environment [18:03:16.544] assign_globals() ... done [18:03:16.545] plan(): Setting new future strategy stack: [18:03:16.545] List of future strategies: [18:03:16.545] 1. sequential: [18:03:16.545] - args: function (..., envir = parent.frame()) [18:03:16.545] - tweaked: FALSE [18:03:16.545] - call: NULL [18:03:16.545] plan(): nbrOfWorkers() = 1 [18:03:16.547] plan(): Setting new future strategy stack: [18:03:16.548] List of future strategies: [18:03:16.548] 1. sequential: [18:03:16.548] - args: function (..., envir = parent.frame()) [18:03:16.548] - tweaked: FALSE [18:03:16.548] - call: plan(strategy) [18:03:16.548] plan(): nbrOfWorkers() = 1 [18:03:16.548] SequentialFuture started (and completed) [18:03:16.549] - Launch lazy future ... done [18:03:16.549] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_3-528714' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f433aca8 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.550] getGlobalsAndPackages() ... [18:03:16.550] Searching for globals... [18:03:16.551] - globals found: [3] '{', 'sample', 'x' [18:03:16.551] Searching for globals ... DONE [18:03:16.552] Resolving globals: FALSE [18:03:16.552] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.552] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.553] - globals: [1] 'x' [18:03:16.553] [18:03:16.553] getGlobalsAndPackages() ... DONE [18:03:16.553] run() for 'Future' ... [18:03:16.554] - state: 'created' [18:03:16.554] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.554] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.554] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.554] - Field: 'label' [18:03:16.555] - Field: 'local' [18:03:16.555] - Field: 'owner' [18:03:16.555] - Field: 'envir' [18:03:16.555] - Field: 'packages' [18:03:16.555] - Field: 'gc' [18:03:16.556] - Field: 'conditions' [18:03:16.556] - Field: 'expr' [18:03:16.556] - Field: 'uuid' [18:03:16.556] - Field: 'seed' [18:03:16.556] - Field: 'version' [18:03:16.556] - Field: 'result' [18:03:16.557] - Field: 'asynchronous' [18:03:16.557] - Field: 'calls' [18:03:16.557] - Field: 'globals' [18:03:16.557] - Field: 'stdout' [18:03:16.557] - Field: 'earlySignal' [18:03:16.557] - Field: 'lazy' [18:03:16.558] - Field: 'state' [18:03:16.558] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.558] - Launch lazy future ... [18:03:16.558] Packages needed by the future expression (n = 0): [18:03:16.558] Packages needed by future strategies (n = 0): [18:03:16.559] { [18:03:16.559] { [18:03:16.559] { [18:03:16.559] ...future.startTime <- base::Sys.time() [18:03:16.559] { [18:03:16.559] { [18:03:16.559] { [18:03:16.559] base::local({ [18:03:16.559] has_future <- base::requireNamespace("future", [18:03:16.559] quietly = TRUE) [18:03:16.559] if (has_future) { [18:03:16.559] ns <- base::getNamespace("future") [18:03:16.559] version <- ns[[".package"]][["version"]] [18:03:16.559] if (is.null(version)) [18:03:16.559] version <- utils::packageVersion("future") [18:03:16.559] } [18:03:16.559] else { [18:03:16.559] version <- NULL [18:03:16.559] } [18:03:16.559] if (!has_future || version < "1.8.0") { [18:03:16.559] info <- base::c(r_version = base::gsub("R version ", [18:03:16.559] "", base::R.version$version.string), [18:03:16.559] platform = base::sprintf("%s (%s-bit)", [18:03:16.559] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.559] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.559] "release", "version")], collapse = " "), [18:03:16.559] hostname = base::Sys.info()[["nodename"]]) [18:03:16.559] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.559] info) [18:03:16.559] info <- base::paste(info, collapse = "; ") [18:03:16.559] if (!has_future) { [18:03:16.559] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.559] info) [18:03:16.559] } [18:03:16.559] else { [18:03:16.559] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.559] info, version) [18:03:16.559] } [18:03:16.559] base::stop(msg) [18:03:16.559] } [18:03:16.559] }) [18:03:16.559] } [18:03:16.559] options(future.plan = NULL) [18:03:16.559] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.559] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.559] } [18:03:16.559] ...future.workdir <- getwd() [18:03:16.559] } [18:03:16.559] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.559] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.559] } [18:03:16.559] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.559] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.559] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.559] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.559] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:16.559] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.559] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.559] base::names(...future.oldOptions)) [18:03:16.559] } [18:03:16.559] if (FALSE) { [18:03:16.559] } [18:03:16.559] else { [18:03:16.559] if (TRUE) { [18:03:16.559] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.559] open = "w") [18:03:16.559] } [18:03:16.559] else { [18:03:16.559] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.559] windows = "NUL", "/dev/null"), open = "w") [18:03:16.559] } [18:03:16.559] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.559] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.559] base::sink(type = "output", split = FALSE) [18:03:16.559] base::close(...future.stdout) [18:03:16.559] }, add = TRUE) [18:03:16.559] } [18:03:16.559] ...future.frame <- base::sys.nframe() [18:03:16.559] ...future.conditions <- base::list() [18:03:16.559] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.559] if (FALSE) { [18:03:16.559] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.559] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.559] } [18:03:16.559] ...future.result <- base::tryCatch({ [18:03:16.559] base::withCallingHandlers({ [18:03:16.559] ...future.value <- base::withVisible(base::local({ [18:03:16.559] sample(x, size = 1L) [18:03:16.559] })) [18:03:16.559] future::FutureResult(value = ...future.value$value, [18:03:16.559] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.559] ...future.rng), globalenv = if (FALSE) [18:03:16.559] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.559] ...future.globalenv.names)) [18:03:16.559] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.559] }, condition = base::local({ [18:03:16.559] c <- base::c [18:03:16.559] inherits <- base::inherits [18:03:16.559] invokeRestart <- base::invokeRestart [18:03:16.559] length <- base::length [18:03:16.559] list <- base::list [18:03:16.559] seq.int <- base::seq.int [18:03:16.559] signalCondition <- base::signalCondition [18:03:16.559] sys.calls <- base::sys.calls [18:03:16.559] `[[` <- base::`[[` [18:03:16.559] `+` <- base::`+` [18:03:16.559] `<<-` <- base::`<<-` [18:03:16.559] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.559] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.559] 3L)] [18:03:16.559] } [18:03:16.559] function(cond) { [18:03:16.559] is_error <- inherits(cond, "error") [18:03:16.559] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.559] NULL) [18:03:16.559] if (is_error) { [18:03:16.559] sessionInformation <- function() { [18:03:16.559] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.559] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.559] search = base::search(), system = base::Sys.info()) [18:03:16.559] } [18:03:16.559] ...future.conditions[[length(...future.conditions) + [18:03:16.559] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.559] cond$call), session = sessionInformation(), [18:03:16.559] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.559] signalCondition(cond) [18:03:16.559] } [18:03:16.559] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.559] "immediateCondition"))) { [18:03:16.559] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.559] ...future.conditions[[length(...future.conditions) + [18:03:16.559] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.559] if (TRUE && !signal) { [18:03:16.559] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.559] { [18:03:16.559] inherits <- base::inherits [18:03:16.559] invokeRestart <- base::invokeRestart [18:03:16.559] is.null <- base::is.null [18:03:16.559] muffled <- FALSE [18:03:16.559] if (inherits(cond, "message")) { [18:03:16.559] muffled <- grepl(pattern, "muffleMessage") [18:03:16.559] if (muffled) [18:03:16.559] invokeRestart("muffleMessage") [18:03:16.559] } [18:03:16.559] else if (inherits(cond, "warning")) { [18:03:16.559] muffled <- grepl(pattern, "muffleWarning") [18:03:16.559] if (muffled) [18:03:16.559] invokeRestart("muffleWarning") [18:03:16.559] } [18:03:16.559] else if (inherits(cond, "condition")) { [18:03:16.559] if (!is.null(pattern)) { [18:03:16.559] computeRestarts <- base::computeRestarts [18:03:16.559] grepl <- base::grepl [18:03:16.559] restarts <- computeRestarts(cond) [18:03:16.559] for (restart in restarts) { [18:03:16.559] name <- restart$name [18:03:16.559] if (is.null(name)) [18:03:16.559] next [18:03:16.559] if (!grepl(pattern, name)) [18:03:16.559] next [18:03:16.559] invokeRestart(restart) [18:03:16.559] muffled <- TRUE [18:03:16.559] break [18:03:16.559] } [18:03:16.559] } [18:03:16.559] } [18:03:16.559] invisible(muffled) [18:03:16.559] } [18:03:16.559] muffleCondition(cond, pattern = "^muffle") [18:03:16.559] } [18:03:16.559] } [18:03:16.559] else { [18:03:16.559] if (TRUE) { [18:03:16.559] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.559] { [18:03:16.559] inherits <- base::inherits [18:03:16.559] invokeRestart <- base::invokeRestart [18:03:16.559] is.null <- base::is.null [18:03:16.559] muffled <- FALSE [18:03:16.559] if (inherits(cond, "message")) { [18:03:16.559] muffled <- grepl(pattern, "muffleMessage") [18:03:16.559] if (muffled) [18:03:16.559] invokeRestart("muffleMessage") [18:03:16.559] } [18:03:16.559] else if (inherits(cond, "warning")) { [18:03:16.559] muffled <- grepl(pattern, "muffleWarning") [18:03:16.559] if (muffled) [18:03:16.559] invokeRestart("muffleWarning") [18:03:16.559] } [18:03:16.559] else if (inherits(cond, "condition")) { [18:03:16.559] if (!is.null(pattern)) { [18:03:16.559] computeRestarts <- base::computeRestarts [18:03:16.559] grepl <- base::grepl [18:03:16.559] restarts <- computeRestarts(cond) [18:03:16.559] for (restart in restarts) { [18:03:16.559] name <- restart$name [18:03:16.559] if (is.null(name)) [18:03:16.559] next [18:03:16.559] if (!grepl(pattern, name)) [18:03:16.559] next [18:03:16.559] invokeRestart(restart) [18:03:16.559] muffled <- TRUE [18:03:16.559] break [18:03:16.559] } [18:03:16.559] } [18:03:16.559] } [18:03:16.559] invisible(muffled) [18:03:16.559] } [18:03:16.559] muffleCondition(cond, pattern = "^muffle") [18:03:16.559] } [18:03:16.559] } [18:03:16.559] } [18:03:16.559] })) [18:03:16.559] }, error = function(ex) { [18:03:16.559] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.559] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.559] ...future.rng), started = ...future.startTime, [18:03:16.559] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.559] version = "1.8"), class = "FutureResult") [18:03:16.559] }, finally = { [18:03:16.559] if (!identical(...future.workdir, getwd())) [18:03:16.559] setwd(...future.workdir) [18:03:16.559] { [18:03:16.559] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.559] ...future.oldOptions$nwarnings <- NULL [18:03:16.559] } [18:03:16.559] base::options(...future.oldOptions) [18:03:16.559] if (.Platform$OS.type == "windows") { [18:03:16.559] old_names <- names(...future.oldEnvVars) [18:03:16.559] envs <- base::Sys.getenv() [18:03:16.559] names <- names(envs) [18:03:16.559] common <- intersect(names, old_names) [18:03:16.559] added <- setdiff(names, old_names) [18:03:16.559] removed <- setdiff(old_names, names) [18:03:16.559] changed <- common[...future.oldEnvVars[common] != [18:03:16.559] envs[common]] [18:03:16.559] NAMES <- toupper(changed) [18:03:16.559] args <- list() [18:03:16.559] for (kk in seq_along(NAMES)) { [18:03:16.559] name <- changed[[kk]] [18:03:16.559] NAME <- NAMES[[kk]] [18:03:16.559] if (name != NAME && is.element(NAME, old_names)) [18:03:16.559] next [18:03:16.559] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.559] } [18:03:16.559] NAMES <- toupper(added) [18:03:16.559] for (kk in seq_along(NAMES)) { [18:03:16.559] name <- added[[kk]] [18:03:16.559] NAME <- NAMES[[kk]] [18:03:16.559] if (name != NAME && is.element(NAME, old_names)) [18:03:16.559] next [18:03:16.559] args[[name]] <- "" [18:03:16.559] } [18:03:16.559] NAMES <- toupper(removed) [18:03:16.559] for (kk in seq_along(NAMES)) { [18:03:16.559] name <- removed[[kk]] [18:03:16.559] NAME <- NAMES[[kk]] [18:03:16.559] if (name != NAME && is.element(NAME, old_names)) [18:03:16.559] next [18:03:16.559] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.559] } [18:03:16.559] if (length(args) > 0) [18:03:16.559] base::do.call(base::Sys.setenv, args = args) [18:03:16.559] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.559] } [18:03:16.559] else { [18:03:16.559] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.559] } [18:03:16.559] { [18:03:16.559] if (base::length(...future.futureOptionsAdded) > [18:03:16.559] 0L) { [18:03:16.559] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.559] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.559] base::options(opts) [18:03:16.559] } [18:03:16.559] { [18:03:16.559] { [18:03:16.559] base::assign(".Random.seed", c(10407L, 89962360L, [18:03:16.559] -1442612813L, 632111957L, -200088696L, 1364328500L, [18:03:16.559] 199212469L), envir = base::globalenv(), inherits = FALSE) [18:03:16.559] NULL [18:03:16.559] } [18:03:16.559] options(future.plan = NULL) [18:03:16.559] if (is.na(NA_character_)) [18:03:16.559] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.559] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.559] future::plan(list(function (..., envir = parent.frame()) [18:03:16.559] { [18:03:16.559] future <- SequentialFuture(..., envir = envir) [18:03:16.559] if (!future$lazy) [18:03:16.559] future <- run(future) [18:03:16.559] invisible(future) [18:03:16.559] }), .cleanup = FALSE, .init = FALSE) [18:03:16.559] } [18:03:16.559] } [18:03:16.559] } [18:03:16.559] }) [18:03:16.559] if (TRUE) { [18:03:16.559] base::sink(type = "output", split = FALSE) [18:03:16.559] if (TRUE) { [18:03:16.559] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.559] } [18:03:16.559] else { [18:03:16.559] ...future.result["stdout"] <- base::list(NULL) [18:03:16.559] } [18:03:16.559] base::close(...future.stdout) [18:03:16.559] ...future.stdout <- NULL [18:03:16.559] } [18:03:16.559] ...future.result$conditions <- ...future.conditions [18:03:16.559] ...future.result$finished <- base::Sys.time() [18:03:16.559] ...future.result [18:03:16.559] } [18:03:16.563] assign_globals() ... [18:03:16.563] List of 1 [18:03:16.563] $ x: int [1:4] 0 1 2 3 [18:03:16.563] - attr(*, "where")=List of 1 [18:03:16.563] ..$ x: [18:03:16.563] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.563] - attr(*, "resolved")= logi FALSE [18:03:16.563] - attr(*, "total_size")= num 64 [18:03:16.563] - attr(*, "already-done")= logi TRUE [18:03:16.566] - copied 'x' to environment [18:03:16.566] assign_globals() ... done [18:03:16.566] plan(): Setting new future strategy stack: [18:03:16.566] List of future strategies: [18:03:16.566] 1. sequential: [18:03:16.566] - args: function (..., envir = parent.frame()) [18:03:16.566] - tweaked: FALSE [18:03:16.566] - call: NULL [18:03:16.567] plan(): nbrOfWorkers() = 1 [18:03:16.568] plan(): Setting new future strategy stack: [18:03:16.568] List of future strategies: [18:03:16.568] 1. sequential: [18:03:16.568] - args: function (..., envir = parent.frame()) [18:03:16.568] - tweaked: FALSE [18:03:16.568] - call: plan(strategy) [18:03:16.569] plan(): nbrOfWorkers() = 1 [18:03:16.569] SequentialFuture started (and completed) [18:03:16.569] - Launch lazy future ... done [18:03:16.569] run() for 'SequentialFuture' ... done SequentialFuture: Label: 'fsample_4-72142' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f433aca8 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) Resolved: TRUE Value: 56 bytes of class 'integer' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.570] resolve() on list ... [18:03:16.570] recursive: 0 [18:03:16.571] length: 4 [18:03:16.571] [18:03:16.571] resolved() for 'SequentialFuture' ... [18:03:16.571] - state: 'finished' [18:03:16.571] - run: TRUE [18:03:16.571] - result: 'FutureResult' [18:03:16.572] resolved() for 'SequentialFuture' ... done [18:03:16.572] Future #1 [18:03:16.572] signalConditionsASAP(SequentialFuture, pos=1) ... [18:03:16.572] - nx: 4 [18:03:16.572] - relay: TRUE [18:03:16.573] - stdout: TRUE [18:03:16.573] - signal: TRUE [18:03:16.573] - resignal: FALSE [18:03:16.573] - force: TRUE [18:03:16.573] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.573] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:16.573] - until=1 [18:03:16.574] - relaying element #1 [18:03:16.574] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.574] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.574] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:03:16.574] length: 3 (resolved future 1) [18:03:16.575] resolved() for 'SequentialFuture' ... [18:03:16.575] - state: 'finished' [18:03:16.575] - run: TRUE [18:03:16.575] - result: 'FutureResult' [18:03:16.575] resolved() for 'SequentialFuture' ... done [18:03:16.575] Future #2 [18:03:16.576] signalConditionsASAP(SequentialFuture, pos=2) ... [18:03:16.576] - nx: 4 [18:03:16.576] - relay: TRUE [18:03:16.576] - stdout: TRUE [18:03:16.576] - signal: TRUE [18:03:16.576] - resignal: FALSE [18:03:16.577] - force: TRUE [18:03:16.577] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.577] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:16.577] - until=2 [18:03:16.577] - relaying element #2 [18:03:16.577] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.578] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.578] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:03:16.578] length: 2 (resolved future 2) [18:03:16.578] resolved() for 'SequentialFuture' ... [18:03:16.578] - state: 'finished' [18:03:16.579] - run: TRUE [18:03:16.579] - result: 'FutureResult' [18:03:16.579] resolved() for 'SequentialFuture' ... done [18:03:16.579] Future #3 [18:03:16.579] signalConditionsASAP(SequentialFuture, pos=3) ... [18:03:16.579] - nx: 4 [18:03:16.580] - relay: TRUE [18:03:16.580] - stdout: TRUE [18:03:16.580] - signal: TRUE [18:03:16.580] - resignal: FALSE [18:03:16.580] - force: TRUE [18:03:16.580] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.580] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:16.581] - until=3 [18:03:16.581] - relaying element #3 [18:03:16.581] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.581] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.581] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:03:16.582] length: 1 (resolved future 3) [18:03:16.582] resolved() for 'SequentialFuture' ... [18:03:16.582] - state: 'finished' [18:03:16.582] - run: TRUE [18:03:16.582] - result: 'FutureResult' [18:03:16.582] resolved() for 'SequentialFuture' ... done [18:03:16.583] Future #4 [18:03:16.583] signalConditionsASAP(SequentialFuture, pos=4) ... [18:03:16.583] - nx: 4 [18:03:16.583] - relay: TRUE [18:03:16.583] - stdout: TRUE [18:03:16.583] - signal: TRUE [18:03:16.584] - resignal: FALSE [18:03:16.584] - force: TRUE [18:03:16.584] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.584] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:16.584] - until=4 [18:03:16.584] - relaying element #4 [18:03:16.585] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.585] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.585] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:03:16.585] length: 0 (resolved future 4) [18:03:16.586] Relaying remaining futures [18:03:16.586] signalConditionsASAP(NULL, pos=0) ... [18:03:16.586] - nx: 4 [18:03:16.587] - relay: TRUE [18:03:16.587] - stdout: TRUE [18:03:16.587] - signal: TRUE [18:03:16.587] - resignal: FALSE [18:03:16.587] - force: TRUE [18:03:16.587] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.588] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:16.588] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.588] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:16.588] signalConditionsASAP(NULL, pos=0) ... done [18:03:16.588] resolve() on list ... DONE [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 1 [[4]] [1] 0 [18:03:16.590] getGlobalsAndPackages() ... [18:03:16.591] Searching for globals... [18:03:16.592] - globals found: [3] '{', 'sample', 'x' [18:03:16.592] Searching for globals ... DONE [18:03:16.592] Resolving globals: FALSE [18:03:16.593] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.593] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.593] - globals: [1] 'x' [18:03:16.593] [18:03:16.594] getGlobalsAndPackages() ... DONE [18:03:16.594] run() for 'Future' ... [18:03:16.594] - state: 'created' [18:03:16.594] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.595] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.595] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.595] - Field: 'label' [18:03:16.595] - Field: 'local' [18:03:16.595] - Field: 'owner' [18:03:16.596] - Field: 'envir' [18:03:16.596] - Field: 'packages' [18:03:16.596] - Field: 'gc' [18:03:16.596] - Field: 'conditions' [18:03:16.596] - Field: 'expr' [18:03:16.596] - Field: 'uuid' [18:03:16.597] - Field: 'seed' [18:03:16.597] - Field: 'version' [18:03:16.597] - Field: 'result' [18:03:16.597] - Field: 'asynchronous' [18:03:16.597] - Field: 'calls' [18:03:16.597] - Field: 'globals' [18:03:16.598] - Field: 'stdout' [18:03:16.598] - Field: 'earlySignal' [18:03:16.598] - Field: 'lazy' [18:03:16.598] - Field: 'state' [18:03:16.598] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.599] - Launch lazy future ... [18:03:16.599] Packages needed by the future expression (n = 0): [18:03:16.599] Packages needed by future strategies (n = 0): [18:03:16.599] { [18:03:16.599] { [18:03:16.599] { [18:03:16.599] ...future.startTime <- base::Sys.time() [18:03:16.599] { [18:03:16.599] { [18:03:16.599] { [18:03:16.599] { [18:03:16.599] base::local({ [18:03:16.599] has_future <- base::requireNamespace("future", [18:03:16.599] quietly = TRUE) [18:03:16.599] if (has_future) { [18:03:16.599] ns <- base::getNamespace("future") [18:03:16.599] version <- ns[[".package"]][["version"]] [18:03:16.599] if (is.null(version)) [18:03:16.599] version <- utils::packageVersion("future") [18:03:16.599] } [18:03:16.599] else { [18:03:16.599] version <- NULL [18:03:16.599] } [18:03:16.599] if (!has_future || version < "1.8.0") { [18:03:16.599] info <- base::c(r_version = base::gsub("R version ", [18:03:16.599] "", base::R.version$version.string), [18:03:16.599] platform = base::sprintf("%s (%s-bit)", [18:03:16.599] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.599] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.599] "release", "version")], collapse = " "), [18:03:16.599] hostname = base::Sys.info()[["nodename"]]) [18:03:16.599] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.599] info) [18:03:16.599] info <- base::paste(info, collapse = "; ") [18:03:16.599] if (!has_future) { [18:03:16.599] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.599] info) [18:03:16.599] } [18:03:16.599] else { [18:03:16.599] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.599] info, version) [18:03:16.599] } [18:03:16.599] base::stop(msg) [18:03:16.599] } [18:03:16.599] }) [18:03:16.599] } [18:03:16.599] options(future.plan = NULL) [18:03:16.599] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.599] future::plan("default", .cleanup = FALSE, [18:03:16.599] .init = FALSE) [18:03:16.599] } [18:03:16.599] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:16.599] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:16.599] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:16.599] } [18:03:16.599] ...future.workdir <- getwd() [18:03:16.599] } [18:03:16.599] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.599] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.599] } [18:03:16.599] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.599] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.599] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.599] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.599] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.599] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.599] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.599] base::names(...future.oldOptions)) [18:03:16.599] } [18:03:16.599] if (FALSE) { [18:03:16.599] } [18:03:16.599] else { [18:03:16.599] if (TRUE) { [18:03:16.599] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.599] open = "w") [18:03:16.599] } [18:03:16.599] else { [18:03:16.599] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.599] windows = "NUL", "/dev/null"), open = "w") [18:03:16.599] } [18:03:16.599] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.599] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.599] base::sink(type = "output", split = FALSE) [18:03:16.599] base::close(...future.stdout) [18:03:16.599] }, add = TRUE) [18:03:16.599] } [18:03:16.599] ...future.frame <- base::sys.nframe() [18:03:16.599] ...future.conditions <- base::list() [18:03:16.599] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.599] if (FALSE) { [18:03:16.599] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.599] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.599] } [18:03:16.599] ...future.result <- base::tryCatch({ [18:03:16.599] base::withCallingHandlers({ [18:03:16.599] ...future.value <- base::withVisible(base::local({ [18:03:16.599] sample(x, size = 1L) [18:03:16.599] })) [18:03:16.599] future::FutureResult(value = ...future.value$value, [18:03:16.599] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.599] ...future.rng), globalenv = if (FALSE) [18:03:16.599] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.599] ...future.globalenv.names)) [18:03:16.599] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.599] }, condition = base::local({ [18:03:16.599] c <- base::c [18:03:16.599] inherits <- base::inherits [18:03:16.599] invokeRestart <- base::invokeRestart [18:03:16.599] length <- base::length [18:03:16.599] list <- base::list [18:03:16.599] seq.int <- base::seq.int [18:03:16.599] signalCondition <- base::signalCondition [18:03:16.599] sys.calls <- base::sys.calls [18:03:16.599] `[[` <- base::`[[` [18:03:16.599] `+` <- base::`+` [18:03:16.599] `<<-` <- base::`<<-` [18:03:16.599] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.599] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.599] 3L)] [18:03:16.599] } [18:03:16.599] function(cond) { [18:03:16.599] is_error <- inherits(cond, "error") [18:03:16.599] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.599] NULL) [18:03:16.599] if (is_error) { [18:03:16.599] sessionInformation <- function() { [18:03:16.599] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.599] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.599] search = base::search(), system = base::Sys.info()) [18:03:16.599] } [18:03:16.599] ...future.conditions[[length(...future.conditions) + [18:03:16.599] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.599] cond$call), session = sessionInformation(), [18:03:16.599] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.599] signalCondition(cond) [18:03:16.599] } [18:03:16.599] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.599] "immediateCondition"))) { [18:03:16.599] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.599] ...future.conditions[[length(...future.conditions) + [18:03:16.599] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.599] if (TRUE && !signal) { [18:03:16.599] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.599] { [18:03:16.599] inherits <- base::inherits [18:03:16.599] invokeRestart <- base::invokeRestart [18:03:16.599] is.null <- base::is.null [18:03:16.599] muffled <- FALSE [18:03:16.599] if (inherits(cond, "message")) { [18:03:16.599] muffled <- grepl(pattern, "muffleMessage") [18:03:16.599] if (muffled) [18:03:16.599] invokeRestart("muffleMessage") [18:03:16.599] } [18:03:16.599] else if (inherits(cond, "warning")) { [18:03:16.599] muffled <- grepl(pattern, "muffleWarning") [18:03:16.599] if (muffled) [18:03:16.599] invokeRestart("muffleWarning") [18:03:16.599] } [18:03:16.599] else if (inherits(cond, "condition")) { [18:03:16.599] if (!is.null(pattern)) { [18:03:16.599] computeRestarts <- base::computeRestarts [18:03:16.599] grepl <- base::grepl [18:03:16.599] restarts <- computeRestarts(cond) [18:03:16.599] for (restart in restarts) { [18:03:16.599] name <- restart$name [18:03:16.599] if (is.null(name)) [18:03:16.599] next [18:03:16.599] if (!grepl(pattern, name)) [18:03:16.599] next [18:03:16.599] invokeRestart(restart) [18:03:16.599] muffled <- TRUE [18:03:16.599] break [18:03:16.599] } [18:03:16.599] } [18:03:16.599] } [18:03:16.599] invisible(muffled) [18:03:16.599] } [18:03:16.599] muffleCondition(cond, pattern = "^muffle") [18:03:16.599] } [18:03:16.599] } [18:03:16.599] else { [18:03:16.599] if (TRUE) { [18:03:16.599] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.599] { [18:03:16.599] inherits <- base::inherits [18:03:16.599] invokeRestart <- base::invokeRestart [18:03:16.599] is.null <- base::is.null [18:03:16.599] muffled <- FALSE [18:03:16.599] if (inherits(cond, "message")) { [18:03:16.599] muffled <- grepl(pattern, "muffleMessage") [18:03:16.599] if (muffled) [18:03:16.599] invokeRestart("muffleMessage") [18:03:16.599] } [18:03:16.599] else if (inherits(cond, "warning")) { [18:03:16.599] muffled <- grepl(pattern, "muffleWarning") [18:03:16.599] if (muffled) [18:03:16.599] invokeRestart("muffleWarning") [18:03:16.599] } [18:03:16.599] else if (inherits(cond, "condition")) { [18:03:16.599] if (!is.null(pattern)) { [18:03:16.599] computeRestarts <- base::computeRestarts [18:03:16.599] grepl <- base::grepl [18:03:16.599] restarts <- computeRestarts(cond) [18:03:16.599] for (restart in restarts) { [18:03:16.599] name <- restart$name [18:03:16.599] if (is.null(name)) [18:03:16.599] next [18:03:16.599] if (!grepl(pattern, name)) [18:03:16.599] next [18:03:16.599] invokeRestart(restart) [18:03:16.599] muffled <- TRUE [18:03:16.599] break [18:03:16.599] } [18:03:16.599] } [18:03:16.599] } [18:03:16.599] invisible(muffled) [18:03:16.599] } [18:03:16.599] muffleCondition(cond, pattern = "^muffle") [18:03:16.599] } [18:03:16.599] } [18:03:16.599] } [18:03:16.599] })) [18:03:16.599] }, error = function(ex) { [18:03:16.599] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.599] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.599] ...future.rng), started = ...future.startTime, [18:03:16.599] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.599] version = "1.8"), class = "FutureResult") [18:03:16.599] }, finally = { [18:03:16.599] if (!identical(...future.workdir, getwd())) [18:03:16.599] setwd(...future.workdir) [18:03:16.599] { [18:03:16.599] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.599] ...future.oldOptions$nwarnings <- NULL [18:03:16.599] } [18:03:16.599] base::options(...future.oldOptions) [18:03:16.599] if (.Platform$OS.type == "windows") { [18:03:16.599] old_names <- names(...future.oldEnvVars) [18:03:16.599] envs <- base::Sys.getenv() [18:03:16.599] names <- names(envs) [18:03:16.599] common <- intersect(names, old_names) [18:03:16.599] added <- setdiff(names, old_names) [18:03:16.599] removed <- setdiff(old_names, names) [18:03:16.599] changed <- common[...future.oldEnvVars[common] != [18:03:16.599] envs[common]] [18:03:16.599] NAMES <- toupper(changed) [18:03:16.599] args <- list() [18:03:16.599] for (kk in seq_along(NAMES)) { [18:03:16.599] name <- changed[[kk]] [18:03:16.599] NAME <- NAMES[[kk]] [18:03:16.599] if (name != NAME && is.element(NAME, old_names)) [18:03:16.599] next [18:03:16.599] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.599] } [18:03:16.599] NAMES <- toupper(added) [18:03:16.599] for (kk in seq_along(NAMES)) { [18:03:16.599] name <- added[[kk]] [18:03:16.599] NAME <- NAMES[[kk]] [18:03:16.599] if (name != NAME && is.element(NAME, old_names)) [18:03:16.599] next [18:03:16.599] args[[name]] <- "" [18:03:16.599] } [18:03:16.599] NAMES <- toupper(removed) [18:03:16.599] for (kk in seq_along(NAMES)) { [18:03:16.599] name <- removed[[kk]] [18:03:16.599] NAME <- NAMES[[kk]] [18:03:16.599] if (name != NAME && is.element(NAME, old_names)) [18:03:16.599] next [18:03:16.599] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.599] } [18:03:16.599] if (length(args) > 0) [18:03:16.599] base::do.call(base::Sys.setenv, args = args) [18:03:16.599] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.599] } [18:03:16.599] else { [18:03:16.599] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.599] } [18:03:16.599] { [18:03:16.599] if (base::length(...future.futureOptionsAdded) > [18:03:16.599] 0L) { [18:03:16.599] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.599] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.599] base::options(opts) [18:03:16.599] } [18:03:16.599] { [18:03:16.599] { [18:03:16.599] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.599] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.599] -1344458670L), envir = base::globalenv(), [18:03:16.599] inherits = FALSE) [18:03:16.599] NULL [18:03:16.599] } [18:03:16.599] options(future.plan = NULL) [18:03:16.599] if (is.na(NA_character_)) [18:03:16.599] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.599] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.599] future::plan(list(function (..., envir = parent.frame()) [18:03:16.599] { [18:03:16.599] future <- SequentialFuture(..., envir = envir) [18:03:16.599] if (!future$lazy) [18:03:16.599] future <- run(future) [18:03:16.599] invisible(future) [18:03:16.599] }), .cleanup = FALSE, .init = FALSE) [18:03:16.599] } [18:03:16.599] } [18:03:16.599] } [18:03:16.599] }) [18:03:16.599] if (TRUE) { [18:03:16.599] base::sink(type = "output", split = FALSE) [18:03:16.599] if (TRUE) { [18:03:16.599] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.599] } [18:03:16.599] else { [18:03:16.599] ...future.result["stdout"] <- base::list(NULL) [18:03:16.599] } [18:03:16.599] base::close(...future.stdout) [18:03:16.599] ...future.stdout <- NULL [18:03:16.599] } [18:03:16.599] ...future.result$conditions <- ...future.conditions [18:03:16.599] ...future.result$finished <- base::Sys.time() [18:03:16.599] ...future.result [18:03:16.599] } [18:03:16.603] assign_globals() ... [18:03:16.603] List of 1 [18:03:16.603] $ x: int [1:4] 0 1 2 3 [18:03:16.603] - attr(*, "where")=List of 1 [18:03:16.603] ..$ x: [18:03:16.603] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.603] - attr(*, "resolved")= logi FALSE [18:03:16.603] - attr(*, "total_size")= num 64 [18:03:16.603] - attr(*, "already-done")= logi TRUE [18:03:16.606] - copied 'x' to environment [18:03:16.607] assign_globals() ... done [18:03:16.607] plan(): Setting new future strategy stack: [18:03:16.607] List of future strategies: [18:03:16.607] 1. sequential: [18:03:16.607] - args: function (..., envir = parent.frame()) [18:03:16.607] - tweaked: FALSE [18:03:16.607] - call: NULL [18:03:16.608] plan(): nbrOfWorkers() = 1 [18:03:16.609] plan(): Setting new future strategy stack: [18:03:16.609] List of future strategies: [18:03:16.609] 1. sequential: [18:03:16.609] - args: function (..., envir = parent.frame()) [18:03:16.609] - tweaked: FALSE [18:03:16.609] - call: plan(strategy) [18:03:16.609] plan(): nbrOfWorkers() = 1 [18:03:16.610] SequentialFuture started (and completed) [18:03:16.610] - Launch lazy future ... done [18:03:16.610] run() for 'SequentialFuture' ... done [18:03:16.610] getGlobalsAndPackages() ... [18:03:16.611] Searching for globals... [18:03:16.612] - globals found: [3] '{', 'sample', 'x' [18:03:16.612] Searching for globals ... DONE [18:03:16.612] Resolving globals: FALSE [18:03:16.613] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.613] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.613] - globals: [1] 'x' [18:03:16.614] [18:03:16.614] getGlobalsAndPackages() ... DONE [18:03:16.614] run() for 'Future' ... [18:03:16.614] - state: 'created' [18:03:16.614] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.615] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.615] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.615] - Field: 'label' [18:03:16.615] - Field: 'local' [18:03:16.615] - Field: 'owner' [18:03:16.616] - Field: 'envir' [18:03:16.616] - Field: 'packages' [18:03:16.616] - Field: 'gc' [18:03:16.616] - Field: 'conditions' [18:03:16.616] - Field: 'expr' [18:03:16.617] - Field: 'uuid' [18:03:16.617] - Field: 'seed' [18:03:16.617] - Field: 'version' [18:03:16.617] - Field: 'result' [18:03:16.617] - Field: 'asynchronous' [18:03:16.617] - Field: 'calls' [18:03:16.618] - Field: 'globals' [18:03:16.618] - Field: 'stdout' [18:03:16.618] - Field: 'earlySignal' [18:03:16.618] - Field: 'lazy' [18:03:16.618] - Field: 'state' [18:03:16.618] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.619] - Launch lazy future ... [18:03:16.619] Packages needed by the future expression (n = 0): [18:03:16.619] Packages needed by future strategies (n = 0): [18:03:16.620] { [18:03:16.620] { [18:03:16.620] { [18:03:16.620] ...future.startTime <- base::Sys.time() [18:03:16.620] { [18:03:16.620] { [18:03:16.620] { [18:03:16.620] { [18:03:16.620] base::local({ [18:03:16.620] has_future <- base::requireNamespace("future", [18:03:16.620] quietly = TRUE) [18:03:16.620] if (has_future) { [18:03:16.620] ns <- base::getNamespace("future") [18:03:16.620] version <- ns[[".package"]][["version"]] [18:03:16.620] if (is.null(version)) [18:03:16.620] version <- utils::packageVersion("future") [18:03:16.620] } [18:03:16.620] else { [18:03:16.620] version <- NULL [18:03:16.620] } [18:03:16.620] if (!has_future || version < "1.8.0") { [18:03:16.620] info <- base::c(r_version = base::gsub("R version ", [18:03:16.620] "", base::R.version$version.string), [18:03:16.620] platform = base::sprintf("%s (%s-bit)", [18:03:16.620] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.620] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.620] "release", "version")], collapse = " "), [18:03:16.620] hostname = base::Sys.info()[["nodename"]]) [18:03:16.620] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.620] info) [18:03:16.620] info <- base::paste(info, collapse = "; ") [18:03:16.620] if (!has_future) { [18:03:16.620] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.620] info) [18:03:16.620] } [18:03:16.620] else { [18:03:16.620] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.620] info, version) [18:03:16.620] } [18:03:16.620] base::stop(msg) [18:03:16.620] } [18:03:16.620] }) [18:03:16.620] } [18:03:16.620] options(future.plan = NULL) [18:03:16.620] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.620] future::plan("default", .cleanup = FALSE, [18:03:16.620] .init = FALSE) [18:03:16.620] } [18:03:16.620] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:16.620] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:16.620] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:16.620] } [18:03:16.620] ...future.workdir <- getwd() [18:03:16.620] } [18:03:16.620] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.620] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.620] } [18:03:16.620] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.620] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.620] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.620] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.620] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.620] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.620] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.620] base::names(...future.oldOptions)) [18:03:16.620] } [18:03:16.620] if (FALSE) { [18:03:16.620] } [18:03:16.620] else { [18:03:16.620] if (TRUE) { [18:03:16.620] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.620] open = "w") [18:03:16.620] } [18:03:16.620] else { [18:03:16.620] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.620] windows = "NUL", "/dev/null"), open = "w") [18:03:16.620] } [18:03:16.620] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.620] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.620] base::sink(type = "output", split = FALSE) [18:03:16.620] base::close(...future.stdout) [18:03:16.620] }, add = TRUE) [18:03:16.620] } [18:03:16.620] ...future.frame <- base::sys.nframe() [18:03:16.620] ...future.conditions <- base::list() [18:03:16.620] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.620] if (FALSE) { [18:03:16.620] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.620] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.620] } [18:03:16.620] ...future.result <- base::tryCatch({ [18:03:16.620] base::withCallingHandlers({ [18:03:16.620] ...future.value <- base::withVisible(base::local({ [18:03:16.620] sample(x, size = 1L) [18:03:16.620] })) [18:03:16.620] future::FutureResult(value = ...future.value$value, [18:03:16.620] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.620] ...future.rng), globalenv = if (FALSE) [18:03:16.620] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.620] ...future.globalenv.names)) [18:03:16.620] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.620] }, condition = base::local({ [18:03:16.620] c <- base::c [18:03:16.620] inherits <- base::inherits [18:03:16.620] invokeRestart <- base::invokeRestart [18:03:16.620] length <- base::length [18:03:16.620] list <- base::list [18:03:16.620] seq.int <- base::seq.int [18:03:16.620] signalCondition <- base::signalCondition [18:03:16.620] sys.calls <- base::sys.calls [18:03:16.620] `[[` <- base::`[[` [18:03:16.620] `+` <- base::`+` [18:03:16.620] `<<-` <- base::`<<-` [18:03:16.620] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.620] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.620] 3L)] [18:03:16.620] } [18:03:16.620] function(cond) { [18:03:16.620] is_error <- inherits(cond, "error") [18:03:16.620] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.620] NULL) [18:03:16.620] if (is_error) { [18:03:16.620] sessionInformation <- function() { [18:03:16.620] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.620] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.620] search = base::search(), system = base::Sys.info()) [18:03:16.620] } [18:03:16.620] ...future.conditions[[length(...future.conditions) + [18:03:16.620] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.620] cond$call), session = sessionInformation(), [18:03:16.620] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.620] signalCondition(cond) [18:03:16.620] } [18:03:16.620] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.620] "immediateCondition"))) { [18:03:16.620] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.620] ...future.conditions[[length(...future.conditions) + [18:03:16.620] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.620] if (TRUE && !signal) { [18:03:16.620] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.620] { [18:03:16.620] inherits <- base::inherits [18:03:16.620] invokeRestart <- base::invokeRestart [18:03:16.620] is.null <- base::is.null [18:03:16.620] muffled <- FALSE [18:03:16.620] if (inherits(cond, "message")) { [18:03:16.620] muffled <- grepl(pattern, "muffleMessage") [18:03:16.620] if (muffled) [18:03:16.620] invokeRestart("muffleMessage") [18:03:16.620] } [18:03:16.620] else if (inherits(cond, "warning")) { [18:03:16.620] muffled <- grepl(pattern, "muffleWarning") [18:03:16.620] if (muffled) [18:03:16.620] invokeRestart("muffleWarning") [18:03:16.620] } [18:03:16.620] else if (inherits(cond, "condition")) { [18:03:16.620] if (!is.null(pattern)) { [18:03:16.620] computeRestarts <- base::computeRestarts [18:03:16.620] grepl <- base::grepl [18:03:16.620] restarts <- computeRestarts(cond) [18:03:16.620] for (restart in restarts) { [18:03:16.620] name <- restart$name [18:03:16.620] if (is.null(name)) [18:03:16.620] next [18:03:16.620] if (!grepl(pattern, name)) [18:03:16.620] next [18:03:16.620] invokeRestart(restart) [18:03:16.620] muffled <- TRUE [18:03:16.620] break [18:03:16.620] } [18:03:16.620] } [18:03:16.620] } [18:03:16.620] invisible(muffled) [18:03:16.620] } [18:03:16.620] muffleCondition(cond, pattern = "^muffle") [18:03:16.620] } [18:03:16.620] } [18:03:16.620] else { [18:03:16.620] if (TRUE) { [18:03:16.620] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.620] { [18:03:16.620] inherits <- base::inherits [18:03:16.620] invokeRestart <- base::invokeRestart [18:03:16.620] is.null <- base::is.null [18:03:16.620] muffled <- FALSE [18:03:16.620] if (inherits(cond, "message")) { [18:03:16.620] muffled <- grepl(pattern, "muffleMessage") [18:03:16.620] if (muffled) [18:03:16.620] invokeRestart("muffleMessage") [18:03:16.620] } [18:03:16.620] else if (inherits(cond, "warning")) { [18:03:16.620] muffled <- grepl(pattern, "muffleWarning") [18:03:16.620] if (muffled) [18:03:16.620] invokeRestart("muffleWarning") [18:03:16.620] } [18:03:16.620] else if (inherits(cond, "condition")) { [18:03:16.620] if (!is.null(pattern)) { [18:03:16.620] computeRestarts <- base::computeRestarts [18:03:16.620] grepl <- base::grepl [18:03:16.620] restarts <- computeRestarts(cond) [18:03:16.620] for (restart in restarts) { [18:03:16.620] name <- restart$name [18:03:16.620] if (is.null(name)) [18:03:16.620] next [18:03:16.620] if (!grepl(pattern, name)) [18:03:16.620] next [18:03:16.620] invokeRestart(restart) [18:03:16.620] muffled <- TRUE [18:03:16.620] break [18:03:16.620] } [18:03:16.620] } [18:03:16.620] } [18:03:16.620] invisible(muffled) [18:03:16.620] } [18:03:16.620] muffleCondition(cond, pattern = "^muffle") [18:03:16.620] } [18:03:16.620] } [18:03:16.620] } [18:03:16.620] })) [18:03:16.620] }, error = function(ex) { [18:03:16.620] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.620] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.620] ...future.rng), started = ...future.startTime, [18:03:16.620] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.620] version = "1.8"), class = "FutureResult") [18:03:16.620] }, finally = { [18:03:16.620] if (!identical(...future.workdir, getwd())) [18:03:16.620] setwd(...future.workdir) [18:03:16.620] { [18:03:16.620] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.620] ...future.oldOptions$nwarnings <- NULL [18:03:16.620] } [18:03:16.620] base::options(...future.oldOptions) [18:03:16.620] if (.Platform$OS.type == "windows") { [18:03:16.620] old_names <- names(...future.oldEnvVars) [18:03:16.620] envs <- base::Sys.getenv() [18:03:16.620] names <- names(envs) [18:03:16.620] common <- intersect(names, old_names) [18:03:16.620] added <- setdiff(names, old_names) [18:03:16.620] removed <- setdiff(old_names, names) [18:03:16.620] changed <- common[...future.oldEnvVars[common] != [18:03:16.620] envs[common]] [18:03:16.620] NAMES <- toupper(changed) [18:03:16.620] args <- list() [18:03:16.620] for (kk in seq_along(NAMES)) { [18:03:16.620] name <- changed[[kk]] [18:03:16.620] NAME <- NAMES[[kk]] [18:03:16.620] if (name != NAME && is.element(NAME, old_names)) [18:03:16.620] next [18:03:16.620] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.620] } [18:03:16.620] NAMES <- toupper(added) [18:03:16.620] for (kk in seq_along(NAMES)) { [18:03:16.620] name <- added[[kk]] [18:03:16.620] NAME <- NAMES[[kk]] [18:03:16.620] if (name != NAME && is.element(NAME, old_names)) [18:03:16.620] next [18:03:16.620] args[[name]] <- "" [18:03:16.620] } [18:03:16.620] NAMES <- toupper(removed) [18:03:16.620] for (kk in seq_along(NAMES)) { [18:03:16.620] name <- removed[[kk]] [18:03:16.620] NAME <- NAMES[[kk]] [18:03:16.620] if (name != NAME && is.element(NAME, old_names)) [18:03:16.620] next [18:03:16.620] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.620] } [18:03:16.620] if (length(args) > 0) [18:03:16.620] base::do.call(base::Sys.setenv, args = args) [18:03:16.620] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.620] } [18:03:16.620] else { [18:03:16.620] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.620] } [18:03:16.620] { [18:03:16.620] if (base::length(...future.futureOptionsAdded) > [18:03:16.620] 0L) { [18:03:16.620] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.620] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.620] base::options(opts) [18:03:16.620] } [18:03:16.620] { [18:03:16.620] { [18:03:16.620] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.620] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.620] -1344458670L), envir = base::globalenv(), [18:03:16.620] inherits = FALSE) [18:03:16.620] NULL [18:03:16.620] } [18:03:16.620] options(future.plan = NULL) [18:03:16.620] if (is.na(NA_character_)) [18:03:16.620] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.620] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.620] future::plan(list(function (..., envir = parent.frame()) [18:03:16.620] { [18:03:16.620] future <- SequentialFuture(..., envir = envir) [18:03:16.620] if (!future$lazy) [18:03:16.620] future <- run(future) [18:03:16.620] invisible(future) [18:03:16.620] }), .cleanup = FALSE, .init = FALSE) [18:03:16.620] } [18:03:16.620] } [18:03:16.620] } [18:03:16.620] }) [18:03:16.620] if (TRUE) { [18:03:16.620] base::sink(type = "output", split = FALSE) [18:03:16.620] if (TRUE) { [18:03:16.620] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.620] } [18:03:16.620] else { [18:03:16.620] ...future.result["stdout"] <- base::list(NULL) [18:03:16.620] } [18:03:16.620] base::close(...future.stdout) [18:03:16.620] ...future.stdout <- NULL [18:03:16.620] } [18:03:16.620] ...future.result$conditions <- ...future.conditions [18:03:16.620] ...future.result$finished <- base::Sys.time() [18:03:16.620] ...future.result [18:03:16.620] } [18:03:16.623] assign_globals() ... [18:03:16.624] List of 1 [18:03:16.624] $ x: int [1:4] 0 1 2 3 [18:03:16.624] - attr(*, "where")=List of 1 [18:03:16.624] ..$ x: [18:03:16.624] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.624] - attr(*, "resolved")= logi FALSE [18:03:16.624] - attr(*, "total_size")= num 64 [18:03:16.624] - attr(*, "already-done")= logi TRUE [18:03:16.628] - copied 'x' to environment [18:03:16.628] assign_globals() ... done [18:03:16.628] plan(): Setting new future strategy stack: [18:03:16.628] List of future strategies: [18:03:16.628] 1. sequential: [18:03:16.628] - args: function (..., envir = parent.frame()) [18:03:16.628] - tweaked: FALSE [18:03:16.628] - call: NULL [18:03:16.629] plan(): nbrOfWorkers() = 1 [18:03:16.630] plan(): Setting new future strategy stack: [18:03:16.630] List of future strategies: [18:03:16.630] 1. sequential: [18:03:16.630] - args: function (..., envir = parent.frame()) [18:03:16.630] - tweaked: FALSE [18:03:16.630] - call: plan(strategy) [18:03:16.631] plan(): nbrOfWorkers() = 1 [18:03:16.631] SequentialFuture started (and completed) [18:03:16.631] - Launch lazy future ... done [18:03:16.631] run() for 'SequentialFuture' ... done [18:03:16.632] getGlobalsAndPackages() ... [18:03:16.632] Searching for globals... [18:03:16.633] - globals found: [3] '{', 'sample', 'x' [18:03:16.633] Searching for globals ... DONE [18:03:16.633] Resolving globals: FALSE [18:03:16.634] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.634] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.635] - globals: [1] 'x' [18:03:16.635] [18:03:16.635] getGlobalsAndPackages() ... DONE [18:03:16.635] run() for 'Future' ... [18:03:16.635] - state: 'created' [18:03:16.636] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.636] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.636] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.636] - Field: 'label' [18:03:16.637] - Field: 'local' [18:03:16.637] - Field: 'owner' [18:03:16.637] - Field: 'envir' [18:03:16.637] - Field: 'packages' [18:03:16.637] - Field: 'gc' [18:03:16.637] - Field: 'conditions' [18:03:16.638] - Field: 'expr' [18:03:16.638] - Field: 'uuid' [18:03:16.638] - Field: 'seed' [18:03:16.638] - Field: 'version' [18:03:16.638] - Field: 'result' [18:03:16.638] - Field: 'asynchronous' [18:03:16.639] - Field: 'calls' [18:03:16.639] - Field: 'globals' [18:03:16.639] - Field: 'stdout' [18:03:16.639] - Field: 'earlySignal' [18:03:16.639] - Field: 'lazy' [18:03:16.639] - Field: 'state' [18:03:16.640] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.640] - Launch lazy future ... [18:03:16.640] Packages needed by the future expression (n = 0): [18:03:16.640] Packages needed by future strategies (n = 0): [18:03:16.641] { [18:03:16.641] { [18:03:16.641] { [18:03:16.641] ...future.startTime <- base::Sys.time() [18:03:16.641] { [18:03:16.641] { [18:03:16.641] { [18:03:16.641] { [18:03:16.641] base::local({ [18:03:16.641] has_future <- base::requireNamespace("future", [18:03:16.641] quietly = TRUE) [18:03:16.641] if (has_future) { [18:03:16.641] ns <- base::getNamespace("future") [18:03:16.641] version <- ns[[".package"]][["version"]] [18:03:16.641] if (is.null(version)) [18:03:16.641] version <- utils::packageVersion("future") [18:03:16.641] } [18:03:16.641] else { [18:03:16.641] version <- NULL [18:03:16.641] } [18:03:16.641] if (!has_future || version < "1.8.0") { [18:03:16.641] info <- base::c(r_version = base::gsub("R version ", [18:03:16.641] "", base::R.version$version.string), [18:03:16.641] platform = base::sprintf("%s (%s-bit)", [18:03:16.641] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.641] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.641] "release", "version")], collapse = " "), [18:03:16.641] hostname = base::Sys.info()[["nodename"]]) [18:03:16.641] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.641] info) [18:03:16.641] info <- base::paste(info, collapse = "; ") [18:03:16.641] if (!has_future) { [18:03:16.641] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.641] info) [18:03:16.641] } [18:03:16.641] else { [18:03:16.641] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.641] info, version) [18:03:16.641] } [18:03:16.641] base::stop(msg) [18:03:16.641] } [18:03:16.641] }) [18:03:16.641] } [18:03:16.641] options(future.plan = NULL) [18:03:16.641] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.641] future::plan("default", .cleanup = FALSE, [18:03:16.641] .init = FALSE) [18:03:16.641] } [18:03:16.641] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:16.641] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:16.641] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:16.641] } [18:03:16.641] ...future.workdir <- getwd() [18:03:16.641] } [18:03:16.641] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.641] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.641] } [18:03:16.641] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.641] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.641] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.641] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.641] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.641] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.641] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.641] base::names(...future.oldOptions)) [18:03:16.641] } [18:03:16.641] if (FALSE) { [18:03:16.641] } [18:03:16.641] else { [18:03:16.641] if (TRUE) { [18:03:16.641] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.641] open = "w") [18:03:16.641] } [18:03:16.641] else { [18:03:16.641] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.641] windows = "NUL", "/dev/null"), open = "w") [18:03:16.641] } [18:03:16.641] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.641] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.641] base::sink(type = "output", split = FALSE) [18:03:16.641] base::close(...future.stdout) [18:03:16.641] }, add = TRUE) [18:03:16.641] } [18:03:16.641] ...future.frame <- base::sys.nframe() [18:03:16.641] ...future.conditions <- base::list() [18:03:16.641] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.641] if (FALSE) { [18:03:16.641] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.641] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.641] } [18:03:16.641] ...future.result <- base::tryCatch({ [18:03:16.641] base::withCallingHandlers({ [18:03:16.641] ...future.value <- base::withVisible(base::local({ [18:03:16.641] sample(x, size = 1L) [18:03:16.641] })) [18:03:16.641] future::FutureResult(value = ...future.value$value, [18:03:16.641] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.641] ...future.rng), globalenv = if (FALSE) [18:03:16.641] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.641] ...future.globalenv.names)) [18:03:16.641] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.641] }, condition = base::local({ [18:03:16.641] c <- base::c [18:03:16.641] inherits <- base::inherits [18:03:16.641] invokeRestart <- base::invokeRestart [18:03:16.641] length <- base::length [18:03:16.641] list <- base::list [18:03:16.641] seq.int <- base::seq.int [18:03:16.641] signalCondition <- base::signalCondition [18:03:16.641] sys.calls <- base::sys.calls [18:03:16.641] `[[` <- base::`[[` [18:03:16.641] `+` <- base::`+` [18:03:16.641] `<<-` <- base::`<<-` [18:03:16.641] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.641] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.641] 3L)] [18:03:16.641] } [18:03:16.641] function(cond) { [18:03:16.641] is_error <- inherits(cond, "error") [18:03:16.641] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.641] NULL) [18:03:16.641] if (is_error) { [18:03:16.641] sessionInformation <- function() { [18:03:16.641] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.641] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.641] search = base::search(), system = base::Sys.info()) [18:03:16.641] } [18:03:16.641] ...future.conditions[[length(...future.conditions) + [18:03:16.641] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.641] cond$call), session = sessionInformation(), [18:03:16.641] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.641] signalCondition(cond) [18:03:16.641] } [18:03:16.641] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.641] "immediateCondition"))) { [18:03:16.641] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.641] ...future.conditions[[length(...future.conditions) + [18:03:16.641] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.641] if (TRUE && !signal) { [18:03:16.641] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.641] { [18:03:16.641] inherits <- base::inherits [18:03:16.641] invokeRestart <- base::invokeRestart [18:03:16.641] is.null <- base::is.null [18:03:16.641] muffled <- FALSE [18:03:16.641] if (inherits(cond, "message")) { [18:03:16.641] muffled <- grepl(pattern, "muffleMessage") [18:03:16.641] if (muffled) [18:03:16.641] invokeRestart("muffleMessage") [18:03:16.641] } [18:03:16.641] else if (inherits(cond, "warning")) { [18:03:16.641] muffled <- grepl(pattern, "muffleWarning") [18:03:16.641] if (muffled) [18:03:16.641] invokeRestart("muffleWarning") [18:03:16.641] } [18:03:16.641] else if (inherits(cond, "condition")) { [18:03:16.641] if (!is.null(pattern)) { [18:03:16.641] computeRestarts <- base::computeRestarts [18:03:16.641] grepl <- base::grepl [18:03:16.641] restarts <- computeRestarts(cond) [18:03:16.641] for (restart in restarts) { [18:03:16.641] name <- restart$name [18:03:16.641] if (is.null(name)) [18:03:16.641] next [18:03:16.641] if (!grepl(pattern, name)) [18:03:16.641] next [18:03:16.641] invokeRestart(restart) [18:03:16.641] muffled <- TRUE [18:03:16.641] break [18:03:16.641] } [18:03:16.641] } [18:03:16.641] } [18:03:16.641] invisible(muffled) [18:03:16.641] } [18:03:16.641] muffleCondition(cond, pattern = "^muffle") [18:03:16.641] } [18:03:16.641] } [18:03:16.641] else { [18:03:16.641] if (TRUE) { [18:03:16.641] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.641] { [18:03:16.641] inherits <- base::inherits [18:03:16.641] invokeRestart <- base::invokeRestart [18:03:16.641] is.null <- base::is.null [18:03:16.641] muffled <- FALSE [18:03:16.641] if (inherits(cond, "message")) { [18:03:16.641] muffled <- grepl(pattern, "muffleMessage") [18:03:16.641] if (muffled) [18:03:16.641] invokeRestart("muffleMessage") [18:03:16.641] } [18:03:16.641] else if (inherits(cond, "warning")) { [18:03:16.641] muffled <- grepl(pattern, "muffleWarning") [18:03:16.641] if (muffled) [18:03:16.641] invokeRestart("muffleWarning") [18:03:16.641] } [18:03:16.641] else if (inherits(cond, "condition")) { [18:03:16.641] if (!is.null(pattern)) { [18:03:16.641] computeRestarts <- base::computeRestarts [18:03:16.641] grepl <- base::grepl [18:03:16.641] restarts <- computeRestarts(cond) [18:03:16.641] for (restart in restarts) { [18:03:16.641] name <- restart$name [18:03:16.641] if (is.null(name)) [18:03:16.641] next [18:03:16.641] if (!grepl(pattern, name)) [18:03:16.641] next [18:03:16.641] invokeRestart(restart) [18:03:16.641] muffled <- TRUE [18:03:16.641] break [18:03:16.641] } [18:03:16.641] } [18:03:16.641] } [18:03:16.641] invisible(muffled) [18:03:16.641] } [18:03:16.641] muffleCondition(cond, pattern = "^muffle") [18:03:16.641] } [18:03:16.641] } [18:03:16.641] } [18:03:16.641] })) [18:03:16.641] }, error = function(ex) { [18:03:16.641] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.641] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.641] ...future.rng), started = ...future.startTime, [18:03:16.641] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.641] version = "1.8"), class = "FutureResult") [18:03:16.641] }, finally = { [18:03:16.641] if (!identical(...future.workdir, getwd())) [18:03:16.641] setwd(...future.workdir) [18:03:16.641] { [18:03:16.641] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.641] ...future.oldOptions$nwarnings <- NULL [18:03:16.641] } [18:03:16.641] base::options(...future.oldOptions) [18:03:16.641] if (.Platform$OS.type == "windows") { [18:03:16.641] old_names <- names(...future.oldEnvVars) [18:03:16.641] envs <- base::Sys.getenv() [18:03:16.641] names <- names(envs) [18:03:16.641] common <- intersect(names, old_names) [18:03:16.641] added <- setdiff(names, old_names) [18:03:16.641] removed <- setdiff(old_names, names) [18:03:16.641] changed <- common[...future.oldEnvVars[common] != [18:03:16.641] envs[common]] [18:03:16.641] NAMES <- toupper(changed) [18:03:16.641] args <- list() [18:03:16.641] for (kk in seq_along(NAMES)) { [18:03:16.641] name <- changed[[kk]] [18:03:16.641] NAME <- NAMES[[kk]] [18:03:16.641] if (name != NAME && is.element(NAME, old_names)) [18:03:16.641] next [18:03:16.641] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.641] } [18:03:16.641] NAMES <- toupper(added) [18:03:16.641] for (kk in seq_along(NAMES)) { [18:03:16.641] name <- added[[kk]] [18:03:16.641] NAME <- NAMES[[kk]] [18:03:16.641] if (name != NAME && is.element(NAME, old_names)) [18:03:16.641] next [18:03:16.641] args[[name]] <- "" [18:03:16.641] } [18:03:16.641] NAMES <- toupper(removed) [18:03:16.641] for (kk in seq_along(NAMES)) { [18:03:16.641] name <- removed[[kk]] [18:03:16.641] NAME <- NAMES[[kk]] [18:03:16.641] if (name != NAME && is.element(NAME, old_names)) [18:03:16.641] next [18:03:16.641] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.641] } [18:03:16.641] if (length(args) > 0) [18:03:16.641] base::do.call(base::Sys.setenv, args = args) [18:03:16.641] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.641] } [18:03:16.641] else { [18:03:16.641] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.641] } [18:03:16.641] { [18:03:16.641] if (base::length(...future.futureOptionsAdded) > [18:03:16.641] 0L) { [18:03:16.641] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.641] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.641] base::options(opts) [18:03:16.641] } [18:03:16.641] { [18:03:16.641] { [18:03:16.641] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.641] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.641] -1344458670L), envir = base::globalenv(), [18:03:16.641] inherits = FALSE) [18:03:16.641] NULL [18:03:16.641] } [18:03:16.641] options(future.plan = NULL) [18:03:16.641] if (is.na(NA_character_)) [18:03:16.641] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.641] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.641] future::plan(list(function (..., envir = parent.frame()) [18:03:16.641] { [18:03:16.641] future <- SequentialFuture(..., envir = envir) [18:03:16.641] if (!future$lazy) [18:03:16.641] future <- run(future) [18:03:16.641] invisible(future) [18:03:16.641] }), .cleanup = FALSE, .init = FALSE) [18:03:16.641] } [18:03:16.641] } [18:03:16.641] } [18:03:16.641] }) [18:03:16.641] if (TRUE) { [18:03:16.641] base::sink(type = "output", split = FALSE) [18:03:16.641] if (TRUE) { [18:03:16.641] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.641] } [18:03:16.641] else { [18:03:16.641] ...future.result["stdout"] <- base::list(NULL) [18:03:16.641] } [18:03:16.641] base::close(...future.stdout) [18:03:16.641] ...future.stdout <- NULL [18:03:16.641] } [18:03:16.641] ...future.result$conditions <- ...future.conditions [18:03:16.641] ...future.result$finished <- base::Sys.time() [18:03:16.641] ...future.result [18:03:16.641] } [18:03:16.645] assign_globals() ... [18:03:16.645] List of 1 [18:03:16.645] $ x: int [1:4] 0 1 2 3 [18:03:16.645] - attr(*, "where")=List of 1 [18:03:16.645] ..$ x: [18:03:16.645] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.645] - attr(*, "resolved")= logi FALSE [18:03:16.645] - attr(*, "total_size")= num 64 [18:03:16.645] - attr(*, "already-done")= logi TRUE [18:03:16.648] - copied 'x' to environment [18:03:16.648] assign_globals() ... done [18:03:16.648] plan(): Setting new future strategy stack: [18:03:16.648] List of future strategies: [18:03:16.648] 1. sequential: [18:03:16.648] - args: function (..., envir = parent.frame()) [18:03:16.648] - tweaked: FALSE [18:03:16.648] - call: NULL [18:03:16.649] plan(): nbrOfWorkers() = 1 [18:03:16.650] plan(): Setting new future strategy stack: [18:03:16.650] List of future strategies: [18:03:16.650] 1. sequential: [18:03:16.650] - args: function (..., envir = parent.frame()) [18:03:16.650] - tweaked: FALSE [18:03:16.650] - call: plan(strategy) [18:03:16.651] plan(): nbrOfWorkers() = 1 [18:03:16.651] SequentialFuture started (and completed) [18:03:16.651] - Launch lazy future ... done [18:03:16.651] run() for 'SequentialFuture' ... done [18:03:16.652] getGlobalsAndPackages() ... [18:03:16.652] Searching for globals... [18:03:16.653] - globals found: [3] '{', 'sample', 'x' [18:03:16.653] Searching for globals ... DONE [18:03:16.653] Resolving globals: FALSE [18:03:16.654] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.654] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.654] - globals: [1] 'x' [18:03:16.655] [18:03:16.655] getGlobalsAndPackages() ... DONE [18:03:16.655] run() for 'Future' ... [18:03:16.655] - state: 'created' [18:03:16.656] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.656] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.656] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.656] - Field: 'label' [18:03:16.656] - Field: 'local' [18:03:16.657] - Field: 'owner' [18:03:16.657] - Field: 'envir' [18:03:16.657] - Field: 'packages' [18:03:16.657] - Field: 'gc' [18:03:16.657] - Field: 'conditions' [18:03:16.657] - Field: 'expr' [18:03:16.658] - Field: 'uuid' [18:03:16.658] - Field: 'seed' [18:03:16.658] - Field: 'version' [18:03:16.658] - Field: 'result' [18:03:16.659] - Field: 'asynchronous' [18:03:16.659] - Field: 'calls' [18:03:16.659] - Field: 'globals' [18:03:16.659] - Field: 'stdout' [18:03:16.659] - Field: 'earlySignal' [18:03:16.659] - Field: 'lazy' [18:03:16.660] - Field: 'state' [18:03:16.660] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.660] - Launch lazy future ... [18:03:16.660] Packages needed by the future expression (n = 0): [18:03:16.660] Packages needed by future strategies (n = 0): [18:03:16.661] { [18:03:16.661] { [18:03:16.661] { [18:03:16.661] ...future.startTime <- base::Sys.time() [18:03:16.661] { [18:03:16.661] { [18:03:16.661] { [18:03:16.661] { [18:03:16.661] base::local({ [18:03:16.661] has_future <- base::requireNamespace("future", [18:03:16.661] quietly = TRUE) [18:03:16.661] if (has_future) { [18:03:16.661] ns <- base::getNamespace("future") [18:03:16.661] version <- ns[[".package"]][["version"]] [18:03:16.661] if (is.null(version)) [18:03:16.661] version <- utils::packageVersion("future") [18:03:16.661] } [18:03:16.661] else { [18:03:16.661] version <- NULL [18:03:16.661] } [18:03:16.661] if (!has_future || version < "1.8.0") { [18:03:16.661] info <- base::c(r_version = base::gsub("R version ", [18:03:16.661] "", base::R.version$version.string), [18:03:16.661] platform = base::sprintf("%s (%s-bit)", [18:03:16.661] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.661] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.661] "release", "version")], collapse = " "), [18:03:16.661] hostname = base::Sys.info()[["nodename"]]) [18:03:16.661] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.661] info) [18:03:16.661] info <- base::paste(info, collapse = "; ") [18:03:16.661] if (!has_future) { [18:03:16.661] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.661] info) [18:03:16.661] } [18:03:16.661] else { [18:03:16.661] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.661] info, version) [18:03:16.661] } [18:03:16.661] base::stop(msg) [18:03:16.661] } [18:03:16.661] }) [18:03:16.661] } [18:03:16.661] options(future.plan = NULL) [18:03:16.661] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.661] future::plan("default", .cleanup = FALSE, [18:03:16.661] .init = FALSE) [18:03:16.661] } [18:03:16.661] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:16.661] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:16.661] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:16.661] } [18:03:16.661] ...future.workdir <- getwd() [18:03:16.661] } [18:03:16.661] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.661] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.661] } [18:03:16.661] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.661] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.661] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.661] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.661] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.661] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.661] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.661] base::names(...future.oldOptions)) [18:03:16.661] } [18:03:16.661] if (FALSE) { [18:03:16.661] } [18:03:16.661] else { [18:03:16.661] if (TRUE) { [18:03:16.661] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.661] open = "w") [18:03:16.661] } [18:03:16.661] else { [18:03:16.661] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.661] windows = "NUL", "/dev/null"), open = "w") [18:03:16.661] } [18:03:16.661] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.661] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.661] base::sink(type = "output", split = FALSE) [18:03:16.661] base::close(...future.stdout) [18:03:16.661] }, add = TRUE) [18:03:16.661] } [18:03:16.661] ...future.frame <- base::sys.nframe() [18:03:16.661] ...future.conditions <- base::list() [18:03:16.661] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.661] if (FALSE) { [18:03:16.661] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.661] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.661] } [18:03:16.661] ...future.result <- base::tryCatch({ [18:03:16.661] base::withCallingHandlers({ [18:03:16.661] ...future.value <- base::withVisible(base::local({ [18:03:16.661] sample(x, size = 1L) [18:03:16.661] })) [18:03:16.661] future::FutureResult(value = ...future.value$value, [18:03:16.661] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.661] ...future.rng), globalenv = if (FALSE) [18:03:16.661] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.661] ...future.globalenv.names)) [18:03:16.661] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.661] }, condition = base::local({ [18:03:16.661] c <- base::c [18:03:16.661] inherits <- base::inherits [18:03:16.661] invokeRestart <- base::invokeRestart [18:03:16.661] length <- base::length [18:03:16.661] list <- base::list [18:03:16.661] seq.int <- base::seq.int [18:03:16.661] signalCondition <- base::signalCondition [18:03:16.661] sys.calls <- base::sys.calls [18:03:16.661] `[[` <- base::`[[` [18:03:16.661] `+` <- base::`+` [18:03:16.661] `<<-` <- base::`<<-` [18:03:16.661] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.661] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.661] 3L)] [18:03:16.661] } [18:03:16.661] function(cond) { [18:03:16.661] is_error <- inherits(cond, "error") [18:03:16.661] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.661] NULL) [18:03:16.661] if (is_error) { [18:03:16.661] sessionInformation <- function() { [18:03:16.661] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.661] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.661] search = base::search(), system = base::Sys.info()) [18:03:16.661] } [18:03:16.661] ...future.conditions[[length(...future.conditions) + [18:03:16.661] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.661] cond$call), session = sessionInformation(), [18:03:16.661] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.661] signalCondition(cond) [18:03:16.661] } [18:03:16.661] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.661] "immediateCondition"))) { [18:03:16.661] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.661] ...future.conditions[[length(...future.conditions) + [18:03:16.661] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.661] if (TRUE && !signal) { [18:03:16.661] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.661] { [18:03:16.661] inherits <- base::inherits [18:03:16.661] invokeRestart <- base::invokeRestart [18:03:16.661] is.null <- base::is.null [18:03:16.661] muffled <- FALSE [18:03:16.661] if (inherits(cond, "message")) { [18:03:16.661] muffled <- grepl(pattern, "muffleMessage") [18:03:16.661] if (muffled) [18:03:16.661] invokeRestart("muffleMessage") [18:03:16.661] } [18:03:16.661] else if (inherits(cond, "warning")) { [18:03:16.661] muffled <- grepl(pattern, "muffleWarning") [18:03:16.661] if (muffled) [18:03:16.661] invokeRestart("muffleWarning") [18:03:16.661] } [18:03:16.661] else if (inherits(cond, "condition")) { [18:03:16.661] if (!is.null(pattern)) { [18:03:16.661] computeRestarts <- base::computeRestarts [18:03:16.661] grepl <- base::grepl [18:03:16.661] restarts <- computeRestarts(cond) [18:03:16.661] for (restart in restarts) { [18:03:16.661] name <- restart$name [18:03:16.661] if (is.null(name)) [18:03:16.661] next [18:03:16.661] if (!grepl(pattern, name)) [18:03:16.661] next [18:03:16.661] invokeRestart(restart) [18:03:16.661] muffled <- TRUE [18:03:16.661] break [18:03:16.661] } [18:03:16.661] } [18:03:16.661] } [18:03:16.661] invisible(muffled) [18:03:16.661] } [18:03:16.661] muffleCondition(cond, pattern = "^muffle") [18:03:16.661] } [18:03:16.661] } [18:03:16.661] else { [18:03:16.661] if (TRUE) { [18:03:16.661] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.661] { [18:03:16.661] inherits <- base::inherits [18:03:16.661] invokeRestart <- base::invokeRestart [18:03:16.661] is.null <- base::is.null [18:03:16.661] muffled <- FALSE [18:03:16.661] if (inherits(cond, "message")) { [18:03:16.661] muffled <- grepl(pattern, "muffleMessage") [18:03:16.661] if (muffled) [18:03:16.661] invokeRestart("muffleMessage") [18:03:16.661] } [18:03:16.661] else if (inherits(cond, "warning")) { [18:03:16.661] muffled <- grepl(pattern, "muffleWarning") [18:03:16.661] if (muffled) [18:03:16.661] invokeRestart("muffleWarning") [18:03:16.661] } [18:03:16.661] else if (inherits(cond, "condition")) { [18:03:16.661] if (!is.null(pattern)) { [18:03:16.661] computeRestarts <- base::computeRestarts [18:03:16.661] grepl <- base::grepl [18:03:16.661] restarts <- computeRestarts(cond) [18:03:16.661] for (restart in restarts) { [18:03:16.661] name <- restart$name [18:03:16.661] if (is.null(name)) [18:03:16.661] next [18:03:16.661] if (!grepl(pattern, name)) [18:03:16.661] next [18:03:16.661] invokeRestart(restart) [18:03:16.661] muffled <- TRUE [18:03:16.661] break [18:03:16.661] } [18:03:16.661] } [18:03:16.661] } [18:03:16.661] invisible(muffled) [18:03:16.661] } [18:03:16.661] muffleCondition(cond, pattern = "^muffle") [18:03:16.661] } [18:03:16.661] } [18:03:16.661] } [18:03:16.661] })) [18:03:16.661] }, error = function(ex) { [18:03:16.661] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.661] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.661] ...future.rng), started = ...future.startTime, [18:03:16.661] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.661] version = "1.8"), class = "FutureResult") [18:03:16.661] }, finally = { [18:03:16.661] if (!identical(...future.workdir, getwd())) [18:03:16.661] setwd(...future.workdir) [18:03:16.661] { [18:03:16.661] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.661] ...future.oldOptions$nwarnings <- NULL [18:03:16.661] } [18:03:16.661] base::options(...future.oldOptions) [18:03:16.661] if (.Platform$OS.type == "windows") { [18:03:16.661] old_names <- names(...future.oldEnvVars) [18:03:16.661] envs <- base::Sys.getenv() [18:03:16.661] names <- names(envs) [18:03:16.661] common <- intersect(names, old_names) [18:03:16.661] added <- setdiff(names, old_names) [18:03:16.661] removed <- setdiff(old_names, names) [18:03:16.661] changed <- common[...future.oldEnvVars[common] != [18:03:16.661] envs[common]] [18:03:16.661] NAMES <- toupper(changed) [18:03:16.661] args <- list() [18:03:16.661] for (kk in seq_along(NAMES)) { [18:03:16.661] name <- changed[[kk]] [18:03:16.661] NAME <- NAMES[[kk]] [18:03:16.661] if (name != NAME && is.element(NAME, old_names)) [18:03:16.661] next [18:03:16.661] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.661] } [18:03:16.661] NAMES <- toupper(added) [18:03:16.661] for (kk in seq_along(NAMES)) { [18:03:16.661] name <- added[[kk]] [18:03:16.661] NAME <- NAMES[[kk]] [18:03:16.661] if (name != NAME && is.element(NAME, old_names)) [18:03:16.661] next [18:03:16.661] args[[name]] <- "" [18:03:16.661] } [18:03:16.661] NAMES <- toupper(removed) [18:03:16.661] for (kk in seq_along(NAMES)) { [18:03:16.661] name <- removed[[kk]] [18:03:16.661] NAME <- NAMES[[kk]] [18:03:16.661] if (name != NAME && is.element(NAME, old_names)) [18:03:16.661] next [18:03:16.661] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.661] } [18:03:16.661] if (length(args) > 0) [18:03:16.661] base::do.call(base::Sys.setenv, args = args) [18:03:16.661] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.661] } [18:03:16.661] else { [18:03:16.661] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.661] } [18:03:16.661] { [18:03:16.661] if (base::length(...future.futureOptionsAdded) > [18:03:16.661] 0L) { [18:03:16.661] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.661] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.661] base::options(opts) [18:03:16.661] } [18:03:16.661] { [18:03:16.661] { [18:03:16.661] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.661] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.661] -1344458670L), envir = base::globalenv(), [18:03:16.661] inherits = FALSE) [18:03:16.661] NULL [18:03:16.661] } [18:03:16.661] options(future.plan = NULL) [18:03:16.661] if (is.na(NA_character_)) [18:03:16.661] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.661] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.661] future::plan(list(function (..., envir = parent.frame()) [18:03:16.661] { [18:03:16.661] future <- SequentialFuture(..., envir = envir) [18:03:16.661] if (!future$lazy) [18:03:16.661] future <- run(future) [18:03:16.661] invisible(future) [18:03:16.661] }), .cleanup = FALSE, .init = FALSE) [18:03:16.661] } [18:03:16.661] } [18:03:16.661] } [18:03:16.661] }) [18:03:16.661] if (TRUE) { [18:03:16.661] base::sink(type = "output", split = FALSE) [18:03:16.661] if (TRUE) { [18:03:16.661] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.661] } [18:03:16.661] else { [18:03:16.661] ...future.result["stdout"] <- base::list(NULL) [18:03:16.661] } [18:03:16.661] base::close(...future.stdout) [18:03:16.661] ...future.stdout <- NULL [18:03:16.661] } [18:03:16.661] ...future.result$conditions <- ...future.conditions [18:03:16.661] ...future.result$finished <- base::Sys.time() [18:03:16.661] ...future.result [18:03:16.661] } [18:03:16.665] assign_globals() ... [18:03:16.665] List of 1 [18:03:16.665] $ x: int [1:4] 0 1 2 3 [18:03:16.665] - attr(*, "where")=List of 1 [18:03:16.665] ..$ x: [18:03:16.665] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.665] - attr(*, "resolved")= logi FALSE [18:03:16.665] - attr(*, "total_size")= num 64 [18:03:16.665] - attr(*, "already-done")= logi TRUE [18:03:16.669] - copied 'x' to environment [18:03:16.669] assign_globals() ... done [18:03:16.669] plan(): Setting new future strategy stack: [18:03:16.670] List of future strategies: [18:03:16.670] 1. sequential: [18:03:16.670] - args: function (..., envir = parent.frame()) [18:03:16.670] - tweaked: FALSE [18:03:16.670] - call: NULL [18:03:16.670] plan(): nbrOfWorkers() = 1 [18:03:16.671] plan(): Setting new future strategy stack: [18:03:16.671] List of future strategies: [18:03:16.671] 1. sequential: [18:03:16.671] - args: function (..., envir = parent.frame()) [18:03:16.671] - tweaked: FALSE [18:03:16.671] - call: plan(strategy) [18:03:16.672] plan(): nbrOfWorkers() = 1 [18:03:16.672] SequentialFuture started (and completed) [18:03:16.672] - Launch lazy future ... done [18:03:16.672] run() for 'SequentialFuture' ... done [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:16.674] getGlobalsAndPackages() ... [18:03:16.674] Searching for globals... [18:03:16.675] - globals found: [3] '{', 'sample', 'x' [18:03:16.675] Searching for globals ... DONE [18:03:16.675] Resolving globals: FALSE [18:03:16.676] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.676] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.676] - globals: [1] 'x' [18:03:16.677] [18:03:16.677] getGlobalsAndPackages() ... DONE [18:03:16.677] run() for 'Future' ... [18:03:16.677] - state: 'created' [18:03:16.677] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.678] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.678] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.678] - Field: 'label' [18:03:16.678] - Field: 'local' [18:03:16.678] - Field: 'owner' [18:03:16.679] - Field: 'envir' [18:03:16.679] - Field: 'packages' [18:03:16.679] - Field: 'gc' [18:03:16.679] - Field: 'conditions' [18:03:16.679] - Field: 'expr' [18:03:16.680] - Field: 'uuid' [18:03:16.680] - Field: 'seed' [18:03:16.680] - Field: 'version' [18:03:16.680] - Field: 'result' [18:03:16.680] - Field: 'asynchronous' [18:03:16.680] - Field: 'calls' [18:03:16.681] - Field: 'globals' [18:03:16.681] - Field: 'stdout' [18:03:16.681] - Field: 'earlySignal' [18:03:16.681] - Field: 'lazy' [18:03:16.681] - Field: 'state' [18:03:16.681] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.682] - Launch lazy future ... [18:03:16.682] Packages needed by the future expression (n = 0): [18:03:16.682] Packages needed by future strategies (n = 0): [18:03:16.683] { [18:03:16.683] { [18:03:16.683] { [18:03:16.683] ...future.startTime <- base::Sys.time() [18:03:16.683] { [18:03:16.683] { [18:03:16.683] { [18:03:16.683] { [18:03:16.683] base::local({ [18:03:16.683] has_future <- base::requireNamespace("future", [18:03:16.683] quietly = TRUE) [18:03:16.683] if (has_future) { [18:03:16.683] ns <- base::getNamespace("future") [18:03:16.683] version <- ns[[".package"]][["version"]] [18:03:16.683] if (is.null(version)) [18:03:16.683] version <- utils::packageVersion("future") [18:03:16.683] } [18:03:16.683] else { [18:03:16.683] version <- NULL [18:03:16.683] } [18:03:16.683] if (!has_future || version < "1.8.0") { [18:03:16.683] info <- base::c(r_version = base::gsub("R version ", [18:03:16.683] "", base::R.version$version.string), [18:03:16.683] platform = base::sprintf("%s (%s-bit)", [18:03:16.683] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.683] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.683] "release", "version")], collapse = " "), [18:03:16.683] hostname = base::Sys.info()[["nodename"]]) [18:03:16.683] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.683] info) [18:03:16.683] info <- base::paste(info, collapse = "; ") [18:03:16.683] if (!has_future) { [18:03:16.683] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.683] info) [18:03:16.683] } [18:03:16.683] else { [18:03:16.683] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.683] info, version) [18:03:16.683] } [18:03:16.683] base::stop(msg) [18:03:16.683] } [18:03:16.683] }) [18:03:16.683] } [18:03:16.683] options(future.plan = NULL) [18:03:16.683] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.683] future::plan("default", .cleanup = FALSE, [18:03:16.683] .init = FALSE) [18:03:16.683] } [18:03:16.683] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:16.683] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:16.683] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:16.683] } [18:03:16.683] ...future.workdir <- getwd() [18:03:16.683] } [18:03:16.683] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.683] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.683] } [18:03:16.683] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.683] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.683] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.683] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.683] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.683] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.683] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.683] base::names(...future.oldOptions)) [18:03:16.683] } [18:03:16.683] if (FALSE) { [18:03:16.683] } [18:03:16.683] else { [18:03:16.683] if (TRUE) { [18:03:16.683] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.683] open = "w") [18:03:16.683] } [18:03:16.683] else { [18:03:16.683] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.683] windows = "NUL", "/dev/null"), open = "w") [18:03:16.683] } [18:03:16.683] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.683] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.683] base::sink(type = "output", split = FALSE) [18:03:16.683] base::close(...future.stdout) [18:03:16.683] }, add = TRUE) [18:03:16.683] } [18:03:16.683] ...future.frame <- base::sys.nframe() [18:03:16.683] ...future.conditions <- base::list() [18:03:16.683] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.683] if (FALSE) { [18:03:16.683] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.683] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.683] } [18:03:16.683] ...future.result <- base::tryCatch({ [18:03:16.683] base::withCallingHandlers({ [18:03:16.683] ...future.value <- base::withVisible(base::local({ [18:03:16.683] sample(x, size = 1L) [18:03:16.683] })) [18:03:16.683] future::FutureResult(value = ...future.value$value, [18:03:16.683] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.683] ...future.rng), globalenv = if (FALSE) [18:03:16.683] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.683] ...future.globalenv.names)) [18:03:16.683] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.683] }, condition = base::local({ [18:03:16.683] c <- base::c [18:03:16.683] inherits <- base::inherits [18:03:16.683] invokeRestart <- base::invokeRestart [18:03:16.683] length <- base::length [18:03:16.683] list <- base::list [18:03:16.683] seq.int <- base::seq.int [18:03:16.683] signalCondition <- base::signalCondition [18:03:16.683] sys.calls <- base::sys.calls [18:03:16.683] `[[` <- base::`[[` [18:03:16.683] `+` <- base::`+` [18:03:16.683] `<<-` <- base::`<<-` [18:03:16.683] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.683] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.683] 3L)] [18:03:16.683] } [18:03:16.683] function(cond) { [18:03:16.683] is_error <- inherits(cond, "error") [18:03:16.683] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.683] NULL) [18:03:16.683] if (is_error) { [18:03:16.683] sessionInformation <- function() { [18:03:16.683] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.683] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.683] search = base::search(), system = base::Sys.info()) [18:03:16.683] } [18:03:16.683] ...future.conditions[[length(...future.conditions) + [18:03:16.683] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.683] cond$call), session = sessionInformation(), [18:03:16.683] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.683] signalCondition(cond) [18:03:16.683] } [18:03:16.683] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.683] "immediateCondition"))) { [18:03:16.683] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.683] ...future.conditions[[length(...future.conditions) + [18:03:16.683] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.683] if (TRUE && !signal) { [18:03:16.683] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.683] { [18:03:16.683] inherits <- base::inherits [18:03:16.683] invokeRestart <- base::invokeRestart [18:03:16.683] is.null <- base::is.null [18:03:16.683] muffled <- FALSE [18:03:16.683] if (inherits(cond, "message")) { [18:03:16.683] muffled <- grepl(pattern, "muffleMessage") [18:03:16.683] if (muffled) [18:03:16.683] invokeRestart("muffleMessage") [18:03:16.683] } [18:03:16.683] else if (inherits(cond, "warning")) { [18:03:16.683] muffled <- grepl(pattern, "muffleWarning") [18:03:16.683] if (muffled) [18:03:16.683] invokeRestart("muffleWarning") [18:03:16.683] } [18:03:16.683] else if (inherits(cond, "condition")) { [18:03:16.683] if (!is.null(pattern)) { [18:03:16.683] computeRestarts <- base::computeRestarts [18:03:16.683] grepl <- base::grepl [18:03:16.683] restarts <- computeRestarts(cond) [18:03:16.683] for (restart in restarts) { [18:03:16.683] name <- restart$name [18:03:16.683] if (is.null(name)) [18:03:16.683] next [18:03:16.683] if (!grepl(pattern, name)) [18:03:16.683] next [18:03:16.683] invokeRestart(restart) [18:03:16.683] muffled <- TRUE [18:03:16.683] break [18:03:16.683] } [18:03:16.683] } [18:03:16.683] } [18:03:16.683] invisible(muffled) [18:03:16.683] } [18:03:16.683] muffleCondition(cond, pattern = "^muffle") [18:03:16.683] } [18:03:16.683] } [18:03:16.683] else { [18:03:16.683] if (TRUE) { [18:03:16.683] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.683] { [18:03:16.683] inherits <- base::inherits [18:03:16.683] invokeRestart <- base::invokeRestart [18:03:16.683] is.null <- base::is.null [18:03:16.683] muffled <- FALSE [18:03:16.683] if (inherits(cond, "message")) { [18:03:16.683] muffled <- grepl(pattern, "muffleMessage") [18:03:16.683] if (muffled) [18:03:16.683] invokeRestart("muffleMessage") [18:03:16.683] } [18:03:16.683] else if (inherits(cond, "warning")) { [18:03:16.683] muffled <- grepl(pattern, "muffleWarning") [18:03:16.683] if (muffled) [18:03:16.683] invokeRestart("muffleWarning") [18:03:16.683] } [18:03:16.683] else if (inherits(cond, "condition")) { [18:03:16.683] if (!is.null(pattern)) { [18:03:16.683] computeRestarts <- base::computeRestarts [18:03:16.683] grepl <- base::grepl [18:03:16.683] restarts <- computeRestarts(cond) [18:03:16.683] for (restart in restarts) { [18:03:16.683] name <- restart$name [18:03:16.683] if (is.null(name)) [18:03:16.683] next [18:03:16.683] if (!grepl(pattern, name)) [18:03:16.683] next [18:03:16.683] invokeRestart(restart) [18:03:16.683] muffled <- TRUE [18:03:16.683] break [18:03:16.683] } [18:03:16.683] } [18:03:16.683] } [18:03:16.683] invisible(muffled) [18:03:16.683] } [18:03:16.683] muffleCondition(cond, pattern = "^muffle") [18:03:16.683] } [18:03:16.683] } [18:03:16.683] } [18:03:16.683] })) [18:03:16.683] }, error = function(ex) { [18:03:16.683] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.683] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.683] ...future.rng), started = ...future.startTime, [18:03:16.683] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.683] version = "1.8"), class = "FutureResult") [18:03:16.683] }, finally = { [18:03:16.683] if (!identical(...future.workdir, getwd())) [18:03:16.683] setwd(...future.workdir) [18:03:16.683] { [18:03:16.683] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.683] ...future.oldOptions$nwarnings <- NULL [18:03:16.683] } [18:03:16.683] base::options(...future.oldOptions) [18:03:16.683] if (.Platform$OS.type == "windows") { [18:03:16.683] old_names <- names(...future.oldEnvVars) [18:03:16.683] envs <- base::Sys.getenv() [18:03:16.683] names <- names(envs) [18:03:16.683] common <- intersect(names, old_names) [18:03:16.683] added <- setdiff(names, old_names) [18:03:16.683] removed <- setdiff(old_names, names) [18:03:16.683] changed <- common[...future.oldEnvVars[common] != [18:03:16.683] envs[common]] [18:03:16.683] NAMES <- toupper(changed) [18:03:16.683] args <- list() [18:03:16.683] for (kk in seq_along(NAMES)) { [18:03:16.683] name <- changed[[kk]] [18:03:16.683] NAME <- NAMES[[kk]] [18:03:16.683] if (name != NAME && is.element(NAME, old_names)) [18:03:16.683] next [18:03:16.683] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.683] } [18:03:16.683] NAMES <- toupper(added) [18:03:16.683] for (kk in seq_along(NAMES)) { [18:03:16.683] name <- added[[kk]] [18:03:16.683] NAME <- NAMES[[kk]] [18:03:16.683] if (name != NAME && is.element(NAME, old_names)) [18:03:16.683] next [18:03:16.683] args[[name]] <- "" [18:03:16.683] } [18:03:16.683] NAMES <- toupper(removed) [18:03:16.683] for (kk in seq_along(NAMES)) { [18:03:16.683] name <- removed[[kk]] [18:03:16.683] NAME <- NAMES[[kk]] [18:03:16.683] if (name != NAME && is.element(NAME, old_names)) [18:03:16.683] next [18:03:16.683] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.683] } [18:03:16.683] if (length(args) > 0) [18:03:16.683] base::do.call(base::Sys.setenv, args = args) [18:03:16.683] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.683] } [18:03:16.683] else { [18:03:16.683] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.683] } [18:03:16.683] { [18:03:16.683] if (base::length(...future.futureOptionsAdded) > [18:03:16.683] 0L) { [18:03:16.683] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.683] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.683] base::options(opts) [18:03:16.683] } [18:03:16.683] { [18:03:16.683] { [18:03:16.683] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.683] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.683] -1344458670L), envir = base::globalenv(), [18:03:16.683] inherits = FALSE) [18:03:16.683] NULL [18:03:16.683] } [18:03:16.683] options(future.plan = NULL) [18:03:16.683] if (is.na(NA_character_)) [18:03:16.683] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.683] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.683] future::plan(list(function (..., envir = parent.frame()) [18:03:16.683] { [18:03:16.683] future <- SequentialFuture(..., envir = envir) [18:03:16.683] if (!future$lazy) [18:03:16.683] future <- run(future) [18:03:16.683] invisible(future) [18:03:16.683] }), .cleanup = FALSE, .init = FALSE) [18:03:16.683] } [18:03:16.683] } [18:03:16.683] } [18:03:16.683] }) [18:03:16.683] if (TRUE) { [18:03:16.683] base::sink(type = "output", split = FALSE) [18:03:16.683] if (TRUE) { [18:03:16.683] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.683] } [18:03:16.683] else { [18:03:16.683] ...future.result["stdout"] <- base::list(NULL) [18:03:16.683] } [18:03:16.683] base::close(...future.stdout) [18:03:16.683] ...future.stdout <- NULL [18:03:16.683] } [18:03:16.683] ...future.result$conditions <- ...future.conditions [18:03:16.683] ...future.result$finished <- base::Sys.time() [18:03:16.683] ...future.result [18:03:16.683] } [18:03:16.687] assign_globals() ... [18:03:16.687] List of 1 [18:03:16.687] $ x: int [1:4] 0 1 2 3 [18:03:16.687] - attr(*, "where")=List of 1 [18:03:16.687] ..$ x: [18:03:16.687] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.687] - attr(*, "resolved")= logi FALSE [18:03:16.687] - attr(*, "total_size")= num 64 [18:03:16.687] - attr(*, "already-done")= logi TRUE [18:03:16.690] - copied 'x' to environment [18:03:16.690] assign_globals() ... done [18:03:16.690] plan(): Setting new future strategy stack: [18:03:16.690] List of future strategies: [18:03:16.690] 1. sequential: [18:03:16.690] - args: function (..., envir = parent.frame()) [18:03:16.690] - tweaked: FALSE [18:03:16.690] - call: NULL [18:03:16.691] plan(): nbrOfWorkers() = 1 [18:03:16.692] plan(): Setting new future strategy stack: [18:03:16.692] List of future strategies: [18:03:16.692] 1. sequential: [18:03:16.692] - args: function (..., envir = parent.frame()) [18:03:16.692] - tweaked: FALSE [18:03:16.692] - call: plan(strategy) [18:03:16.693] plan(): nbrOfWorkers() = 1 [18:03:16.693] SequentialFuture started (and completed) [18:03:16.693] - Launch lazy future ... done [18:03:16.693] run() for 'SequentialFuture' ... done [18:03:16.694] getGlobalsAndPackages() ... [18:03:16.694] Searching for globals... [18:03:16.695] - globals found: [3] '{', 'sample', 'x' [18:03:16.695] Searching for globals ... DONE [18:03:16.695] Resolving globals: FALSE [18:03:16.696] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.696] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.697] - globals: [1] 'x' [18:03:16.697] [18:03:16.697] getGlobalsAndPackages() ... DONE [18:03:16.697] run() for 'Future' ... [18:03:16.697] - state: 'created' [18:03:16.698] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.698] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.698] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.698] - Field: 'label' [18:03:16.698] - Field: 'local' [18:03:16.699] - Field: 'owner' [18:03:16.699] - Field: 'envir' [18:03:16.699] - Field: 'packages' [18:03:16.699] - Field: 'gc' [18:03:16.699] - Field: 'conditions' [18:03:16.700] - Field: 'expr' [18:03:16.700] - Field: 'uuid' [18:03:16.700] - Field: 'seed' [18:03:16.700] - Field: 'version' [18:03:16.701] - Field: 'result' [18:03:16.701] - Field: 'asynchronous' [18:03:16.701] - Field: 'calls' [18:03:16.702] - Field: 'globals' [18:03:16.702] - Field: 'stdout' [18:03:16.702] - Field: 'earlySignal' [18:03:16.702] - Field: 'lazy' [18:03:16.702] - Field: 'state' [18:03:16.703] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.703] - Launch lazy future ... [18:03:16.703] Packages needed by the future expression (n = 0): [18:03:16.703] Packages needed by future strategies (n = 0): [18:03:16.704] { [18:03:16.704] { [18:03:16.704] { [18:03:16.704] ...future.startTime <- base::Sys.time() [18:03:16.704] { [18:03:16.704] { [18:03:16.704] { [18:03:16.704] { [18:03:16.704] base::local({ [18:03:16.704] has_future <- base::requireNamespace("future", [18:03:16.704] quietly = TRUE) [18:03:16.704] if (has_future) { [18:03:16.704] ns <- base::getNamespace("future") [18:03:16.704] version <- ns[[".package"]][["version"]] [18:03:16.704] if (is.null(version)) [18:03:16.704] version <- utils::packageVersion("future") [18:03:16.704] } [18:03:16.704] else { [18:03:16.704] version <- NULL [18:03:16.704] } [18:03:16.704] if (!has_future || version < "1.8.0") { [18:03:16.704] info <- base::c(r_version = base::gsub("R version ", [18:03:16.704] "", base::R.version$version.string), [18:03:16.704] platform = base::sprintf("%s (%s-bit)", [18:03:16.704] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.704] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.704] "release", "version")], collapse = " "), [18:03:16.704] hostname = base::Sys.info()[["nodename"]]) [18:03:16.704] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.704] info) [18:03:16.704] info <- base::paste(info, collapse = "; ") [18:03:16.704] if (!has_future) { [18:03:16.704] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.704] info) [18:03:16.704] } [18:03:16.704] else { [18:03:16.704] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.704] info, version) [18:03:16.704] } [18:03:16.704] base::stop(msg) [18:03:16.704] } [18:03:16.704] }) [18:03:16.704] } [18:03:16.704] options(future.plan = NULL) [18:03:16.704] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.704] future::plan("default", .cleanup = FALSE, [18:03:16.704] .init = FALSE) [18:03:16.704] } [18:03:16.704] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:16.704] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:16.704] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:16.704] } [18:03:16.704] ...future.workdir <- getwd() [18:03:16.704] } [18:03:16.704] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.704] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.704] } [18:03:16.704] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.704] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.704] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.704] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.704] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.704] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.704] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.704] base::names(...future.oldOptions)) [18:03:16.704] } [18:03:16.704] if (FALSE) { [18:03:16.704] } [18:03:16.704] else { [18:03:16.704] if (TRUE) { [18:03:16.704] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.704] open = "w") [18:03:16.704] } [18:03:16.704] else { [18:03:16.704] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.704] windows = "NUL", "/dev/null"), open = "w") [18:03:16.704] } [18:03:16.704] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.704] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.704] base::sink(type = "output", split = FALSE) [18:03:16.704] base::close(...future.stdout) [18:03:16.704] }, add = TRUE) [18:03:16.704] } [18:03:16.704] ...future.frame <- base::sys.nframe() [18:03:16.704] ...future.conditions <- base::list() [18:03:16.704] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.704] if (FALSE) { [18:03:16.704] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.704] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.704] } [18:03:16.704] ...future.result <- base::tryCatch({ [18:03:16.704] base::withCallingHandlers({ [18:03:16.704] ...future.value <- base::withVisible(base::local({ [18:03:16.704] sample(x, size = 1L) [18:03:16.704] })) [18:03:16.704] future::FutureResult(value = ...future.value$value, [18:03:16.704] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.704] ...future.rng), globalenv = if (FALSE) [18:03:16.704] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.704] ...future.globalenv.names)) [18:03:16.704] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.704] }, condition = base::local({ [18:03:16.704] c <- base::c [18:03:16.704] inherits <- base::inherits [18:03:16.704] invokeRestart <- base::invokeRestart [18:03:16.704] length <- base::length [18:03:16.704] list <- base::list [18:03:16.704] seq.int <- base::seq.int [18:03:16.704] signalCondition <- base::signalCondition [18:03:16.704] sys.calls <- base::sys.calls [18:03:16.704] `[[` <- base::`[[` [18:03:16.704] `+` <- base::`+` [18:03:16.704] `<<-` <- base::`<<-` [18:03:16.704] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.704] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.704] 3L)] [18:03:16.704] } [18:03:16.704] function(cond) { [18:03:16.704] is_error <- inherits(cond, "error") [18:03:16.704] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.704] NULL) [18:03:16.704] if (is_error) { [18:03:16.704] sessionInformation <- function() { [18:03:16.704] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.704] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.704] search = base::search(), system = base::Sys.info()) [18:03:16.704] } [18:03:16.704] ...future.conditions[[length(...future.conditions) + [18:03:16.704] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.704] cond$call), session = sessionInformation(), [18:03:16.704] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.704] signalCondition(cond) [18:03:16.704] } [18:03:16.704] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.704] "immediateCondition"))) { [18:03:16.704] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.704] ...future.conditions[[length(...future.conditions) + [18:03:16.704] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.704] if (TRUE && !signal) { [18:03:16.704] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.704] { [18:03:16.704] inherits <- base::inherits [18:03:16.704] invokeRestart <- base::invokeRestart [18:03:16.704] is.null <- base::is.null [18:03:16.704] muffled <- FALSE [18:03:16.704] if (inherits(cond, "message")) { [18:03:16.704] muffled <- grepl(pattern, "muffleMessage") [18:03:16.704] if (muffled) [18:03:16.704] invokeRestart("muffleMessage") [18:03:16.704] } [18:03:16.704] else if (inherits(cond, "warning")) { [18:03:16.704] muffled <- grepl(pattern, "muffleWarning") [18:03:16.704] if (muffled) [18:03:16.704] invokeRestart("muffleWarning") [18:03:16.704] } [18:03:16.704] else if (inherits(cond, "condition")) { [18:03:16.704] if (!is.null(pattern)) { [18:03:16.704] computeRestarts <- base::computeRestarts [18:03:16.704] grepl <- base::grepl [18:03:16.704] restarts <- computeRestarts(cond) [18:03:16.704] for (restart in restarts) { [18:03:16.704] name <- restart$name [18:03:16.704] if (is.null(name)) [18:03:16.704] next [18:03:16.704] if (!grepl(pattern, name)) [18:03:16.704] next [18:03:16.704] invokeRestart(restart) [18:03:16.704] muffled <- TRUE [18:03:16.704] break [18:03:16.704] } [18:03:16.704] } [18:03:16.704] } [18:03:16.704] invisible(muffled) [18:03:16.704] } [18:03:16.704] muffleCondition(cond, pattern = "^muffle") [18:03:16.704] } [18:03:16.704] } [18:03:16.704] else { [18:03:16.704] if (TRUE) { [18:03:16.704] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.704] { [18:03:16.704] inherits <- base::inherits [18:03:16.704] invokeRestart <- base::invokeRestart [18:03:16.704] is.null <- base::is.null [18:03:16.704] muffled <- FALSE [18:03:16.704] if (inherits(cond, "message")) { [18:03:16.704] muffled <- grepl(pattern, "muffleMessage") [18:03:16.704] if (muffled) [18:03:16.704] invokeRestart("muffleMessage") [18:03:16.704] } [18:03:16.704] else if (inherits(cond, "warning")) { [18:03:16.704] muffled <- grepl(pattern, "muffleWarning") [18:03:16.704] if (muffled) [18:03:16.704] invokeRestart("muffleWarning") [18:03:16.704] } [18:03:16.704] else if (inherits(cond, "condition")) { [18:03:16.704] if (!is.null(pattern)) { [18:03:16.704] computeRestarts <- base::computeRestarts [18:03:16.704] grepl <- base::grepl [18:03:16.704] restarts <- computeRestarts(cond) [18:03:16.704] for (restart in restarts) { [18:03:16.704] name <- restart$name [18:03:16.704] if (is.null(name)) [18:03:16.704] next [18:03:16.704] if (!grepl(pattern, name)) [18:03:16.704] next [18:03:16.704] invokeRestart(restart) [18:03:16.704] muffled <- TRUE [18:03:16.704] break [18:03:16.704] } [18:03:16.704] } [18:03:16.704] } [18:03:16.704] invisible(muffled) [18:03:16.704] } [18:03:16.704] muffleCondition(cond, pattern = "^muffle") [18:03:16.704] } [18:03:16.704] } [18:03:16.704] } [18:03:16.704] })) [18:03:16.704] }, error = function(ex) { [18:03:16.704] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.704] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.704] ...future.rng), started = ...future.startTime, [18:03:16.704] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.704] version = "1.8"), class = "FutureResult") [18:03:16.704] }, finally = { [18:03:16.704] if (!identical(...future.workdir, getwd())) [18:03:16.704] setwd(...future.workdir) [18:03:16.704] { [18:03:16.704] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.704] ...future.oldOptions$nwarnings <- NULL [18:03:16.704] } [18:03:16.704] base::options(...future.oldOptions) [18:03:16.704] if (.Platform$OS.type == "windows") { [18:03:16.704] old_names <- names(...future.oldEnvVars) [18:03:16.704] envs <- base::Sys.getenv() [18:03:16.704] names <- names(envs) [18:03:16.704] common <- intersect(names, old_names) [18:03:16.704] added <- setdiff(names, old_names) [18:03:16.704] removed <- setdiff(old_names, names) [18:03:16.704] changed <- common[...future.oldEnvVars[common] != [18:03:16.704] envs[common]] [18:03:16.704] NAMES <- toupper(changed) [18:03:16.704] args <- list() [18:03:16.704] for (kk in seq_along(NAMES)) { [18:03:16.704] name <- changed[[kk]] [18:03:16.704] NAME <- NAMES[[kk]] [18:03:16.704] if (name != NAME && is.element(NAME, old_names)) [18:03:16.704] next [18:03:16.704] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.704] } [18:03:16.704] NAMES <- toupper(added) [18:03:16.704] for (kk in seq_along(NAMES)) { [18:03:16.704] name <- added[[kk]] [18:03:16.704] NAME <- NAMES[[kk]] [18:03:16.704] if (name != NAME && is.element(NAME, old_names)) [18:03:16.704] next [18:03:16.704] args[[name]] <- "" [18:03:16.704] } [18:03:16.704] NAMES <- toupper(removed) [18:03:16.704] for (kk in seq_along(NAMES)) { [18:03:16.704] name <- removed[[kk]] [18:03:16.704] NAME <- NAMES[[kk]] [18:03:16.704] if (name != NAME && is.element(NAME, old_names)) [18:03:16.704] next [18:03:16.704] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.704] } [18:03:16.704] if (length(args) > 0) [18:03:16.704] base::do.call(base::Sys.setenv, args = args) [18:03:16.704] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.704] } [18:03:16.704] else { [18:03:16.704] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.704] } [18:03:16.704] { [18:03:16.704] if (base::length(...future.futureOptionsAdded) > [18:03:16.704] 0L) { [18:03:16.704] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.704] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.704] base::options(opts) [18:03:16.704] } [18:03:16.704] { [18:03:16.704] { [18:03:16.704] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.704] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.704] -1344458670L), envir = base::globalenv(), [18:03:16.704] inherits = FALSE) [18:03:16.704] NULL [18:03:16.704] } [18:03:16.704] options(future.plan = NULL) [18:03:16.704] if (is.na(NA_character_)) [18:03:16.704] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.704] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.704] future::plan(list(function (..., envir = parent.frame()) [18:03:16.704] { [18:03:16.704] future <- SequentialFuture(..., envir = envir) [18:03:16.704] if (!future$lazy) [18:03:16.704] future <- run(future) [18:03:16.704] invisible(future) [18:03:16.704] }), .cleanup = FALSE, .init = FALSE) [18:03:16.704] } [18:03:16.704] } [18:03:16.704] } [18:03:16.704] }) [18:03:16.704] if (TRUE) { [18:03:16.704] base::sink(type = "output", split = FALSE) [18:03:16.704] if (TRUE) { [18:03:16.704] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.704] } [18:03:16.704] else { [18:03:16.704] ...future.result["stdout"] <- base::list(NULL) [18:03:16.704] } [18:03:16.704] base::close(...future.stdout) [18:03:16.704] ...future.stdout <- NULL [18:03:16.704] } [18:03:16.704] ...future.result$conditions <- ...future.conditions [18:03:16.704] ...future.result$finished <- base::Sys.time() [18:03:16.704] ...future.result [18:03:16.704] } [18:03:16.708] assign_globals() ... [18:03:16.708] List of 1 [18:03:16.708] $ x: int [1:4] 0 1 2 3 [18:03:16.708] - attr(*, "where")=List of 1 [18:03:16.708] ..$ x: [18:03:16.708] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.708] - attr(*, "resolved")= logi FALSE [18:03:16.708] - attr(*, "total_size")= num 64 [18:03:16.708] - attr(*, "already-done")= logi TRUE [18:03:16.711] - copied 'x' to environment [18:03:16.711] assign_globals() ... done [18:03:16.711] plan(): Setting new future strategy stack: [18:03:16.711] List of future strategies: [18:03:16.711] 1. sequential: [18:03:16.711] - args: function (..., envir = parent.frame()) [18:03:16.711] - tweaked: FALSE [18:03:16.711] - call: NULL [18:03:16.712] plan(): nbrOfWorkers() = 1 [18:03:16.713] plan(): Setting new future strategy stack: [18:03:16.713] List of future strategies: [18:03:16.713] 1. sequential: [18:03:16.713] - args: function (..., envir = parent.frame()) [18:03:16.713] - tweaked: FALSE [18:03:16.713] - call: plan(strategy) [18:03:16.714] plan(): nbrOfWorkers() = 1 [18:03:16.714] SequentialFuture started (and completed) [18:03:16.714] - Launch lazy future ... done [18:03:16.714] run() for 'SequentialFuture' ... done [18:03:16.715] getGlobalsAndPackages() ... [18:03:16.715] Searching for globals... [18:03:16.716] - globals found: [3] '{', 'sample', 'x' [18:03:16.716] Searching for globals ... DONE [18:03:16.717] Resolving globals: FALSE [18:03:16.717] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.717] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.718] - globals: [1] 'x' [18:03:16.718] [18:03:16.718] getGlobalsAndPackages() ... DONE [18:03:16.718] run() for 'Future' ... [18:03:16.718] - state: 'created' [18:03:16.719] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.719] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.719] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.719] - Field: 'label' [18:03:16.720] - Field: 'local' [18:03:16.720] - Field: 'owner' [18:03:16.720] - Field: 'envir' [18:03:16.720] - Field: 'packages' [18:03:16.720] - Field: 'gc' [18:03:16.720] - Field: 'conditions' [18:03:16.721] - Field: 'expr' [18:03:16.721] - Field: 'uuid' [18:03:16.721] - Field: 'seed' [18:03:16.721] - Field: 'version' [18:03:16.721] - Field: 'result' [18:03:16.722] - Field: 'asynchronous' [18:03:16.722] - Field: 'calls' [18:03:16.722] - Field: 'globals' [18:03:16.722] - Field: 'stdout' [18:03:16.722] - Field: 'earlySignal' [18:03:16.722] - Field: 'lazy' [18:03:16.723] - Field: 'state' [18:03:16.723] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.723] - Launch lazy future ... [18:03:16.723] Packages needed by the future expression (n = 0): [18:03:16.723] Packages needed by future strategies (n = 0): [18:03:16.724] { [18:03:16.724] { [18:03:16.724] { [18:03:16.724] ...future.startTime <- base::Sys.time() [18:03:16.724] { [18:03:16.724] { [18:03:16.724] { [18:03:16.724] { [18:03:16.724] base::local({ [18:03:16.724] has_future <- base::requireNamespace("future", [18:03:16.724] quietly = TRUE) [18:03:16.724] if (has_future) { [18:03:16.724] ns <- base::getNamespace("future") [18:03:16.724] version <- ns[[".package"]][["version"]] [18:03:16.724] if (is.null(version)) [18:03:16.724] version <- utils::packageVersion("future") [18:03:16.724] } [18:03:16.724] else { [18:03:16.724] version <- NULL [18:03:16.724] } [18:03:16.724] if (!has_future || version < "1.8.0") { [18:03:16.724] info <- base::c(r_version = base::gsub("R version ", [18:03:16.724] "", base::R.version$version.string), [18:03:16.724] platform = base::sprintf("%s (%s-bit)", [18:03:16.724] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.724] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.724] "release", "version")], collapse = " "), [18:03:16.724] hostname = base::Sys.info()[["nodename"]]) [18:03:16.724] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.724] info) [18:03:16.724] info <- base::paste(info, collapse = "; ") [18:03:16.724] if (!has_future) { [18:03:16.724] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.724] info) [18:03:16.724] } [18:03:16.724] else { [18:03:16.724] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.724] info, version) [18:03:16.724] } [18:03:16.724] base::stop(msg) [18:03:16.724] } [18:03:16.724] }) [18:03:16.724] } [18:03:16.724] options(future.plan = NULL) [18:03:16.724] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.724] future::plan("default", .cleanup = FALSE, [18:03:16.724] .init = FALSE) [18:03:16.724] } [18:03:16.724] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:16.724] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:16.724] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:16.724] } [18:03:16.724] ...future.workdir <- getwd() [18:03:16.724] } [18:03:16.724] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.724] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.724] } [18:03:16.724] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.724] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.724] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.724] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.724] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.724] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.724] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.724] base::names(...future.oldOptions)) [18:03:16.724] } [18:03:16.724] if (FALSE) { [18:03:16.724] } [18:03:16.724] else { [18:03:16.724] if (TRUE) { [18:03:16.724] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.724] open = "w") [18:03:16.724] } [18:03:16.724] else { [18:03:16.724] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.724] windows = "NUL", "/dev/null"), open = "w") [18:03:16.724] } [18:03:16.724] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.724] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.724] base::sink(type = "output", split = FALSE) [18:03:16.724] base::close(...future.stdout) [18:03:16.724] }, add = TRUE) [18:03:16.724] } [18:03:16.724] ...future.frame <- base::sys.nframe() [18:03:16.724] ...future.conditions <- base::list() [18:03:16.724] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.724] if (FALSE) { [18:03:16.724] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.724] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.724] } [18:03:16.724] ...future.result <- base::tryCatch({ [18:03:16.724] base::withCallingHandlers({ [18:03:16.724] ...future.value <- base::withVisible(base::local({ [18:03:16.724] sample(x, size = 1L) [18:03:16.724] })) [18:03:16.724] future::FutureResult(value = ...future.value$value, [18:03:16.724] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.724] ...future.rng), globalenv = if (FALSE) [18:03:16.724] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.724] ...future.globalenv.names)) [18:03:16.724] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.724] }, condition = base::local({ [18:03:16.724] c <- base::c [18:03:16.724] inherits <- base::inherits [18:03:16.724] invokeRestart <- base::invokeRestart [18:03:16.724] length <- base::length [18:03:16.724] list <- base::list [18:03:16.724] seq.int <- base::seq.int [18:03:16.724] signalCondition <- base::signalCondition [18:03:16.724] sys.calls <- base::sys.calls [18:03:16.724] `[[` <- base::`[[` [18:03:16.724] `+` <- base::`+` [18:03:16.724] `<<-` <- base::`<<-` [18:03:16.724] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.724] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.724] 3L)] [18:03:16.724] } [18:03:16.724] function(cond) { [18:03:16.724] is_error <- inherits(cond, "error") [18:03:16.724] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.724] NULL) [18:03:16.724] if (is_error) { [18:03:16.724] sessionInformation <- function() { [18:03:16.724] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.724] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.724] search = base::search(), system = base::Sys.info()) [18:03:16.724] } [18:03:16.724] ...future.conditions[[length(...future.conditions) + [18:03:16.724] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.724] cond$call), session = sessionInformation(), [18:03:16.724] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.724] signalCondition(cond) [18:03:16.724] } [18:03:16.724] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.724] "immediateCondition"))) { [18:03:16.724] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.724] ...future.conditions[[length(...future.conditions) + [18:03:16.724] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.724] if (TRUE && !signal) { [18:03:16.724] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.724] { [18:03:16.724] inherits <- base::inherits [18:03:16.724] invokeRestart <- base::invokeRestart [18:03:16.724] is.null <- base::is.null [18:03:16.724] muffled <- FALSE [18:03:16.724] if (inherits(cond, "message")) { [18:03:16.724] muffled <- grepl(pattern, "muffleMessage") [18:03:16.724] if (muffled) [18:03:16.724] invokeRestart("muffleMessage") [18:03:16.724] } [18:03:16.724] else if (inherits(cond, "warning")) { [18:03:16.724] muffled <- grepl(pattern, "muffleWarning") [18:03:16.724] if (muffled) [18:03:16.724] invokeRestart("muffleWarning") [18:03:16.724] } [18:03:16.724] else if (inherits(cond, "condition")) { [18:03:16.724] if (!is.null(pattern)) { [18:03:16.724] computeRestarts <- base::computeRestarts [18:03:16.724] grepl <- base::grepl [18:03:16.724] restarts <- computeRestarts(cond) [18:03:16.724] for (restart in restarts) { [18:03:16.724] name <- restart$name [18:03:16.724] if (is.null(name)) [18:03:16.724] next [18:03:16.724] if (!grepl(pattern, name)) [18:03:16.724] next [18:03:16.724] invokeRestart(restart) [18:03:16.724] muffled <- TRUE [18:03:16.724] break [18:03:16.724] } [18:03:16.724] } [18:03:16.724] } [18:03:16.724] invisible(muffled) [18:03:16.724] } [18:03:16.724] muffleCondition(cond, pattern = "^muffle") [18:03:16.724] } [18:03:16.724] } [18:03:16.724] else { [18:03:16.724] if (TRUE) { [18:03:16.724] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.724] { [18:03:16.724] inherits <- base::inherits [18:03:16.724] invokeRestart <- base::invokeRestart [18:03:16.724] is.null <- base::is.null [18:03:16.724] muffled <- FALSE [18:03:16.724] if (inherits(cond, "message")) { [18:03:16.724] muffled <- grepl(pattern, "muffleMessage") [18:03:16.724] if (muffled) [18:03:16.724] invokeRestart("muffleMessage") [18:03:16.724] } [18:03:16.724] else if (inherits(cond, "warning")) { [18:03:16.724] muffled <- grepl(pattern, "muffleWarning") [18:03:16.724] if (muffled) [18:03:16.724] invokeRestart("muffleWarning") [18:03:16.724] } [18:03:16.724] else if (inherits(cond, "condition")) { [18:03:16.724] if (!is.null(pattern)) { [18:03:16.724] computeRestarts <- base::computeRestarts [18:03:16.724] grepl <- base::grepl [18:03:16.724] restarts <- computeRestarts(cond) [18:03:16.724] for (restart in restarts) { [18:03:16.724] name <- restart$name [18:03:16.724] if (is.null(name)) [18:03:16.724] next [18:03:16.724] if (!grepl(pattern, name)) [18:03:16.724] next [18:03:16.724] invokeRestart(restart) [18:03:16.724] muffled <- TRUE [18:03:16.724] break [18:03:16.724] } [18:03:16.724] } [18:03:16.724] } [18:03:16.724] invisible(muffled) [18:03:16.724] } [18:03:16.724] muffleCondition(cond, pattern = "^muffle") [18:03:16.724] } [18:03:16.724] } [18:03:16.724] } [18:03:16.724] })) [18:03:16.724] }, error = function(ex) { [18:03:16.724] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.724] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.724] ...future.rng), started = ...future.startTime, [18:03:16.724] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.724] version = "1.8"), class = "FutureResult") [18:03:16.724] }, finally = { [18:03:16.724] if (!identical(...future.workdir, getwd())) [18:03:16.724] setwd(...future.workdir) [18:03:16.724] { [18:03:16.724] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.724] ...future.oldOptions$nwarnings <- NULL [18:03:16.724] } [18:03:16.724] base::options(...future.oldOptions) [18:03:16.724] if (.Platform$OS.type == "windows") { [18:03:16.724] old_names <- names(...future.oldEnvVars) [18:03:16.724] envs <- base::Sys.getenv() [18:03:16.724] names <- names(envs) [18:03:16.724] common <- intersect(names, old_names) [18:03:16.724] added <- setdiff(names, old_names) [18:03:16.724] removed <- setdiff(old_names, names) [18:03:16.724] changed <- common[...future.oldEnvVars[common] != [18:03:16.724] envs[common]] [18:03:16.724] NAMES <- toupper(changed) [18:03:16.724] args <- list() [18:03:16.724] for (kk in seq_along(NAMES)) { [18:03:16.724] name <- changed[[kk]] [18:03:16.724] NAME <- NAMES[[kk]] [18:03:16.724] if (name != NAME && is.element(NAME, old_names)) [18:03:16.724] next [18:03:16.724] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.724] } [18:03:16.724] NAMES <- toupper(added) [18:03:16.724] for (kk in seq_along(NAMES)) { [18:03:16.724] name <- added[[kk]] [18:03:16.724] NAME <- NAMES[[kk]] [18:03:16.724] if (name != NAME && is.element(NAME, old_names)) [18:03:16.724] next [18:03:16.724] args[[name]] <- "" [18:03:16.724] } [18:03:16.724] NAMES <- toupper(removed) [18:03:16.724] for (kk in seq_along(NAMES)) { [18:03:16.724] name <- removed[[kk]] [18:03:16.724] NAME <- NAMES[[kk]] [18:03:16.724] if (name != NAME && is.element(NAME, old_names)) [18:03:16.724] next [18:03:16.724] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.724] } [18:03:16.724] if (length(args) > 0) [18:03:16.724] base::do.call(base::Sys.setenv, args = args) [18:03:16.724] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.724] } [18:03:16.724] else { [18:03:16.724] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.724] } [18:03:16.724] { [18:03:16.724] if (base::length(...future.futureOptionsAdded) > [18:03:16.724] 0L) { [18:03:16.724] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.724] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.724] base::options(opts) [18:03:16.724] } [18:03:16.724] { [18:03:16.724] { [18:03:16.724] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.724] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.724] -1344458670L), envir = base::globalenv(), [18:03:16.724] inherits = FALSE) [18:03:16.724] NULL [18:03:16.724] } [18:03:16.724] options(future.plan = NULL) [18:03:16.724] if (is.na(NA_character_)) [18:03:16.724] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.724] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.724] future::plan(list(function (..., envir = parent.frame()) [18:03:16.724] { [18:03:16.724] future <- SequentialFuture(..., envir = envir) [18:03:16.724] if (!future$lazy) [18:03:16.724] future <- run(future) [18:03:16.724] invisible(future) [18:03:16.724] }), .cleanup = FALSE, .init = FALSE) [18:03:16.724] } [18:03:16.724] } [18:03:16.724] } [18:03:16.724] }) [18:03:16.724] if (TRUE) { [18:03:16.724] base::sink(type = "output", split = FALSE) [18:03:16.724] if (TRUE) { [18:03:16.724] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.724] } [18:03:16.724] else { [18:03:16.724] ...future.result["stdout"] <- base::list(NULL) [18:03:16.724] } [18:03:16.724] base::close(...future.stdout) [18:03:16.724] ...future.stdout <- NULL [18:03:16.724] } [18:03:16.724] ...future.result$conditions <- ...future.conditions [18:03:16.724] ...future.result$finished <- base::Sys.time() [18:03:16.724] ...future.result [18:03:16.724] } [18:03:16.728] assign_globals() ... [18:03:16.728] List of 1 [18:03:16.728] $ x: int [1:4] 0 1 2 3 [18:03:16.728] - attr(*, "where")=List of 1 [18:03:16.728] ..$ x: [18:03:16.728] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.728] - attr(*, "resolved")= logi FALSE [18:03:16.728] - attr(*, "total_size")= num 64 [18:03:16.728] - attr(*, "already-done")= logi TRUE [18:03:16.731] - copied 'x' to environment [18:03:16.731] assign_globals() ... done [18:03:16.731] plan(): Setting new future strategy stack: [18:03:16.731] List of future strategies: [18:03:16.731] 1. sequential: [18:03:16.731] - args: function (..., envir = parent.frame()) [18:03:16.731] - tweaked: FALSE [18:03:16.731] - call: NULL [18:03:16.732] plan(): nbrOfWorkers() = 1 [18:03:16.733] plan(): Setting new future strategy stack: [18:03:16.733] List of future strategies: [18:03:16.733] 1. sequential: [18:03:16.733] - args: function (..., envir = parent.frame()) [18:03:16.733] - tweaked: FALSE [18:03:16.733] - call: plan(strategy) [18:03:16.734] plan(): nbrOfWorkers() = 1 [18:03:16.734] SequentialFuture started (and completed) [18:03:16.734] - Launch lazy future ... done [18:03:16.734] run() for 'SequentialFuture' ... done [18:03:16.735] getGlobalsAndPackages() ... [18:03:16.735] Searching for globals... [18:03:16.736] - globals found: [3] '{', 'sample', 'x' [18:03:16.736] Searching for globals ... DONE [18:03:16.736] Resolving globals: FALSE [18:03:16.737] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.737] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.738] - globals: [1] 'x' [18:03:16.738] [18:03:16.739] getGlobalsAndPackages() ... DONE [18:03:16.739] run() for 'Future' ... [18:03:16.739] - state: 'created' [18:03:16.740] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.740] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.740] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.740] - Field: 'label' [18:03:16.741] - Field: 'local' [18:03:16.741] - Field: 'owner' [18:03:16.741] - Field: 'envir' [18:03:16.741] - Field: 'packages' [18:03:16.741] - Field: 'gc' [18:03:16.741] - Field: 'conditions' [18:03:16.742] - Field: 'expr' [18:03:16.742] - Field: 'uuid' [18:03:16.742] - Field: 'seed' [18:03:16.742] - Field: 'version' [18:03:16.742] - Field: 'result' [18:03:16.742] - Field: 'asynchronous' [18:03:16.743] - Field: 'calls' [18:03:16.743] - Field: 'globals' [18:03:16.743] - Field: 'stdout' [18:03:16.743] - Field: 'earlySignal' [18:03:16.743] - Field: 'lazy' [18:03:16.744] - Field: 'state' [18:03:16.744] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.744] - Launch lazy future ... [18:03:16.744] Packages needed by the future expression (n = 0): [18:03:16.744] Packages needed by future strategies (n = 0): [18:03:16.745] { [18:03:16.745] { [18:03:16.745] { [18:03:16.745] ...future.startTime <- base::Sys.time() [18:03:16.745] { [18:03:16.745] { [18:03:16.745] { [18:03:16.745] { [18:03:16.745] base::local({ [18:03:16.745] has_future <- base::requireNamespace("future", [18:03:16.745] quietly = TRUE) [18:03:16.745] if (has_future) { [18:03:16.745] ns <- base::getNamespace("future") [18:03:16.745] version <- ns[[".package"]][["version"]] [18:03:16.745] if (is.null(version)) [18:03:16.745] version <- utils::packageVersion("future") [18:03:16.745] } [18:03:16.745] else { [18:03:16.745] version <- NULL [18:03:16.745] } [18:03:16.745] if (!has_future || version < "1.8.0") { [18:03:16.745] info <- base::c(r_version = base::gsub("R version ", [18:03:16.745] "", base::R.version$version.string), [18:03:16.745] platform = base::sprintf("%s (%s-bit)", [18:03:16.745] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.745] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.745] "release", "version")], collapse = " "), [18:03:16.745] hostname = base::Sys.info()[["nodename"]]) [18:03:16.745] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.745] info) [18:03:16.745] info <- base::paste(info, collapse = "; ") [18:03:16.745] if (!has_future) { [18:03:16.745] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.745] info) [18:03:16.745] } [18:03:16.745] else { [18:03:16.745] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.745] info, version) [18:03:16.745] } [18:03:16.745] base::stop(msg) [18:03:16.745] } [18:03:16.745] }) [18:03:16.745] } [18:03:16.745] options(future.plan = NULL) [18:03:16.745] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.745] future::plan("default", .cleanup = FALSE, [18:03:16.745] .init = FALSE) [18:03:16.745] } [18:03:16.745] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:16.745] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:16.745] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:16.745] } [18:03:16.745] ...future.workdir <- getwd() [18:03:16.745] } [18:03:16.745] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.745] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.745] } [18:03:16.745] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.745] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.745] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.745] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.745] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.745] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.745] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.745] base::names(...future.oldOptions)) [18:03:16.745] } [18:03:16.745] if (FALSE) { [18:03:16.745] } [18:03:16.745] else { [18:03:16.745] if (TRUE) { [18:03:16.745] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.745] open = "w") [18:03:16.745] } [18:03:16.745] else { [18:03:16.745] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.745] windows = "NUL", "/dev/null"), open = "w") [18:03:16.745] } [18:03:16.745] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.745] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.745] base::sink(type = "output", split = FALSE) [18:03:16.745] base::close(...future.stdout) [18:03:16.745] }, add = TRUE) [18:03:16.745] } [18:03:16.745] ...future.frame <- base::sys.nframe() [18:03:16.745] ...future.conditions <- base::list() [18:03:16.745] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.745] if (FALSE) { [18:03:16.745] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.745] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.745] } [18:03:16.745] ...future.result <- base::tryCatch({ [18:03:16.745] base::withCallingHandlers({ [18:03:16.745] ...future.value <- base::withVisible(base::local({ [18:03:16.745] sample(x, size = 1L) [18:03:16.745] })) [18:03:16.745] future::FutureResult(value = ...future.value$value, [18:03:16.745] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.745] ...future.rng), globalenv = if (FALSE) [18:03:16.745] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.745] ...future.globalenv.names)) [18:03:16.745] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.745] }, condition = base::local({ [18:03:16.745] c <- base::c [18:03:16.745] inherits <- base::inherits [18:03:16.745] invokeRestart <- base::invokeRestart [18:03:16.745] length <- base::length [18:03:16.745] list <- base::list [18:03:16.745] seq.int <- base::seq.int [18:03:16.745] signalCondition <- base::signalCondition [18:03:16.745] sys.calls <- base::sys.calls [18:03:16.745] `[[` <- base::`[[` [18:03:16.745] `+` <- base::`+` [18:03:16.745] `<<-` <- base::`<<-` [18:03:16.745] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.745] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.745] 3L)] [18:03:16.745] } [18:03:16.745] function(cond) { [18:03:16.745] is_error <- inherits(cond, "error") [18:03:16.745] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.745] NULL) [18:03:16.745] if (is_error) { [18:03:16.745] sessionInformation <- function() { [18:03:16.745] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.745] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.745] search = base::search(), system = base::Sys.info()) [18:03:16.745] } [18:03:16.745] ...future.conditions[[length(...future.conditions) + [18:03:16.745] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.745] cond$call), session = sessionInformation(), [18:03:16.745] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.745] signalCondition(cond) [18:03:16.745] } [18:03:16.745] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.745] "immediateCondition"))) { [18:03:16.745] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.745] ...future.conditions[[length(...future.conditions) + [18:03:16.745] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.745] if (TRUE && !signal) { [18:03:16.745] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.745] { [18:03:16.745] inherits <- base::inherits [18:03:16.745] invokeRestart <- base::invokeRestart [18:03:16.745] is.null <- base::is.null [18:03:16.745] muffled <- FALSE [18:03:16.745] if (inherits(cond, "message")) { [18:03:16.745] muffled <- grepl(pattern, "muffleMessage") [18:03:16.745] if (muffled) [18:03:16.745] invokeRestart("muffleMessage") [18:03:16.745] } [18:03:16.745] else if (inherits(cond, "warning")) { [18:03:16.745] muffled <- grepl(pattern, "muffleWarning") [18:03:16.745] if (muffled) [18:03:16.745] invokeRestart("muffleWarning") [18:03:16.745] } [18:03:16.745] else if (inherits(cond, "condition")) { [18:03:16.745] if (!is.null(pattern)) { [18:03:16.745] computeRestarts <- base::computeRestarts [18:03:16.745] grepl <- base::grepl [18:03:16.745] restarts <- computeRestarts(cond) [18:03:16.745] for (restart in restarts) { [18:03:16.745] name <- restart$name [18:03:16.745] if (is.null(name)) [18:03:16.745] next [18:03:16.745] if (!grepl(pattern, name)) [18:03:16.745] next [18:03:16.745] invokeRestart(restart) [18:03:16.745] muffled <- TRUE [18:03:16.745] break [18:03:16.745] } [18:03:16.745] } [18:03:16.745] } [18:03:16.745] invisible(muffled) [18:03:16.745] } [18:03:16.745] muffleCondition(cond, pattern = "^muffle") [18:03:16.745] } [18:03:16.745] } [18:03:16.745] else { [18:03:16.745] if (TRUE) { [18:03:16.745] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.745] { [18:03:16.745] inherits <- base::inherits [18:03:16.745] invokeRestart <- base::invokeRestart [18:03:16.745] is.null <- base::is.null [18:03:16.745] muffled <- FALSE [18:03:16.745] if (inherits(cond, "message")) { [18:03:16.745] muffled <- grepl(pattern, "muffleMessage") [18:03:16.745] if (muffled) [18:03:16.745] invokeRestart("muffleMessage") [18:03:16.745] } [18:03:16.745] else if (inherits(cond, "warning")) { [18:03:16.745] muffled <- grepl(pattern, "muffleWarning") [18:03:16.745] if (muffled) [18:03:16.745] invokeRestart("muffleWarning") [18:03:16.745] } [18:03:16.745] else if (inherits(cond, "condition")) { [18:03:16.745] if (!is.null(pattern)) { [18:03:16.745] computeRestarts <- base::computeRestarts [18:03:16.745] grepl <- base::grepl [18:03:16.745] restarts <- computeRestarts(cond) [18:03:16.745] for (restart in restarts) { [18:03:16.745] name <- restart$name [18:03:16.745] if (is.null(name)) [18:03:16.745] next [18:03:16.745] if (!grepl(pattern, name)) [18:03:16.745] next [18:03:16.745] invokeRestart(restart) [18:03:16.745] muffled <- TRUE [18:03:16.745] break [18:03:16.745] } [18:03:16.745] } [18:03:16.745] } [18:03:16.745] invisible(muffled) [18:03:16.745] } [18:03:16.745] muffleCondition(cond, pattern = "^muffle") [18:03:16.745] } [18:03:16.745] } [18:03:16.745] } [18:03:16.745] })) [18:03:16.745] }, error = function(ex) { [18:03:16.745] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.745] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.745] ...future.rng), started = ...future.startTime, [18:03:16.745] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.745] version = "1.8"), class = "FutureResult") [18:03:16.745] }, finally = { [18:03:16.745] if (!identical(...future.workdir, getwd())) [18:03:16.745] setwd(...future.workdir) [18:03:16.745] { [18:03:16.745] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.745] ...future.oldOptions$nwarnings <- NULL [18:03:16.745] } [18:03:16.745] base::options(...future.oldOptions) [18:03:16.745] if (.Platform$OS.type == "windows") { [18:03:16.745] old_names <- names(...future.oldEnvVars) [18:03:16.745] envs <- base::Sys.getenv() [18:03:16.745] names <- names(envs) [18:03:16.745] common <- intersect(names, old_names) [18:03:16.745] added <- setdiff(names, old_names) [18:03:16.745] removed <- setdiff(old_names, names) [18:03:16.745] changed <- common[...future.oldEnvVars[common] != [18:03:16.745] envs[common]] [18:03:16.745] NAMES <- toupper(changed) [18:03:16.745] args <- list() [18:03:16.745] for (kk in seq_along(NAMES)) { [18:03:16.745] name <- changed[[kk]] [18:03:16.745] NAME <- NAMES[[kk]] [18:03:16.745] if (name != NAME && is.element(NAME, old_names)) [18:03:16.745] next [18:03:16.745] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.745] } [18:03:16.745] NAMES <- toupper(added) [18:03:16.745] for (kk in seq_along(NAMES)) { [18:03:16.745] name <- added[[kk]] [18:03:16.745] NAME <- NAMES[[kk]] [18:03:16.745] if (name != NAME && is.element(NAME, old_names)) [18:03:16.745] next [18:03:16.745] args[[name]] <- "" [18:03:16.745] } [18:03:16.745] NAMES <- toupper(removed) [18:03:16.745] for (kk in seq_along(NAMES)) { [18:03:16.745] name <- removed[[kk]] [18:03:16.745] NAME <- NAMES[[kk]] [18:03:16.745] if (name != NAME && is.element(NAME, old_names)) [18:03:16.745] next [18:03:16.745] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.745] } [18:03:16.745] if (length(args) > 0) [18:03:16.745] base::do.call(base::Sys.setenv, args = args) [18:03:16.745] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.745] } [18:03:16.745] else { [18:03:16.745] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.745] } [18:03:16.745] { [18:03:16.745] if (base::length(...future.futureOptionsAdded) > [18:03:16.745] 0L) { [18:03:16.745] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.745] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.745] base::options(opts) [18:03:16.745] } [18:03:16.745] { [18:03:16.745] { [18:03:16.745] base::assign(".Random.seed", c(10407L, -2133391687L, [18:03:16.745] 507561766L, 1260545903L, 1362917092L, -1772566379L, [18:03:16.745] -1344458670L), envir = base::globalenv(), [18:03:16.745] inherits = FALSE) [18:03:16.745] NULL [18:03:16.745] } [18:03:16.745] options(future.plan = NULL) [18:03:16.745] if (is.na(NA_character_)) [18:03:16.745] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.745] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.745] future::plan(list(function (..., envir = parent.frame()) [18:03:16.745] { [18:03:16.745] future <- SequentialFuture(..., envir = envir) [18:03:16.745] if (!future$lazy) [18:03:16.745] future <- run(future) [18:03:16.745] invisible(future) [18:03:16.745] }), .cleanup = FALSE, .init = FALSE) [18:03:16.745] } [18:03:16.745] } [18:03:16.745] } [18:03:16.745] }) [18:03:16.745] if (TRUE) { [18:03:16.745] base::sink(type = "output", split = FALSE) [18:03:16.745] if (TRUE) { [18:03:16.745] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.745] } [18:03:16.745] else { [18:03:16.745] ...future.result["stdout"] <- base::list(NULL) [18:03:16.745] } [18:03:16.745] base::close(...future.stdout) [18:03:16.745] ...future.stdout <- NULL [18:03:16.745] } [18:03:16.745] ...future.result$conditions <- ...future.conditions [18:03:16.745] ...future.result$finished <- base::Sys.time() [18:03:16.745] ...future.result [18:03:16.745] } [18:03:16.749] assign_globals() ... [18:03:16.749] List of 1 [18:03:16.749] $ x: int [1:4] 0 1 2 3 [18:03:16.749] - attr(*, "where")=List of 1 [18:03:16.749] ..$ x: [18:03:16.749] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.749] - attr(*, "resolved")= logi FALSE [18:03:16.749] - attr(*, "total_size")= num 64 [18:03:16.749] - attr(*, "already-done")= logi TRUE [18:03:16.752] - copied 'x' to environment [18:03:16.752] assign_globals() ... done [18:03:16.753] plan(): Setting new future strategy stack: [18:03:16.753] List of future strategies: [18:03:16.753] 1. sequential: [18:03:16.753] - args: function (..., envir = parent.frame()) [18:03:16.753] - tweaked: FALSE [18:03:16.753] - call: NULL [18:03:16.753] plan(): nbrOfWorkers() = 1 [18:03:16.754] plan(): Setting new future strategy stack: [18:03:16.755] List of future strategies: [18:03:16.755] 1. sequential: [18:03:16.755] - args: function (..., envir = parent.frame()) [18:03:16.755] - tweaked: FALSE [18:03:16.755] - call: plan(strategy) [18:03:16.755] plan(): nbrOfWorkers() = 1 [18:03:16.755] SequentialFuture started (and completed) [18:03:16.756] - Launch lazy future ... done [18:03:16.756] run() for 'SequentialFuture' ... done [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:16.757] getGlobalsAndPackages() ... [18:03:16.757] Searching for globals... [18:03:16.758] - globals found: [3] '{', 'sample', 'x' [18:03:16.758] Searching for globals ... DONE [18:03:16.759] Resolving globals: FALSE [18:03:16.759] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.760] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.760] - globals: [1] 'x' [18:03:16.760] [18:03:16.760] getGlobalsAndPackages() ... DONE [18:03:16.760] run() for 'Future' ... [18:03:16.761] - state: 'created' [18:03:16.761] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.761] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.761] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.762] - Field: 'label' [18:03:16.762] - Field: 'local' [18:03:16.762] - Field: 'owner' [18:03:16.762] - Field: 'envir' [18:03:16.762] - Field: 'packages' [18:03:16.762] - Field: 'gc' [18:03:16.763] - Field: 'conditions' [18:03:16.763] - Field: 'expr' [18:03:16.763] - Field: 'uuid' [18:03:16.763] - Field: 'seed' [18:03:16.763] - Field: 'version' [18:03:16.763] - Field: 'result' [18:03:16.764] - Field: 'asynchronous' [18:03:16.764] - Field: 'calls' [18:03:16.764] - Field: 'globals' [18:03:16.764] - Field: 'stdout' [18:03:16.764] - Field: 'earlySignal' [18:03:16.765] - Field: 'lazy' [18:03:16.765] - Field: 'state' [18:03:16.765] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.765] - Launch lazy future ... [18:03:16.765] Packages needed by the future expression (n = 0): [18:03:16.765] Packages needed by future strategies (n = 0): [18:03:16.766] { [18:03:16.766] { [18:03:16.766] { [18:03:16.766] ...future.startTime <- base::Sys.time() [18:03:16.766] { [18:03:16.766] { [18:03:16.766] { [18:03:16.766] base::local({ [18:03:16.766] has_future <- base::requireNamespace("future", [18:03:16.766] quietly = TRUE) [18:03:16.766] if (has_future) { [18:03:16.766] ns <- base::getNamespace("future") [18:03:16.766] version <- ns[[".package"]][["version"]] [18:03:16.766] if (is.null(version)) [18:03:16.766] version <- utils::packageVersion("future") [18:03:16.766] } [18:03:16.766] else { [18:03:16.766] version <- NULL [18:03:16.766] } [18:03:16.766] if (!has_future || version < "1.8.0") { [18:03:16.766] info <- base::c(r_version = base::gsub("R version ", [18:03:16.766] "", base::R.version$version.string), [18:03:16.766] platform = base::sprintf("%s (%s-bit)", [18:03:16.766] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.766] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.766] "release", "version")], collapse = " "), [18:03:16.766] hostname = base::Sys.info()[["nodename"]]) [18:03:16.766] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.766] info) [18:03:16.766] info <- base::paste(info, collapse = "; ") [18:03:16.766] if (!has_future) { [18:03:16.766] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.766] info) [18:03:16.766] } [18:03:16.766] else { [18:03:16.766] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.766] info, version) [18:03:16.766] } [18:03:16.766] base::stop(msg) [18:03:16.766] } [18:03:16.766] }) [18:03:16.766] } [18:03:16.766] options(future.plan = NULL) [18:03:16.766] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.766] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.766] } [18:03:16.766] ...future.workdir <- getwd() [18:03:16.766] } [18:03:16.766] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.766] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.766] } [18:03:16.766] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.766] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.766] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.766] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.766] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.766] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.766] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.766] base::names(...future.oldOptions)) [18:03:16.766] } [18:03:16.766] if (FALSE) { [18:03:16.766] } [18:03:16.766] else { [18:03:16.766] if (TRUE) { [18:03:16.766] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.766] open = "w") [18:03:16.766] } [18:03:16.766] else { [18:03:16.766] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.766] windows = "NUL", "/dev/null"), open = "w") [18:03:16.766] } [18:03:16.766] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.766] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.766] base::sink(type = "output", split = FALSE) [18:03:16.766] base::close(...future.stdout) [18:03:16.766] }, add = TRUE) [18:03:16.766] } [18:03:16.766] ...future.frame <- base::sys.nframe() [18:03:16.766] ...future.conditions <- base::list() [18:03:16.766] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.766] if (FALSE) { [18:03:16.766] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.766] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.766] } [18:03:16.766] ...future.result <- base::tryCatch({ [18:03:16.766] base::withCallingHandlers({ [18:03:16.766] ...future.value <- base::withVisible(base::local({ [18:03:16.766] sample(x, size = 1L) [18:03:16.766] })) [18:03:16.766] future::FutureResult(value = ...future.value$value, [18:03:16.766] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.766] ...future.rng), globalenv = if (FALSE) [18:03:16.766] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.766] ...future.globalenv.names)) [18:03:16.766] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.766] }, condition = base::local({ [18:03:16.766] c <- base::c [18:03:16.766] inherits <- base::inherits [18:03:16.766] invokeRestart <- base::invokeRestart [18:03:16.766] length <- base::length [18:03:16.766] list <- base::list [18:03:16.766] seq.int <- base::seq.int [18:03:16.766] signalCondition <- base::signalCondition [18:03:16.766] sys.calls <- base::sys.calls [18:03:16.766] `[[` <- base::`[[` [18:03:16.766] `+` <- base::`+` [18:03:16.766] `<<-` <- base::`<<-` [18:03:16.766] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.766] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.766] 3L)] [18:03:16.766] } [18:03:16.766] function(cond) { [18:03:16.766] is_error <- inherits(cond, "error") [18:03:16.766] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.766] NULL) [18:03:16.766] if (is_error) { [18:03:16.766] sessionInformation <- function() { [18:03:16.766] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.766] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.766] search = base::search(), system = base::Sys.info()) [18:03:16.766] } [18:03:16.766] ...future.conditions[[length(...future.conditions) + [18:03:16.766] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.766] cond$call), session = sessionInformation(), [18:03:16.766] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.766] signalCondition(cond) [18:03:16.766] } [18:03:16.766] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.766] "immediateCondition"))) { [18:03:16.766] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.766] ...future.conditions[[length(...future.conditions) + [18:03:16.766] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.766] if (TRUE && !signal) { [18:03:16.766] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.766] { [18:03:16.766] inherits <- base::inherits [18:03:16.766] invokeRestart <- base::invokeRestart [18:03:16.766] is.null <- base::is.null [18:03:16.766] muffled <- FALSE [18:03:16.766] if (inherits(cond, "message")) { [18:03:16.766] muffled <- grepl(pattern, "muffleMessage") [18:03:16.766] if (muffled) [18:03:16.766] invokeRestart("muffleMessage") [18:03:16.766] } [18:03:16.766] else if (inherits(cond, "warning")) { [18:03:16.766] muffled <- grepl(pattern, "muffleWarning") [18:03:16.766] if (muffled) [18:03:16.766] invokeRestart("muffleWarning") [18:03:16.766] } [18:03:16.766] else if (inherits(cond, "condition")) { [18:03:16.766] if (!is.null(pattern)) { [18:03:16.766] computeRestarts <- base::computeRestarts [18:03:16.766] grepl <- base::grepl [18:03:16.766] restarts <- computeRestarts(cond) [18:03:16.766] for (restart in restarts) { [18:03:16.766] name <- restart$name [18:03:16.766] if (is.null(name)) [18:03:16.766] next [18:03:16.766] if (!grepl(pattern, name)) [18:03:16.766] next [18:03:16.766] invokeRestart(restart) [18:03:16.766] muffled <- TRUE [18:03:16.766] break [18:03:16.766] } [18:03:16.766] } [18:03:16.766] } [18:03:16.766] invisible(muffled) [18:03:16.766] } [18:03:16.766] muffleCondition(cond, pattern = "^muffle") [18:03:16.766] } [18:03:16.766] } [18:03:16.766] else { [18:03:16.766] if (TRUE) { [18:03:16.766] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.766] { [18:03:16.766] inherits <- base::inherits [18:03:16.766] invokeRestart <- base::invokeRestart [18:03:16.766] is.null <- base::is.null [18:03:16.766] muffled <- FALSE [18:03:16.766] if (inherits(cond, "message")) { [18:03:16.766] muffled <- grepl(pattern, "muffleMessage") [18:03:16.766] if (muffled) [18:03:16.766] invokeRestart("muffleMessage") [18:03:16.766] } [18:03:16.766] else if (inherits(cond, "warning")) { [18:03:16.766] muffled <- grepl(pattern, "muffleWarning") [18:03:16.766] if (muffled) [18:03:16.766] invokeRestart("muffleWarning") [18:03:16.766] } [18:03:16.766] else if (inherits(cond, "condition")) { [18:03:16.766] if (!is.null(pattern)) { [18:03:16.766] computeRestarts <- base::computeRestarts [18:03:16.766] grepl <- base::grepl [18:03:16.766] restarts <- computeRestarts(cond) [18:03:16.766] for (restart in restarts) { [18:03:16.766] name <- restart$name [18:03:16.766] if (is.null(name)) [18:03:16.766] next [18:03:16.766] if (!grepl(pattern, name)) [18:03:16.766] next [18:03:16.766] invokeRestart(restart) [18:03:16.766] muffled <- TRUE [18:03:16.766] break [18:03:16.766] } [18:03:16.766] } [18:03:16.766] } [18:03:16.766] invisible(muffled) [18:03:16.766] } [18:03:16.766] muffleCondition(cond, pattern = "^muffle") [18:03:16.766] } [18:03:16.766] } [18:03:16.766] } [18:03:16.766] })) [18:03:16.766] }, error = function(ex) { [18:03:16.766] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.766] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.766] ...future.rng), started = ...future.startTime, [18:03:16.766] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.766] version = "1.8"), class = "FutureResult") [18:03:16.766] }, finally = { [18:03:16.766] if (!identical(...future.workdir, getwd())) [18:03:16.766] setwd(...future.workdir) [18:03:16.766] { [18:03:16.766] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.766] ...future.oldOptions$nwarnings <- NULL [18:03:16.766] } [18:03:16.766] base::options(...future.oldOptions) [18:03:16.766] if (.Platform$OS.type == "windows") { [18:03:16.766] old_names <- names(...future.oldEnvVars) [18:03:16.766] envs <- base::Sys.getenv() [18:03:16.766] names <- names(envs) [18:03:16.766] common <- intersect(names, old_names) [18:03:16.766] added <- setdiff(names, old_names) [18:03:16.766] removed <- setdiff(old_names, names) [18:03:16.766] changed <- common[...future.oldEnvVars[common] != [18:03:16.766] envs[common]] [18:03:16.766] NAMES <- toupper(changed) [18:03:16.766] args <- list() [18:03:16.766] for (kk in seq_along(NAMES)) { [18:03:16.766] name <- changed[[kk]] [18:03:16.766] NAME <- NAMES[[kk]] [18:03:16.766] if (name != NAME && is.element(NAME, old_names)) [18:03:16.766] next [18:03:16.766] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.766] } [18:03:16.766] NAMES <- toupper(added) [18:03:16.766] for (kk in seq_along(NAMES)) { [18:03:16.766] name <- added[[kk]] [18:03:16.766] NAME <- NAMES[[kk]] [18:03:16.766] if (name != NAME && is.element(NAME, old_names)) [18:03:16.766] next [18:03:16.766] args[[name]] <- "" [18:03:16.766] } [18:03:16.766] NAMES <- toupper(removed) [18:03:16.766] for (kk in seq_along(NAMES)) { [18:03:16.766] name <- removed[[kk]] [18:03:16.766] NAME <- NAMES[[kk]] [18:03:16.766] if (name != NAME && is.element(NAME, old_names)) [18:03:16.766] next [18:03:16.766] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.766] } [18:03:16.766] if (length(args) > 0) [18:03:16.766] base::do.call(base::Sys.setenv, args = args) [18:03:16.766] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.766] } [18:03:16.766] else { [18:03:16.766] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.766] } [18:03:16.766] { [18:03:16.766] if (base::length(...future.futureOptionsAdded) > [18:03:16.766] 0L) { [18:03:16.766] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.766] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.766] base::options(opts) [18:03:16.766] } [18:03:16.766] { [18:03:16.766] { [18:03:16.766] base::assign(".Random.seed", c(10407L, -1683821936L, [18:03:16.766] 1227100314L, 1967199548L, -1973854777L, 154975643L, [18:03:16.766] -417942709L), envir = base::globalenv(), [18:03:16.766] inherits = FALSE) [18:03:16.766] NULL [18:03:16.766] } [18:03:16.766] options(future.plan = NULL) [18:03:16.766] if (is.na(NA_character_)) [18:03:16.766] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.766] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.766] future::plan(list(function (..., envir = parent.frame()) [18:03:16.766] { [18:03:16.766] future <- SequentialFuture(..., envir = envir) [18:03:16.766] if (!future$lazy) [18:03:16.766] future <- run(future) [18:03:16.766] invisible(future) [18:03:16.766] }), .cleanup = FALSE, .init = FALSE) [18:03:16.766] } [18:03:16.766] } [18:03:16.766] } [18:03:16.766] }) [18:03:16.766] if (TRUE) { [18:03:16.766] base::sink(type = "output", split = FALSE) [18:03:16.766] if (TRUE) { [18:03:16.766] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.766] } [18:03:16.766] else { [18:03:16.766] ...future.result["stdout"] <- base::list(NULL) [18:03:16.766] } [18:03:16.766] base::close(...future.stdout) [18:03:16.766] ...future.stdout <- NULL [18:03:16.766] } [18:03:16.766] ...future.result$conditions <- ...future.conditions [18:03:16.766] ...future.result$finished <- base::Sys.time() [18:03:16.766] ...future.result [18:03:16.766] } [18:03:16.770] assign_globals() ... [18:03:16.770] List of 1 [18:03:16.770] $ x: int [1:4] 0 1 2 3 [18:03:16.770] - attr(*, "where")=List of 1 [18:03:16.770] ..$ x: [18:03:16.770] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.770] - attr(*, "resolved")= logi FALSE [18:03:16.770] - attr(*, "total_size")= num 64 [18:03:16.770] - attr(*, "already-done")= logi TRUE [18:03:16.773] - copied 'x' to environment [18:03:16.773] assign_globals() ... done [18:03:16.774] plan(): Setting new future strategy stack: [18:03:16.774] List of future strategies: [18:03:16.774] 1. sequential: [18:03:16.774] - args: function (..., envir = parent.frame()) [18:03:16.774] - tweaked: FALSE [18:03:16.774] - call: NULL [18:03:16.774] plan(): nbrOfWorkers() = 1 [18:03:16.776] plan(): Setting new future strategy stack: [18:03:16.776] List of future strategies: [18:03:16.776] 1. sequential: [18:03:16.776] - args: function (..., envir = parent.frame()) [18:03:16.776] - tweaked: FALSE [18:03:16.776] - call: plan(strategy) [18:03:16.776] plan(): nbrOfWorkers() = 1 [18:03:16.776] SequentialFuture started (and completed) [18:03:16.777] - Launch lazy future ... done [18:03:16.778] run() for 'SequentialFuture' ... done [18:03:16.778] getGlobalsAndPackages() ... [18:03:16.779] Searching for globals... [18:03:16.780] - globals found: [3] '{', 'sample', 'x' [18:03:16.780] Searching for globals ... DONE [18:03:16.780] Resolving globals: FALSE [18:03:16.781] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.781] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.781] - globals: [1] 'x' [18:03:16.781] [18:03:16.782] getGlobalsAndPackages() ... DONE [18:03:16.782] run() for 'Future' ... [18:03:16.782] - state: 'created' [18:03:16.782] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.783] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.783] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.783] - Field: 'label' [18:03:16.783] - Field: 'local' [18:03:16.783] - Field: 'owner' [18:03:16.784] - Field: 'envir' [18:03:16.784] - Field: 'packages' [18:03:16.784] - Field: 'gc' [18:03:16.784] - Field: 'conditions' [18:03:16.784] - Field: 'expr' [18:03:16.784] - Field: 'uuid' [18:03:16.785] - Field: 'seed' [18:03:16.785] - Field: 'version' [18:03:16.785] - Field: 'result' [18:03:16.785] - Field: 'asynchronous' [18:03:16.785] - Field: 'calls' [18:03:16.786] - Field: 'globals' [18:03:16.786] - Field: 'stdout' [18:03:16.786] - Field: 'earlySignal' [18:03:16.786] - Field: 'lazy' [18:03:16.786] - Field: 'state' [18:03:16.786] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.787] - Launch lazy future ... [18:03:16.787] Packages needed by the future expression (n = 0): [18:03:16.787] Packages needed by future strategies (n = 0): [18:03:16.788] { [18:03:16.788] { [18:03:16.788] { [18:03:16.788] ...future.startTime <- base::Sys.time() [18:03:16.788] { [18:03:16.788] { [18:03:16.788] { [18:03:16.788] base::local({ [18:03:16.788] has_future <- base::requireNamespace("future", [18:03:16.788] quietly = TRUE) [18:03:16.788] if (has_future) { [18:03:16.788] ns <- base::getNamespace("future") [18:03:16.788] version <- ns[[".package"]][["version"]] [18:03:16.788] if (is.null(version)) [18:03:16.788] version <- utils::packageVersion("future") [18:03:16.788] } [18:03:16.788] else { [18:03:16.788] version <- NULL [18:03:16.788] } [18:03:16.788] if (!has_future || version < "1.8.0") { [18:03:16.788] info <- base::c(r_version = base::gsub("R version ", [18:03:16.788] "", base::R.version$version.string), [18:03:16.788] platform = base::sprintf("%s (%s-bit)", [18:03:16.788] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.788] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.788] "release", "version")], collapse = " "), [18:03:16.788] hostname = base::Sys.info()[["nodename"]]) [18:03:16.788] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.788] info) [18:03:16.788] info <- base::paste(info, collapse = "; ") [18:03:16.788] if (!has_future) { [18:03:16.788] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.788] info) [18:03:16.788] } [18:03:16.788] else { [18:03:16.788] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.788] info, version) [18:03:16.788] } [18:03:16.788] base::stop(msg) [18:03:16.788] } [18:03:16.788] }) [18:03:16.788] } [18:03:16.788] options(future.plan = NULL) [18:03:16.788] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.788] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.788] } [18:03:16.788] ...future.workdir <- getwd() [18:03:16.788] } [18:03:16.788] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.788] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.788] } [18:03:16.788] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.788] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.788] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.788] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.788] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.788] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.788] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.788] base::names(...future.oldOptions)) [18:03:16.788] } [18:03:16.788] if (FALSE) { [18:03:16.788] } [18:03:16.788] else { [18:03:16.788] if (TRUE) { [18:03:16.788] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.788] open = "w") [18:03:16.788] } [18:03:16.788] else { [18:03:16.788] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.788] windows = "NUL", "/dev/null"), open = "w") [18:03:16.788] } [18:03:16.788] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.788] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.788] base::sink(type = "output", split = FALSE) [18:03:16.788] base::close(...future.stdout) [18:03:16.788] }, add = TRUE) [18:03:16.788] } [18:03:16.788] ...future.frame <- base::sys.nframe() [18:03:16.788] ...future.conditions <- base::list() [18:03:16.788] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.788] if (FALSE) { [18:03:16.788] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.788] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.788] } [18:03:16.788] ...future.result <- base::tryCatch({ [18:03:16.788] base::withCallingHandlers({ [18:03:16.788] ...future.value <- base::withVisible(base::local({ [18:03:16.788] sample(x, size = 1L) [18:03:16.788] })) [18:03:16.788] future::FutureResult(value = ...future.value$value, [18:03:16.788] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.788] ...future.rng), globalenv = if (FALSE) [18:03:16.788] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.788] ...future.globalenv.names)) [18:03:16.788] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.788] }, condition = base::local({ [18:03:16.788] c <- base::c [18:03:16.788] inherits <- base::inherits [18:03:16.788] invokeRestart <- base::invokeRestart [18:03:16.788] length <- base::length [18:03:16.788] list <- base::list [18:03:16.788] seq.int <- base::seq.int [18:03:16.788] signalCondition <- base::signalCondition [18:03:16.788] sys.calls <- base::sys.calls [18:03:16.788] `[[` <- base::`[[` [18:03:16.788] `+` <- base::`+` [18:03:16.788] `<<-` <- base::`<<-` [18:03:16.788] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.788] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.788] 3L)] [18:03:16.788] } [18:03:16.788] function(cond) { [18:03:16.788] is_error <- inherits(cond, "error") [18:03:16.788] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.788] NULL) [18:03:16.788] if (is_error) { [18:03:16.788] sessionInformation <- function() { [18:03:16.788] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.788] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.788] search = base::search(), system = base::Sys.info()) [18:03:16.788] } [18:03:16.788] ...future.conditions[[length(...future.conditions) + [18:03:16.788] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.788] cond$call), session = sessionInformation(), [18:03:16.788] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.788] signalCondition(cond) [18:03:16.788] } [18:03:16.788] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.788] "immediateCondition"))) { [18:03:16.788] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.788] ...future.conditions[[length(...future.conditions) + [18:03:16.788] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.788] if (TRUE && !signal) { [18:03:16.788] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.788] { [18:03:16.788] inherits <- base::inherits [18:03:16.788] invokeRestart <- base::invokeRestart [18:03:16.788] is.null <- base::is.null [18:03:16.788] muffled <- FALSE [18:03:16.788] if (inherits(cond, "message")) { [18:03:16.788] muffled <- grepl(pattern, "muffleMessage") [18:03:16.788] if (muffled) [18:03:16.788] invokeRestart("muffleMessage") [18:03:16.788] } [18:03:16.788] else if (inherits(cond, "warning")) { [18:03:16.788] muffled <- grepl(pattern, "muffleWarning") [18:03:16.788] if (muffled) [18:03:16.788] invokeRestart("muffleWarning") [18:03:16.788] } [18:03:16.788] else if (inherits(cond, "condition")) { [18:03:16.788] if (!is.null(pattern)) { [18:03:16.788] computeRestarts <- base::computeRestarts [18:03:16.788] grepl <- base::grepl [18:03:16.788] restarts <- computeRestarts(cond) [18:03:16.788] for (restart in restarts) { [18:03:16.788] name <- restart$name [18:03:16.788] if (is.null(name)) [18:03:16.788] next [18:03:16.788] if (!grepl(pattern, name)) [18:03:16.788] next [18:03:16.788] invokeRestart(restart) [18:03:16.788] muffled <- TRUE [18:03:16.788] break [18:03:16.788] } [18:03:16.788] } [18:03:16.788] } [18:03:16.788] invisible(muffled) [18:03:16.788] } [18:03:16.788] muffleCondition(cond, pattern = "^muffle") [18:03:16.788] } [18:03:16.788] } [18:03:16.788] else { [18:03:16.788] if (TRUE) { [18:03:16.788] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.788] { [18:03:16.788] inherits <- base::inherits [18:03:16.788] invokeRestart <- base::invokeRestart [18:03:16.788] is.null <- base::is.null [18:03:16.788] muffled <- FALSE [18:03:16.788] if (inherits(cond, "message")) { [18:03:16.788] muffled <- grepl(pattern, "muffleMessage") [18:03:16.788] if (muffled) [18:03:16.788] invokeRestart("muffleMessage") [18:03:16.788] } [18:03:16.788] else if (inherits(cond, "warning")) { [18:03:16.788] muffled <- grepl(pattern, "muffleWarning") [18:03:16.788] if (muffled) [18:03:16.788] invokeRestart("muffleWarning") [18:03:16.788] } [18:03:16.788] else if (inherits(cond, "condition")) { [18:03:16.788] if (!is.null(pattern)) { [18:03:16.788] computeRestarts <- base::computeRestarts [18:03:16.788] grepl <- base::grepl [18:03:16.788] restarts <- computeRestarts(cond) [18:03:16.788] for (restart in restarts) { [18:03:16.788] name <- restart$name [18:03:16.788] if (is.null(name)) [18:03:16.788] next [18:03:16.788] if (!grepl(pattern, name)) [18:03:16.788] next [18:03:16.788] invokeRestart(restart) [18:03:16.788] muffled <- TRUE [18:03:16.788] break [18:03:16.788] } [18:03:16.788] } [18:03:16.788] } [18:03:16.788] invisible(muffled) [18:03:16.788] } [18:03:16.788] muffleCondition(cond, pattern = "^muffle") [18:03:16.788] } [18:03:16.788] } [18:03:16.788] } [18:03:16.788] })) [18:03:16.788] }, error = function(ex) { [18:03:16.788] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.788] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.788] ...future.rng), started = ...future.startTime, [18:03:16.788] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.788] version = "1.8"), class = "FutureResult") [18:03:16.788] }, finally = { [18:03:16.788] if (!identical(...future.workdir, getwd())) [18:03:16.788] setwd(...future.workdir) [18:03:16.788] { [18:03:16.788] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.788] ...future.oldOptions$nwarnings <- NULL [18:03:16.788] } [18:03:16.788] base::options(...future.oldOptions) [18:03:16.788] if (.Platform$OS.type == "windows") { [18:03:16.788] old_names <- names(...future.oldEnvVars) [18:03:16.788] envs <- base::Sys.getenv() [18:03:16.788] names <- names(envs) [18:03:16.788] common <- intersect(names, old_names) [18:03:16.788] added <- setdiff(names, old_names) [18:03:16.788] removed <- setdiff(old_names, names) [18:03:16.788] changed <- common[...future.oldEnvVars[common] != [18:03:16.788] envs[common]] [18:03:16.788] NAMES <- toupper(changed) [18:03:16.788] args <- list() [18:03:16.788] for (kk in seq_along(NAMES)) { [18:03:16.788] name <- changed[[kk]] [18:03:16.788] NAME <- NAMES[[kk]] [18:03:16.788] if (name != NAME && is.element(NAME, old_names)) [18:03:16.788] next [18:03:16.788] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.788] } [18:03:16.788] NAMES <- toupper(added) [18:03:16.788] for (kk in seq_along(NAMES)) { [18:03:16.788] name <- added[[kk]] [18:03:16.788] NAME <- NAMES[[kk]] [18:03:16.788] if (name != NAME && is.element(NAME, old_names)) [18:03:16.788] next [18:03:16.788] args[[name]] <- "" [18:03:16.788] } [18:03:16.788] NAMES <- toupper(removed) [18:03:16.788] for (kk in seq_along(NAMES)) { [18:03:16.788] name <- removed[[kk]] [18:03:16.788] NAME <- NAMES[[kk]] [18:03:16.788] if (name != NAME && is.element(NAME, old_names)) [18:03:16.788] next [18:03:16.788] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.788] } [18:03:16.788] if (length(args) > 0) [18:03:16.788] base::do.call(base::Sys.setenv, args = args) [18:03:16.788] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.788] } [18:03:16.788] else { [18:03:16.788] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.788] } [18:03:16.788] { [18:03:16.788] if (base::length(...future.futureOptionsAdded) > [18:03:16.788] 0L) { [18:03:16.788] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.788] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.788] base::options(opts) [18:03:16.788] } [18:03:16.788] { [18:03:16.788] { [18:03:16.788] base::assign(".Random.seed", c(10407L, 1967199548L, [18:03:16.788] 609453078L, -2086513189L, -417942709L, -1546034481L, [18:03:16.788] 127407062L), envir = base::globalenv(), inherits = FALSE) [18:03:16.788] NULL [18:03:16.788] } [18:03:16.788] options(future.plan = NULL) [18:03:16.788] if (is.na(NA_character_)) [18:03:16.788] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.788] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.788] future::plan(list(function (..., envir = parent.frame()) [18:03:16.788] { [18:03:16.788] future <- SequentialFuture(..., envir = envir) [18:03:16.788] if (!future$lazy) [18:03:16.788] future <- run(future) [18:03:16.788] invisible(future) [18:03:16.788] }), .cleanup = FALSE, .init = FALSE) [18:03:16.788] } [18:03:16.788] } [18:03:16.788] } [18:03:16.788] }) [18:03:16.788] if (TRUE) { [18:03:16.788] base::sink(type = "output", split = FALSE) [18:03:16.788] if (TRUE) { [18:03:16.788] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.788] } [18:03:16.788] else { [18:03:16.788] ...future.result["stdout"] <- base::list(NULL) [18:03:16.788] } [18:03:16.788] base::close(...future.stdout) [18:03:16.788] ...future.stdout <- NULL [18:03:16.788] } [18:03:16.788] ...future.result$conditions <- ...future.conditions [18:03:16.788] ...future.result$finished <- base::Sys.time() [18:03:16.788] ...future.result [18:03:16.788] } [18:03:16.791] assign_globals() ... [18:03:16.791] List of 1 [18:03:16.791] $ x: int [1:4] 0 1 2 3 [18:03:16.791] - attr(*, "where")=List of 1 [18:03:16.791] ..$ x: [18:03:16.791] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.791] - attr(*, "resolved")= logi FALSE [18:03:16.791] - attr(*, "total_size")= num 64 [18:03:16.791] - attr(*, "already-done")= logi TRUE [18:03:16.794] - copied 'x' to environment [18:03:16.795] assign_globals() ... done [18:03:16.795] plan(): Setting new future strategy stack: [18:03:16.795] List of future strategies: [18:03:16.795] 1. sequential: [18:03:16.795] - args: function (..., envir = parent.frame()) [18:03:16.795] - tweaked: FALSE [18:03:16.795] - call: NULL [18:03:16.796] plan(): nbrOfWorkers() = 1 [18:03:16.797] plan(): Setting new future strategy stack: [18:03:16.797] List of future strategies: [18:03:16.797] 1. sequential: [18:03:16.797] - args: function (..., envir = parent.frame()) [18:03:16.797] - tweaked: FALSE [18:03:16.797] - call: plan(strategy) [18:03:16.797] plan(): nbrOfWorkers() = 1 [18:03:16.798] SequentialFuture started (and completed) [18:03:16.798] - Launch lazy future ... done [18:03:16.798] run() for 'SequentialFuture' ... done [18:03:16.799] getGlobalsAndPackages() ... [18:03:16.799] Searching for globals... [18:03:16.800] - globals found: [3] '{', 'sample', 'x' [18:03:16.800] Searching for globals ... DONE [18:03:16.800] Resolving globals: FALSE [18:03:16.801] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.801] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.801] - globals: [1] 'x' [18:03:16.802] [18:03:16.802] getGlobalsAndPackages() ... DONE [18:03:16.802] run() for 'Future' ... [18:03:16.802] - state: 'created' [18:03:16.802] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.803] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.803] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.803] - Field: 'label' [18:03:16.803] - Field: 'local' [18:03:16.804] - Field: 'owner' [18:03:16.804] - Field: 'envir' [18:03:16.804] - Field: 'packages' [18:03:16.804] - Field: 'gc' [18:03:16.804] - Field: 'conditions' [18:03:16.804] - Field: 'expr' [18:03:16.805] - Field: 'uuid' [18:03:16.805] - Field: 'seed' [18:03:16.805] - Field: 'version' [18:03:16.805] - Field: 'result' [18:03:16.805] - Field: 'asynchronous' [18:03:16.805] - Field: 'calls' [18:03:16.806] - Field: 'globals' [18:03:16.806] - Field: 'stdout' [18:03:16.806] - Field: 'earlySignal' [18:03:16.806] - Field: 'lazy' [18:03:16.806] - Field: 'state' [18:03:16.806] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.807] - Launch lazy future ... [18:03:16.807] Packages needed by the future expression (n = 0): [18:03:16.807] Packages needed by future strategies (n = 0): [18:03:16.808] { [18:03:16.808] { [18:03:16.808] { [18:03:16.808] ...future.startTime <- base::Sys.time() [18:03:16.808] { [18:03:16.808] { [18:03:16.808] { [18:03:16.808] base::local({ [18:03:16.808] has_future <- base::requireNamespace("future", [18:03:16.808] quietly = TRUE) [18:03:16.808] if (has_future) { [18:03:16.808] ns <- base::getNamespace("future") [18:03:16.808] version <- ns[[".package"]][["version"]] [18:03:16.808] if (is.null(version)) [18:03:16.808] version <- utils::packageVersion("future") [18:03:16.808] } [18:03:16.808] else { [18:03:16.808] version <- NULL [18:03:16.808] } [18:03:16.808] if (!has_future || version < "1.8.0") { [18:03:16.808] info <- base::c(r_version = base::gsub("R version ", [18:03:16.808] "", base::R.version$version.string), [18:03:16.808] platform = base::sprintf("%s (%s-bit)", [18:03:16.808] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.808] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.808] "release", "version")], collapse = " "), [18:03:16.808] hostname = base::Sys.info()[["nodename"]]) [18:03:16.808] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.808] info) [18:03:16.808] info <- base::paste(info, collapse = "; ") [18:03:16.808] if (!has_future) { [18:03:16.808] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.808] info) [18:03:16.808] } [18:03:16.808] else { [18:03:16.808] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.808] info, version) [18:03:16.808] } [18:03:16.808] base::stop(msg) [18:03:16.808] } [18:03:16.808] }) [18:03:16.808] } [18:03:16.808] options(future.plan = NULL) [18:03:16.808] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.808] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.808] } [18:03:16.808] ...future.workdir <- getwd() [18:03:16.808] } [18:03:16.808] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.808] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.808] } [18:03:16.808] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.808] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.808] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.808] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.808] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.808] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.808] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.808] base::names(...future.oldOptions)) [18:03:16.808] } [18:03:16.808] if (FALSE) { [18:03:16.808] } [18:03:16.808] else { [18:03:16.808] if (TRUE) { [18:03:16.808] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.808] open = "w") [18:03:16.808] } [18:03:16.808] else { [18:03:16.808] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.808] windows = "NUL", "/dev/null"), open = "w") [18:03:16.808] } [18:03:16.808] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.808] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.808] base::sink(type = "output", split = FALSE) [18:03:16.808] base::close(...future.stdout) [18:03:16.808] }, add = TRUE) [18:03:16.808] } [18:03:16.808] ...future.frame <- base::sys.nframe() [18:03:16.808] ...future.conditions <- base::list() [18:03:16.808] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.808] if (FALSE) { [18:03:16.808] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.808] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.808] } [18:03:16.808] ...future.result <- base::tryCatch({ [18:03:16.808] base::withCallingHandlers({ [18:03:16.808] ...future.value <- base::withVisible(base::local({ [18:03:16.808] sample(x, size = 1L) [18:03:16.808] })) [18:03:16.808] future::FutureResult(value = ...future.value$value, [18:03:16.808] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.808] ...future.rng), globalenv = if (FALSE) [18:03:16.808] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.808] ...future.globalenv.names)) [18:03:16.808] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.808] }, condition = base::local({ [18:03:16.808] c <- base::c [18:03:16.808] inherits <- base::inherits [18:03:16.808] invokeRestart <- base::invokeRestart [18:03:16.808] length <- base::length [18:03:16.808] list <- base::list [18:03:16.808] seq.int <- base::seq.int [18:03:16.808] signalCondition <- base::signalCondition [18:03:16.808] sys.calls <- base::sys.calls [18:03:16.808] `[[` <- base::`[[` [18:03:16.808] `+` <- base::`+` [18:03:16.808] `<<-` <- base::`<<-` [18:03:16.808] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.808] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.808] 3L)] [18:03:16.808] } [18:03:16.808] function(cond) { [18:03:16.808] is_error <- inherits(cond, "error") [18:03:16.808] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.808] NULL) [18:03:16.808] if (is_error) { [18:03:16.808] sessionInformation <- function() { [18:03:16.808] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.808] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.808] search = base::search(), system = base::Sys.info()) [18:03:16.808] } [18:03:16.808] ...future.conditions[[length(...future.conditions) + [18:03:16.808] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.808] cond$call), session = sessionInformation(), [18:03:16.808] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.808] signalCondition(cond) [18:03:16.808] } [18:03:16.808] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.808] "immediateCondition"))) { [18:03:16.808] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.808] ...future.conditions[[length(...future.conditions) + [18:03:16.808] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.808] if (TRUE && !signal) { [18:03:16.808] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.808] { [18:03:16.808] inherits <- base::inherits [18:03:16.808] invokeRestart <- base::invokeRestart [18:03:16.808] is.null <- base::is.null [18:03:16.808] muffled <- FALSE [18:03:16.808] if (inherits(cond, "message")) { [18:03:16.808] muffled <- grepl(pattern, "muffleMessage") [18:03:16.808] if (muffled) [18:03:16.808] invokeRestart("muffleMessage") [18:03:16.808] } [18:03:16.808] else if (inherits(cond, "warning")) { [18:03:16.808] muffled <- grepl(pattern, "muffleWarning") [18:03:16.808] if (muffled) [18:03:16.808] invokeRestart("muffleWarning") [18:03:16.808] } [18:03:16.808] else if (inherits(cond, "condition")) { [18:03:16.808] if (!is.null(pattern)) { [18:03:16.808] computeRestarts <- base::computeRestarts [18:03:16.808] grepl <- base::grepl [18:03:16.808] restarts <- computeRestarts(cond) [18:03:16.808] for (restart in restarts) { [18:03:16.808] name <- restart$name [18:03:16.808] if (is.null(name)) [18:03:16.808] next [18:03:16.808] if (!grepl(pattern, name)) [18:03:16.808] next [18:03:16.808] invokeRestart(restart) [18:03:16.808] muffled <- TRUE [18:03:16.808] break [18:03:16.808] } [18:03:16.808] } [18:03:16.808] } [18:03:16.808] invisible(muffled) [18:03:16.808] } [18:03:16.808] muffleCondition(cond, pattern = "^muffle") [18:03:16.808] } [18:03:16.808] } [18:03:16.808] else { [18:03:16.808] if (TRUE) { [18:03:16.808] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.808] { [18:03:16.808] inherits <- base::inherits [18:03:16.808] invokeRestart <- base::invokeRestart [18:03:16.808] is.null <- base::is.null [18:03:16.808] muffled <- FALSE [18:03:16.808] if (inherits(cond, "message")) { [18:03:16.808] muffled <- grepl(pattern, "muffleMessage") [18:03:16.808] if (muffled) [18:03:16.808] invokeRestart("muffleMessage") [18:03:16.808] } [18:03:16.808] else if (inherits(cond, "warning")) { [18:03:16.808] muffled <- grepl(pattern, "muffleWarning") [18:03:16.808] if (muffled) [18:03:16.808] invokeRestart("muffleWarning") [18:03:16.808] } [18:03:16.808] else if (inherits(cond, "condition")) { [18:03:16.808] if (!is.null(pattern)) { [18:03:16.808] computeRestarts <- base::computeRestarts [18:03:16.808] grepl <- base::grepl [18:03:16.808] restarts <- computeRestarts(cond) [18:03:16.808] for (restart in restarts) { [18:03:16.808] name <- restart$name [18:03:16.808] if (is.null(name)) [18:03:16.808] next [18:03:16.808] if (!grepl(pattern, name)) [18:03:16.808] next [18:03:16.808] invokeRestart(restart) [18:03:16.808] muffled <- TRUE [18:03:16.808] break [18:03:16.808] } [18:03:16.808] } [18:03:16.808] } [18:03:16.808] invisible(muffled) [18:03:16.808] } [18:03:16.808] muffleCondition(cond, pattern = "^muffle") [18:03:16.808] } [18:03:16.808] } [18:03:16.808] } [18:03:16.808] })) [18:03:16.808] }, error = function(ex) { [18:03:16.808] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.808] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.808] ...future.rng), started = ...future.startTime, [18:03:16.808] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.808] version = "1.8"), class = "FutureResult") [18:03:16.808] }, finally = { [18:03:16.808] if (!identical(...future.workdir, getwd())) [18:03:16.808] setwd(...future.workdir) [18:03:16.808] { [18:03:16.808] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.808] ...future.oldOptions$nwarnings <- NULL [18:03:16.808] } [18:03:16.808] base::options(...future.oldOptions) [18:03:16.808] if (.Platform$OS.type == "windows") { [18:03:16.808] old_names <- names(...future.oldEnvVars) [18:03:16.808] envs <- base::Sys.getenv() [18:03:16.808] names <- names(envs) [18:03:16.808] common <- intersect(names, old_names) [18:03:16.808] added <- setdiff(names, old_names) [18:03:16.808] removed <- setdiff(old_names, names) [18:03:16.808] changed <- common[...future.oldEnvVars[common] != [18:03:16.808] envs[common]] [18:03:16.808] NAMES <- toupper(changed) [18:03:16.808] args <- list() [18:03:16.808] for (kk in seq_along(NAMES)) { [18:03:16.808] name <- changed[[kk]] [18:03:16.808] NAME <- NAMES[[kk]] [18:03:16.808] if (name != NAME && is.element(NAME, old_names)) [18:03:16.808] next [18:03:16.808] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.808] } [18:03:16.808] NAMES <- toupper(added) [18:03:16.808] for (kk in seq_along(NAMES)) { [18:03:16.808] name <- added[[kk]] [18:03:16.808] NAME <- NAMES[[kk]] [18:03:16.808] if (name != NAME && is.element(NAME, old_names)) [18:03:16.808] next [18:03:16.808] args[[name]] <- "" [18:03:16.808] } [18:03:16.808] NAMES <- toupper(removed) [18:03:16.808] for (kk in seq_along(NAMES)) { [18:03:16.808] name <- removed[[kk]] [18:03:16.808] NAME <- NAMES[[kk]] [18:03:16.808] if (name != NAME && is.element(NAME, old_names)) [18:03:16.808] next [18:03:16.808] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.808] } [18:03:16.808] if (length(args) > 0) [18:03:16.808] base::do.call(base::Sys.setenv, args = args) [18:03:16.808] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.808] } [18:03:16.808] else { [18:03:16.808] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.808] } [18:03:16.808] { [18:03:16.808] if (base::length(...future.futureOptionsAdded) > [18:03:16.808] 0L) { [18:03:16.808] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.808] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.808] base::options(opts) [18:03:16.808] } [18:03:16.808] { [18:03:16.808] { [18:03:16.808] base::assign(".Random.seed", c(10407L, -2086513189L, [18:03:16.808] -300431471L, 772910725L, 127407062L, -1883774256L, [18:03:16.808] 284069849L), envir = base::globalenv(), inherits = FALSE) [18:03:16.808] NULL [18:03:16.808] } [18:03:16.808] options(future.plan = NULL) [18:03:16.808] if (is.na(NA_character_)) [18:03:16.808] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.808] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.808] future::plan(list(function (..., envir = parent.frame()) [18:03:16.808] { [18:03:16.808] future <- SequentialFuture(..., envir = envir) [18:03:16.808] if (!future$lazy) [18:03:16.808] future <- run(future) [18:03:16.808] invisible(future) [18:03:16.808] }), .cleanup = FALSE, .init = FALSE) [18:03:16.808] } [18:03:16.808] } [18:03:16.808] } [18:03:16.808] }) [18:03:16.808] if (TRUE) { [18:03:16.808] base::sink(type = "output", split = FALSE) [18:03:16.808] if (TRUE) { [18:03:16.808] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.808] } [18:03:16.808] else { [18:03:16.808] ...future.result["stdout"] <- base::list(NULL) [18:03:16.808] } [18:03:16.808] base::close(...future.stdout) [18:03:16.808] ...future.stdout <- NULL [18:03:16.808] } [18:03:16.808] ...future.result$conditions <- ...future.conditions [18:03:16.808] ...future.result$finished <- base::Sys.time() [18:03:16.808] ...future.result [18:03:16.808] } [18:03:16.811] assign_globals() ... [18:03:16.812] List of 1 [18:03:16.812] $ x: int [1:4] 0 1 2 3 [18:03:16.812] - attr(*, "where")=List of 1 [18:03:16.812] ..$ x: [18:03:16.812] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.812] - attr(*, "resolved")= logi FALSE [18:03:16.812] - attr(*, "total_size")= num 64 [18:03:16.812] - attr(*, "already-done")= logi TRUE [18:03:16.815] - copied 'x' to environment [18:03:16.816] assign_globals() ... done [18:03:16.816] plan(): Setting new future strategy stack: [18:03:16.816] List of future strategies: [18:03:16.816] 1. sequential: [18:03:16.816] - args: function (..., envir = parent.frame()) [18:03:16.816] - tweaked: FALSE [18:03:16.816] - call: NULL [18:03:16.817] plan(): nbrOfWorkers() = 1 [18:03:16.818] plan(): Setting new future strategy stack: [18:03:16.818] List of future strategies: [18:03:16.818] 1. sequential: [18:03:16.818] - args: function (..., envir = parent.frame()) [18:03:16.818] - tweaked: FALSE [18:03:16.818] - call: plan(strategy) [18:03:16.818] plan(): nbrOfWorkers() = 1 [18:03:16.819] SequentialFuture started (and completed) [18:03:16.819] - Launch lazy future ... done [18:03:16.819] run() for 'SequentialFuture' ... done [18:03:16.820] getGlobalsAndPackages() ... [18:03:16.820] Searching for globals... [18:03:16.821] - globals found: [3] '{', 'sample', 'x' [18:03:16.821] Searching for globals ... DONE [18:03:16.821] Resolving globals: FALSE [18:03:16.822] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.822] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.822] - globals: [1] 'x' [18:03:16.823] [18:03:16.823] getGlobalsAndPackages() ... DONE [18:03:16.823] run() for 'Future' ... [18:03:16.823] - state: 'created' [18:03:16.823] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.824] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.824] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.824] - Field: 'label' [18:03:16.824] - Field: 'local' [18:03:16.825] - Field: 'owner' [18:03:16.825] - Field: 'envir' [18:03:16.825] - Field: 'packages' [18:03:16.825] - Field: 'gc' [18:03:16.825] - Field: 'conditions' [18:03:16.825] - Field: 'expr' [18:03:16.826] - Field: 'uuid' [18:03:16.826] - Field: 'seed' [18:03:16.826] - Field: 'version' [18:03:16.826] - Field: 'result' [18:03:16.826] - Field: 'asynchronous' [18:03:16.826] - Field: 'calls' [18:03:16.827] - Field: 'globals' [18:03:16.827] - Field: 'stdout' [18:03:16.827] - Field: 'earlySignal' [18:03:16.827] - Field: 'lazy' [18:03:16.827] - Field: 'state' [18:03:16.828] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.828] - Launch lazy future ... [18:03:16.828] Packages needed by the future expression (n = 0): [18:03:16.828] Packages needed by future strategies (n = 0): [18:03:16.829] { [18:03:16.829] { [18:03:16.829] { [18:03:16.829] ...future.startTime <- base::Sys.time() [18:03:16.829] { [18:03:16.829] { [18:03:16.829] { [18:03:16.829] base::local({ [18:03:16.829] has_future <- base::requireNamespace("future", [18:03:16.829] quietly = TRUE) [18:03:16.829] if (has_future) { [18:03:16.829] ns <- base::getNamespace("future") [18:03:16.829] version <- ns[[".package"]][["version"]] [18:03:16.829] if (is.null(version)) [18:03:16.829] version <- utils::packageVersion("future") [18:03:16.829] } [18:03:16.829] else { [18:03:16.829] version <- NULL [18:03:16.829] } [18:03:16.829] if (!has_future || version < "1.8.0") { [18:03:16.829] info <- base::c(r_version = base::gsub("R version ", [18:03:16.829] "", base::R.version$version.string), [18:03:16.829] platform = base::sprintf("%s (%s-bit)", [18:03:16.829] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.829] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.829] "release", "version")], collapse = " "), [18:03:16.829] hostname = base::Sys.info()[["nodename"]]) [18:03:16.829] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.829] info) [18:03:16.829] info <- base::paste(info, collapse = "; ") [18:03:16.829] if (!has_future) { [18:03:16.829] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.829] info) [18:03:16.829] } [18:03:16.829] else { [18:03:16.829] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.829] info, version) [18:03:16.829] } [18:03:16.829] base::stop(msg) [18:03:16.829] } [18:03:16.829] }) [18:03:16.829] } [18:03:16.829] options(future.plan = NULL) [18:03:16.829] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.829] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.829] } [18:03:16.829] ...future.workdir <- getwd() [18:03:16.829] } [18:03:16.829] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.829] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.829] } [18:03:16.829] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.829] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.829] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.829] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.829] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.829] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.829] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.829] base::names(...future.oldOptions)) [18:03:16.829] } [18:03:16.829] if (FALSE) { [18:03:16.829] } [18:03:16.829] else { [18:03:16.829] if (TRUE) { [18:03:16.829] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.829] open = "w") [18:03:16.829] } [18:03:16.829] else { [18:03:16.829] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.829] windows = "NUL", "/dev/null"), open = "w") [18:03:16.829] } [18:03:16.829] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.829] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.829] base::sink(type = "output", split = FALSE) [18:03:16.829] base::close(...future.stdout) [18:03:16.829] }, add = TRUE) [18:03:16.829] } [18:03:16.829] ...future.frame <- base::sys.nframe() [18:03:16.829] ...future.conditions <- base::list() [18:03:16.829] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.829] if (FALSE) { [18:03:16.829] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.829] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.829] } [18:03:16.829] ...future.result <- base::tryCatch({ [18:03:16.829] base::withCallingHandlers({ [18:03:16.829] ...future.value <- base::withVisible(base::local({ [18:03:16.829] sample(x, size = 1L) [18:03:16.829] })) [18:03:16.829] future::FutureResult(value = ...future.value$value, [18:03:16.829] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.829] ...future.rng), globalenv = if (FALSE) [18:03:16.829] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.829] ...future.globalenv.names)) [18:03:16.829] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.829] }, condition = base::local({ [18:03:16.829] c <- base::c [18:03:16.829] inherits <- base::inherits [18:03:16.829] invokeRestart <- base::invokeRestart [18:03:16.829] length <- base::length [18:03:16.829] list <- base::list [18:03:16.829] seq.int <- base::seq.int [18:03:16.829] signalCondition <- base::signalCondition [18:03:16.829] sys.calls <- base::sys.calls [18:03:16.829] `[[` <- base::`[[` [18:03:16.829] `+` <- base::`+` [18:03:16.829] `<<-` <- base::`<<-` [18:03:16.829] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.829] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.829] 3L)] [18:03:16.829] } [18:03:16.829] function(cond) { [18:03:16.829] is_error <- inherits(cond, "error") [18:03:16.829] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.829] NULL) [18:03:16.829] if (is_error) { [18:03:16.829] sessionInformation <- function() { [18:03:16.829] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.829] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.829] search = base::search(), system = base::Sys.info()) [18:03:16.829] } [18:03:16.829] ...future.conditions[[length(...future.conditions) + [18:03:16.829] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.829] cond$call), session = sessionInformation(), [18:03:16.829] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.829] signalCondition(cond) [18:03:16.829] } [18:03:16.829] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.829] "immediateCondition"))) { [18:03:16.829] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.829] ...future.conditions[[length(...future.conditions) + [18:03:16.829] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.829] if (TRUE && !signal) { [18:03:16.829] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.829] { [18:03:16.829] inherits <- base::inherits [18:03:16.829] invokeRestart <- base::invokeRestart [18:03:16.829] is.null <- base::is.null [18:03:16.829] muffled <- FALSE [18:03:16.829] if (inherits(cond, "message")) { [18:03:16.829] muffled <- grepl(pattern, "muffleMessage") [18:03:16.829] if (muffled) [18:03:16.829] invokeRestart("muffleMessage") [18:03:16.829] } [18:03:16.829] else if (inherits(cond, "warning")) { [18:03:16.829] muffled <- grepl(pattern, "muffleWarning") [18:03:16.829] if (muffled) [18:03:16.829] invokeRestart("muffleWarning") [18:03:16.829] } [18:03:16.829] else if (inherits(cond, "condition")) { [18:03:16.829] if (!is.null(pattern)) { [18:03:16.829] computeRestarts <- base::computeRestarts [18:03:16.829] grepl <- base::grepl [18:03:16.829] restarts <- computeRestarts(cond) [18:03:16.829] for (restart in restarts) { [18:03:16.829] name <- restart$name [18:03:16.829] if (is.null(name)) [18:03:16.829] next [18:03:16.829] if (!grepl(pattern, name)) [18:03:16.829] next [18:03:16.829] invokeRestart(restart) [18:03:16.829] muffled <- TRUE [18:03:16.829] break [18:03:16.829] } [18:03:16.829] } [18:03:16.829] } [18:03:16.829] invisible(muffled) [18:03:16.829] } [18:03:16.829] muffleCondition(cond, pattern = "^muffle") [18:03:16.829] } [18:03:16.829] } [18:03:16.829] else { [18:03:16.829] if (TRUE) { [18:03:16.829] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.829] { [18:03:16.829] inherits <- base::inherits [18:03:16.829] invokeRestart <- base::invokeRestart [18:03:16.829] is.null <- base::is.null [18:03:16.829] muffled <- FALSE [18:03:16.829] if (inherits(cond, "message")) { [18:03:16.829] muffled <- grepl(pattern, "muffleMessage") [18:03:16.829] if (muffled) [18:03:16.829] invokeRestart("muffleMessage") [18:03:16.829] } [18:03:16.829] else if (inherits(cond, "warning")) { [18:03:16.829] muffled <- grepl(pattern, "muffleWarning") [18:03:16.829] if (muffled) [18:03:16.829] invokeRestart("muffleWarning") [18:03:16.829] } [18:03:16.829] else if (inherits(cond, "condition")) { [18:03:16.829] if (!is.null(pattern)) { [18:03:16.829] computeRestarts <- base::computeRestarts [18:03:16.829] grepl <- base::grepl [18:03:16.829] restarts <- computeRestarts(cond) [18:03:16.829] for (restart in restarts) { [18:03:16.829] name <- restart$name [18:03:16.829] if (is.null(name)) [18:03:16.829] next [18:03:16.829] if (!grepl(pattern, name)) [18:03:16.829] next [18:03:16.829] invokeRestart(restart) [18:03:16.829] muffled <- TRUE [18:03:16.829] break [18:03:16.829] } [18:03:16.829] } [18:03:16.829] } [18:03:16.829] invisible(muffled) [18:03:16.829] } [18:03:16.829] muffleCondition(cond, pattern = "^muffle") [18:03:16.829] } [18:03:16.829] } [18:03:16.829] } [18:03:16.829] })) [18:03:16.829] }, error = function(ex) { [18:03:16.829] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.829] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.829] ...future.rng), started = ...future.startTime, [18:03:16.829] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.829] version = "1.8"), class = "FutureResult") [18:03:16.829] }, finally = { [18:03:16.829] if (!identical(...future.workdir, getwd())) [18:03:16.829] setwd(...future.workdir) [18:03:16.829] { [18:03:16.829] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.829] ...future.oldOptions$nwarnings <- NULL [18:03:16.829] } [18:03:16.829] base::options(...future.oldOptions) [18:03:16.829] if (.Platform$OS.type == "windows") { [18:03:16.829] old_names <- names(...future.oldEnvVars) [18:03:16.829] envs <- base::Sys.getenv() [18:03:16.829] names <- names(envs) [18:03:16.829] common <- intersect(names, old_names) [18:03:16.829] added <- setdiff(names, old_names) [18:03:16.829] removed <- setdiff(old_names, names) [18:03:16.829] changed <- common[...future.oldEnvVars[common] != [18:03:16.829] envs[common]] [18:03:16.829] NAMES <- toupper(changed) [18:03:16.829] args <- list() [18:03:16.829] for (kk in seq_along(NAMES)) { [18:03:16.829] name <- changed[[kk]] [18:03:16.829] NAME <- NAMES[[kk]] [18:03:16.829] if (name != NAME && is.element(NAME, old_names)) [18:03:16.829] next [18:03:16.829] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.829] } [18:03:16.829] NAMES <- toupper(added) [18:03:16.829] for (kk in seq_along(NAMES)) { [18:03:16.829] name <- added[[kk]] [18:03:16.829] NAME <- NAMES[[kk]] [18:03:16.829] if (name != NAME && is.element(NAME, old_names)) [18:03:16.829] next [18:03:16.829] args[[name]] <- "" [18:03:16.829] } [18:03:16.829] NAMES <- toupper(removed) [18:03:16.829] for (kk in seq_along(NAMES)) { [18:03:16.829] name <- removed[[kk]] [18:03:16.829] NAME <- NAMES[[kk]] [18:03:16.829] if (name != NAME && is.element(NAME, old_names)) [18:03:16.829] next [18:03:16.829] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.829] } [18:03:16.829] if (length(args) > 0) [18:03:16.829] base::do.call(base::Sys.setenv, args = args) [18:03:16.829] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.829] } [18:03:16.829] else { [18:03:16.829] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.829] } [18:03:16.829] { [18:03:16.829] if (base::length(...future.futureOptionsAdded) > [18:03:16.829] 0L) { [18:03:16.829] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.829] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.829] base::options(opts) [18:03:16.829] } [18:03:16.829] { [18:03:16.829] { [18:03:16.829] base::assign(".Random.seed", c(10407L, 772910725L, [18:03:16.829] 791082755L, -1773599638L, 284069849L, -881615660L, [18:03:16.829] -1821822604L), envir = base::globalenv(), [18:03:16.829] inherits = FALSE) [18:03:16.829] NULL [18:03:16.829] } [18:03:16.829] options(future.plan = NULL) [18:03:16.829] if (is.na(NA_character_)) [18:03:16.829] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.829] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.829] future::plan(list(function (..., envir = parent.frame()) [18:03:16.829] { [18:03:16.829] future <- SequentialFuture(..., envir = envir) [18:03:16.829] if (!future$lazy) [18:03:16.829] future <- run(future) [18:03:16.829] invisible(future) [18:03:16.829] }), .cleanup = FALSE, .init = FALSE) [18:03:16.829] } [18:03:16.829] } [18:03:16.829] } [18:03:16.829] }) [18:03:16.829] if (TRUE) { [18:03:16.829] base::sink(type = "output", split = FALSE) [18:03:16.829] if (TRUE) { [18:03:16.829] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.829] } [18:03:16.829] else { [18:03:16.829] ...future.result["stdout"] <- base::list(NULL) [18:03:16.829] } [18:03:16.829] base::close(...future.stdout) [18:03:16.829] ...future.stdout <- NULL [18:03:16.829] } [18:03:16.829] ...future.result$conditions <- ...future.conditions [18:03:16.829] ...future.result$finished <- base::Sys.time() [18:03:16.829] ...future.result [18:03:16.829] } [18:03:16.833] assign_globals() ... [18:03:16.833] List of 1 [18:03:16.833] $ x: int [1:4] 0 1 2 3 [18:03:16.833] - attr(*, "where")=List of 1 [18:03:16.833] ..$ x: [18:03:16.833] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.833] - attr(*, "resolved")= logi FALSE [18:03:16.833] - attr(*, "total_size")= num 64 [18:03:16.833] - attr(*, "already-done")= logi TRUE [18:03:16.836] - copied 'x' to environment [18:03:16.837] assign_globals() ... done [18:03:16.837] plan(): Setting new future strategy stack: [18:03:16.837] List of future strategies: [18:03:16.837] 1. sequential: [18:03:16.837] - args: function (..., envir = parent.frame()) [18:03:16.837] - tweaked: FALSE [18:03:16.837] - call: NULL [18:03:16.838] plan(): nbrOfWorkers() = 1 [18:03:16.839] plan(): Setting new future strategy stack: [18:03:16.839] List of future strategies: [18:03:16.839] 1. sequential: [18:03:16.839] - args: function (..., envir = parent.frame()) [18:03:16.839] - tweaked: FALSE [18:03:16.839] - call: plan(strategy) [18:03:16.840] plan(): nbrOfWorkers() = 1 [18:03:16.840] SequentialFuture started (and completed) [18:03:16.840] - Launch lazy future ... done [18:03:16.840] run() for 'SequentialFuture' ... done [[1]] [1] 2 [[2]] [1] 3 [[3]] [1] 3 [[4]] [1] 1 [18:03:16.842] getGlobalsAndPackages() ... [18:03:16.842] Searching for globals... [18:03:16.843] - globals found: [3] '{', 'sample', 'x' [18:03:16.843] Searching for globals ... DONE [18:03:16.843] Resolving globals: FALSE [18:03:16.844] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.844] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.845] - globals: [1] 'x' [18:03:16.845] [18:03:16.845] getGlobalsAndPackages() ... DONE [18:03:16.845] run() for 'Future' ... [18:03:16.845] - state: 'created' [18:03:16.846] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.846] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.846] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.846] - Field: 'label' [18:03:16.847] - Field: 'local' [18:03:16.847] - Field: 'owner' [18:03:16.847] - Field: 'envir' [18:03:16.847] - Field: 'packages' [18:03:16.847] - Field: 'gc' [18:03:16.848] - Field: 'conditions' [18:03:16.848] - Field: 'expr' [18:03:16.848] - Field: 'uuid' [18:03:16.848] - Field: 'seed' [18:03:16.848] - Field: 'version' [18:03:16.849] - Field: 'result' [18:03:16.849] - Field: 'asynchronous' [18:03:16.849] - Field: 'calls' [18:03:16.849] - Field: 'globals' [18:03:16.849] - Field: 'stdout' [18:03:16.849] - Field: 'earlySignal' [18:03:16.850] - Field: 'lazy' [18:03:16.850] - Field: 'state' [18:03:16.850] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.851] - Launch lazy future ... [18:03:16.851] Packages needed by the future expression (n = 0): [18:03:16.852] Packages needed by future strategies (n = 0): [18:03:16.852] { [18:03:16.852] { [18:03:16.852] { [18:03:16.852] ...future.startTime <- base::Sys.time() [18:03:16.852] { [18:03:16.852] { [18:03:16.852] { [18:03:16.852] base::local({ [18:03:16.852] has_future <- base::requireNamespace("future", [18:03:16.852] quietly = TRUE) [18:03:16.852] if (has_future) { [18:03:16.852] ns <- base::getNamespace("future") [18:03:16.852] version <- ns[[".package"]][["version"]] [18:03:16.852] if (is.null(version)) [18:03:16.852] version <- utils::packageVersion("future") [18:03:16.852] } [18:03:16.852] else { [18:03:16.852] version <- NULL [18:03:16.852] } [18:03:16.852] if (!has_future || version < "1.8.0") { [18:03:16.852] info <- base::c(r_version = base::gsub("R version ", [18:03:16.852] "", base::R.version$version.string), [18:03:16.852] platform = base::sprintf("%s (%s-bit)", [18:03:16.852] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.852] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.852] "release", "version")], collapse = " "), [18:03:16.852] hostname = base::Sys.info()[["nodename"]]) [18:03:16.852] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.852] info) [18:03:16.852] info <- base::paste(info, collapse = "; ") [18:03:16.852] if (!has_future) { [18:03:16.852] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.852] info) [18:03:16.852] } [18:03:16.852] else { [18:03:16.852] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.852] info, version) [18:03:16.852] } [18:03:16.852] base::stop(msg) [18:03:16.852] } [18:03:16.852] }) [18:03:16.852] } [18:03:16.852] options(future.plan = NULL) [18:03:16.852] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.852] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.852] } [18:03:16.852] ...future.workdir <- getwd() [18:03:16.852] } [18:03:16.852] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.852] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.852] } [18:03:16.852] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.852] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.852] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.852] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.852] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.852] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.852] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.852] base::names(...future.oldOptions)) [18:03:16.852] } [18:03:16.852] if (FALSE) { [18:03:16.852] } [18:03:16.852] else { [18:03:16.852] if (TRUE) { [18:03:16.852] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.852] open = "w") [18:03:16.852] } [18:03:16.852] else { [18:03:16.852] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.852] windows = "NUL", "/dev/null"), open = "w") [18:03:16.852] } [18:03:16.852] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.852] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.852] base::sink(type = "output", split = FALSE) [18:03:16.852] base::close(...future.stdout) [18:03:16.852] }, add = TRUE) [18:03:16.852] } [18:03:16.852] ...future.frame <- base::sys.nframe() [18:03:16.852] ...future.conditions <- base::list() [18:03:16.852] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.852] if (FALSE) { [18:03:16.852] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.852] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.852] } [18:03:16.852] ...future.result <- base::tryCatch({ [18:03:16.852] base::withCallingHandlers({ [18:03:16.852] ...future.value <- base::withVisible(base::local({ [18:03:16.852] sample(x, size = 1L) [18:03:16.852] })) [18:03:16.852] future::FutureResult(value = ...future.value$value, [18:03:16.852] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.852] ...future.rng), globalenv = if (FALSE) [18:03:16.852] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.852] ...future.globalenv.names)) [18:03:16.852] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.852] }, condition = base::local({ [18:03:16.852] c <- base::c [18:03:16.852] inherits <- base::inherits [18:03:16.852] invokeRestart <- base::invokeRestart [18:03:16.852] length <- base::length [18:03:16.852] list <- base::list [18:03:16.852] seq.int <- base::seq.int [18:03:16.852] signalCondition <- base::signalCondition [18:03:16.852] sys.calls <- base::sys.calls [18:03:16.852] `[[` <- base::`[[` [18:03:16.852] `+` <- base::`+` [18:03:16.852] `<<-` <- base::`<<-` [18:03:16.852] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.852] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.852] 3L)] [18:03:16.852] } [18:03:16.852] function(cond) { [18:03:16.852] is_error <- inherits(cond, "error") [18:03:16.852] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.852] NULL) [18:03:16.852] if (is_error) { [18:03:16.852] sessionInformation <- function() { [18:03:16.852] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.852] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.852] search = base::search(), system = base::Sys.info()) [18:03:16.852] } [18:03:16.852] ...future.conditions[[length(...future.conditions) + [18:03:16.852] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.852] cond$call), session = sessionInformation(), [18:03:16.852] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.852] signalCondition(cond) [18:03:16.852] } [18:03:16.852] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.852] "immediateCondition"))) { [18:03:16.852] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.852] ...future.conditions[[length(...future.conditions) + [18:03:16.852] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.852] if (TRUE && !signal) { [18:03:16.852] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.852] { [18:03:16.852] inherits <- base::inherits [18:03:16.852] invokeRestart <- base::invokeRestart [18:03:16.852] is.null <- base::is.null [18:03:16.852] muffled <- FALSE [18:03:16.852] if (inherits(cond, "message")) { [18:03:16.852] muffled <- grepl(pattern, "muffleMessage") [18:03:16.852] if (muffled) [18:03:16.852] invokeRestart("muffleMessage") [18:03:16.852] } [18:03:16.852] else if (inherits(cond, "warning")) { [18:03:16.852] muffled <- grepl(pattern, "muffleWarning") [18:03:16.852] if (muffled) [18:03:16.852] invokeRestart("muffleWarning") [18:03:16.852] } [18:03:16.852] else if (inherits(cond, "condition")) { [18:03:16.852] if (!is.null(pattern)) { [18:03:16.852] computeRestarts <- base::computeRestarts [18:03:16.852] grepl <- base::grepl [18:03:16.852] restarts <- computeRestarts(cond) [18:03:16.852] for (restart in restarts) { [18:03:16.852] name <- restart$name [18:03:16.852] if (is.null(name)) [18:03:16.852] next [18:03:16.852] if (!grepl(pattern, name)) [18:03:16.852] next [18:03:16.852] invokeRestart(restart) [18:03:16.852] muffled <- TRUE [18:03:16.852] break [18:03:16.852] } [18:03:16.852] } [18:03:16.852] } [18:03:16.852] invisible(muffled) [18:03:16.852] } [18:03:16.852] muffleCondition(cond, pattern = "^muffle") [18:03:16.852] } [18:03:16.852] } [18:03:16.852] else { [18:03:16.852] if (TRUE) { [18:03:16.852] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.852] { [18:03:16.852] inherits <- base::inherits [18:03:16.852] invokeRestart <- base::invokeRestart [18:03:16.852] is.null <- base::is.null [18:03:16.852] muffled <- FALSE [18:03:16.852] if (inherits(cond, "message")) { [18:03:16.852] muffled <- grepl(pattern, "muffleMessage") [18:03:16.852] if (muffled) [18:03:16.852] invokeRestart("muffleMessage") [18:03:16.852] } [18:03:16.852] else if (inherits(cond, "warning")) { [18:03:16.852] muffled <- grepl(pattern, "muffleWarning") [18:03:16.852] if (muffled) [18:03:16.852] invokeRestart("muffleWarning") [18:03:16.852] } [18:03:16.852] else if (inherits(cond, "condition")) { [18:03:16.852] if (!is.null(pattern)) { [18:03:16.852] computeRestarts <- base::computeRestarts [18:03:16.852] grepl <- base::grepl [18:03:16.852] restarts <- computeRestarts(cond) [18:03:16.852] for (restart in restarts) { [18:03:16.852] name <- restart$name [18:03:16.852] if (is.null(name)) [18:03:16.852] next [18:03:16.852] if (!grepl(pattern, name)) [18:03:16.852] next [18:03:16.852] invokeRestart(restart) [18:03:16.852] muffled <- TRUE [18:03:16.852] break [18:03:16.852] } [18:03:16.852] } [18:03:16.852] } [18:03:16.852] invisible(muffled) [18:03:16.852] } [18:03:16.852] muffleCondition(cond, pattern = "^muffle") [18:03:16.852] } [18:03:16.852] } [18:03:16.852] } [18:03:16.852] })) [18:03:16.852] }, error = function(ex) { [18:03:16.852] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.852] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.852] ...future.rng), started = ...future.startTime, [18:03:16.852] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.852] version = "1.8"), class = "FutureResult") [18:03:16.852] }, finally = { [18:03:16.852] if (!identical(...future.workdir, getwd())) [18:03:16.852] setwd(...future.workdir) [18:03:16.852] { [18:03:16.852] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.852] ...future.oldOptions$nwarnings <- NULL [18:03:16.852] } [18:03:16.852] base::options(...future.oldOptions) [18:03:16.852] if (.Platform$OS.type == "windows") { [18:03:16.852] old_names <- names(...future.oldEnvVars) [18:03:16.852] envs <- base::Sys.getenv() [18:03:16.852] names <- names(envs) [18:03:16.852] common <- intersect(names, old_names) [18:03:16.852] added <- setdiff(names, old_names) [18:03:16.852] removed <- setdiff(old_names, names) [18:03:16.852] changed <- common[...future.oldEnvVars[common] != [18:03:16.852] envs[common]] [18:03:16.852] NAMES <- toupper(changed) [18:03:16.852] args <- list() [18:03:16.852] for (kk in seq_along(NAMES)) { [18:03:16.852] name <- changed[[kk]] [18:03:16.852] NAME <- NAMES[[kk]] [18:03:16.852] if (name != NAME && is.element(NAME, old_names)) [18:03:16.852] next [18:03:16.852] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.852] } [18:03:16.852] NAMES <- toupper(added) [18:03:16.852] for (kk in seq_along(NAMES)) { [18:03:16.852] name <- added[[kk]] [18:03:16.852] NAME <- NAMES[[kk]] [18:03:16.852] if (name != NAME && is.element(NAME, old_names)) [18:03:16.852] next [18:03:16.852] args[[name]] <- "" [18:03:16.852] } [18:03:16.852] NAMES <- toupper(removed) [18:03:16.852] for (kk in seq_along(NAMES)) { [18:03:16.852] name <- removed[[kk]] [18:03:16.852] NAME <- NAMES[[kk]] [18:03:16.852] if (name != NAME && is.element(NAME, old_names)) [18:03:16.852] next [18:03:16.852] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.852] } [18:03:16.852] if (length(args) > 0) [18:03:16.852] base::do.call(base::Sys.setenv, args = args) [18:03:16.852] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.852] } [18:03:16.852] else { [18:03:16.852] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.852] } [18:03:16.852] { [18:03:16.852] if (base::length(...future.futureOptionsAdded) > [18:03:16.852] 0L) { [18:03:16.852] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.852] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.852] base::options(opts) [18:03:16.852] } [18:03:16.852] { [18:03:16.852] { [18:03:16.852] base::assign(".Random.seed", c(10407L, -360425712L, [18:03:16.852] 1204573881L, 140613387L, -565828537L, 1595519908L, [18:03:16.852] 2092638744L), envir = base::globalenv(), [18:03:16.852] inherits = FALSE) [18:03:16.852] NULL [18:03:16.852] } [18:03:16.852] options(future.plan = NULL) [18:03:16.852] if (is.na(NA_character_)) [18:03:16.852] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.852] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.852] future::plan(list(function (..., envir = parent.frame()) [18:03:16.852] { [18:03:16.852] future <- SequentialFuture(..., envir = envir) [18:03:16.852] if (!future$lazy) [18:03:16.852] future <- run(future) [18:03:16.852] invisible(future) [18:03:16.852] }), .cleanup = FALSE, .init = FALSE) [18:03:16.852] } [18:03:16.852] } [18:03:16.852] } [18:03:16.852] }) [18:03:16.852] if (TRUE) { [18:03:16.852] base::sink(type = "output", split = FALSE) [18:03:16.852] if (TRUE) { [18:03:16.852] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.852] } [18:03:16.852] else { [18:03:16.852] ...future.result["stdout"] <- base::list(NULL) [18:03:16.852] } [18:03:16.852] base::close(...future.stdout) [18:03:16.852] ...future.stdout <- NULL [18:03:16.852] } [18:03:16.852] ...future.result$conditions <- ...future.conditions [18:03:16.852] ...future.result$finished <- base::Sys.time() [18:03:16.852] ...future.result [18:03:16.852] } [18:03:16.856] assign_globals() ... [18:03:16.856] List of 1 [18:03:16.856] $ x: int [1:4] 0 1 2 3 [18:03:16.856] - attr(*, "where")=List of 1 [18:03:16.856] ..$ x: [18:03:16.856] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.856] - attr(*, "resolved")= logi FALSE [18:03:16.856] - attr(*, "total_size")= num 64 [18:03:16.856] - attr(*, "already-done")= logi TRUE [18:03:16.859] - copied 'x' to environment [18:03:16.859] assign_globals() ... done [18:03:16.860] plan(): Setting new future strategy stack: [18:03:16.860] List of future strategies: [18:03:16.860] 1. sequential: [18:03:16.860] - args: function (..., envir = parent.frame()) [18:03:16.860] - tweaked: FALSE [18:03:16.860] - call: NULL [18:03:16.860] plan(): nbrOfWorkers() = 1 [18:03:16.861] plan(): Setting new future strategy stack: [18:03:16.861] List of future strategies: [18:03:16.861] 1. sequential: [18:03:16.861] - args: function (..., envir = parent.frame()) [18:03:16.861] - tweaked: FALSE [18:03:16.861] - call: plan(strategy) [18:03:16.862] plan(): nbrOfWorkers() = 1 [18:03:16.862] SequentialFuture started (and completed) [18:03:16.862] - Launch lazy future ... done [18:03:16.863] run() for 'SequentialFuture' ... done [18:03:16.863] getGlobalsAndPackages() ... [18:03:16.863] Searching for globals... [18:03:16.864] - globals found: [3] '{', 'sample', 'x' [18:03:16.865] Searching for globals ... DONE [18:03:16.865] Resolving globals: FALSE [18:03:16.865] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.866] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.866] - globals: [1] 'x' [18:03:16.866] [18:03:16.866] getGlobalsAndPackages() ... DONE [18:03:16.866] run() for 'Future' ... [18:03:16.867] - state: 'created' [18:03:16.867] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.867] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.867] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.868] - Field: 'label' [18:03:16.868] - Field: 'local' [18:03:16.868] - Field: 'owner' [18:03:16.868] - Field: 'envir' [18:03:16.868] - Field: 'packages' [18:03:16.868] - Field: 'gc' [18:03:16.869] - Field: 'conditions' [18:03:16.869] - Field: 'expr' [18:03:16.869] - Field: 'uuid' [18:03:16.869] - Field: 'seed' [18:03:16.869] - Field: 'version' [18:03:16.870] - Field: 'result' [18:03:16.870] - Field: 'asynchronous' [18:03:16.870] - Field: 'calls' [18:03:16.870] - Field: 'globals' [18:03:16.870] - Field: 'stdout' [18:03:16.870] - Field: 'earlySignal' [18:03:16.871] - Field: 'lazy' [18:03:16.871] - Field: 'state' [18:03:16.871] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.871] - Launch lazy future ... [18:03:16.871] Packages needed by the future expression (n = 0): [18:03:16.871] Packages needed by future strategies (n = 0): [18:03:16.872] { [18:03:16.872] { [18:03:16.872] { [18:03:16.872] ...future.startTime <- base::Sys.time() [18:03:16.872] { [18:03:16.872] { [18:03:16.872] { [18:03:16.872] base::local({ [18:03:16.872] has_future <- base::requireNamespace("future", [18:03:16.872] quietly = TRUE) [18:03:16.872] if (has_future) { [18:03:16.872] ns <- base::getNamespace("future") [18:03:16.872] version <- ns[[".package"]][["version"]] [18:03:16.872] if (is.null(version)) [18:03:16.872] version <- utils::packageVersion("future") [18:03:16.872] } [18:03:16.872] else { [18:03:16.872] version <- NULL [18:03:16.872] } [18:03:16.872] if (!has_future || version < "1.8.0") { [18:03:16.872] info <- base::c(r_version = base::gsub("R version ", [18:03:16.872] "", base::R.version$version.string), [18:03:16.872] platform = base::sprintf("%s (%s-bit)", [18:03:16.872] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.872] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.872] "release", "version")], collapse = " "), [18:03:16.872] hostname = base::Sys.info()[["nodename"]]) [18:03:16.872] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.872] info) [18:03:16.872] info <- base::paste(info, collapse = "; ") [18:03:16.872] if (!has_future) { [18:03:16.872] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.872] info) [18:03:16.872] } [18:03:16.872] else { [18:03:16.872] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.872] info, version) [18:03:16.872] } [18:03:16.872] base::stop(msg) [18:03:16.872] } [18:03:16.872] }) [18:03:16.872] } [18:03:16.872] options(future.plan = NULL) [18:03:16.872] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.872] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.872] } [18:03:16.872] ...future.workdir <- getwd() [18:03:16.872] } [18:03:16.872] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.872] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.872] } [18:03:16.872] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.872] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.872] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.872] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.872] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.872] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.872] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.872] base::names(...future.oldOptions)) [18:03:16.872] } [18:03:16.872] if (FALSE) { [18:03:16.872] } [18:03:16.872] else { [18:03:16.872] if (TRUE) { [18:03:16.872] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.872] open = "w") [18:03:16.872] } [18:03:16.872] else { [18:03:16.872] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.872] windows = "NUL", "/dev/null"), open = "w") [18:03:16.872] } [18:03:16.872] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.872] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.872] base::sink(type = "output", split = FALSE) [18:03:16.872] base::close(...future.stdout) [18:03:16.872] }, add = TRUE) [18:03:16.872] } [18:03:16.872] ...future.frame <- base::sys.nframe() [18:03:16.872] ...future.conditions <- base::list() [18:03:16.872] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.872] if (FALSE) { [18:03:16.872] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.872] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.872] } [18:03:16.872] ...future.result <- base::tryCatch({ [18:03:16.872] base::withCallingHandlers({ [18:03:16.872] ...future.value <- base::withVisible(base::local({ [18:03:16.872] sample(x, size = 1L) [18:03:16.872] })) [18:03:16.872] future::FutureResult(value = ...future.value$value, [18:03:16.872] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.872] ...future.rng), globalenv = if (FALSE) [18:03:16.872] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.872] ...future.globalenv.names)) [18:03:16.872] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.872] }, condition = base::local({ [18:03:16.872] c <- base::c [18:03:16.872] inherits <- base::inherits [18:03:16.872] invokeRestart <- base::invokeRestart [18:03:16.872] length <- base::length [18:03:16.872] list <- base::list [18:03:16.872] seq.int <- base::seq.int [18:03:16.872] signalCondition <- base::signalCondition [18:03:16.872] sys.calls <- base::sys.calls [18:03:16.872] `[[` <- base::`[[` [18:03:16.872] `+` <- base::`+` [18:03:16.872] `<<-` <- base::`<<-` [18:03:16.872] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.872] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.872] 3L)] [18:03:16.872] } [18:03:16.872] function(cond) { [18:03:16.872] is_error <- inherits(cond, "error") [18:03:16.872] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.872] NULL) [18:03:16.872] if (is_error) { [18:03:16.872] sessionInformation <- function() { [18:03:16.872] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.872] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.872] search = base::search(), system = base::Sys.info()) [18:03:16.872] } [18:03:16.872] ...future.conditions[[length(...future.conditions) + [18:03:16.872] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.872] cond$call), session = sessionInformation(), [18:03:16.872] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.872] signalCondition(cond) [18:03:16.872] } [18:03:16.872] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.872] "immediateCondition"))) { [18:03:16.872] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.872] ...future.conditions[[length(...future.conditions) + [18:03:16.872] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.872] if (TRUE && !signal) { [18:03:16.872] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.872] { [18:03:16.872] inherits <- base::inherits [18:03:16.872] invokeRestart <- base::invokeRestart [18:03:16.872] is.null <- base::is.null [18:03:16.872] muffled <- FALSE [18:03:16.872] if (inherits(cond, "message")) { [18:03:16.872] muffled <- grepl(pattern, "muffleMessage") [18:03:16.872] if (muffled) [18:03:16.872] invokeRestart("muffleMessage") [18:03:16.872] } [18:03:16.872] else if (inherits(cond, "warning")) { [18:03:16.872] muffled <- grepl(pattern, "muffleWarning") [18:03:16.872] if (muffled) [18:03:16.872] invokeRestart("muffleWarning") [18:03:16.872] } [18:03:16.872] else if (inherits(cond, "condition")) { [18:03:16.872] if (!is.null(pattern)) { [18:03:16.872] computeRestarts <- base::computeRestarts [18:03:16.872] grepl <- base::grepl [18:03:16.872] restarts <- computeRestarts(cond) [18:03:16.872] for (restart in restarts) { [18:03:16.872] name <- restart$name [18:03:16.872] if (is.null(name)) [18:03:16.872] next [18:03:16.872] if (!grepl(pattern, name)) [18:03:16.872] next [18:03:16.872] invokeRestart(restart) [18:03:16.872] muffled <- TRUE [18:03:16.872] break [18:03:16.872] } [18:03:16.872] } [18:03:16.872] } [18:03:16.872] invisible(muffled) [18:03:16.872] } [18:03:16.872] muffleCondition(cond, pattern = "^muffle") [18:03:16.872] } [18:03:16.872] } [18:03:16.872] else { [18:03:16.872] if (TRUE) { [18:03:16.872] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.872] { [18:03:16.872] inherits <- base::inherits [18:03:16.872] invokeRestart <- base::invokeRestart [18:03:16.872] is.null <- base::is.null [18:03:16.872] muffled <- FALSE [18:03:16.872] if (inherits(cond, "message")) { [18:03:16.872] muffled <- grepl(pattern, "muffleMessage") [18:03:16.872] if (muffled) [18:03:16.872] invokeRestart("muffleMessage") [18:03:16.872] } [18:03:16.872] else if (inherits(cond, "warning")) { [18:03:16.872] muffled <- grepl(pattern, "muffleWarning") [18:03:16.872] if (muffled) [18:03:16.872] invokeRestart("muffleWarning") [18:03:16.872] } [18:03:16.872] else if (inherits(cond, "condition")) { [18:03:16.872] if (!is.null(pattern)) { [18:03:16.872] computeRestarts <- base::computeRestarts [18:03:16.872] grepl <- base::grepl [18:03:16.872] restarts <- computeRestarts(cond) [18:03:16.872] for (restart in restarts) { [18:03:16.872] name <- restart$name [18:03:16.872] if (is.null(name)) [18:03:16.872] next [18:03:16.872] if (!grepl(pattern, name)) [18:03:16.872] next [18:03:16.872] invokeRestart(restart) [18:03:16.872] muffled <- TRUE [18:03:16.872] break [18:03:16.872] } [18:03:16.872] } [18:03:16.872] } [18:03:16.872] invisible(muffled) [18:03:16.872] } [18:03:16.872] muffleCondition(cond, pattern = "^muffle") [18:03:16.872] } [18:03:16.872] } [18:03:16.872] } [18:03:16.872] })) [18:03:16.872] }, error = function(ex) { [18:03:16.872] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.872] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.872] ...future.rng), started = ...future.startTime, [18:03:16.872] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.872] version = "1.8"), class = "FutureResult") [18:03:16.872] }, finally = { [18:03:16.872] if (!identical(...future.workdir, getwd())) [18:03:16.872] setwd(...future.workdir) [18:03:16.872] { [18:03:16.872] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.872] ...future.oldOptions$nwarnings <- NULL [18:03:16.872] } [18:03:16.872] base::options(...future.oldOptions) [18:03:16.872] if (.Platform$OS.type == "windows") { [18:03:16.872] old_names <- names(...future.oldEnvVars) [18:03:16.872] envs <- base::Sys.getenv() [18:03:16.872] names <- names(envs) [18:03:16.872] common <- intersect(names, old_names) [18:03:16.872] added <- setdiff(names, old_names) [18:03:16.872] removed <- setdiff(old_names, names) [18:03:16.872] changed <- common[...future.oldEnvVars[common] != [18:03:16.872] envs[common]] [18:03:16.872] NAMES <- toupper(changed) [18:03:16.872] args <- list() [18:03:16.872] for (kk in seq_along(NAMES)) { [18:03:16.872] name <- changed[[kk]] [18:03:16.872] NAME <- NAMES[[kk]] [18:03:16.872] if (name != NAME && is.element(NAME, old_names)) [18:03:16.872] next [18:03:16.872] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.872] } [18:03:16.872] NAMES <- toupper(added) [18:03:16.872] for (kk in seq_along(NAMES)) { [18:03:16.872] name <- added[[kk]] [18:03:16.872] NAME <- NAMES[[kk]] [18:03:16.872] if (name != NAME && is.element(NAME, old_names)) [18:03:16.872] next [18:03:16.872] args[[name]] <- "" [18:03:16.872] } [18:03:16.872] NAMES <- toupper(removed) [18:03:16.872] for (kk in seq_along(NAMES)) { [18:03:16.872] name <- removed[[kk]] [18:03:16.872] NAME <- NAMES[[kk]] [18:03:16.872] if (name != NAME && is.element(NAME, old_names)) [18:03:16.872] next [18:03:16.872] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.872] } [18:03:16.872] if (length(args) > 0) [18:03:16.872] base::do.call(base::Sys.setenv, args = args) [18:03:16.872] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.872] } [18:03:16.872] else { [18:03:16.872] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.872] } [18:03:16.872] { [18:03:16.872] if (base::length(...future.futureOptionsAdded) > [18:03:16.872] 0L) { [18:03:16.872] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.872] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.872] base::options(opts) [18:03:16.872] } [18:03:16.872] { [18:03:16.872] { [18:03:16.872] base::assign(".Random.seed", c(10407L, 140613387L, [18:03:16.872] 975528569L, -936944055L, 2092638744L, 412926000L, [18:03:16.872] -1646547732L), envir = base::globalenv(), [18:03:16.872] inherits = FALSE) [18:03:16.872] NULL [18:03:16.872] } [18:03:16.872] options(future.plan = NULL) [18:03:16.872] if (is.na(NA_character_)) [18:03:16.872] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.872] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.872] future::plan(list(function (..., envir = parent.frame()) [18:03:16.872] { [18:03:16.872] future <- SequentialFuture(..., envir = envir) [18:03:16.872] if (!future$lazy) [18:03:16.872] future <- run(future) [18:03:16.872] invisible(future) [18:03:16.872] }), .cleanup = FALSE, .init = FALSE) [18:03:16.872] } [18:03:16.872] } [18:03:16.872] } [18:03:16.872] }) [18:03:16.872] if (TRUE) { [18:03:16.872] base::sink(type = "output", split = FALSE) [18:03:16.872] if (TRUE) { [18:03:16.872] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.872] } [18:03:16.872] else { [18:03:16.872] ...future.result["stdout"] <- base::list(NULL) [18:03:16.872] } [18:03:16.872] base::close(...future.stdout) [18:03:16.872] ...future.stdout <- NULL [18:03:16.872] } [18:03:16.872] ...future.result$conditions <- ...future.conditions [18:03:16.872] ...future.result$finished <- base::Sys.time() [18:03:16.872] ...future.result [18:03:16.872] } [18:03:16.876] assign_globals() ... [18:03:16.876] List of 1 [18:03:16.876] $ x: int [1:4] 0 1 2 3 [18:03:16.876] - attr(*, "where")=List of 1 [18:03:16.876] ..$ x: [18:03:16.876] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.876] - attr(*, "resolved")= logi FALSE [18:03:16.876] - attr(*, "total_size")= num 64 [18:03:16.876] - attr(*, "already-done")= logi TRUE [18:03:16.879] - copied 'x' to environment [18:03:16.879] assign_globals() ... done [18:03:16.879] plan(): Setting new future strategy stack: [18:03:16.880] List of future strategies: [18:03:16.880] 1. sequential: [18:03:16.880] - args: function (..., envir = parent.frame()) [18:03:16.880] - tweaked: FALSE [18:03:16.880] - call: NULL [18:03:16.880] plan(): nbrOfWorkers() = 1 [18:03:16.881] plan(): Setting new future strategy stack: [18:03:16.881] List of future strategies: [18:03:16.881] 1. sequential: [18:03:16.881] - args: function (..., envir = parent.frame()) [18:03:16.881] - tweaked: FALSE [18:03:16.881] - call: plan(strategy) [18:03:16.882] plan(): nbrOfWorkers() = 1 [18:03:16.882] SequentialFuture started (and completed) [18:03:16.882] - Launch lazy future ... done [18:03:16.882] run() for 'SequentialFuture' ... done [18:03:16.883] getGlobalsAndPackages() ... [18:03:16.883] Searching for globals... [18:03:16.884] - globals found: [3] '{', 'sample', 'x' [18:03:16.884] Searching for globals ... DONE [18:03:16.885] Resolving globals: FALSE [18:03:16.885] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.885] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.886] - globals: [1] 'x' [18:03:16.886] [18:03:16.887] getGlobalsAndPackages() ... DONE [18:03:16.887] run() for 'Future' ... [18:03:16.887] - state: 'created' [18:03:16.888] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.888] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.888] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.888] - Field: 'label' [18:03:16.889] - Field: 'local' [18:03:16.889] - Field: 'owner' [18:03:16.889] - Field: 'envir' [18:03:16.889] - Field: 'packages' [18:03:16.889] - Field: 'gc' [18:03:16.890] - Field: 'conditions' [18:03:16.890] - Field: 'expr' [18:03:16.890] - Field: 'uuid' [18:03:16.890] - Field: 'seed' [18:03:16.890] - Field: 'version' [18:03:16.890] - Field: 'result' [18:03:16.891] - Field: 'asynchronous' [18:03:16.891] - Field: 'calls' [18:03:16.891] - Field: 'globals' [18:03:16.891] - Field: 'stdout' [18:03:16.891] - Field: 'earlySignal' [18:03:16.891] - Field: 'lazy' [18:03:16.892] - Field: 'state' [18:03:16.892] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.892] - Launch lazy future ... [18:03:16.892] Packages needed by the future expression (n = 0): [18:03:16.892] Packages needed by future strategies (n = 0): [18:03:16.893] { [18:03:16.893] { [18:03:16.893] { [18:03:16.893] ...future.startTime <- base::Sys.time() [18:03:16.893] { [18:03:16.893] { [18:03:16.893] { [18:03:16.893] base::local({ [18:03:16.893] has_future <- base::requireNamespace("future", [18:03:16.893] quietly = TRUE) [18:03:16.893] if (has_future) { [18:03:16.893] ns <- base::getNamespace("future") [18:03:16.893] version <- ns[[".package"]][["version"]] [18:03:16.893] if (is.null(version)) [18:03:16.893] version <- utils::packageVersion("future") [18:03:16.893] } [18:03:16.893] else { [18:03:16.893] version <- NULL [18:03:16.893] } [18:03:16.893] if (!has_future || version < "1.8.0") { [18:03:16.893] info <- base::c(r_version = base::gsub("R version ", [18:03:16.893] "", base::R.version$version.string), [18:03:16.893] platform = base::sprintf("%s (%s-bit)", [18:03:16.893] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.893] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.893] "release", "version")], collapse = " "), [18:03:16.893] hostname = base::Sys.info()[["nodename"]]) [18:03:16.893] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.893] info) [18:03:16.893] info <- base::paste(info, collapse = "; ") [18:03:16.893] if (!has_future) { [18:03:16.893] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.893] info) [18:03:16.893] } [18:03:16.893] else { [18:03:16.893] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.893] info, version) [18:03:16.893] } [18:03:16.893] base::stop(msg) [18:03:16.893] } [18:03:16.893] }) [18:03:16.893] } [18:03:16.893] options(future.plan = NULL) [18:03:16.893] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.893] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.893] } [18:03:16.893] ...future.workdir <- getwd() [18:03:16.893] } [18:03:16.893] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.893] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.893] } [18:03:16.893] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.893] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.893] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.893] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.893] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.893] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.893] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.893] base::names(...future.oldOptions)) [18:03:16.893] } [18:03:16.893] if (FALSE) { [18:03:16.893] } [18:03:16.893] else { [18:03:16.893] if (TRUE) { [18:03:16.893] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.893] open = "w") [18:03:16.893] } [18:03:16.893] else { [18:03:16.893] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.893] windows = "NUL", "/dev/null"), open = "w") [18:03:16.893] } [18:03:16.893] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.893] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.893] base::sink(type = "output", split = FALSE) [18:03:16.893] base::close(...future.stdout) [18:03:16.893] }, add = TRUE) [18:03:16.893] } [18:03:16.893] ...future.frame <- base::sys.nframe() [18:03:16.893] ...future.conditions <- base::list() [18:03:16.893] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.893] if (FALSE) { [18:03:16.893] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.893] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.893] } [18:03:16.893] ...future.result <- base::tryCatch({ [18:03:16.893] base::withCallingHandlers({ [18:03:16.893] ...future.value <- base::withVisible(base::local({ [18:03:16.893] sample(x, size = 1L) [18:03:16.893] })) [18:03:16.893] future::FutureResult(value = ...future.value$value, [18:03:16.893] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.893] ...future.rng), globalenv = if (FALSE) [18:03:16.893] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.893] ...future.globalenv.names)) [18:03:16.893] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.893] }, condition = base::local({ [18:03:16.893] c <- base::c [18:03:16.893] inherits <- base::inherits [18:03:16.893] invokeRestart <- base::invokeRestart [18:03:16.893] length <- base::length [18:03:16.893] list <- base::list [18:03:16.893] seq.int <- base::seq.int [18:03:16.893] signalCondition <- base::signalCondition [18:03:16.893] sys.calls <- base::sys.calls [18:03:16.893] `[[` <- base::`[[` [18:03:16.893] `+` <- base::`+` [18:03:16.893] `<<-` <- base::`<<-` [18:03:16.893] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.893] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.893] 3L)] [18:03:16.893] } [18:03:16.893] function(cond) { [18:03:16.893] is_error <- inherits(cond, "error") [18:03:16.893] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.893] NULL) [18:03:16.893] if (is_error) { [18:03:16.893] sessionInformation <- function() { [18:03:16.893] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.893] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.893] search = base::search(), system = base::Sys.info()) [18:03:16.893] } [18:03:16.893] ...future.conditions[[length(...future.conditions) + [18:03:16.893] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.893] cond$call), session = sessionInformation(), [18:03:16.893] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.893] signalCondition(cond) [18:03:16.893] } [18:03:16.893] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.893] "immediateCondition"))) { [18:03:16.893] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.893] ...future.conditions[[length(...future.conditions) + [18:03:16.893] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.893] if (TRUE && !signal) { [18:03:16.893] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.893] { [18:03:16.893] inherits <- base::inherits [18:03:16.893] invokeRestart <- base::invokeRestart [18:03:16.893] is.null <- base::is.null [18:03:16.893] muffled <- FALSE [18:03:16.893] if (inherits(cond, "message")) { [18:03:16.893] muffled <- grepl(pattern, "muffleMessage") [18:03:16.893] if (muffled) [18:03:16.893] invokeRestart("muffleMessage") [18:03:16.893] } [18:03:16.893] else if (inherits(cond, "warning")) { [18:03:16.893] muffled <- grepl(pattern, "muffleWarning") [18:03:16.893] if (muffled) [18:03:16.893] invokeRestart("muffleWarning") [18:03:16.893] } [18:03:16.893] else if (inherits(cond, "condition")) { [18:03:16.893] if (!is.null(pattern)) { [18:03:16.893] computeRestarts <- base::computeRestarts [18:03:16.893] grepl <- base::grepl [18:03:16.893] restarts <- computeRestarts(cond) [18:03:16.893] for (restart in restarts) { [18:03:16.893] name <- restart$name [18:03:16.893] if (is.null(name)) [18:03:16.893] next [18:03:16.893] if (!grepl(pattern, name)) [18:03:16.893] next [18:03:16.893] invokeRestart(restart) [18:03:16.893] muffled <- TRUE [18:03:16.893] break [18:03:16.893] } [18:03:16.893] } [18:03:16.893] } [18:03:16.893] invisible(muffled) [18:03:16.893] } [18:03:16.893] muffleCondition(cond, pattern = "^muffle") [18:03:16.893] } [18:03:16.893] } [18:03:16.893] else { [18:03:16.893] if (TRUE) { [18:03:16.893] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.893] { [18:03:16.893] inherits <- base::inherits [18:03:16.893] invokeRestart <- base::invokeRestart [18:03:16.893] is.null <- base::is.null [18:03:16.893] muffled <- FALSE [18:03:16.893] if (inherits(cond, "message")) { [18:03:16.893] muffled <- grepl(pattern, "muffleMessage") [18:03:16.893] if (muffled) [18:03:16.893] invokeRestart("muffleMessage") [18:03:16.893] } [18:03:16.893] else if (inherits(cond, "warning")) { [18:03:16.893] muffled <- grepl(pattern, "muffleWarning") [18:03:16.893] if (muffled) [18:03:16.893] invokeRestart("muffleWarning") [18:03:16.893] } [18:03:16.893] else if (inherits(cond, "condition")) { [18:03:16.893] if (!is.null(pattern)) { [18:03:16.893] computeRestarts <- base::computeRestarts [18:03:16.893] grepl <- base::grepl [18:03:16.893] restarts <- computeRestarts(cond) [18:03:16.893] for (restart in restarts) { [18:03:16.893] name <- restart$name [18:03:16.893] if (is.null(name)) [18:03:16.893] next [18:03:16.893] if (!grepl(pattern, name)) [18:03:16.893] next [18:03:16.893] invokeRestart(restart) [18:03:16.893] muffled <- TRUE [18:03:16.893] break [18:03:16.893] } [18:03:16.893] } [18:03:16.893] } [18:03:16.893] invisible(muffled) [18:03:16.893] } [18:03:16.893] muffleCondition(cond, pattern = "^muffle") [18:03:16.893] } [18:03:16.893] } [18:03:16.893] } [18:03:16.893] })) [18:03:16.893] }, error = function(ex) { [18:03:16.893] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.893] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.893] ...future.rng), started = ...future.startTime, [18:03:16.893] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.893] version = "1.8"), class = "FutureResult") [18:03:16.893] }, finally = { [18:03:16.893] if (!identical(...future.workdir, getwd())) [18:03:16.893] setwd(...future.workdir) [18:03:16.893] { [18:03:16.893] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.893] ...future.oldOptions$nwarnings <- NULL [18:03:16.893] } [18:03:16.893] base::options(...future.oldOptions) [18:03:16.893] if (.Platform$OS.type == "windows") { [18:03:16.893] old_names <- names(...future.oldEnvVars) [18:03:16.893] envs <- base::Sys.getenv() [18:03:16.893] names <- names(envs) [18:03:16.893] common <- intersect(names, old_names) [18:03:16.893] added <- setdiff(names, old_names) [18:03:16.893] removed <- setdiff(old_names, names) [18:03:16.893] changed <- common[...future.oldEnvVars[common] != [18:03:16.893] envs[common]] [18:03:16.893] NAMES <- toupper(changed) [18:03:16.893] args <- list() [18:03:16.893] for (kk in seq_along(NAMES)) { [18:03:16.893] name <- changed[[kk]] [18:03:16.893] NAME <- NAMES[[kk]] [18:03:16.893] if (name != NAME && is.element(NAME, old_names)) [18:03:16.893] next [18:03:16.893] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.893] } [18:03:16.893] NAMES <- toupper(added) [18:03:16.893] for (kk in seq_along(NAMES)) { [18:03:16.893] name <- added[[kk]] [18:03:16.893] NAME <- NAMES[[kk]] [18:03:16.893] if (name != NAME && is.element(NAME, old_names)) [18:03:16.893] next [18:03:16.893] args[[name]] <- "" [18:03:16.893] } [18:03:16.893] NAMES <- toupper(removed) [18:03:16.893] for (kk in seq_along(NAMES)) { [18:03:16.893] name <- removed[[kk]] [18:03:16.893] NAME <- NAMES[[kk]] [18:03:16.893] if (name != NAME && is.element(NAME, old_names)) [18:03:16.893] next [18:03:16.893] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.893] } [18:03:16.893] if (length(args) > 0) [18:03:16.893] base::do.call(base::Sys.setenv, args = args) [18:03:16.893] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.893] } [18:03:16.893] else { [18:03:16.893] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.893] } [18:03:16.893] { [18:03:16.893] if (base::length(...future.futureOptionsAdded) > [18:03:16.893] 0L) { [18:03:16.893] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.893] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.893] base::options(opts) [18:03:16.893] } [18:03:16.893] { [18:03:16.893] { [18:03:16.893] base::assign(".Random.seed", c(10407L, -936944055L, [18:03:16.893] -1017084284L, 127613059L, -1646547732L, -1681072108L, [18:03:16.893] 213234980L), envir = base::globalenv(), inherits = FALSE) [18:03:16.893] NULL [18:03:16.893] } [18:03:16.893] options(future.plan = NULL) [18:03:16.893] if (is.na(NA_character_)) [18:03:16.893] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.893] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.893] future::plan(list(function (..., envir = parent.frame()) [18:03:16.893] { [18:03:16.893] future <- SequentialFuture(..., envir = envir) [18:03:16.893] if (!future$lazy) [18:03:16.893] future <- run(future) [18:03:16.893] invisible(future) [18:03:16.893] }), .cleanup = FALSE, .init = FALSE) [18:03:16.893] } [18:03:16.893] } [18:03:16.893] } [18:03:16.893] }) [18:03:16.893] if (TRUE) { [18:03:16.893] base::sink(type = "output", split = FALSE) [18:03:16.893] if (TRUE) { [18:03:16.893] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.893] } [18:03:16.893] else { [18:03:16.893] ...future.result["stdout"] <- base::list(NULL) [18:03:16.893] } [18:03:16.893] base::close(...future.stdout) [18:03:16.893] ...future.stdout <- NULL [18:03:16.893] } [18:03:16.893] ...future.result$conditions <- ...future.conditions [18:03:16.893] ...future.result$finished <- base::Sys.time() [18:03:16.893] ...future.result [18:03:16.893] } [18:03:16.897] assign_globals() ... [18:03:16.897] List of 1 [18:03:16.897] $ x: int [1:4] 0 1 2 3 [18:03:16.897] - attr(*, "where")=List of 1 [18:03:16.897] ..$ x: [18:03:16.897] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.897] - attr(*, "resolved")= logi FALSE [18:03:16.897] - attr(*, "total_size")= num 64 [18:03:16.897] - attr(*, "already-done")= logi TRUE [18:03:16.900] - copied 'x' to environment [18:03:16.900] assign_globals() ... done [18:03:16.900] plan(): Setting new future strategy stack: [18:03:16.900] List of future strategies: [18:03:16.900] 1. sequential: [18:03:16.900] - args: function (..., envir = parent.frame()) [18:03:16.900] - tweaked: FALSE [18:03:16.900] - call: NULL [18:03:16.901] plan(): nbrOfWorkers() = 1 [18:03:16.902] plan(): Setting new future strategy stack: [18:03:16.902] List of future strategies: [18:03:16.902] 1. sequential: [18:03:16.902] - args: function (..., envir = parent.frame()) [18:03:16.902] - tweaked: FALSE [18:03:16.902] - call: plan(strategy) [18:03:16.903] plan(): nbrOfWorkers() = 1 [18:03:16.903] SequentialFuture started (and completed) [18:03:16.903] - Launch lazy future ... done [18:03:16.903] run() for 'SequentialFuture' ... done [18:03:16.904] getGlobalsAndPackages() ... [18:03:16.904] Searching for globals... [18:03:16.905] - globals found: [3] '{', 'sample', 'x' [18:03:16.905] Searching for globals ... DONE [18:03:16.905] Resolving globals: FALSE [18:03:16.906] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.906] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.907] - globals: [1] 'x' [18:03:16.907] [18:03:16.907] getGlobalsAndPackages() ... DONE [18:03:16.907] run() for 'Future' ... [18:03:16.907] - state: 'created' [18:03:16.908] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.908] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.908] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.908] - Field: 'label' [18:03:16.909] - Field: 'local' [18:03:16.909] - Field: 'owner' [18:03:16.909] - Field: 'envir' [18:03:16.909] - Field: 'packages' [18:03:16.909] - Field: 'gc' [18:03:16.910] - Field: 'conditions' [18:03:16.910] - Field: 'expr' [18:03:16.910] - Field: 'uuid' [18:03:16.910] - Field: 'seed' [18:03:16.910] - Field: 'version' [18:03:16.910] - Field: 'result' [18:03:16.911] - Field: 'asynchronous' [18:03:16.911] - Field: 'calls' [18:03:16.911] - Field: 'globals' [18:03:16.911] - Field: 'stdout' [18:03:16.911] - Field: 'earlySignal' [18:03:16.911] - Field: 'lazy' [18:03:16.912] - Field: 'state' [18:03:16.912] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.912] - Launch lazy future ... [18:03:16.912] Packages needed by the future expression (n = 0): [18:03:16.912] Packages needed by future strategies (n = 0): [18:03:16.913] { [18:03:16.913] { [18:03:16.913] { [18:03:16.913] ...future.startTime <- base::Sys.time() [18:03:16.913] { [18:03:16.913] { [18:03:16.913] { [18:03:16.913] base::local({ [18:03:16.913] has_future <- base::requireNamespace("future", [18:03:16.913] quietly = TRUE) [18:03:16.913] if (has_future) { [18:03:16.913] ns <- base::getNamespace("future") [18:03:16.913] version <- ns[[".package"]][["version"]] [18:03:16.913] if (is.null(version)) [18:03:16.913] version <- utils::packageVersion("future") [18:03:16.913] } [18:03:16.913] else { [18:03:16.913] version <- NULL [18:03:16.913] } [18:03:16.913] if (!has_future || version < "1.8.0") { [18:03:16.913] info <- base::c(r_version = base::gsub("R version ", [18:03:16.913] "", base::R.version$version.string), [18:03:16.913] platform = base::sprintf("%s (%s-bit)", [18:03:16.913] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.913] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.913] "release", "version")], collapse = " "), [18:03:16.913] hostname = base::Sys.info()[["nodename"]]) [18:03:16.913] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.913] info) [18:03:16.913] info <- base::paste(info, collapse = "; ") [18:03:16.913] if (!has_future) { [18:03:16.913] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.913] info) [18:03:16.913] } [18:03:16.913] else { [18:03:16.913] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.913] info, version) [18:03:16.913] } [18:03:16.913] base::stop(msg) [18:03:16.913] } [18:03:16.913] }) [18:03:16.913] } [18:03:16.913] options(future.plan = NULL) [18:03:16.913] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.913] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.913] } [18:03:16.913] ...future.workdir <- getwd() [18:03:16.913] } [18:03:16.913] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.913] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.913] } [18:03:16.913] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.913] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.913] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.913] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.913] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:16.913] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.913] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.913] base::names(...future.oldOptions)) [18:03:16.913] } [18:03:16.913] if (FALSE) { [18:03:16.913] } [18:03:16.913] else { [18:03:16.913] if (TRUE) { [18:03:16.913] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.913] open = "w") [18:03:16.913] } [18:03:16.913] else { [18:03:16.913] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.913] windows = "NUL", "/dev/null"), open = "w") [18:03:16.913] } [18:03:16.913] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.913] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.913] base::sink(type = "output", split = FALSE) [18:03:16.913] base::close(...future.stdout) [18:03:16.913] }, add = TRUE) [18:03:16.913] } [18:03:16.913] ...future.frame <- base::sys.nframe() [18:03:16.913] ...future.conditions <- base::list() [18:03:16.913] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.913] if (FALSE) { [18:03:16.913] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.913] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.913] } [18:03:16.913] ...future.result <- base::tryCatch({ [18:03:16.913] base::withCallingHandlers({ [18:03:16.913] ...future.value <- base::withVisible(base::local({ [18:03:16.913] sample(x, size = 1L) [18:03:16.913] })) [18:03:16.913] future::FutureResult(value = ...future.value$value, [18:03:16.913] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.913] ...future.rng), globalenv = if (FALSE) [18:03:16.913] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.913] ...future.globalenv.names)) [18:03:16.913] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.913] }, condition = base::local({ [18:03:16.913] c <- base::c [18:03:16.913] inherits <- base::inherits [18:03:16.913] invokeRestart <- base::invokeRestart [18:03:16.913] length <- base::length [18:03:16.913] list <- base::list [18:03:16.913] seq.int <- base::seq.int [18:03:16.913] signalCondition <- base::signalCondition [18:03:16.913] sys.calls <- base::sys.calls [18:03:16.913] `[[` <- base::`[[` [18:03:16.913] `+` <- base::`+` [18:03:16.913] `<<-` <- base::`<<-` [18:03:16.913] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.913] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.913] 3L)] [18:03:16.913] } [18:03:16.913] function(cond) { [18:03:16.913] is_error <- inherits(cond, "error") [18:03:16.913] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.913] NULL) [18:03:16.913] if (is_error) { [18:03:16.913] sessionInformation <- function() { [18:03:16.913] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.913] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.913] search = base::search(), system = base::Sys.info()) [18:03:16.913] } [18:03:16.913] ...future.conditions[[length(...future.conditions) + [18:03:16.913] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.913] cond$call), session = sessionInformation(), [18:03:16.913] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.913] signalCondition(cond) [18:03:16.913] } [18:03:16.913] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.913] "immediateCondition"))) { [18:03:16.913] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.913] ...future.conditions[[length(...future.conditions) + [18:03:16.913] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.913] if (TRUE && !signal) { [18:03:16.913] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.913] { [18:03:16.913] inherits <- base::inherits [18:03:16.913] invokeRestart <- base::invokeRestart [18:03:16.913] is.null <- base::is.null [18:03:16.913] muffled <- FALSE [18:03:16.913] if (inherits(cond, "message")) { [18:03:16.913] muffled <- grepl(pattern, "muffleMessage") [18:03:16.913] if (muffled) [18:03:16.913] invokeRestart("muffleMessage") [18:03:16.913] } [18:03:16.913] else if (inherits(cond, "warning")) { [18:03:16.913] muffled <- grepl(pattern, "muffleWarning") [18:03:16.913] if (muffled) [18:03:16.913] invokeRestart("muffleWarning") [18:03:16.913] } [18:03:16.913] else if (inherits(cond, "condition")) { [18:03:16.913] if (!is.null(pattern)) { [18:03:16.913] computeRestarts <- base::computeRestarts [18:03:16.913] grepl <- base::grepl [18:03:16.913] restarts <- computeRestarts(cond) [18:03:16.913] for (restart in restarts) { [18:03:16.913] name <- restart$name [18:03:16.913] if (is.null(name)) [18:03:16.913] next [18:03:16.913] if (!grepl(pattern, name)) [18:03:16.913] next [18:03:16.913] invokeRestart(restart) [18:03:16.913] muffled <- TRUE [18:03:16.913] break [18:03:16.913] } [18:03:16.913] } [18:03:16.913] } [18:03:16.913] invisible(muffled) [18:03:16.913] } [18:03:16.913] muffleCondition(cond, pattern = "^muffle") [18:03:16.913] } [18:03:16.913] } [18:03:16.913] else { [18:03:16.913] if (TRUE) { [18:03:16.913] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.913] { [18:03:16.913] inherits <- base::inherits [18:03:16.913] invokeRestart <- base::invokeRestart [18:03:16.913] is.null <- base::is.null [18:03:16.913] muffled <- FALSE [18:03:16.913] if (inherits(cond, "message")) { [18:03:16.913] muffled <- grepl(pattern, "muffleMessage") [18:03:16.913] if (muffled) [18:03:16.913] invokeRestart("muffleMessage") [18:03:16.913] } [18:03:16.913] else if (inherits(cond, "warning")) { [18:03:16.913] muffled <- grepl(pattern, "muffleWarning") [18:03:16.913] if (muffled) [18:03:16.913] invokeRestart("muffleWarning") [18:03:16.913] } [18:03:16.913] else if (inherits(cond, "condition")) { [18:03:16.913] if (!is.null(pattern)) { [18:03:16.913] computeRestarts <- base::computeRestarts [18:03:16.913] grepl <- base::grepl [18:03:16.913] restarts <- computeRestarts(cond) [18:03:16.913] for (restart in restarts) { [18:03:16.913] name <- restart$name [18:03:16.913] if (is.null(name)) [18:03:16.913] next [18:03:16.913] if (!grepl(pattern, name)) [18:03:16.913] next [18:03:16.913] invokeRestart(restart) [18:03:16.913] muffled <- TRUE [18:03:16.913] break [18:03:16.913] } [18:03:16.913] } [18:03:16.913] } [18:03:16.913] invisible(muffled) [18:03:16.913] } [18:03:16.913] muffleCondition(cond, pattern = "^muffle") [18:03:16.913] } [18:03:16.913] } [18:03:16.913] } [18:03:16.913] })) [18:03:16.913] }, error = function(ex) { [18:03:16.913] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.913] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.913] ...future.rng), started = ...future.startTime, [18:03:16.913] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.913] version = "1.8"), class = "FutureResult") [18:03:16.913] }, finally = { [18:03:16.913] if (!identical(...future.workdir, getwd())) [18:03:16.913] setwd(...future.workdir) [18:03:16.913] { [18:03:16.913] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.913] ...future.oldOptions$nwarnings <- NULL [18:03:16.913] } [18:03:16.913] base::options(...future.oldOptions) [18:03:16.913] if (.Platform$OS.type == "windows") { [18:03:16.913] old_names <- names(...future.oldEnvVars) [18:03:16.913] envs <- base::Sys.getenv() [18:03:16.913] names <- names(envs) [18:03:16.913] common <- intersect(names, old_names) [18:03:16.913] added <- setdiff(names, old_names) [18:03:16.913] removed <- setdiff(old_names, names) [18:03:16.913] changed <- common[...future.oldEnvVars[common] != [18:03:16.913] envs[common]] [18:03:16.913] NAMES <- toupper(changed) [18:03:16.913] args <- list() [18:03:16.913] for (kk in seq_along(NAMES)) { [18:03:16.913] name <- changed[[kk]] [18:03:16.913] NAME <- NAMES[[kk]] [18:03:16.913] if (name != NAME && is.element(NAME, old_names)) [18:03:16.913] next [18:03:16.913] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.913] } [18:03:16.913] NAMES <- toupper(added) [18:03:16.913] for (kk in seq_along(NAMES)) { [18:03:16.913] name <- added[[kk]] [18:03:16.913] NAME <- NAMES[[kk]] [18:03:16.913] if (name != NAME && is.element(NAME, old_names)) [18:03:16.913] next [18:03:16.913] args[[name]] <- "" [18:03:16.913] } [18:03:16.913] NAMES <- toupper(removed) [18:03:16.913] for (kk in seq_along(NAMES)) { [18:03:16.913] name <- removed[[kk]] [18:03:16.913] NAME <- NAMES[[kk]] [18:03:16.913] if (name != NAME && is.element(NAME, old_names)) [18:03:16.913] next [18:03:16.913] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.913] } [18:03:16.913] if (length(args) > 0) [18:03:16.913] base::do.call(base::Sys.setenv, args = args) [18:03:16.913] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.913] } [18:03:16.913] else { [18:03:16.913] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.913] } [18:03:16.913] { [18:03:16.913] if (base::length(...future.futureOptionsAdded) > [18:03:16.913] 0L) { [18:03:16.913] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.913] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.913] base::options(opts) [18:03:16.913] } [18:03:16.913] { [18:03:16.913] { [18:03:16.913] base::assign(".Random.seed", c(10407L, 127613059L, [18:03:16.913] 1025761628L, -1478220506L, 213234980L, -1686519009L, [18:03:16.913] -1529045512L), envir = base::globalenv(), [18:03:16.913] inherits = FALSE) [18:03:16.913] NULL [18:03:16.913] } [18:03:16.913] options(future.plan = NULL) [18:03:16.913] if (is.na(NA_character_)) [18:03:16.913] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.913] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.913] future::plan(list(function (..., envir = parent.frame()) [18:03:16.913] { [18:03:16.913] future <- SequentialFuture(..., envir = envir) [18:03:16.913] if (!future$lazy) [18:03:16.913] future <- run(future) [18:03:16.913] invisible(future) [18:03:16.913] }), .cleanup = FALSE, .init = FALSE) [18:03:16.913] } [18:03:16.913] } [18:03:16.913] } [18:03:16.913] }) [18:03:16.913] if (TRUE) { [18:03:16.913] base::sink(type = "output", split = FALSE) [18:03:16.913] if (TRUE) { [18:03:16.913] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.913] } [18:03:16.913] else { [18:03:16.913] ...future.result["stdout"] <- base::list(NULL) [18:03:16.913] } [18:03:16.913] base::close(...future.stdout) [18:03:16.913] ...future.stdout <- NULL [18:03:16.913] } [18:03:16.913] ...future.result$conditions <- ...future.conditions [18:03:16.913] ...future.result$finished <- base::Sys.time() [18:03:16.913] ...future.result [18:03:16.913] } [18:03:16.917] assign_globals() ... [18:03:16.917] List of 1 [18:03:16.917] $ x: int [1:4] 0 1 2 3 [18:03:16.917] - attr(*, "where")=List of 1 [18:03:16.917] ..$ x: [18:03:16.917] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.917] - attr(*, "resolved")= logi FALSE [18:03:16.917] - attr(*, "total_size")= num 64 [18:03:16.917] - attr(*, "already-done")= logi TRUE [18:03:16.920] - copied 'x' to environment [18:03:16.920] assign_globals() ... done [18:03:16.920] plan(): Setting new future strategy stack: [18:03:16.920] List of future strategies: [18:03:16.920] 1. sequential: [18:03:16.920] - args: function (..., envir = parent.frame()) [18:03:16.920] - tweaked: FALSE [18:03:16.920] - call: NULL [18:03:16.921] plan(): nbrOfWorkers() = 1 [18:03:16.922] plan(): Setting new future strategy stack: [18:03:16.922] List of future strategies: [18:03:16.922] 1. sequential: [18:03:16.922] - args: function (..., envir = parent.frame()) [18:03:16.922] - tweaked: FALSE [18:03:16.922] - call: plan(strategy) [18:03:16.924] plan(): nbrOfWorkers() = 1 [18:03:16.924] SequentialFuture started (and completed) [18:03:16.924] - Launch lazy future ... done [18:03:16.924] run() for 'SequentialFuture' ... done [[1]] [1] 0 [[2]] [1] 3 [[3]] [1] 2 [[4]] [1] 3 [18:03:16.925] getGlobalsAndPackages() ... [18:03:16.926] Searching for globals... [18:03:16.927] - globals found: [3] '{', 'sample', 'x' [18:03:16.927] Searching for globals ... DONE [18:03:16.927] Resolving globals: FALSE [18:03:16.928] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.928] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.928] - globals: [1] 'x' [18:03:16.928] [18:03:16.929] getGlobalsAndPackages() ... DONE [18:03:16.929] run() for 'Future' ... [18:03:16.929] - state: 'created' [18:03:16.929] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.930] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.930] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.930] - Field: 'label' [18:03:16.930] - Field: 'local' [18:03:16.930] - Field: 'owner' [18:03:16.931] - Field: 'envir' [18:03:16.931] - Field: 'packages' [18:03:16.931] - Field: 'gc' [18:03:16.931] - Field: 'conditions' [18:03:16.931] - Field: 'expr' [18:03:16.931] - Field: 'uuid' [18:03:16.932] - Field: 'seed' [18:03:16.932] - Field: 'version' [18:03:16.932] - Field: 'result' [18:03:16.932] - Field: 'asynchronous' [18:03:16.932] - Field: 'calls' [18:03:16.933] - Field: 'globals' [18:03:16.933] - Field: 'stdout' [18:03:16.933] - Field: 'earlySignal' [18:03:16.933] - Field: 'lazy' [18:03:16.933] - Field: 'state' [18:03:16.933] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.934] - Launch lazy future ... [18:03:16.934] Packages needed by the future expression (n = 0): [18:03:16.934] Packages needed by future strategies (n = 0): [18:03:16.935] { [18:03:16.935] { [18:03:16.935] { [18:03:16.935] ...future.startTime <- base::Sys.time() [18:03:16.935] { [18:03:16.935] { [18:03:16.935] { [18:03:16.935] base::local({ [18:03:16.935] has_future <- base::requireNamespace("future", [18:03:16.935] quietly = TRUE) [18:03:16.935] if (has_future) { [18:03:16.935] ns <- base::getNamespace("future") [18:03:16.935] version <- ns[[".package"]][["version"]] [18:03:16.935] if (is.null(version)) [18:03:16.935] version <- utils::packageVersion("future") [18:03:16.935] } [18:03:16.935] else { [18:03:16.935] version <- NULL [18:03:16.935] } [18:03:16.935] if (!has_future || version < "1.8.0") { [18:03:16.935] info <- base::c(r_version = base::gsub("R version ", [18:03:16.935] "", base::R.version$version.string), [18:03:16.935] platform = base::sprintf("%s (%s-bit)", [18:03:16.935] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.935] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.935] "release", "version")], collapse = " "), [18:03:16.935] hostname = base::Sys.info()[["nodename"]]) [18:03:16.935] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.935] info) [18:03:16.935] info <- base::paste(info, collapse = "; ") [18:03:16.935] if (!has_future) { [18:03:16.935] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.935] info) [18:03:16.935] } [18:03:16.935] else { [18:03:16.935] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.935] info, version) [18:03:16.935] } [18:03:16.935] base::stop(msg) [18:03:16.935] } [18:03:16.935] }) [18:03:16.935] } [18:03:16.935] options(future.plan = NULL) [18:03:16.935] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.935] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.935] } [18:03:16.935] ...future.workdir <- getwd() [18:03:16.935] } [18:03:16.935] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.935] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.935] } [18:03:16.935] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.935] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.935] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.935] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.935] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.935] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.935] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.935] base::names(...future.oldOptions)) [18:03:16.935] } [18:03:16.935] if (FALSE) { [18:03:16.935] } [18:03:16.935] else { [18:03:16.935] if (TRUE) { [18:03:16.935] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.935] open = "w") [18:03:16.935] } [18:03:16.935] else { [18:03:16.935] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.935] windows = "NUL", "/dev/null"), open = "w") [18:03:16.935] } [18:03:16.935] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.935] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.935] base::sink(type = "output", split = FALSE) [18:03:16.935] base::close(...future.stdout) [18:03:16.935] }, add = TRUE) [18:03:16.935] } [18:03:16.935] ...future.frame <- base::sys.nframe() [18:03:16.935] ...future.conditions <- base::list() [18:03:16.935] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.935] if (FALSE) { [18:03:16.935] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.935] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.935] } [18:03:16.935] ...future.result <- base::tryCatch({ [18:03:16.935] base::withCallingHandlers({ [18:03:16.935] ...future.value <- base::withVisible(base::local({ [18:03:16.935] sample(x, size = 1L) [18:03:16.935] })) [18:03:16.935] future::FutureResult(value = ...future.value$value, [18:03:16.935] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.935] ...future.rng), globalenv = if (FALSE) [18:03:16.935] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.935] ...future.globalenv.names)) [18:03:16.935] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.935] }, condition = base::local({ [18:03:16.935] c <- base::c [18:03:16.935] inherits <- base::inherits [18:03:16.935] invokeRestart <- base::invokeRestart [18:03:16.935] length <- base::length [18:03:16.935] list <- base::list [18:03:16.935] seq.int <- base::seq.int [18:03:16.935] signalCondition <- base::signalCondition [18:03:16.935] sys.calls <- base::sys.calls [18:03:16.935] `[[` <- base::`[[` [18:03:16.935] `+` <- base::`+` [18:03:16.935] `<<-` <- base::`<<-` [18:03:16.935] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.935] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.935] 3L)] [18:03:16.935] } [18:03:16.935] function(cond) { [18:03:16.935] is_error <- inherits(cond, "error") [18:03:16.935] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.935] NULL) [18:03:16.935] if (is_error) { [18:03:16.935] sessionInformation <- function() { [18:03:16.935] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.935] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.935] search = base::search(), system = base::Sys.info()) [18:03:16.935] } [18:03:16.935] ...future.conditions[[length(...future.conditions) + [18:03:16.935] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.935] cond$call), session = sessionInformation(), [18:03:16.935] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.935] signalCondition(cond) [18:03:16.935] } [18:03:16.935] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.935] "immediateCondition"))) { [18:03:16.935] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.935] ...future.conditions[[length(...future.conditions) + [18:03:16.935] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.935] if (TRUE && !signal) { [18:03:16.935] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.935] { [18:03:16.935] inherits <- base::inherits [18:03:16.935] invokeRestart <- base::invokeRestart [18:03:16.935] is.null <- base::is.null [18:03:16.935] muffled <- FALSE [18:03:16.935] if (inherits(cond, "message")) { [18:03:16.935] muffled <- grepl(pattern, "muffleMessage") [18:03:16.935] if (muffled) [18:03:16.935] invokeRestart("muffleMessage") [18:03:16.935] } [18:03:16.935] else if (inherits(cond, "warning")) { [18:03:16.935] muffled <- grepl(pattern, "muffleWarning") [18:03:16.935] if (muffled) [18:03:16.935] invokeRestart("muffleWarning") [18:03:16.935] } [18:03:16.935] else if (inherits(cond, "condition")) { [18:03:16.935] if (!is.null(pattern)) { [18:03:16.935] computeRestarts <- base::computeRestarts [18:03:16.935] grepl <- base::grepl [18:03:16.935] restarts <- computeRestarts(cond) [18:03:16.935] for (restart in restarts) { [18:03:16.935] name <- restart$name [18:03:16.935] if (is.null(name)) [18:03:16.935] next [18:03:16.935] if (!grepl(pattern, name)) [18:03:16.935] next [18:03:16.935] invokeRestart(restart) [18:03:16.935] muffled <- TRUE [18:03:16.935] break [18:03:16.935] } [18:03:16.935] } [18:03:16.935] } [18:03:16.935] invisible(muffled) [18:03:16.935] } [18:03:16.935] muffleCondition(cond, pattern = "^muffle") [18:03:16.935] } [18:03:16.935] } [18:03:16.935] else { [18:03:16.935] if (TRUE) { [18:03:16.935] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.935] { [18:03:16.935] inherits <- base::inherits [18:03:16.935] invokeRestart <- base::invokeRestart [18:03:16.935] is.null <- base::is.null [18:03:16.935] muffled <- FALSE [18:03:16.935] if (inherits(cond, "message")) { [18:03:16.935] muffled <- grepl(pattern, "muffleMessage") [18:03:16.935] if (muffled) [18:03:16.935] invokeRestart("muffleMessage") [18:03:16.935] } [18:03:16.935] else if (inherits(cond, "warning")) { [18:03:16.935] muffled <- grepl(pattern, "muffleWarning") [18:03:16.935] if (muffled) [18:03:16.935] invokeRestart("muffleWarning") [18:03:16.935] } [18:03:16.935] else if (inherits(cond, "condition")) { [18:03:16.935] if (!is.null(pattern)) { [18:03:16.935] computeRestarts <- base::computeRestarts [18:03:16.935] grepl <- base::grepl [18:03:16.935] restarts <- computeRestarts(cond) [18:03:16.935] for (restart in restarts) { [18:03:16.935] name <- restart$name [18:03:16.935] if (is.null(name)) [18:03:16.935] next [18:03:16.935] if (!grepl(pattern, name)) [18:03:16.935] next [18:03:16.935] invokeRestart(restart) [18:03:16.935] muffled <- TRUE [18:03:16.935] break [18:03:16.935] } [18:03:16.935] } [18:03:16.935] } [18:03:16.935] invisible(muffled) [18:03:16.935] } [18:03:16.935] muffleCondition(cond, pattern = "^muffle") [18:03:16.935] } [18:03:16.935] } [18:03:16.935] } [18:03:16.935] })) [18:03:16.935] }, error = function(ex) { [18:03:16.935] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.935] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.935] ...future.rng), started = ...future.startTime, [18:03:16.935] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.935] version = "1.8"), class = "FutureResult") [18:03:16.935] }, finally = { [18:03:16.935] if (!identical(...future.workdir, getwd())) [18:03:16.935] setwd(...future.workdir) [18:03:16.935] { [18:03:16.935] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.935] ...future.oldOptions$nwarnings <- NULL [18:03:16.935] } [18:03:16.935] base::options(...future.oldOptions) [18:03:16.935] if (.Platform$OS.type == "windows") { [18:03:16.935] old_names <- names(...future.oldEnvVars) [18:03:16.935] envs <- base::Sys.getenv() [18:03:16.935] names <- names(envs) [18:03:16.935] common <- intersect(names, old_names) [18:03:16.935] added <- setdiff(names, old_names) [18:03:16.935] removed <- setdiff(old_names, names) [18:03:16.935] changed <- common[...future.oldEnvVars[common] != [18:03:16.935] envs[common]] [18:03:16.935] NAMES <- toupper(changed) [18:03:16.935] args <- list() [18:03:16.935] for (kk in seq_along(NAMES)) { [18:03:16.935] name <- changed[[kk]] [18:03:16.935] NAME <- NAMES[[kk]] [18:03:16.935] if (name != NAME && is.element(NAME, old_names)) [18:03:16.935] next [18:03:16.935] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.935] } [18:03:16.935] NAMES <- toupper(added) [18:03:16.935] for (kk in seq_along(NAMES)) { [18:03:16.935] name <- added[[kk]] [18:03:16.935] NAME <- NAMES[[kk]] [18:03:16.935] if (name != NAME && is.element(NAME, old_names)) [18:03:16.935] next [18:03:16.935] args[[name]] <- "" [18:03:16.935] } [18:03:16.935] NAMES <- toupper(removed) [18:03:16.935] for (kk in seq_along(NAMES)) { [18:03:16.935] name <- removed[[kk]] [18:03:16.935] NAME <- NAMES[[kk]] [18:03:16.935] if (name != NAME && is.element(NAME, old_names)) [18:03:16.935] next [18:03:16.935] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.935] } [18:03:16.935] if (length(args) > 0) [18:03:16.935] base::do.call(base::Sys.setenv, args = args) [18:03:16.935] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.935] } [18:03:16.935] else { [18:03:16.935] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.935] } [18:03:16.935] { [18:03:16.935] if (base::length(...future.futureOptionsAdded) > [18:03:16.935] 0L) { [18:03:16.935] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.935] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.935] base::options(opts) [18:03:16.935] } [18:03:16.935] { [18:03:16.935] { [18:03:16.935] base::assign(".Random.seed", c(10407L, 1798063976L, [18:03:16.935] -1999661904L, 17592362L, -826890881L, 1066014190L, [18:03:16.935] -643378345L), envir = base::globalenv(), [18:03:16.935] inherits = FALSE) [18:03:16.935] NULL [18:03:16.935] } [18:03:16.935] options(future.plan = NULL) [18:03:16.935] if (is.na(NA_character_)) [18:03:16.935] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.935] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.935] future::plan(list(function (..., envir = parent.frame()) [18:03:16.935] { [18:03:16.935] future <- SequentialFuture(..., envir = envir) [18:03:16.935] if (!future$lazy) [18:03:16.935] future <- run(future) [18:03:16.935] invisible(future) [18:03:16.935] }), .cleanup = FALSE, .init = FALSE) [18:03:16.935] } [18:03:16.935] } [18:03:16.935] } [18:03:16.935] }) [18:03:16.935] if (TRUE) { [18:03:16.935] base::sink(type = "output", split = FALSE) [18:03:16.935] if (TRUE) { [18:03:16.935] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.935] } [18:03:16.935] else { [18:03:16.935] ...future.result["stdout"] <- base::list(NULL) [18:03:16.935] } [18:03:16.935] base::close(...future.stdout) [18:03:16.935] ...future.stdout <- NULL [18:03:16.935] } [18:03:16.935] ...future.result$conditions <- ...future.conditions [18:03:16.935] ...future.result$finished <- base::Sys.time() [18:03:16.935] ...future.result [18:03:16.935] } [18:03:16.938] assign_globals() ... [18:03:16.939] List of 1 [18:03:16.939] $ x: int [1:4] 0 1 2 3 [18:03:16.939] - attr(*, "where")=List of 1 [18:03:16.939] ..$ x: [18:03:16.939] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.939] - attr(*, "resolved")= logi FALSE [18:03:16.939] - attr(*, "total_size")= num 64 [18:03:16.939] - attr(*, "already-done")= logi TRUE [18:03:16.942] - copied 'x' to environment [18:03:16.942] assign_globals() ... done [18:03:16.942] plan(): Setting new future strategy stack: [18:03:16.942] List of future strategies: [18:03:16.942] 1. sequential: [18:03:16.942] - args: function (..., envir = parent.frame()) [18:03:16.942] - tweaked: FALSE [18:03:16.942] - call: NULL [18:03:16.943] plan(): nbrOfWorkers() = 1 [18:03:16.944] plan(): Setting new future strategy stack: [18:03:16.944] List of future strategies: [18:03:16.944] 1. sequential: [18:03:16.944] - args: function (..., envir = parent.frame()) [18:03:16.944] - tweaked: FALSE [18:03:16.944] - call: plan(strategy) [18:03:16.944] plan(): nbrOfWorkers() = 1 [18:03:16.945] SequentialFuture started (and completed) [18:03:16.945] - Launch lazy future ... done [18:03:16.945] run() for 'SequentialFuture' ... done [18:03:16.946] getGlobalsAndPackages() ... [18:03:16.946] Searching for globals... [18:03:16.947] - globals found: [3] '{', 'sample', 'x' [18:03:16.947] Searching for globals ... DONE [18:03:16.947] Resolving globals: FALSE [18:03:16.948] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.948] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.948] - globals: [1] 'x' [18:03:16.949] [18:03:16.949] getGlobalsAndPackages() ... DONE [18:03:16.949] run() for 'Future' ... [18:03:16.949] - state: 'created' [18:03:16.949] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.950] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.950] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.950] - Field: 'label' [18:03:16.950] - Field: 'local' [18:03:16.950] - Field: 'owner' [18:03:16.951] - Field: 'envir' [18:03:16.951] - Field: 'packages' [18:03:16.951] - Field: 'gc' [18:03:16.951] - Field: 'conditions' [18:03:16.951] - Field: 'expr' [18:03:16.952] - Field: 'uuid' [18:03:16.952] - Field: 'seed' [18:03:16.952] - Field: 'version' [18:03:16.952] - Field: 'result' [18:03:16.952] - Field: 'asynchronous' [18:03:16.952] - Field: 'calls' [18:03:16.953] - Field: 'globals' [18:03:16.953] - Field: 'stdout' [18:03:16.953] - Field: 'earlySignal' [18:03:16.953] - Field: 'lazy' [18:03:16.953] - Field: 'state' [18:03:16.953] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.954] - Launch lazy future ... [18:03:16.954] Packages needed by the future expression (n = 0): [18:03:16.954] Packages needed by future strategies (n = 0): [18:03:16.955] { [18:03:16.955] { [18:03:16.955] { [18:03:16.955] ...future.startTime <- base::Sys.time() [18:03:16.955] { [18:03:16.955] { [18:03:16.955] { [18:03:16.955] base::local({ [18:03:16.955] has_future <- base::requireNamespace("future", [18:03:16.955] quietly = TRUE) [18:03:16.955] if (has_future) { [18:03:16.955] ns <- base::getNamespace("future") [18:03:16.955] version <- ns[[".package"]][["version"]] [18:03:16.955] if (is.null(version)) [18:03:16.955] version <- utils::packageVersion("future") [18:03:16.955] } [18:03:16.955] else { [18:03:16.955] version <- NULL [18:03:16.955] } [18:03:16.955] if (!has_future || version < "1.8.0") { [18:03:16.955] info <- base::c(r_version = base::gsub("R version ", [18:03:16.955] "", base::R.version$version.string), [18:03:16.955] platform = base::sprintf("%s (%s-bit)", [18:03:16.955] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.955] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.955] "release", "version")], collapse = " "), [18:03:16.955] hostname = base::Sys.info()[["nodename"]]) [18:03:16.955] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.955] info) [18:03:16.955] info <- base::paste(info, collapse = "; ") [18:03:16.955] if (!has_future) { [18:03:16.955] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.955] info) [18:03:16.955] } [18:03:16.955] else { [18:03:16.955] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.955] info, version) [18:03:16.955] } [18:03:16.955] base::stop(msg) [18:03:16.955] } [18:03:16.955] }) [18:03:16.955] } [18:03:16.955] options(future.plan = NULL) [18:03:16.955] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.955] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.955] } [18:03:16.955] ...future.workdir <- getwd() [18:03:16.955] } [18:03:16.955] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.955] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.955] } [18:03:16.955] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.955] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.955] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.955] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.955] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.955] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.955] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.955] base::names(...future.oldOptions)) [18:03:16.955] } [18:03:16.955] if (FALSE) { [18:03:16.955] } [18:03:16.955] else { [18:03:16.955] if (TRUE) { [18:03:16.955] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.955] open = "w") [18:03:16.955] } [18:03:16.955] else { [18:03:16.955] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.955] windows = "NUL", "/dev/null"), open = "w") [18:03:16.955] } [18:03:16.955] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.955] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.955] base::sink(type = "output", split = FALSE) [18:03:16.955] base::close(...future.stdout) [18:03:16.955] }, add = TRUE) [18:03:16.955] } [18:03:16.955] ...future.frame <- base::sys.nframe() [18:03:16.955] ...future.conditions <- base::list() [18:03:16.955] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.955] if (FALSE) { [18:03:16.955] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.955] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.955] } [18:03:16.955] ...future.result <- base::tryCatch({ [18:03:16.955] base::withCallingHandlers({ [18:03:16.955] ...future.value <- base::withVisible(base::local({ [18:03:16.955] sample(x, size = 1L) [18:03:16.955] })) [18:03:16.955] future::FutureResult(value = ...future.value$value, [18:03:16.955] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.955] ...future.rng), globalenv = if (FALSE) [18:03:16.955] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.955] ...future.globalenv.names)) [18:03:16.955] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.955] }, condition = base::local({ [18:03:16.955] c <- base::c [18:03:16.955] inherits <- base::inherits [18:03:16.955] invokeRestart <- base::invokeRestart [18:03:16.955] length <- base::length [18:03:16.955] list <- base::list [18:03:16.955] seq.int <- base::seq.int [18:03:16.955] signalCondition <- base::signalCondition [18:03:16.955] sys.calls <- base::sys.calls [18:03:16.955] `[[` <- base::`[[` [18:03:16.955] `+` <- base::`+` [18:03:16.955] `<<-` <- base::`<<-` [18:03:16.955] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.955] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.955] 3L)] [18:03:16.955] } [18:03:16.955] function(cond) { [18:03:16.955] is_error <- inherits(cond, "error") [18:03:16.955] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.955] NULL) [18:03:16.955] if (is_error) { [18:03:16.955] sessionInformation <- function() { [18:03:16.955] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.955] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.955] search = base::search(), system = base::Sys.info()) [18:03:16.955] } [18:03:16.955] ...future.conditions[[length(...future.conditions) + [18:03:16.955] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.955] cond$call), session = sessionInformation(), [18:03:16.955] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.955] signalCondition(cond) [18:03:16.955] } [18:03:16.955] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.955] "immediateCondition"))) { [18:03:16.955] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.955] ...future.conditions[[length(...future.conditions) + [18:03:16.955] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.955] if (TRUE && !signal) { [18:03:16.955] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.955] { [18:03:16.955] inherits <- base::inherits [18:03:16.955] invokeRestart <- base::invokeRestart [18:03:16.955] is.null <- base::is.null [18:03:16.955] muffled <- FALSE [18:03:16.955] if (inherits(cond, "message")) { [18:03:16.955] muffled <- grepl(pattern, "muffleMessage") [18:03:16.955] if (muffled) [18:03:16.955] invokeRestart("muffleMessage") [18:03:16.955] } [18:03:16.955] else if (inherits(cond, "warning")) { [18:03:16.955] muffled <- grepl(pattern, "muffleWarning") [18:03:16.955] if (muffled) [18:03:16.955] invokeRestart("muffleWarning") [18:03:16.955] } [18:03:16.955] else if (inherits(cond, "condition")) { [18:03:16.955] if (!is.null(pattern)) { [18:03:16.955] computeRestarts <- base::computeRestarts [18:03:16.955] grepl <- base::grepl [18:03:16.955] restarts <- computeRestarts(cond) [18:03:16.955] for (restart in restarts) { [18:03:16.955] name <- restart$name [18:03:16.955] if (is.null(name)) [18:03:16.955] next [18:03:16.955] if (!grepl(pattern, name)) [18:03:16.955] next [18:03:16.955] invokeRestart(restart) [18:03:16.955] muffled <- TRUE [18:03:16.955] break [18:03:16.955] } [18:03:16.955] } [18:03:16.955] } [18:03:16.955] invisible(muffled) [18:03:16.955] } [18:03:16.955] muffleCondition(cond, pattern = "^muffle") [18:03:16.955] } [18:03:16.955] } [18:03:16.955] else { [18:03:16.955] if (TRUE) { [18:03:16.955] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.955] { [18:03:16.955] inherits <- base::inherits [18:03:16.955] invokeRestart <- base::invokeRestart [18:03:16.955] is.null <- base::is.null [18:03:16.955] muffled <- FALSE [18:03:16.955] if (inherits(cond, "message")) { [18:03:16.955] muffled <- grepl(pattern, "muffleMessage") [18:03:16.955] if (muffled) [18:03:16.955] invokeRestart("muffleMessage") [18:03:16.955] } [18:03:16.955] else if (inherits(cond, "warning")) { [18:03:16.955] muffled <- grepl(pattern, "muffleWarning") [18:03:16.955] if (muffled) [18:03:16.955] invokeRestart("muffleWarning") [18:03:16.955] } [18:03:16.955] else if (inherits(cond, "condition")) { [18:03:16.955] if (!is.null(pattern)) { [18:03:16.955] computeRestarts <- base::computeRestarts [18:03:16.955] grepl <- base::grepl [18:03:16.955] restarts <- computeRestarts(cond) [18:03:16.955] for (restart in restarts) { [18:03:16.955] name <- restart$name [18:03:16.955] if (is.null(name)) [18:03:16.955] next [18:03:16.955] if (!grepl(pattern, name)) [18:03:16.955] next [18:03:16.955] invokeRestart(restart) [18:03:16.955] muffled <- TRUE [18:03:16.955] break [18:03:16.955] } [18:03:16.955] } [18:03:16.955] } [18:03:16.955] invisible(muffled) [18:03:16.955] } [18:03:16.955] muffleCondition(cond, pattern = "^muffle") [18:03:16.955] } [18:03:16.955] } [18:03:16.955] } [18:03:16.955] })) [18:03:16.955] }, error = function(ex) { [18:03:16.955] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.955] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.955] ...future.rng), started = ...future.startTime, [18:03:16.955] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.955] version = "1.8"), class = "FutureResult") [18:03:16.955] }, finally = { [18:03:16.955] if (!identical(...future.workdir, getwd())) [18:03:16.955] setwd(...future.workdir) [18:03:16.955] { [18:03:16.955] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.955] ...future.oldOptions$nwarnings <- NULL [18:03:16.955] } [18:03:16.955] base::options(...future.oldOptions) [18:03:16.955] if (.Platform$OS.type == "windows") { [18:03:16.955] old_names <- names(...future.oldEnvVars) [18:03:16.955] envs <- base::Sys.getenv() [18:03:16.955] names <- names(envs) [18:03:16.955] common <- intersect(names, old_names) [18:03:16.955] added <- setdiff(names, old_names) [18:03:16.955] removed <- setdiff(old_names, names) [18:03:16.955] changed <- common[...future.oldEnvVars[common] != [18:03:16.955] envs[common]] [18:03:16.955] NAMES <- toupper(changed) [18:03:16.955] args <- list() [18:03:16.955] for (kk in seq_along(NAMES)) { [18:03:16.955] name <- changed[[kk]] [18:03:16.955] NAME <- NAMES[[kk]] [18:03:16.955] if (name != NAME && is.element(NAME, old_names)) [18:03:16.955] next [18:03:16.955] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.955] } [18:03:16.955] NAMES <- toupper(added) [18:03:16.955] for (kk in seq_along(NAMES)) { [18:03:16.955] name <- added[[kk]] [18:03:16.955] NAME <- NAMES[[kk]] [18:03:16.955] if (name != NAME && is.element(NAME, old_names)) [18:03:16.955] next [18:03:16.955] args[[name]] <- "" [18:03:16.955] } [18:03:16.955] NAMES <- toupper(removed) [18:03:16.955] for (kk in seq_along(NAMES)) { [18:03:16.955] name <- removed[[kk]] [18:03:16.955] NAME <- NAMES[[kk]] [18:03:16.955] if (name != NAME && is.element(NAME, old_names)) [18:03:16.955] next [18:03:16.955] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.955] } [18:03:16.955] if (length(args) > 0) [18:03:16.955] base::do.call(base::Sys.setenv, args = args) [18:03:16.955] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.955] } [18:03:16.955] else { [18:03:16.955] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.955] } [18:03:16.955] { [18:03:16.955] if (base::length(...future.futureOptionsAdded) > [18:03:16.955] 0L) { [18:03:16.955] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.955] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.955] base::options(opts) [18:03:16.955] } [18:03:16.955] { [18:03:16.955] { [18:03:16.955] base::assign(".Random.seed", c(10407L, 17592362L, [18:03:16.955] -396958494L, -323289559L, -643378345L, -1910361370L, [18:03:16.955] -1675698073L), envir = base::globalenv(), [18:03:16.955] inherits = FALSE) [18:03:16.955] NULL [18:03:16.955] } [18:03:16.955] options(future.plan = NULL) [18:03:16.955] if (is.na(NA_character_)) [18:03:16.955] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.955] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.955] future::plan(list(function (..., envir = parent.frame()) [18:03:16.955] { [18:03:16.955] future <- SequentialFuture(..., envir = envir) [18:03:16.955] if (!future$lazy) [18:03:16.955] future <- run(future) [18:03:16.955] invisible(future) [18:03:16.955] }), .cleanup = FALSE, .init = FALSE) [18:03:16.955] } [18:03:16.955] } [18:03:16.955] } [18:03:16.955] }) [18:03:16.955] if (TRUE) { [18:03:16.955] base::sink(type = "output", split = FALSE) [18:03:16.955] if (TRUE) { [18:03:16.955] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.955] } [18:03:16.955] else { [18:03:16.955] ...future.result["stdout"] <- base::list(NULL) [18:03:16.955] } [18:03:16.955] base::close(...future.stdout) [18:03:16.955] ...future.stdout <- NULL [18:03:16.955] } [18:03:16.955] ...future.result$conditions <- ...future.conditions [18:03:16.955] ...future.result$finished <- base::Sys.time() [18:03:16.955] ...future.result [18:03:16.955] } [18:03:16.958] assign_globals() ... [18:03:16.959] List of 1 [18:03:16.959] $ x: int [1:4] 0 1 2 3 [18:03:16.959] - attr(*, "where")=List of 1 [18:03:16.959] ..$ x: [18:03:16.959] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.959] - attr(*, "resolved")= logi FALSE [18:03:16.959] - attr(*, "total_size")= num 64 [18:03:16.959] - attr(*, "already-done")= logi TRUE [18:03:16.963] - copied 'x' to environment [18:03:16.963] assign_globals() ... done [18:03:16.963] plan(): Setting new future strategy stack: [18:03:16.963] List of future strategies: [18:03:16.963] 1. sequential: [18:03:16.963] - args: function (..., envir = parent.frame()) [18:03:16.963] - tweaked: FALSE [18:03:16.963] - call: NULL [18:03:16.964] plan(): nbrOfWorkers() = 1 [18:03:16.965] plan(): Setting new future strategy stack: [18:03:16.965] List of future strategies: [18:03:16.965] 1. sequential: [18:03:16.965] - args: function (..., envir = parent.frame()) [18:03:16.965] - tweaked: FALSE [18:03:16.965] - call: plan(strategy) [18:03:16.966] plan(): nbrOfWorkers() = 1 [18:03:16.966] SequentialFuture started (and completed) [18:03:16.966] - Launch lazy future ... done [18:03:16.966] run() for 'SequentialFuture' ... done [18:03:16.967] getGlobalsAndPackages() ... [18:03:16.967] Searching for globals... [18:03:16.968] - globals found: [3] '{', 'sample', 'x' [18:03:16.968] Searching for globals ... DONE [18:03:16.968] Resolving globals: FALSE [18:03:16.969] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.969] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.970] - globals: [1] 'x' [18:03:16.970] [18:03:16.970] getGlobalsAndPackages() ... DONE [18:03:16.970] run() for 'Future' ... [18:03:16.970] - state: 'created' [18:03:16.971] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.971] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.971] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.971] - Field: 'label' [18:03:16.972] - Field: 'local' [18:03:16.972] - Field: 'owner' [18:03:16.972] - Field: 'envir' [18:03:16.972] - Field: 'packages' [18:03:16.972] - Field: 'gc' [18:03:16.972] - Field: 'conditions' [18:03:16.973] - Field: 'expr' [18:03:16.973] - Field: 'uuid' [18:03:16.973] - Field: 'seed' [18:03:16.973] - Field: 'version' [18:03:16.973] - Field: 'result' [18:03:16.973] - Field: 'asynchronous' [18:03:16.974] - Field: 'calls' [18:03:16.974] - Field: 'globals' [18:03:16.974] - Field: 'stdout' [18:03:16.974] - Field: 'earlySignal' [18:03:16.974] - Field: 'lazy' [18:03:16.974] - Field: 'state' [18:03:16.975] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.975] - Launch lazy future ... [18:03:16.975] Packages needed by the future expression (n = 0): [18:03:16.975] Packages needed by future strategies (n = 0): [18:03:16.976] { [18:03:16.976] { [18:03:16.976] { [18:03:16.976] ...future.startTime <- base::Sys.time() [18:03:16.976] { [18:03:16.976] { [18:03:16.976] { [18:03:16.976] base::local({ [18:03:16.976] has_future <- base::requireNamespace("future", [18:03:16.976] quietly = TRUE) [18:03:16.976] if (has_future) { [18:03:16.976] ns <- base::getNamespace("future") [18:03:16.976] version <- ns[[".package"]][["version"]] [18:03:16.976] if (is.null(version)) [18:03:16.976] version <- utils::packageVersion("future") [18:03:16.976] } [18:03:16.976] else { [18:03:16.976] version <- NULL [18:03:16.976] } [18:03:16.976] if (!has_future || version < "1.8.0") { [18:03:16.976] info <- base::c(r_version = base::gsub("R version ", [18:03:16.976] "", base::R.version$version.string), [18:03:16.976] platform = base::sprintf("%s (%s-bit)", [18:03:16.976] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.976] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.976] "release", "version")], collapse = " "), [18:03:16.976] hostname = base::Sys.info()[["nodename"]]) [18:03:16.976] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.976] info) [18:03:16.976] info <- base::paste(info, collapse = "; ") [18:03:16.976] if (!has_future) { [18:03:16.976] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.976] info) [18:03:16.976] } [18:03:16.976] else { [18:03:16.976] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.976] info, version) [18:03:16.976] } [18:03:16.976] base::stop(msg) [18:03:16.976] } [18:03:16.976] }) [18:03:16.976] } [18:03:16.976] options(future.plan = NULL) [18:03:16.976] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.976] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.976] } [18:03:16.976] ...future.workdir <- getwd() [18:03:16.976] } [18:03:16.976] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.976] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.976] } [18:03:16.976] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.976] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.976] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.976] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.976] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.976] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.976] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.976] base::names(...future.oldOptions)) [18:03:16.976] } [18:03:16.976] if (FALSE) { [18:03:16.976] } [18:03:16.976] else { [18:03:16.976] if (TRUE) { [18:03:16.976] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.976] open = "w") [18:03:16.976] } [18:03:16.976] else { [18:03:16.976] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.976] windows = "NUL", "/dev/null"), open = "w") [18:03:16.976] } [18:03:16.976] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.976] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.976] base::sink(type = "output", split = FALSE) [18:03:16.976] base::close(...future.stdout) [18:03:16.976] }, add = TRUE) [18:03:16.976] } [18:03:16.976] ...future.frame <- base::sys.nframe() [18:03:16.976] ...future.conditions <- base::list() [18:03:16.976] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.976] if (FALSE) { [18:03:16.976] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.976] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.976] } [18:03:16.976] ...future.result <- base::tryCatch({ [18:03:16.976] base::withCallingHandlers({ [18:03:16.976] ...future.value <- base::withVisible(base::local({ [18:03:16.976] sample(x, size = 1L) [18:03:16.976] })) [18:03:16.976] future::FutureResult(value = ...future.value$value, [18:03:16.976] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.976] ...future.rng), globalenv = if (FALSE) [18:03:16.976] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.976] ...future.globalenv.names)) [18:03:16.976] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.976] }, condition = base::local({ [18:03:16.976] c <- base::c [18:03:16.976] inherits <- base::inherits [18:03:16.976] invokeRestart <- base::invokeRestart [18:03:16.976] length <- base::length [18:03:16.976] list <- base::list [18:03:16.976] seq.int <- base::seq.int [18:03:16.976] signalCondition <- base::signalCondition [18:03:16.976] sys.calls <- base::sys.calls [18:03:16.976] `[[` <- base::`[[` [18:03:16.976] `+` <- base::`+` [18:03:16.976] `<<-` <- base::`<<-` [18:03:16.976] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.976] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.976] 3L)] [18:03:16.976] } [18:03:16.976] function(cond) { [18:03:16.976] is_error <- inherits(cond, "error") [18:03:16.976] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.976] NULL) [18:03:16.976] if (is_error) { [18:03:16.976] sessionInformation <- function() { [18:03:16.976] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.976] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.976] search = base::search(), system = base::Sys.info()) [18:03:16.976] } [18:03:16.976] ...future.conditions[[length(...future.conditions) + [18:03:16.976] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.976] cond$call), session = sessionInformation(), [18:03:16.976] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.976] signalCondition(cond) [18:03:16.976] } [18:03:16.976] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.976] "immediateCondition"))) { [18:03:16.976] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.976] ...future.conditions[[length(...future.conditions) + [18:03:16.976] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.976] if (TRUE && !signal) { [18:03:16.976] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.976] { [18:03:16.976] inherits <- base::inherits [18:03:16.976] invokeRestart <- base::invokeRestart [18:03:16.976] is.null <- base::is.null [18:03:16.976] muffled <- FALSE [18:03:16.976] if (inherits(cond, "message")) { [18:03:16.976] muffled <- grepl(pattern, "muffleMessage") [18:03:16.976] if (muffled) [18:03:16.976] invokeRestart("muffleMessage") [18:03:16.976] } [18:03:16.976] else if (inherits(cond, "warning")) { [18:03:16.976] muffled <- grepl(pattern, "muffleWarning") [18:03:16.976] if (muffled) [18:03:16.976] invokeRestart("muffleWarning") [18:03:16.976] } [18:03:16.976] else if (inherits(cond, "condition")) { [18:03:16.976] if (!is.null(pattern)) { [18:03:16.976] computeRestarts <- base::computeRestarts [18:03:16.976] grepl <- base::grepl [18:03:16.976] restarts <- computeRestarts(cond) [18:03:16.976] for (restart in restarts) { [18:03:16.976] name <- restart$name [18:03:16.976] if (is.null(name)) [18:03:16.976] next [18:03:16.976] if (!grepl(pattern, name)) [18:03:16.976] next [18:03:16.976] invokeRestart(restart) [18:03:16.976] muffled <- TRUE [18:03:16.976] break [18:03:16.976] } [18:03:16.976] } [18:03:16.976] } [18:03:16.976] invisible(muffled) [18:03:16.976] } [18:03:16.976] muffleCondition(cond, pattern = "^muffle") [18:03:16.976] } [18:03:16.976] } [18:03:16.976] else { [18:03:16.976] if (TRUE) { [18:03:16.976] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.976] { [18:03:16.976] inherits <- base::inherits [18:03:16.976] invokeRestart <- base::invokeRestart [18:03:16.976] is.null <- base::is.null [18:03:16.976] muffled <- FALSE [18:03:16.976] if (inherits(cond, "message")) { [18:03:16.976] muffled <- grepl(pattern, "muffleMessage") [18:03:16.976] if (muffled) [18:03:16.976] invokeRestart("muffleMessage") [18:03:16.976] } [18:03:16.976] else if (inherits(cond, "warning")) { [18:03:16.976] muffled <- grepl(pattern, "muffleWarning") [18:03:16.976] if (muffled) [18:03:16.976] invokeRestart("muffleWarning") [18:03:16.976] } [18:03:16.976] else if (inherits(cond, "condition")) { [18:03:16.976] if (!is.null(pattern)) { [18:03:16.976] computeRestarts <- base::computeRestarts [18:03:16.976] grepl <- base::grepl [18:03:16.976] restarts <- computeRestarts(cond) [18:03:16.976] for (restart in restarts) { [18:03:16.976] name <- restart$name [18:03:16.976] if (is.null(name)) [18:03:16.976] next [18:03:16.976] if (!grepl(pattern, name)) [18:03:16.976] next [18:03:16.976] invokeRestart(restart) [18:03:16.976] muffled <- TRUE [18:03:16.976] break [18:03:16.976] } [18:03:16.976] } [18:03:16.976] } [18:03:16.976] invisible(muffled) [18:03:16.976] } [18:03:16.976] muffleCondition(cond, pattern = "^muffle") [18:03:16.976] } [18:03:16.976] } [18:03:16.976] } [18:03:16.976] })) [18:03:16.976] }, error = function(ex) { [18:03:16.976] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.976] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.976] ...future.rng), started = ...future.startTime, [18:03:16.976] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.976] version = "1.8"), class = "FutureResult") [18:03:16.976] }, finally = { [18:03:16.976] if (!identical(...future.workdir, getwd())) [18:03:16.976] setwd(...future.workdir) [18:03:16.976] { [18:03:16.976] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.976] ...future.oldOptions$nwarnings <- NULL [18:03:16.976] } [18:03:16.976] base::options(...future.oldOptions) [18:03:16.976] if (.Platform$OS.type == "windows") { [18:03:16.976] old_names <- names(...future.oldEnvVars) [18:03:16.976] envs <- base::Sys.getenv() [18:03:16.976] names <- names(envs) [18:03:16.976] common <- intersect(names, old_names) [18:03:16.976] added <- setdiff(names, old_names) [18:03:16.976] removed <- setdiff(old_names, names) [18:03:16.976] changed <- common[...future.oldEnvVars[common] != [18:03:16.976] envs[common]] [18:03:16.976] NAMES <- toupper(changed) [18:03:16.976] args <- list() [18:03:16.976] for (kk in seq_along(NAMES)) { [18:03:16.976] name <- changed[[kk]] [18:03:16.976] NAME <- NAMES[[kk]] [18:03:16.976] if (name != NAME && is.element(NAME, old_names)) [18:03:16.976] next [18:03:16.976] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.976] } [18:03:16.976] NAMES <- toupper(added) [18:03:16.976] for (kk in seq_along(NAMES)) { [18:03:16.976] name <- added[[kk]] [18:03:16.976] NAME <- NAMES[[kk]] [18:03:16.976] if (name != NAME && is.element(NAME, old_names)) [18:03:16.976] next [18:03:16.976] args[[name]] <- "" [18:03:16.976] } [18:03:16.976] NAMES <- toupper(removed) [18:03:16.976] for (kk in seq_along(NAMES)) { [18:03:16.976] name <- removed[[kk]] [18:03:16.976] NAME <- NAMES[[kk]] [18:03:16.976] if (name != NAME && is.element(NAME, old_names)) [18:03:16.976] next [18:03:16.976] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.976] } [18:03:16.976] if (length(args) > 0) [18:03:16.976] base::do.call(base::Sys.setenv, args = args) [18:03:16.976] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.976] } [18:03:16.976] else { [18:03:16.976] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.976] } [18:03:16.976] { [18:03:16.976] if (base::length(...future.futureOptionsAdded) > [18:03:16.976] 0L) { [18:03:16.976] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.976] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.976] base::options(opts) [18:03:16.976] } [18:03:16.976] { [18:03:16.976] { [18:03:16.976] base::assign(".Random.seed", c(10407L, -323289559L, [18:03:16.976] -1434030130L, -175446176L, -1675698073L, [18:03:16.976] 1761082697L, 714521354L), envir = base::globalenv(), [18:03:16.976] inherits = FALSE) [18:03:16.976] NULL [18:03:16.976] } [18:03:16.976] options(future.plan = NULL) [18:03:16.976] if (is.na(NA_character_)) [18:03:16.976] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.976] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.976] future::plan(list(function (..., envir = parent.frame()) [18:03:16.976] { [18:03:16.976] future <- SequentialFuture(..., envir = envir) [18:03:16.976] if (!future$lazy) [18:03:16.976] future <- run(future) [18:03:16.976] invisible(future) [18:03:16.976] }), .cleanup = FALSE, .init = FALSE) [18:03:16.976] } [18:03:16.976] } [18:03:16.976] } [18:03:16.976] }) [18:03:16.976] if (TRUE) { [18:03:16.976] base::sink(type = "output", split = FALSE) [18:03:16.976] if (TRUE) { [18:03:16.976] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.976] } [18:03:16.976] else { [18:03:16.976] ...future.result["stdout"] <- base::list(NULL) [18:03:16.976] } [18:03:16.976] base::close(...future.stdout) [18:03:16.976] ...future.stdout <- NULL [18:03:16.976] } [18:03:16.976] ...future.result$conditions <- ...future.conditions [18:03:16.976] ...future.result$finished <- base::Sys.time() [18:03:16.976] ...future.result [18:03:16.976] } [18:03:16.979] assign_globals() ... [18:03:16.980] List of 1 [18:03:16.980] $ x: int [1:4] 0 1 2 3 [18:03:16.980] - attr(*, "where")=List of 1 [18:03:16.980] ..$ x: [18:03:16.980] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:16.980] - attr(*, "resolved")= logi FALSE [18:03:16.980] - attr(*, "total_size")= num 64 [18:03:16.980] - attr(*, "already-done")= logi TRUE [18:03:16.983] - copied 'x' to environment [18:03:16.983] assign_globals() ... done [18:03:16.983] plan(): Setting new future strategy stack: [18:03:16.983] List of future strategies: [18:03:16.983] 1. sequential: [18:03:16.983] - args: function (..., envir = parent.frame()) [18:03:16.983] - tweaked: FALSE [18:03:16.983] - call: NULL [18:03:16.984] plan(): nbrOfWorkers() = 1 [18:03:16.985] plan(): Setting new future strategy stack: [18:03:16.985] List of future strategies: [18:03:16.985] 1. sequential: [18:03:16.985] - args: function (..., envir = parent.frame()) [18:03:16.985] - tweaked: FALSE [18:03:16.985] - call: plan(strategy) [18:03:16.986] plan(): nbrOfWorkers() = 1 [18:03:16.986] SequentialFuture started (and completed) [18:03:16.986] - Launch lazy future ... done [18:03:16.986] run() for 'SequentialFuture' ... done [18:03:16.987] getGlobalsAndPackages() ... [18:03:16.987] Searching for globals... [18:03:16.988] - globals found: [3] '{', 'sample', 'x' [18:03:16.988] Searching for globals ... DONE [18:03:16.988] Resolving globals: FALSE [18:03:16.989] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:16.989] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:16.989] - globals: [1] 'x' [18:03:16.990] [18:03:16.990] getGlobalsAndPackages() ... DONE [18:03:16.990] run() for 'Future' ... [18:03:16.990] - state: 'created' [18:03:16.990] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:16.991] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:16.991] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:16.992] - Field: 'label' [18:03:16.992] - Field: 'local' [18:03:16.993] - Field: 'owner' [18:03:16.993] - Field: 'envir' [18:03:16.993] - Field: 'packages' [18:03:16.993] - Field: 'gc' [18:03:16.993] - Field: 'conditions' [18:03:16.993] - Field: 'expr' [18:03:16.994] - Field: 'uuid' [18:03:16.994] - Field: 'seed' [18:03:16.994] - Field: 'version' [18:03:16.994] - Field: 'result' [18:03:16.994] - Field: 'asynchronous' [18:03:16.995] - Field: 'calls' [18:03:16.995] - Field: 'globals' [18:03:16.995] - Field: 'stdout' [18:03:16.995] - Field: 'earlySignal' [18:03:16.995] - Field: 'lazy' [18:03:16.995] - Field: 'state' [18:03:16.996] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:16.996] - Launch lazy future ... [18:03:16.996] Packages needed by the future expression (n = 0): [18:03:16.996] Packages needed by future strategies (n = 0): [18:03:16.997] { [18:03:16.997] { [18:03:16.997] { [18:03:16.997] ...future.startTime <- base::Sys.time() [18:03:16.997] { [18:03:16.997] { [18:03:16.997] { [18:03:16.997] base::local({ [18:03:16.997] has_future <- base::requireNamespace("future", [18:03:16.997] quietly = TRUE) [18:03:16.997] if (has_future) { [18:03:16.997] ns <- base::getNamespace("future") [18:03:16.997] version <- ns[[".package"]][["version"]] [18:03:16.997] if (is.null(version)) [18:03:16.997] version <- utils::packageVersion("future") [18:03:16.997] } [18:03:16.997] else { [18:03:16.997] version <- NULL [18:03:16.997] } [18:03:16.997] if (!has_future || version < "1.8.0") { [18:03:16.997] info <- base::c(r_version = base::gsub("R version ", [18:03:16.997] "", base::R.version$version.string), [18:03:16.997] platform = base::sprintf("%s (%s-bit)", [18:03:16.997] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:16.997] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:16.997] "release", "version")], collapse = " "), [18:03:16.997] hostname = base::Sys.info()[["nodename"]]) [18:03:16.997] info <- base::sprintf("%s: %s", base::names(info), [18:03:16.997] info) [18:03:16.997] info <- base::paste(info, collapse = "; ") [18:03:16.997] if (!has_future) { [18:03:16.997] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:16.997] info) [18:03:16.997] } [18:03:16.997] else { [18:03:16.997] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:16.997] info, version) [18:03:16.997] } [18:03:16.997] base::stop(msg) [18:03:16.997] } [18:03:16.997] }) [18:03:16.997] } [18:03:16.997] options(future.plan = NULL) [18:03:16.997] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.997] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:16.997] } [18:03:16.997] ...future.workdir <- getwd() [18:03:16.997] } [18:03:16.997] ...future.oldOptions <- base::as.list(base::.Options) [18:03:16.997] ...future.oldEnvVars <- base::Sys.getenv() [18:03:16.997] } [18:03:16.997] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:16.997] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:16.997] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:16.997] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:16.997] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:16.997] future.stdout.windows.reencode = NULL, width = 80L) [18:03:16.997] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:16.997] base::names(...future.oldOptions)) [18:03:16.997] } [18:03:16.997] if (FALSE) { [18:03:16.997] } [18:03:16.997] else { [18:03:16.997] if (TRUE) { [18:03:16.997] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:16.997] open = "w") [18:03:16.997] } [18:03:16.997] else { [18:03:16.997] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:16.997] windows = "NUL", "/dev/null"), open = "w") [18:03:16.997] } [18:03:16.997] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:16.997] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:16.997] base::sink(type = "output", split = FALSE) [18:03:16.997] base::close(...future.stdout) [18:03:16.997] }, add = TRUE) [18:03:16.997] } [18:03:16.997] ...future.frame <- base::sys.nframe() [18:03:16.997] ...future.conditions <- base::list() [18:03:16.997] ...future.rng <- base::globalenv()$.Random.seed [18:03:16.997] if (FALSE) { [18:03:16.997] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:16.997] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:16.997] } [18:03:16.997] ...future.result <- base::tryCatch({ [18:03:16.997] base::withCallingHandlers({ [18:03:16.997] ...future.value <- base::withVisible(base::local({ [18:03:16.997] sample(x, size = 1L) [18:03:16.997] })) [18:03:16.997] future::FutureResult(value = ...future.value$value, [18:03:16.997] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.997] ...future.rng), globalenv = if (FALSE) [18:03:16.997] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:16.997] ...future.globalenv.names)) [18:03:16.997] else NULL, started = ...future.startTime, version = "1.8") [18:03:16.997] }, condition = base::local({ [18:03:16.997] c <- base::c [18:03:16.997] inherits <- base::inherits [18:03:16.997] invokeRestart <- base::invokeRestart [18:03:16.997] length <- base::length [18:03:16.997] list <- base::list [18:03:16.997] seq.int <- base::seq.int [18:03:16.997] signalCondition <- base::signalCondition [18:03:16.997] sys.calls <- base::sys.calls [18:03:16.997] `[[` <- base::`[[` [18:03:16.997] `+` <- base::`+` [18:03:16.997] `<<-` <- base::`<<-` [18:03:16.997] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:16.997] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:16.997] 3L)] [18:03:16.997] } [18:03:16.997] function(cond) { [18:03:16.997] is_error <- inherits(cond, "error") [18:03:16.997] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:16.997] NULL) [18:03:16.997] if (is_error) { [18:03:16.997] sessionInformation <- function() { [18:03:16.997] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:16.997] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:16.997] search = base::search(), system = base::Sys.info()) [18:03:16.997] } [18:03:16.997] ...future.conditions[[length(...future.conditions) + [18:03:16.997] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:16.997] cond$call), session = sessionInformation(), [18:03:16.997] timestamp = base::Sys.time(), signaled = 0L) [18:03:16.997] signalCondition(cond) [18:03:16.997] } [18:03:16.997] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:16.997] "immediateCondition"))) { [18:03:16.997] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:16.997] ...future.conditions[[length(...future.conditions) + [18:03:16.997] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:16.997] if (TRUE && !signal) { [18:03:16.997] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.997] { [18:03:16.997] inherits <- base::inherits [18:03:16.997] invokeRestart <- base::invokeRestart [18:03:16.997] is.null <- base::is.null [18:03:16.997] muffled <- FALSE [18:03:16.997] if (inherits(cond, "message")) { [18:03:16.997] muffled <- grepl(pattern, "muffleMessage") [18:03:16.997] if (muffled) [18:03:16.997] invokeRestart("muffleMessage") [18:03:16.997] } [18:03:16.997] else if (inherits(cond, "warning")) { [18:03:16.997] muffled <- grepl(pattern, "muffleWarning") [18:03:16.997] if (muffled) [18:03:16.997] invokeRestart("muffleWarning") [18:03:16.997] } [18:03:16.997] else if (inherits(cond, "condition")) { [18:03:16.997] if (!is.null(pattern)) { [18:03:16.997] computeRestarts <- base::computeRestarts [18:03:16.997] grepl <- base::grepl [18:03:16.997] restarts <- computeRestarts(cond) [18:03:16.997] for (restart in restarts) { [18:03:16.997] name <- restart$name [18:03:16.997] if (is.null(name)) [18:03:16.997] next [18:03:16.997] if (!grepl(pattern, name)) [18:03:16.997] next [18:03:16.997] invokeRestart(restart) [18:03:16.997] muffled <- TRUE [18:03:16.997] break [18:03:16.997] } [18:03:16.997] } [18:03:16.997] } [18:03:16.997] invisible(muffled) [18:03:16.997] } [18:03:16.997] muffleCondition(cond, pattern = "^muffle") [18:03:16.997] } [18:03:16.997] } [18:03:16.997] else { [18:03:16.997] if (TRUE) { [18:03:16.997] muffleCondition <- function (cond, pattern = "^muffle") [18:03:16.997] { [18:03:16.997] inherits <- base::inherits [18:03:16.997] invokeRestart <- base::invokeRestart [18:03:16.997] is.null <- base::is.null [18:03:16.997] muffled <- FALSE [18:03:16.997] if (inherits(cond, "message")) { [18:03:16.997] muffled <- grepl(pattern, "muffleMessage") [18:03:16.997] if (muffled) [18:03:16.997] invokeRestart("muffleMessage") [18:03:16.997] } [18:03:16.997] else if (inherits(cond, "warning")) { [18:03:16.997] muffled <- grepl(pattern, "muffleWarning") [18:03:16.997] if (muffled) [18:03:16.997] invokeRestart("muffleWarning") [18:03:16.997] } [18:03:16.997] else if (inherits(cond, "condition")) { [18:03:16.997] if (!is.null(pattern)) { [18:03:16.997] computeRestarts <- base::computeRestarts [18:03:16.997] grepl <- base::grepl [18:03:16.997] restarts <- computeRestarts(cond) [18:03:16.997] for (restart in restarts) { [18:03:16.997] name <- restart$name [18:03:16.997] if (is.null(name)) [18:03:16.997] next [18:03:16.997] if (!grepl(pattern, name)) [18:03:16.997] next [18:03:16.997] invokeRestart(restart) [18:03:16.997] muffled <- TRUE [18:03:16.997] break [18:03:16.997] } [18:03:16.997] } [18:03:16.997] } [18:03:16.997] invisible(muffled) [18:03:16.997] } [18:03:16.997] muffleCondition(cond, pattern = "^muffle") [18:03:16.997] } [18:03:16.997] } [18:03:16.997] } [18:03:16.997] })) [18:03:16.997] }, error = function(ex) { [18:03:16.997] base::structure(base::list(value = NULL, visible = NULL, [18:03:16.997] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:16.997] ...future.rng), started = ...future.startTime, [18:03:16.997] finished = Sys.time(), session_uuid = NA_character_, [18:03:16.997] version = "1.8"), class = "FutureResult") [18:03:16.997] }, finally = { [18:03:16.997] if (!identical(...future.workdir, getwd())) [18:03:16.997] setwd(...future.workdir) [18:03:16.997] { [18:03:16.997] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:16.997] ...future.oldOptions$nwarnings <- NULL [18:03:16.997] } [18:03:16.997] base::options(...future.oldOptions) [18:03:16.997] if (.Platform$OS.type == "windows") { [18:03:16.997] old_names <- names(...future.oldEnvVars) [18:03:16.997] envs <- base::Sys.getenv() [18:03:16.997] names <- names(envs) [18:03:16.997] common <- intersect(names, old_names) [18:03:16.997] added <- setdiff(names, old_names) [18:03:16.997] removed <- setdiff(old_names, names) [18:03:16.997] changed <- common[...future.oldEnvVars[common] != [18:03:16.997] envs[common]] [18:03:16.997] NAMES <- toupper(changed) [18:03:16.997] args <- list() [18:03:16.997] for (kk in seq_along(NAMES)) { [18:03:16.997] name <- changed[[kk]] [18:03:16.997] NAME <- NAMES[[kk]] [18:03:16.997] if (name != NAME && is.element(NAME, old_names)) [18:03:16.997] next [18:03:16.997] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.997] } [18:03:16.997] NAMES <- toupper(added) [18:03:16.997] for (kk in seq_along(NAMES)) { [18:03:16.997] name <- added[[kk]] [18:03:16.997] NAME <- NAMES[[kk]] [18:03:16.997] if (name != NAME && is.element(NAME, old_names)) [18:03:16.997] next [18:03:16.997] args[[name]] <- "" [18:03:16.997] } [18:03:16.997] NAMES <- toupper(removed) [18:03:16.997] for (kk in seq_along(NAMES)) { [18:03:16.997] name <- removed[[kk]] [18:03:16.997] NAME <- NAMES[[kk]] [18:03:16.997] if (name != NAME && is.element(NAME, old_names)) [18:03:16.997] next [18:03:16.997] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:16.997] } [18:03:16.997] if (length(args) > 0) [18:03:16.997] base::do.call(base::Sys.setenv, args = args) [18:03:16.997] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:16.997] } [18:03:16.997] else { [18:03:16.997] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:16.997] } [18:03:16.997] { [18:03:16.997] if (base::length(...future.futureOptionsAdded) > [18:03:16.997] 0L) { [18:03:16.997] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:16.997] base::names(opts) <- ...future.futureOptionsAdded [18:03:16.997] base::options(opts) [18:03:16.997] } [18:03:16.997] { [18:03:16.997] { [18:03:16.997] base::assign(".Random.seed", c(10407L, -1238383553L, [18:03:16.997] -1380181231L, 1603896375L, 831768359L, -1216777860L, [18:03:16.997] -29476210L), envir = base::globalenv(), inherits = FALSE) [18:03:16.997] NULL [18:03:16.997] } [18:03:16.997] options(future.plan = NULL) [18:03:16.997] if (is.na(NA_character_)) [18:03:16.997] Sys.unsetenv("R_FUTURE_PLAN") [18:03:16.997] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:16.997] future::plan(list(function (..., envir = parent.frame()) [18:03:16.997] { [18:03:16.997] future <- SequentialFuture(..., envir = envir) [18:03:16.997] if (!future$lazy) [18:03:16.997] future <- run(future) [18:03:16.997] invisible(future) [18:03:16.997] }), .cleanup = FALSE, .init = FALSE) [18:03:16.997] } [18:03:16.997] } [18:03:16.997] } [18:03:16.997] }) [18:03:16.997] if (TRUE) { [18:03:16.997] base::sink(type = "output", split = FALSE) [18:03:16.997] if (TRUE) { [18:03:16.997] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:16.997] } [18:03:16.997] else { [18:03:16.997] ...future.result["stdout"] <- base::list(NULL) [18:03:16.997] } [18:03:16.997] base::close(...future.stdout) [18:03:16.997] ...future.stdout <- NULL [18:03:16.997] } [18:03:16.997] ...future.result$conditions <- ...future.conditions [18:03:16.997] ...future.result$finished <- base::Sys.time() [18:03:16.997] ...future.result [18:03:16.997] } [18:03:17.001] assign_globals() ... [18:03:17.001] List of 1 [18:03:17.001] $ x: int [1:4] 0 1 2 3 [18:03:17.001] - attr(*, "where")=List of 1 [18:03:17.001] ..$ x: [18:03:17.001] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.001] - attr(*, "resolved")= logi FALSE [18:03:17.001] - attr(*, "total_size")= num 64 [18:03:17.001] - attr(*, "already-done")= logi TRUE [18:03:17.004] - copied 'x' to environment [18:03:17.004] assign_globals() ... done [18:03:17.004] plan(): Setting new future strategy stack: [18:03:17.005] List of future strategies: [18:03:17.005] 1. sequential: [18:03:17.005] - args: function (..., envir = parent.frame()) [18:03:17.005] - tweaked: FALSE [18:03:17.005] - call: NULL [18:03:17.005] plan(): nbrOfWorkers() = 1 [18:03:17.006] plan(): Setting new future strategy stack: [18:03:17.006] List of future strategies: [18:03:17.006] 1. sequential: [18:03:17.006] - args: function (..., envir = parent.frame()) [18:03:17.006] - tweaked: FALSE [18:03:17.006] - call: plan(strategy) [18:03:17.007] plan(): nbrOfWorkers() = 1 [18:03:17.007] SequentialFuture started (and completed) [18:03:17.007] - Launch lazy future ... done [18:03:17.007] run() for 'SequentialFuture' ... done [18:03:17.008] Future state: 'finished' [18:03:17.008] signalConditions() ... [18:03:17.008] - include = 'condition' [18:03:17.008] - exclude = 'immediateCondition' [18:03:17.009] - resignal = TRUE [18:03:17.009] - Number of conditions: 1 [18:03:17.009] - Condition #1: 'RngFutureWarning', 'FutureWarning', 'warning', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:17.009] signalConditions() ... done Future UUID: 4fd9f48e-6349-01b3-ae84-1b8f86c1b095 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: SequentialFuture: Label: 'fsample_1-337766' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f4c3bc30 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureWarning' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:17.011] getGlobalsAndPackages() ... [18:03:17.011] Searching for globals... [18:03:17.012] - globals found: [3] '{', 'sample', 'x' [18:03:17.012] Searching for globals ... DONE [18:03:17.012] Resolving globals: FALSE [18:03:17.013] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.013] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.013] - globals: [1] 'x' [18:03:17.014] [18:03:17.014] getGlobalsAndPackages() ... DONE [18:03:17.014] run() for 'Future' ... [18:03:17.014] - state: 'created' [18:03:17.014] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.015] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.015] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.015] - Field: 'label' [18:03:17.015] - Field: 'local' [18:03:17.015] - Field: 'owner' [18:03:17.016] - Field: 'envir' [18:03:17.016] - Field: 'packages' [18:03:17.016] - Field: 'gc' [18:03:17.016] - Field: 'conditions' [18:03:17.016] - Field: 'expr' [18:03:17.017] - Field: 'uuid' [18:03:17.017] - Field: 'seed' [18:03:17.017] - Field: 'version' [18:03:17.017] - Field: 'result' [18:03:17.017] - Field: 'asynchronous' [18:03:17.017] - Field: 'calls' [18:03:17.018] - Field: 'globals' [18:03:17.018] - Field: 'stdout' [18:03:17.018] - Field: 'earlySignal' [18:03:17.018] - Field: 'lazy' [18:03:17.018] - Field: 'state' [18:03:17.018] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.019] - Launch lazy future ... [18:03:17.019] Packages needed by the future expression (n = 0): [18:03:17.019] Packages needed by future strategies (n = 0): [18:03:17.020] { [18:03:17.020] { [18:03:17.020] { [18:03:17.020] ...future.startTime <- base::Sys.time() [18:03:17.020] { [18:03:17.020] { [18:03:17.020] { [18:03:17.020] base::local({ [18:03:17.020] has_future <- base::requireNamespace("future", [18:03:17.020] quietly = TRUE) [18:03:17.020] if (has_future) { [18:03:17.020] ns <- base::getNamespace("future") [18:03:17.020] version <- ns[[".package"]][["version"]] [18:03:17.020] if (is.null(version)) [18:03:17.020] version <- utils::packageVersion("future") [18:03:17.020] } [18:03:17.020] else { [18:03:17.020] version <- NULL [18:03:17.020] } [18:03:17.020] if (!has_future || version < "1.8.0") { [18:03:17.020] info <- base::c(r_version = base::gsub("R version ", [18:03:17.020] "", base::R.version$version.string), [18:03:17.020] platform = base::sprintf("%s (%s-bit)", [18:03:17.020] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.020] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.020] "release", "version")], collapse = " "), [18:03:17.020] hostname = base::Sys.info()[["nodename"]]) [18:03:17.020] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.020] info) [18:03:17.020] info <- base::paste(info, collapse = "; ") [18:03:17.020] if (!has_future) { [18:03:17.020] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.020] info) [18:03:17.020] } [18:03:17.020] else { [18:03:17.020] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.020] info, version) [18:03:17.020] } [18:03:17.020] base::stop(msg) [18:03:17.020] } [18:03:17.020] }) [18:03:17.020] } [18:03:17.020] options(future.plan = NULL) [18:03:17.020] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.020] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.020] } [18:03:17.020] ...future.workdir <- getwd() [18:03:17.020] } [18:03:17.020] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.020] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.020] } [18:03:17.020] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.020] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.020] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.020] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.020] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:17.020] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.020] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.020] base::names(...future.oldOptions)) [18:03:17.020] } [18:03:17.020] if (FALSE) { [18:03:17.020] } [18:03:17.020] else { [18:03:17.020] if (TRUE) { [18:03:17.020] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.020] open = "w") [18:03:17.020] } [18:03:17.020] else { [18:03:17.020] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.020] windows = "NUL", "/dev/null"), open = "w") [18:03:17.020] } [18:03:17.020] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.020] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.020] base::sink(type = "output", split = FALSE) [18:03:17.020] base::close(...future.stdout) [18:03:17.020] }, add = TRUE) [18:03:17.020] } [18:03:17.020] ...future.frame <- base::sys.nframe() [18:03:17.020] ...future.conditions <- base::list() [18:03:17.020] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.020] if (FALSE) { [18:03:17.020] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.020] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.020] } [18:03:17.020] ...future.result <- base::tryCatch({ [18:03:17.020] base::withCallingHandlers({ [18:03:17.020] ...future.value <- base::withVisible(base::local({ [18:03:17.020] sample(x, size = 1L) [18:03:17.020] })) [18:03:17.020] future::FutureResult(value = ...future.value$value, [18:03:17.020] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.020] ...future.rng), globalenv = if (FALSE) [18:03:17.020] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.020] ...future.globalenv.names)) [18:03:17.020] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.020] }, condition = base::local({ [18:03:17.020] c <- base::c [18:03:17.020] inherits <- base::inherits [18:03:17.020] invokeRestart <- base::invokeRestart [18:03:17.020] length <- base::length [18:03:17.020] list <- base::list [18:03:17.020] seq.int <- base::seq.int [18:03:17.020] signalCondition <- base::signalCondition [18:03:17.020] sys.calls <- base::sys.calls [18:03:17.020] `[[` <- base::`[[` [18:03:17.020] `+` <- base::`+` [18:03:17.020] `<<-` <- base::`<<-` [18:03:17.020] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.020] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.020] 3L)] [18:03:17.020] } [18:03:17.020] function(cond) { [18:03:17.020] is_error <- inherits(cond, "error") [18:03:17.020] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.020] NULL) [18:03:17.020] if (is_error) { [18:03:17.020] sessionInformation <- function() { [18:03:17.020] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.020] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.020] search = base::search(), system = base::Sys.info()) [18:03:17.020] } [18:03:17.020] ...future.conditions[[length(...future.conditions) + [18:03:17.020] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.020] cond$call), session = sessionInformation(), [18:03:17.020] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.020] signalCondition(cond) [18:03:17.020] } [18:03:17.020] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.020] "immediateCondition"))) { [18:03:17.020] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.020] ...future.conditions[[length(...future.conditions) + [18:03:17.020] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.020] if (TRUE && !signal) { [18:03:17.020] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.020] { [18:03:17.020] inherits <- base::inherits [18:03:17.020] invokeRestart <- base::invokeRestart [18:03:17.020] is.null <- base::is.null [18:03:17.020] muffled <- FALSE [18:03:17.020] if (inherits(cond, "message")) { [18:03:17.020] muffled <- grepl(pattern, "muffleMessage") [18:03:17.020] if (muffled) [18:03:17.020] invokeRestart("muffleMessage") [18:03:17.020] } [18:03:17.020] else if (inherits(cond, "warning")) { [18:03:17.020] muffled <- grepl(pattern, "muffleWarning") [18:03:17.020] if (muffled) [18:03:17.020] invokeRestart("muffleWarning") [18:03:17.020] } [18:03:17.020] else if (inherits(cond, "condition")) { [18:03:17.020] if (!is.null(pattern)) { [18:03:17.020] computeRestarts <- base::computeRestarts [18:03:17.020] grepl <- base::grepl [18:03:17.020] restarts <- computeRestarts(cond) [18:03:17.020] for (restart in restarts) { [18:03:17.020] name <- restart$name [18:03:17.020] if (is.null(name)) [18:03:17.020] next [18:03:17.020] if (!grepl(pattern, name)) [18:03:17.020] next [18:03:17.020] invokeRestart(restart) [18:03:17.020] muffled <- TRUE [18:03:17.020] break [18:03:17.020] } [18:03:17.020] } [18:03:17.020] } [18:03:17.020] invisible(muffled) [18:03:17.020] } [18:03:17.020] muffleCondition(cond, pattern = "^muffle") [18:03:17.020] } [18:03:17.020] } [18:03:17.020] else { [18:03:17.020] if (TRUE) { [18:03:17.020] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.020] { [18:03:17.020] inherits <- base::inherits [18:03:17.020] invokeRestart <- base::invokeRestart [18:03:17.020] is.null <- base::is.null [18:03:17.020] muffled <- FALSE [18:03:17.020] if (inherits(cond, "message")) { [18:03:17.020] muffled <- grepl(pattern, "muffleMessage") [18:03:17.020] if (muffled) [18:03:17.020] invokeRestart("muffleMessage") [18:03:17.020] } [18:03:17.020] else if (inherits(cond, "warning")) { [18:03:17.020] muffled <- grepl(pattern, "muffleWarning") [18:03:17.020] if (muffled) [18:03:17.020] invokeRestart("muffleWarning") [18:03:17.020] } [18:03:17.020] else if (inherits(cond, "condition")) { [18:03:17.020] if (!is.null(pattern)) { [18:03:17.020] computeRestarts <- base::computeRestarts [18:03:17.020] grepl <- base::grepl [18:03:17.020] restarts <- computeRestarts(cond) [18:03:17.020] for (restart in restarts) { [18:03:17.020] name <- restart$name [18:03:17.020] if (is.null(name)) [18:03:17.020] next [18:03:17.020] if (!grepl(pattern, name)) [18:03:17.020] next [18:03:17.020] invokeRestart(restart) [18:03:17.020] muffled <- TRUE [18:03:17.020] break [18:03:17.020] } [18:03:17.020] } [18:03:17.020] } [18:03:17.020] invisible(muffled) [18:03:17.020] } [18:03:17.020] muffleCondition(cond, pattern = "^muffle") [18:03:17.020] } [18:03:17.020] } [18:03:17.020] } [18:03:17.020] })) [18:03:17.020] }, error = function(ex) { [18:03:17.020] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.020] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.020] ...future.rng), started = ...future.startTime, [18:03:17.020] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.020] version = "1.8"), class = "FutureResult") [18:03:17.020] }, finally = { [18:03:17.020] if (!identical(...future.workdir, getwd())) [18:03:17.020] setwd(...future.workdir) [18:03:17.020] { [18:03:17.020] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.020] ...future.oldOptions$nwarnings <- NULL [18:03:17.020] } [18:03:17.020] base::options(...future.oldOptions) [18:03:17.020] if (.Platform$OS.type == "windows") { [18:03:17.020] old_names <- names(...future.oldEnvVars) [18:03:17.020] envs <- base::Sys.getenv() [18:03:17.020] names <- names(envs) [18:03:17.020] common <- intersect(names, old_names) [18:03:17.020] added <- setdiff(names, old_names) [18:03:17.020] removed <- setdiff(old_names, names) [18:03:17.020] changed <- common[...future.oldEnvVars[common] != [18:03:17.020] envs[common]] [18:03:17.020] NAMES <- toupper(changed) [18:03:17.020] args <- list() [18:03:17.020] for (kk in seq_along(NAMES)) { [18:03:17.020] name <- changed[[kk]] [18:03:17.020] NAME <- NAMES[[kk]] [18:03:17.020] if (name != NAME && is.element(NAME, old_names)) [18:03:17.020] next [18:03:17.020] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.020] } [18:03:17.020] NAMES <- toupper(added) [18:03:17.020] for (kk in seq_along(NAMES)) { [18:03:17.020] name <- added[[kk]] [18:03:17.020] NAME <- NAMES[[kk]] [18:03:17.020] if (name != NAME && is.element(NAME, old_names)) [18:03:17.020] next [18:03:17.020] args[[name]] <- "" [18:03:17.020] } [18:03:17.020] NAMES <- toupper(removed) [18:03:17.020] for (kk in seq_along(NAMES)) { [18:03:17.020] name <- removed[[kk]] [18:03:17.020] NAME <- NAMES[[kk]] [18:03:17.020] if (name != NAME && is.element(NAME, old_names)) [18:03:17.020] next [18:03:17.020] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.020] } [18:03:17.020] if (length(args) > 0) [18:03:17.020] base::do.call(base::Sys.setenv, args = args) [18:03:17.020] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.020] } [18:03:17.020] else { [18:03:17.020] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.020] } [18:03:17.020] { [18:03:17.020] if (base::length(...future.futureOptionsAdded) > [18:03:17.020] 0L) { [18:03:17.020] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.020] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.020] base::options(opts) [18:03:17.020] } [18:03:17.020] { [18:03:17.020] { [18:03:17.020] base::assign(".Random.seed", c(10407L, -1128540126L, [18:03:17.020] -952246999L, 139006239L, -761127359L, 1614120285L, [18:03:17.020] -193196834L), envir = base::globalenv(), [18:03:17.020] inherits = FALSE) [18:03:17.020] NULL [18:03:17.020] } [18:03:17.020] options(future.plan = NULL) [18:03:17.020] if (is.na(NA_character_)) [18:03:17.020] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.020] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.020] future::plan(list(function (..., envir = parent.frame()) [18:03:17.020] { [18:03:17.020] future <- SequentialFuture(..., envir = envir) [18:03:17.020] if (!future$lazy) [18:03:17.020] future <- run(future) [18:03:17.020] invisible(future) [18:03:17.020] }), .cleanup = FALSE, .init = FALSE) [18:03:17.020] } [18:03:17.020] } [18:03:17.020] } [18:03:17.020] }) [18:03:17.020] if (TRUE) { [18:03:17.020] base::sink(type = "output", split = FALSE) [18:03:17.020] if (TRUE) { [18:03:17.020] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.020] } [18:03:17.020] else { [18:03:17.020] ...future.result["stdout"] <- base::list(NULL) [18:03:17.020] } [18:03:17.020] base::close(...future.stdout) [18:03:17.020] ...future.stdout <- NULL [18:03:17.020] } [18:03:17.020] ...future.result$conditions <- ...future.conditions [18:03:17.020] ...future.result$finished <- base::Sys.time() [18:03:17.020] ...future.result [18:03:17.020] } [18:03:17.023] assign_globals() ... [18:03:17.023] List of 1 [18:03:17.023] $ x: int [1:4] 0 1 2 3 [18:03:17.023] - attr(*, "where")=List of 1 [18:03:17.023] ..$ x: [18:03:17.023] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.023] - attr(*, "resolved")= logi FALSE [18:03:17.023] - attr(*, "total_size")= num 64 [18:03:17.023] - attr(*, "already-done")= logi TRUE [18:03:17.026] - copied 'x' to environment [18:03:17.027] assign_globals() ... done [18:03:17.028] plan(): Setting new future strategy stack: [18:03:17.028] List of future strategies: [18:03:17.028] 1. sequential: [18:03:17.028] - args: function (..., envir = parent.frame()) [18:03:17.028] - tweaked: FALSE [18:03:17.028] - call: NULL [18:03:17.029] plan(): nbrOfWorkers() = 1 [18:03:17.030] plan(): Setting new future strategy stack: [18:03:17.030] List of future strategies: [18:03:17.030] 1. sequential: [18:03:17.030] - args: function (..., envir = parent.frame()) [18:03:17.030] - tweaked: FALSE [18:03:17.030] - call: plan(strategy) [18:03:17.030] plan(): nbrOfWorkers() = 1 [18:03:17.031] SequentialFuture started (and completed) [18:03:17.031] - Launch lazy future ... done [18:03:17.031] run() for 'SequentialFuture' ... done [18:03:17.032] getGlobalsAndPackages() ... [18:03:17.032] Searching for globals... [18:03:17.033] - globals found: [3] '{', 'sample', 'x' [18:03:17.033] Searching for globals ... DONE [18:03:17.033] Resolving globals: FALSE [18:03:17.034] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.034] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.034] - globals: [1] 'x' [18:03:17.035] [18:03:17.035] getGlobalsAndPackages() ... DONE [18:03:17.035] run() for 'Future' ... [18:03:17.035] - state: 'created' [18:03:17.035] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.036] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.036] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.036] - Field: 'label' [18:03:17.036] - Field: 'local' [18:03:17.037] - Field: 'owner' [18:03:17.037] - Field: 'envir' [18:03:17.037] - Field: 'packages' [18:03:17.037] - Field: 'gc' [18:03:17.037] - Field: 'conditions' [18:03:17.037] - Field: 'expr' [18:03:17.038] - Field: 'uuid' [18:03:17.038] - Field: 'seed' [18:03:17.038] - Field: 'version' [18:03:17.038] - Field: 'result' [18:03:17.038] - Field: 'asynchronous' [18:03:17.038] - Field: 'calls' [18:03:17.039] - Field: 'globals' [18:03:17.039] - Field: 'stdout' [18:03:17.039] - Field: 'earlySignal' [18:03:17.039] - Field: 'lazy' [18:03:17.039] - Field: 'state' [18:03:17.039] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.040] - Launch lazy future ... [18:03:17.040] Packages needed by the future expression (n = 0): [18:03:17.040] Packages needed by future strategies (n = 0): [18:03:17.041] { [18:03:17.041] { [18:03:17.041] { [18:03:17.041] ...future.startTime <- base::Sys.time() [18:03:17.041] { [18:03:17.041] { [18:03:17.041] { [18:03:17.041] base::local({ [18:03:17.041] has_future <- base::requireNamespace("future", [18:03:17.041] quietly = TRUE) [18:03:17.041] if (has_future) { [18:03:17.041] ns <- base::getNamespace("future") [18:03:17.041] version <- ns[[".package"]][["version"]] [18:03:17.041] if (is.null(version)) [18:03:17.041] version <- utils::packageVersion("future") [18:03:17.041] } [18:03:17.041] else { [18:03:17.041] version <- NULL [18:03:17.041] } [18:03:17.041] if (!has_future || version < "1.8.0") { [18:03:17.041] info <- base::c(r_version = base::gsub("R version ", [18:03:17.041] "", base::R.version$version.string), [18:03:17.041] platform = base::sprintf("%s (%s-bit)", [18:03:17.041] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.041] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.041] "release", "version")], collapse = " "), [18:03:17.041] hostname = base::Sys.info()[["nodename"]]) [18:03:17.041] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.041] info) [18:03:17.041] info <- base::paste(info, collapse = "; ") [18:03:17.041] if (!has_future) { [18:03:17.041] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.041] info) [18:03:17.041] } [18:03:17.041] else { [18:03:17.041] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.041] info, version) [18:03:17.041] } [18:03:17.041] base::stop(msg) [18:03:17.041] } [18:03:17.041] }) [18:03:17.041] } [18:03:17.041] options(future.plan = NULL) [18:03:17.041] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.041] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.041] } [18:03:17.041] ...future.workdir <- getwd() [18:03:17.041] } [18:03:17.041] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.041] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.041] } [18:03:17.041] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.041] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.041] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.041] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.041] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:17.041] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.041] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.041] base::names(...future.oldOptions)) [18:03:17.041] } [18:03:17.041] if (FALSE) { [18:03:17.041] } [18:03:17.041] else { [18:03:17.041] if (TRUE) { [18:03:17.041] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.041] open = "w") [18:03:17.041] } [18:03:17.041] else { [18:03:17.041] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.041] windows = "NUL", "/dev/null"), open = "w") [18:03:17.041] } [18:03:17.041] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.041] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.041] base::sink(type = "output", split = FALSE) [18:03:17.041] base::close(...future.stdout) [18:03:17.041] }, add = TRUE) [18:03:17.041] } [18:03:17.041] ...future.frame <- base::sys.nframe() [18:03:17.041] ...future.conditions <- base::list() [18:03:17.041] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.041] if (FALSE) { [18:03:17.041] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.041] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.041] } [18:03:17.041] ...future.result <- base::tryCatch({ [18:03:17.041] base::withCallingHandlers({ [18:03:17.041] ...future.value <- base::withVisible(base::local({ [18:03:17.041] sample(x, size = 1L) [18:03:17.041] })) [18:03:17.041] future::FutureResult(value = ...future.value$value, [18:03:17.041] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.041] ...future.rng), globalenv = if (FALSE) [18:03:17.041] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.041] ...future.globalenv.names)) [18:03:17.041] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.041] }, condition = base::local({ [18:03:17.041] c <- base::c [18:03:17.041] inherits <- base::inherits [18:03:17.041] invokeRestart <- base::invokeRestart [18:03:17.041] length <- base::length [18:03:17.041] list <- base::list [18:03:17.041] seq.int <- base::seq.int [18:03:17.041] signalCondition <- base::signalCondition [18:03:17.041] sys.calls <- base::sys.calls [18:03:17.041] `[[` <- base::`[[` [18:03:17.041] `+` <- base::`+` [18:03:17.041] `<<-` <- base::`<<-` [18:03:17.041] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.041] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.041] 3L)] [18:03:17.041] } [18:03:17.041] function(cond) { [18:03:17.041] is_error <- inherits(cond, "error") [18:03:17.041] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.041] NULL) [18:03:17.041] if (is_error) { [18:03:17.041] sessionInformation <- function() { [18:03:17.041] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.041] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.041] search = base::search(), system = base::Sys.info()) [18:03:17.041] } [18:03:17.041] ...future.conditions[[length(...future.conditions) + [18:03:17.041] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.041] cond$call), session = sessionInformation(), [18:03:17.041] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.041] signalCondition(cond) [18:03:17.041] } [18:03:17.041] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.041] "immediateCondition"))) { [18:03:17.041] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.041] ...future.conditions[[length(...future.conditions) + [18:03:17.041] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.041] if (TRUE && !signal) { [18:03:17.041] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.041] { [18:03:17.041] inherits <- base::inherits [18:03:17.041] invokeRestart <- base::invokeRestart [18:03:17.041] is.null <- base::is.null [18:03:17.041] muffled <- FALSE [18:03:17.041] if (inherits(cond, "message")) { [18:03:17.041] muffled <- grepl(pattern, "muffleMessage") [18:03:17.041] if (muffled) [18:03:17.041] invokeRestart("muffleMessage") [18:03:17.041] } [18:03:17.041] else if (inherits(cond, "warning")) { [18:03:17.041] muffled <- grepl(pattern, "muffleWarning") [18:03:17.041] if (muffled) [18:03:17.041] invokeRestart("muffleWarning") [18:03:17.041] } [18:03:17.041] else if (inherits(cond, "condition")) { [18:03:17.041] if (!is.null(pattern)) { [18:03:17.041] computeRestarts <- base::computeRestarts [18:03:17.041] grepl <- base::grepl [18:03:17.041] restarts <- computeRestarts(cond) [18:03:17.041] for (restart in restarts) { [18:03:17.041] name <- restart$name [18:03:17.041] if (is.null(name)) [18:03:17.041] next [18:03:17.041] if (!grepl(pattern, name)) [18:03:17.041] next [18:03:17.041] invokeRestart(restart) [18:03:17.041] muffled <- TRUE [18:03:17.041] break [18:03:17.041] } [18:03:17.041] } [18:03:17.041] } [18:03:17.041] invisible(muffled) [18:03:17.041] } [18:03:17.041] muffleCondition(cond, pattern = "^muffle") [18:03:17.041] } [18:03:17.041] } [18:03:17.041] else { [18:03:17.041] if (TRUE) { [18:03:17.041] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.041] { [18:03:17.041] inherits <- base::inherits [18:03:17.041] invokeRestart <- base::invokeRestart [18:03:17.041] is.null <- base::is.null [18:03:17.041] muffled <- FALSE [18:03:17.041] if (inherits(cond, "message")) { [18:03:17.041] muffled <- grepl(pattern, "muffleMessage") [18:03:17.041] if (muffled) [18:03:17.041] invokeRestart("muffleMessage") [18:03:17.041] } [18:03:17.041] else if (inherits(cond, "warning")) { [18:03:17.041] muffled <- grepl(pattern, "muffleWarning") [18:03:17.041] if (muffled) [18:03:17.041] invokeRestart("muffleWarning") [18:03:17.041] } [18:03:17.041] else if (inherits(cond, "condition")) { [18:03:17.041] if (!is.null(pattern)) { [18:03:17.041] computeRestarts <- base::computeRestarts [18:03:17.041] grepl <- base::grepl [18:03:17.041] restarts <- computeRestarts(cond) [18:03:17.041] for (restart in restarts) { [18:03:17.041] name <- restart$name [18:03:17.041] if (is.null(name)) [18:03:17.041] next [18:03:17.041] if (!grepl(pattern, name)) [18:03:17.041] next [18:03:17.041] invokeRestart(restart) [18:03:17.041] muffled <- TRUE [18:03:17.041] break [18:03:17.041] } [18:03:17.041] } [18:03:17.041] } [18:03:17.041] invisible(muffled) [18:03:17.041] } [18:03:17.041] muffleCondition(cond, pattern = "^muffle") [18:03:17.041] } [18:03:17.041] } [18:03:17.041] } [18:03:17.041] })) [18:03:17.041] }, error = function(ex) { [18:03:17.041] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.041] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.041] ...future.rng), started = ...future.startTime, [18:03:17.041] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.041] version = "1.8"), class = "FutureResult") [18:03:17.041] }, finally = { [18:03:17.041] if (!identical(...future.workdir, getwd())) [18:03:17.041] setwd(...future.workdir) [18:03:17.041] { [18:03:17.041] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.041] ...future.oldOptions$nwarnings <- NULL [18:03:17.041] } [18:03:17.041] base::options(...future.oldOptions) [18:03:17.041] if (.Platform$OS.type == "windows") { [18:03:17.041] old_names <- names(...future.oldEnvVars) [18:03:17.041] envs <- base::Sys.getenv() [18:03:17.041] names <- names(envs) [18:03:17.041] common <- intersect(names, old_names) [18:03:17.041] added <- setdiff(names, old_names) [18:03:17.041] removed <- setdiff(old_names, names) [18:03:17.041] changed <- common[...future.oldEnvVars[common] != [18:03:17.041] envs[common]] [18:03:17.041] NAMES <- toupper(changed) [18:03:17.041] args <- list() [18:03:17.041] for (kk in seq_along(NAMES)) { [18:03:17.041] name <- changed[[kk]] [18:03:17.041] NAME <- NAMES[[kk]] [18:03:17.041] if (name != NAME && is.element(NAME, old_names)) [18:03:17.041] next [18:03:17.041] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.041] } [18:03:17.041] NAMES <- toupper(added) [18:03:17.041] for (kk in seq_along(NAMES)) { [18:03:17.041] name <- added[[kk]] [18:03:17.041] NAME <- NAMES[[kk]] [18:03:17.041] if (name != NAME && is.element(NAME, old_names)) [18:03:17.041] next [18:03:17.041] args[[name]] <- "" [18:03:17.041] } [18:03:17.041] NAMES <- toupper(removed) [18:03:17.041] for (kk in seq_along(NAMES)) { [18:03:17.041] name <- removed[[kk]] [18:03:17.041] NAME <- NAMES[[kk]] [18:03:17.041] if (name != NAME && is.element(NAME, old_names)) [18:03:17.041] next [18:03:17.041] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.041] } [18:03:17.041] if (length(args) > 0) [18:03:17.041] base::do.call(base::Sys.setenv, args = args) [18:03:17.041] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.041] } [18:03:17.041] else { [18:03:17.041] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.041] } [18:03:17.041] { [18:03:17.041] if (base::length(...future.futureOptionsAdded) > [18:03:17.041] 0L) { [18:03:17.041] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.041] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.041] base::options(opts) [18:03:17.041] } [18:03:17.041] { [18:03:17.041] { [18:03:17.041] base::assign(".Random.seed", c(10407L, 298683515L, [18:03:17.041] -257106736L, 2003180683L, -1427480851L, 591762006L, [18:03:17.041] 2139143346L), envir = base::globalenv(), [18:03:17.041] inherits = FALSE) [18:03:17.041] NULL [18:03:17.041] } [18:03:17.041] options(future.plan = NULL) [18:03:17.041] if (is.na(NA_character_)) [18:03:17.041] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.041] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.041] future::plan(list(function (..., envir = parent.frame()) [18:03:17.041] { [18:03:17.041] future <- SequentialFuture(..., envir = envir) [18:03:17.041] if (!future$lazy) [18:03:17.041] future <- run(future) [18:03:17.041] invisible(future) [18:03:17.041] }), .cleanup = FALSE, .init = FALSE) [18:03:17.041] } [18:03:17.041] } [18:03:17.041] } [18:03:17.041] }) [18:03:17.041] if (TRUE) { [18:03:17.041] base::sink(type = "output", split = FALSE) [18:03:17.041] if (TRUE) { [18:03:17.041] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.041] } [18:03:17.041] else { [18:03:17.041] ...future.result["stdout"] <- base::list(NULL) [18:03:17.041] } [18:03:17.041] base::close(...future.stdout) [18:03:17.041] ...future.stdout <- NULL [18:03:17.041] } [18:03:17.041] ...future.result$conditions <- ...future.conditions [18:03:17.041] ...future.result$finished <- base::Sys.time() [18:03:17.041] ...future.result [18:03:17.041] } [18:03:17.044] assign_globals() ... [18:03:17.044] List of 1 [18:03:17.044] $ x: int [1:4] 0 1 2 3 [18:03:17.044] - attr(*, "where")=List of 1 [18:03:17.044] ..$ x: [18:03:17.044] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.044] - attr(*, "resolved")= logi FALSE [18:03:17.044] - attr(*, "total_size")= num 64 [18:03:17.044] - attr(*, "already-done")= logi TRUE [18:03:17.047] - copied 'x' to environment [18:03:17.048] assign_globals() ... done [18:03:17.048] plan(): Setting new future strategy stack: [18:03:17.048] List of future strategies: [18:03:17.048] 1. sequential: [18:03:17.048] - args: function (..., envir = parent.frame()) [18:03:17.048] - tweaked: FALSE [18:03:17.048] - call: NULL [18:03:17.049] plan(): nbrOfWorkers() = 1 [18:03:17.050] plan(): Setting new future strategy stack: [18:03:17.050] List of future strategies: [18:03:17.050] 1. sequential: [18:03:17.050] - args: function (..., envir = parent.frame()) [18:03:17.050] - tweaked: FALSE [18:03:17.050] - call: plan(strategy) [18:03:17.051] plan(): nbrOfWorkers() = 1 [18:03:17.051] SequentialFuture started (and completed) [18:03:17.051] - Launch lazy future ... done [18:03:17.051] run() for 'SequentialFuture' ... done [18:03:17.052] getGlobalsAndPackages() ... [18:03:17.052] Searching for globals... [18:03:17.053] - globals found: [3] '{', 'sample', 'x' [18:03:17.053] Searching for globals ... DONE [18:03:17.053] Resolving globals: FALSE [18:03:17.054] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.054] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.054] - globals: [1] 'x' [18:03:17.055] [18:03:17.055] getGlobalsAndPackages() ... DONE [18:03:17.055] run() for 'Future' ... [18:03:17.055] - state: 'created' [18:03:17.055] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.056] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.056] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.056] - Field: 'label' [18:03:17.056] - Field: 'local' [18:03:17.057] - Field: 'owner' [18:03:17.057] - Field: 'envir' [18:03:17.057] - Field: 'packages' [18:03:17.057] - Field: 'gc' [18:03:17.057] - Field: 'conditions' [18:03:17.057] - Field: 'expr' [18:03:17.058] - Field: 'uuid' [18:03:17.058] - Field: 'seed' [18:03:17.058] - Field: 'version' [18:03:17.058] - Field: 'result' [18:03:17.058] - Field: 'asynchronous' [18:03:17.058] - Field: 'calls' [18:03:17.059] - Field: 'globals' [18:03:17.059] - Field: 'stdout' [18:03:17.059] - Field: 'earlySignal' [18:03:17.059] - Field: 'lazy' [18:03:17.059] - Field: 'state' [18:03:17.060] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.061] - Launch lazy future ... [18:03:17.061] Packages needed by the future expression (n = 0): [18:03:17.061] Packages needed by future strategies (n = 0): [18:03:17.062] { [18:03:17.062] { [18:03:17.062] { [18:03:17.062] ...future.startTime <- base::Sys.time() [18:03:17.062] { [18:03:17.062] { [18:03:17.062] { [18:03:17.062] base::local({ [18:03:17.062] has_future <- base::requireNamespace("future", [18:03:17.062] quietly = TRUE) [18:03:17.062] if (has_future) { [18:03:17.062] ns <- base::getNamespace("future") [18:03:17.062] version <- ns[[".package"]][["version"]] [18:03:17.062] if (is.null(version)) [18:03:17.062] version <- utils::packageVersion("future") [18:03:17.062] } [18:03:17.062] else { [18:03:17.062] version <- NULL [18:03:17.062] } [18:03:17.062] if (!has_future || version < "1.8.0") { [18:03:17.062] info <- base::c(r_version = base::gsub("R version ", [18:03:17.062] "", base::R.version$version.string), [18:03:17.062] platform = base::sprintf("%s (%s-bit)", [18:03:17.062] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.062] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.062] "release", "version")], collapse = " "), [18:03:17.062] hostname = base::Sys.info()[["nodename"]]) [18:03:17.062] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.062] info) [18:03:17.062] info <- base::paste(info, collapse = "; ") [18:03:17.062] if (!has_future) { [18:03:17.062] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.062] info) [18:03:17.062] } [18:03:17.062] else { [18:03:17.062] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.062] info, version) [18:03:17.062] } [18:03:17.062] base::stop(msg) [18:03:17.062] } [18:03:17.062] }) [18:03:17.062] } [18:03:17.062] options(future.plan = NULL) [18:03:17.062] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.062] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.062] } [18:03:17.062] ...future.workdir <- getwd() [18:03:17.062] } [18:03:17.062] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.062] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.062] } [18:03:17.062] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.062] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.062] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.062] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.062] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:17.062] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.062] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.062] base::names(...future.oldOptions)) [18:03:17.062] } [18:03:17.062] if (FALSE) { [18:03:17.062] } [18:03:17.062] else { [18:03:17.062] if (TRUE) { [18:03:17.062] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.062] open = "w") [18:03:17.062] } [18:03:17.062] else { [18:03:17.062] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.062] windows = "NUL", "/dev/null"), open = "w") [18:03:17.062] } [18:03:17.062] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.062] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.062] base::sink(type = "output", split = FALSE) [18:03:17.062] base::close(...future.stdout) [18:03:17.062] }, add = TRUE) [18:03:17.062] } [18:03:17.062] ...future.frame <- base::sys.nframe() [18:03:17.062] ...future.conditions <- base::list() [18:03:17.062] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.062] if (FALSE) { [18:03:17.062] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.062] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.062] } [18:03:17.062] ...future.result <- base::tryCatch({ [18:03:17.062] base::withCallingHandlers({ [18:03:17.062] ...future.value <- base::withVisible(base::local({ [18:03:17.062] sample(x, size = 1L) [18:03:17.062] })) [18:03:17.062] future::FutureResult(value = ...future.value$value, [18:03:17.062] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.062] ...future.rng), globalenv = if (FALSE) [18:03:17.062] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.062] ...future.globalenv.names)) [18:03:17.062] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.062] }, condition = base::local({ [18:03:17.062] c <- base::c [18:03:17.062] inherits <- base::inherits [18:03:17.062] invokeRestart <- base::invokeRestart [18:03:17.062] length <- base::length [18:03:17.062] list <- base::list [18:03:17.062] seq.int <- base::seq.int [18:03:17.062] signalCondition <- base::signalCondition [18:03:17.062] sys.calls <- base::sys.calls [18:03:17.062] `[[` <- base::`[[` [18:03:17.062] `+` <- base::`+` [18:03:17.062] `<<-` <- base::`<<-` [18:03:17.062] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.062] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.062] 3L)] [18:03:17.062] } [18:03:17.062] function(cond) { [18:03:17.062] is_error <- inherits(cond, "error") [18:03:17.062] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.062] NULL) [18:03:17.062] if (is_error) { [18:03:17.062] sessionInformation <- function() { [18:03:17.062] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.062] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.062] search = base::search(), system = base::Sys.info()) [18:03:17.062] } [18:03:17.062] ...future.conditions[[length(...future.conditions) + [18:03:17.062] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.062] cond$call), session = sessionInformation(), [18:03:17.062] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.062] signalCondition(cond) [18:03:17.062] } [18:03:17.062] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.062] "immediateCondition"))) { [18:03:17.062] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.062] ...future.conditions[[length(...future.conditions) + [18:03:17.062] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.062] if (TRUE && !signal) { [18:03:17.062] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.062] { [18:03:17.062] inherits <- base::inherits [18:03:17.062] invokeRestart <- base::invokeRestart [18:03:17.062] is.null <- base::is.null [18:03:17.062] muffled <- FALSE [18:03:17.062] if (inherits(cond, "message")) { [18:03:17.062] muffled <- grepl(pattern, "muffleMessage") [18:03:17.062] if (muffled) [18:03:17.062] invokeRestart("muffleMessage") [18:03:17.062] } [18:03:17.062] else if (inherits(cond, "warning")) { [18:03:17.062] muffled <- grepl(pattern, "muffleWarning") [18:03:17.062] if (muffled) [18:03:17.062] invokeRestart("muffleWarning") [18:03:17.062] } [18:03:17.062] else if (inherits(cond, "condition")) { [18:03:17.062] if (!is.null(pattern)) { [18:03:17.062] computeRestarts <- base::computeRestarts [18:03:17.062] grepl <- base::grepl [18:03:17.062] restarts <- computeRestarts(cond) [18:03:17.062] for (restart in restarts) { [18:03:17.062] name <- restart$name [18:03:17.062] if (is.null(name)) [18:03:17.062] next [18:03:17.062] if (!grepl(pattern, name)) [18:03:17.062] next [18:03:17.062] invokeRestart(restart) [18:03:17.062] muffled <- TRUE [18:03:17.062] break [18:03:17.062] } [18:03:17.062] } [18:03:17.062] } [18:03:17.062] invisible(muffled) [18:03:17.062] } [18:03:17.062] muffleCondition(cond, pattern = "^muffle") [18:03:17.062] } [18:03:17.062] } [18:03:17.062] else { [18:03:17.062] if (TRUE) { [18:03:17.062] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.062] { [18:03:17.062] inherits <- base::inherits [18:03:17.062] invokeRestart <- base::invokeRestart [18:03:17.062] is.null <- base::is.null [18:03:17.062] muffled <- FALSE [18:03:17.062] if (inherits(cond, "message")) { [18:03:17.062] muffled <- grepl(pattern, "muffleMessage") [18:03:17.062] if (muffled) [18:03:17.062] invokeRestart("muffleMessage") [18:03:17.062] } [18:03:17.062] else if (inherits(cond, "warning")) { [18:03:17.062] muffled <- grepl(pattern, "muffleWarning") [18:03:17.062] if (muffled) [18:03:17.062] invokeRestart("muffleWarning") [18:03:17.062] } [18:03:17.062] else if (inherits(cond, "condition")) { [18:03:17.062] if (!is.null(pattern)) { [18:03:17.062] computeRestarts <- base::computeRestarts [18:03:17.062] grepl <- base::grepl [18:03:17.062] restarts <- computeRestarts(cond) [18:03:17.062] for (restart in restarts) { [18:03:17.062] name <- restart$name [18:03:17.062] if (is.null(name)) [18:03:17.062] next [18:03:17.062] if (!grepl(pattern, name)) [18:03:17.062] next [18:03:17.062] invokeRestart(restart) [18:03:17.062] muffled <- TRUE [18:03:17.062] break [18:03:17.062] } [18:03:17.062] } [18:03:17.062] } [18:03:17.062] invisible(muffled) [18:03:17.062] } [18:03:17.062] muffleCondition(cond, pattern = "^muffle") [18:03:17.062] } [18:03:17.062] } [18:03:17.062] } [18:03:17.062] })) [18:03:17.062] }, error = function(ex) { [18:03:17.062] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.062] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.062] ...future.rng), started = ...future.startTime, [18:03:17.062] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.062] version = "1.8"), class = "FutureResult") [18:03:17.062] }, finally = { [18:03:17.062] if (!identical(...future.workdir, getwd())) [18:03:17.062] setwd(...future.workdir) [18:03:17.062] { [18:03:17.062] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.062] ...future.oldOptions$nwarnings <- NULL [18:03:17.062] } [18:03:17.062] base::options(...future.oldOptions) [18:03:17.062] if (.Platform$OS.type == "windows") { [18:03:17.062] old_names <- names(...future.oldEnvVars) [18:03:17.062] envs <- base::Sys.getenv() [18:03:17.062] names <- names(envs) [18:03:17.062] common <- intersect(names, old_names) [18:03:17.062] added <- setdiff(names, old_names) [18:03:17.062] removed <- setdiff(old_names, names) [18:03:17.062] changed <- common[...future.oldEnvVars[common] != [18:03:17.062] envs[common]] [18:03:17.062] NAMES <- toupper(changed) [18:03:17.062] args <- list() [18:03:17.062] for (kk in seq_along(NAMES)) { [18:03:17.062] name <- changed[[kk]] [18:03:17.062] NAME <- NAMES[[kk]] [18:03:17.062] if (name != NAME && is.element(NAME, old_names)) [18:03:17.062] next [18:03:17.062] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.062] } [18:03:17.062] NAMES <- toupper(added) [18:03:17.062] for (kk in seq_along(NAMES)) { [18:03:17.062] name <- added[[kk]] [18:03:17.062] NAME <- NAMES[[kk]] [18:03:17.062] if (name != NAME && is.element(NAME, old_names)) [18:03:17.062] next [18:03:17.062] args[[name]] <- "" [18:03:17.062] } [18:03:17.062] NAMES <- toupper(removed) [18:03:17.062] for (kk in seq_along(NAMES)) { [18:03:17.062] name <- removed[[kk]] [18:03:17.062] NAME <- NAMES[[kk]] [18:03:17.062] if (name != NAME && is.element(NAME, old_names)) [18:03:17.062] next [18:03:17.062] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.062] } [18:03:17.062] if (length(args) > 0) [18:03:17.062] base::do.call(base::Sys.setenv, args = args) [18:03:17.062] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.062] } [18:03:17.062] else { [18:03:17.062] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.062] } [18:03:17.062] { [18:03:17.062] if (base::length(...future.futureOptionsAdded) > [18:03:17.062] 0L) { [18:03:17.062] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.062] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.062] base::options(opts) [18:03:17.062] } [18:03:17.062] { [18:03:17.062] { [18:03:17.062] base::assign(".Random.seed", c(10407L, 2003180683L, [18:03:17.062] 1301033394L, 1566703528L, 2139143346L, -1318839166L, [18:03:17.062] -255827950L), envir = base::globalenv(), [18:03:17.062] inherits = FALSE) [18:03:17.062] NULL [18:03:17.062] } [18:03:17.062] options(future.plan = NULL) [18:03:17.062] if (is.na(NA_character_)) [18:03:17.062] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.062] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.062] future::plan(list(function (..., envir = parent.frame()) [18:03:17.062] { [18:03:17.062] future <- SequentialFuture(..., envir = envir) [18:03:17.062] if (!future$lazy) [18:03:17.062] future <- run(future) [18:03:17.062] invisible(future) [18:03:17.062] }), .cleanup = FALSE, .init = FALSE) [18:03:17.062] } [18:03:17.062] } [18:03:17.062] } [18:03:17.062] }) [18:03:17.062] if (TRUE) { [18:03:17.062] base::sink(type = "output", split = FALSE) [18:03:17.062] if (TRUE) { [18:03:17.062] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.062] } [18:03:17.062] else { [18:03:17.062] ...future.result["stdout"] <- base::list(NULL) [18:03:17.062] } [18:03:17.062] base::close(...future.stdout) [18:03:17.062] ...future.stdout <- NULL [18:03:17.062] } [18:03:17.062] ...future.result$conditions <- ...future.conditions [18:03:17.062] ...future.result$finished <- base::Sys.time() [18:03:17.062] ...future.result [18:03:17.062] } [18:03:17.065] assign_globals() ... [18:03:17.066] List of 1 [18:03:17.066] $ x: int [1:4] 0 1 2 3 [18:03:17.066] - attr(*, "where")=List of 1 [18:03:17.066] ..$ x: [18:03:17.066] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.066] - attr(*, "resolved")= logi FALSE [18:03:17.066] - attr(*, "total_size")= num 64 [18:03:17.066] - attr(*, "already-done")= logi TRUE [18:03:17.069] - copied 'x' to environment [18:03:17.069] assign_globals() ... done [18:03:17.069] plan(): Setting new future strategy stack: [18:03:17.069] List of future strategies: [18:03:17.069] 1. sequential: [18:03:17.069] - args: function (..., envir = parent.frame()) [18:03:17.069] - tweaked: FALSE [18:03:17.069] - call: NULL [18:03:17.070] plan(): nbrOfWorkers() = 1 [18:03:17.071] plan(): Setting new future strategy stack: [18:03:17.071] List of future strategies: [18:03:17.071] 1. sequential: [18:03:17.071] - args: function (..., envir = parent.frame()) [18:03:17.071] - tweaked: FALSE [18:03:17.071] - call: plan(strategy) [18:03:17.072] plan(): nbrOfWorkers() = 1 [18:03:17.072] SequentialFuture started (and completed) [18:03:17.072] - Launch lazy future ... done [18:03:17.072] run() for 'SequentialFuture' ... done [18:03:17.073] getGlobalsAndPackages() ... [18:03:17.073] Searching for globals... [18:03:17.074] - globals found: [3] '{', 'sample', 'x' [18:03:17.074] Searching for globals ... DONE [18:03:17.074] Resolving globals: FALSE [18:03:17.075] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.075] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.075] - globals: [1] 'x' [18:03:17.076] [18:03:17.076] getGlobalsAndPackages() ... DONE [18:03:17.076] run() for 'Future' ... [18:03:17.076] - state: 'created' [18:03:17.077] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.077] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.077] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.077] - Field: 'label' [18:03:17.077] - Field: 'local' [18:03:17.078] - Field: 'owner' [18:03:17.078] - Field: 'envir' [18:03:17.078] - Field: 'packages' [18:03:17.078] - Field: 'gc' [18:03:17.078] - Field: 'conditions' [18:03:17.078] - Field: 'expr' [18:03:17.079] - Field: 'uuid' [18:03:17.079] - Field: 'seed' [18:03:17.079] - Field: 'version' [18:03:17.079] - Field: 'result' [18:03:17.079] - Field: 'asynchronous' [18:03:17.080] - Field: 'calls' [18:03:17.080] - Field: 'globals' [18:03:17.080] - Field: 'stdout' [18:03:17.080] - Field: 'earlySignal' [18:03:17.080] - Field: 'lazy' [18:03:17.080] - Field: 'state' [18:03:17.081] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.081] - Launch lazy future ... [18:03:17.081] Packages needed by the future expression (n = 0): [18:03:17.081] Packages needed by future strategies (n = 0): [18:03:17.082] { [18:03:17.082] { [18:03:17.082] { [18:03:17.082] ...future.startTime <- base::Sys.time() [18:03:17.082] { [18:03:17.082] { [18:03:17.082] { [18:03:17.082] base::local({ [18:03:17.082] has_future <- base::requireNamespace("future", [18:03:17.082] quietly = TRUE) [18:03:17.082] if (has_future) { [18:03:17.082] ns <- base::getNamespace("future") [18:03:17.082] version <- ns[[".package"]][["version"]] [18:03:17.082] if (is.null(version)) [18:03:17.082] version <- utils::packageVersion("future") [18:03:17.082] } [18:03:17.082] else { [18:03:17.082] version <- NULL [18:03:17.082] } [18:03:17.082] if (!has_future || version < "1.8.0") { [18:03:17.082] info <- base::c(r_version = base::gsub("R version ", [18:03:17.082] "", base::R.version$version.string), [18:03:17.082] platform = base::sprintf("%s (%s-bit)", [18:03:17.082] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.082] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.082] "release", "version")], collapse = " "), [18:03:17.082] hostname = base::Sys.info()[["nodename"]]) [18:03:17.082] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.082] info) [18:03:17.082] info <- base::paste(info, collapse = "; ") [18:03:17.082] if (!has_future) { [18:03:17.082] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.082] info) [18:03:17.082] } [18:03:17.082] else { [18:03:17.082] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.082] info, version) [18:03:17.082] } [18:03:17.082] base::stop(msg) [18:03:17.082] } [18:03:17.082] }) [18:03:17.082] } [18:03:17.082] options(future.plan = NULL) [18:03:17.082] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.082] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.082] } [18:03:17.082] ...future.workdir <- getwd() [18:03:17.082] } [18:03:17.082] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.082] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.082] } [18:03:17.082] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.082] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.082] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.082] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.082] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:17.082] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.082] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.082] base::names(...future.oldOptions)) [18:03:17.082] } [18:03:17.082] if (FALSE) { [18:03:17.082] } [18:03:17.082] else { [18:03:17.082] if (TRUE) { [18:03:17.082] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.082] open = "w") [18:03:17.082] } [18:03:17.082] else { [18:03:17.082] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.082] windows = "NUL", "/dev/null"), open = "w") [18:03:17.082] } [18:03:17.082] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.082] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.082] base::sink(type = "output", split = FALSE) [18:03:17.082] base::close(...future.stdout) [18:03:17.082] }, add = TRUE) [18:03:17.082] } [18:03:17.082] ...future.frame <- base::sys.nframe() [18:03:17.082] ...future.conditions <- base::list() [18:03:17.082] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.082] if (FALSE) { [18:03:17.082] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.082] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.082] } [18:03:17.082] ...future.result <- base::tryCatch({ [18:03:17.082] base::withCallingHandlers({ [18:03:17.082] ...future.value <- base::withVisible(base::local({ [18:03:17.082] sample(x, size = 1L) [18:03:17.082] })) [18:03:17.082] future::FutureResult(value = ...future.value$value, [18:03:17.082] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.082] ...future.rng), globalenv = if (FALSE) [18:03:17.082] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.082] ...future.globalenv.names)) [18:03:17.082] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.082] }, condition = base::local({ [18:03:17.082] c <- base::c [18:03:17.082] inherits <- base::inherits [18:03:17.082] invokeRestart <- base::invokeRestart [18:03:17.082] length <- base::length [18:03:17.082] list <- base::list [18:03:17.082] seq.int <- base::seq.int [18:03:17.082] signalCondition <- base::signalCondition [18:03:17.082] sys.calls <- base::sys.calls [18:03:17.082] `[[` <- base::`[[` [18:03:17.082] `+` <- base::`+` [18:03:17.082] `<<-` <- base::`<<-` [18:03:17.082] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.082] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.082] 3L)] [18:03:17.082] } [18:03:17.082] function(cond) { [18:03:17.082] is_error <- inherits(cond, "error") [18:03:17.082] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.082] NULL) [18:03:17.082] if (is_error) { [18:03:17.082] sessionInformation <- function() { [18:03:17.082] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.082] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.082] search = base::search(), system = base::Sys.info()) [18:03:17.082] } [18:03:17.082] ...future.conditions[[length(...future.conditions) + [18:03:17.082] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.082] cond$call), session = sessionInformation(), [18:03:17.082] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.082] signalCondition(cond) [18:03:17.082] } [18:03:17.082] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.082] "immediateCondition"))) { [18:03:17.082] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.082] ...future.conditions[[length(...future.conditions) + [18:03:17.082] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.082] if (TRUE && !signal) { [18:03:17.082] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.082] { [18:03:17.082] inherits <- base::inherits [18:03:17.082] invokeRestart <- base::invokeRestart [18:03:17.082] is.null <- base::is.null [18:03:17.082] muffled <- FALSE [18:03:17.082] if (inherits(cond, "message")) { [18:03:17.082] muffled <- grepl(pattern, "muffleMessage") [18:03:17.082] if (muffled) [18:03:17.082] invokeRestart("muffleMessage") [18:03:17.082] } [18:03:17.082] else if (inherits(cond, "warning")) { [18:03:17.082] muffled <- grepl(pattern, "muffleWarning") [18:03:17.082] if (muffled) [18:03:17.082] invokeRestart("muffleWarning") [18:03:17.082] } [18:03:17.082] else if (inherits(cond, "condition")) { [18:03:17.082] if (!is.null(pattern)) { [18:03:17.082] computeRestarts <- base::computeRestarts [18:03:17.082] grepl <- base::grepl [18:03:17.082] restarts <- computeRestarts(cond) [18:03:17.082] for (restart in restarts) { [18:03:17.082] name <- restart$name [18:03:17.082] if (is.null(name)) [18:03:17.082] next [18:03:17.082] if (!grepl(pattern, name)) [18:03:17.082] next [18:03:17.082] invokeRestart(restart) [18:03:17.082] muffled <- TRUE [18:03:17.082] break [18:03:17.082] } [18:03:17.082] } [18:03:17.082] } [18:03:17.082] invisible(muffled) [18:03:17.082] } [18:03:17.082] muffleCondition(cond, pattern = "^muffle") [18:03:17.082] } [18:03:17.082] } [18:03:17.082] else { [18:03:17.082] if (TRUE) { [18:03:17.082] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.082] { [18:03:17.082] inherits <- base::inherits [18:03:17.082] invokeRestart <- base::invokeRestart [18:03:17.082] is.null <- base::is.null [18:03:17.082] muffled <- FALSE [18:03:17.082] if (inherits(cond, "message")) { [18:03:17.082] muffled <- grepl(pattern, "muffleMessage") [18:03:17.082] if (muffled) [18:03:17.082] invokeRestart("muffleMessage") [18:03:17.082] } [18:03:17.082] else if (inherits(cond, "warning")) { [18:03:17.082] muffled <- grepl(pattern, "muffleWarning") [18:03:17.082] if (muffled) [18:03:17.082] invokeRestart("muffleWarning") [18:03:17.082] } [18:03:17.082] else if (inherits(cond, "condition")) { [18:03:17.082] if (!is.null(pattern)) { [18:03:17.082] computeRestarts <- base::computeRestarts [18:03:17.082] grepl <- base::grepl [18:03:17.082] restarts <- computeRestarts(cond) [18:03:17.082] for (restart in restarts) { [18:03:17.082] name <- restart$name [18:03:17.082] if (is.null(name)) [18:03:17.082] next [18:03:17.082] if (!grepl(pattern, name)) [18:03:17.082] next [18:03:17.082] invokeRestart(restart) [18:03:17.082] muffled <- TRUE [18:03:17.082] break [18:03:17.082] } [18:03:17.082] } [18:03:17.082] } [18:03:17.082] invisible(muffled) [18:03:17.082] } [18:03:17.082] muffleCondition(cond, pattern = "^muffle") [18:03:17.082] } [18:03:17.082] } [18:03:17.082] } [18:03:17.082] })) [18:03:17.082] }, error = function(ex) { [18:03:17.082] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.082] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.082] ...future.rng), started = ...future.startTime, [18:03:17.082] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.082] version = "1.8"), class = "FutureResult") [18:03:17.082] }, finally = { [18:03:17.082] if (!identical(...future.workdir, getwd())) [18:03:17.082] setwd(...future.workdir) [18:03:17.082] { [18:03:17.082] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.082] ...future.oldOptions$nwarnings <- NULL [18:03:17.082] } [18:03:17.082] base::options(...future.oldOptions) [18:03:17.082] if (.Platform$OS.type == "windows") { [18:03:17.082] old_names <- names(...future.oldEnvVars) [18:03:17.082] envs <- base::Sys.getenv() [18:03:17.082] names <- names(envs) [18:03:17.082] common <- intersect(names, old_names) [18:03:17.082] added <- setdiff(names, old_names) [18:03:17.082] removed <- setdiff(old_names, names) [18:03:17.082] changed <- common[...future.oldEnvVars[common] != [18:03:17.082] envs[common]] [18:03:17.082] NAMES <- toupper(changed) [18:03:17.082] args <- list() [18:03:17.082] for (kk in seq_along(NAMES)) { [18:03:17.082] name <- changed[[kk]] [18:03:17.082] NAME <- NAMES[[kk]] [18:03:17.082] if (name != NAME && is.element(NAME, old_names)) [18:03:17.082] next [18:03:17.082] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.082] } [18:03:17.082] NAMES <- toupper(added) [18:03:17.082] for (kk in seq_along(NAMES)) { [18:03:17.082] name <- added[[kk]] [18:03:17.082] NAME <- NAMES[[kk]] [18:03:17.082] if (name != NAME && is.element(NAME, old_names)) [18:03:17.082] next [18:03:17.082] args[[name]] <- "" [18:03:17.082] } [18:03:17.082] NAMES <- toupper(removed) [18:03:17.082] for (kk in seq_along(NAMES)) { [18:03:17.082] name <- removed[[kk]] [18:03:17.082] NAME <- NAMES[[kk]] [18:03:17.082] if (name != NAME && is.element(NAME, old_names)) [18:03:17.082] next [18:03:17.082] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.082] } [18:03:17.082] if (length(args) > 0) [18:03:17.082] base::do.call(base::Sys.setenv, args = args) [18:03:17.082] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.082] } [18:03:17.082] else { [18:03:17.082] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.082] } [18:03:17.082] { [18:03:17.082] if (base::length(...future.futureOptionsAdded) > [18:03:17.082] 0L) { [18:03:17.082] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.082] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.082] base::options(opts) [18:03:17.082] } [18:03:17.082] { [18:03:17.082] { [18:03:17.082] base::assign(".Random.seed", c(10407L, 1566703528L, [18:03:17.082] 170874120L, 239632999L, -255827950L, 145623865L, [18:03:17.082] -1664332594L), envir = base::globalenv(), [18:03:17.082] inherits = FALSE) [18:03:17.082] NULL [18:03:17.082] } [18:03:17.082] options(future.plan = NULL) [18:03:17.082] if (is.na(NA_character_)) [18:03:17.082] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.082] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.082] future::plan(list(function (..., envir = parent.frame()) [18:03:17.082] { [18:03:17.082] future <- SequentialFuture(..., envir = envir) [18:03:17.082] if (!future$lazy) [18:03:17.082] future <- run(future) [18:03:17.082] invisible(future) [18:03:17.082] }), .cleanup = FALSE, .init = FALSE) [18:03:17.082] } [18:03:17.082] } [18:03:17.082] } [18:03:17.082] }) [18:03:17.082] if (TRUE) { [18:03:17.082] base::sink(type = "output", split = FALSE) [18:03:17.082] if (TRUE) { [18:03:17.082] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.082] } [18:03:17.082] else { [18:03:17.082] ...future.result["stdout"] <- base::list(NULL) [18:03:17.082] } [18:03:17.082] base::close(...future.stdout) [18:03:17.082] ...future.stdout <- NULL [18:03:17.082] } [18:03:17.082] ...future.result$conditions <- ...future.conditions [18:03:17.082] ...future.result$finished <- base::Sys.time() [18:03:17.082] ...future.result [18:03:17.082] } [18:03:17.085] assign_globals() ... [18:03:17.086] List of 1 [18:03:17.086] $ x: int [1:4] 0 1 2 3 [18:03:17.086] - attr(*, "where")=List of 1 [18:03:17.086] ..$ x: [18:03:17.086] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.086] - attr(*, "resolved")= logi FALSE [18:03:17.086] - attr(*, "total_size")= num 64 [18:03:17.086] - attr(*, "already-done")= logi TRUE [18:03:17.089] - copied 'x' to environment [18:03:17.089] assign_globals() ... done [18:03:17.089] plan(): Setting new future strategy stack: [18:03:17.089] List of future strategies: [18:03:17.089] 1. sequential: [18:03:17.089] - args: function (..., envir = parent.frame()) [18:03:17.089] - tweaked: FALSE [18:03:17.089] - call: NULL [18:03:17.090] plan(): nbrOfWorkers() = 1 [18:03:17.091] plan(): Setting new future strategy stack: [18:03:17.091] List of future strategies: [18:03:17.091] 1. sequential: [18:03:17.091] - args: function (..., envir = parent.frame()) [18:03:17.091] - tweaked: FALSE [18:03:17.091] - call: plan(strategy) [18:03:17.092] plan(): nbrOfWorkers() = 1 [18:03:17.092] SequentialFuture started (and completed) [18:03:17.092] - Launch lazy future ... done [18:03:17.092] run() for 'SequentialFuture' ... done [[1]] [1] 3 [[2]] [1] 0 [[3]] [1] 1 [[4]] [1] 3 [18:03:17.093] getGlobalsAndPackages() ... [18:03:17.093] Searching for globals... [18:03:17.097] - globals found: [3] '{', 'sample', 'x' [18:03:17.097] Searching for globals ... DONE [18:03:17.098] Resolving globals: FALSE [18:03:17.098] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.099] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.099] - globals: [1] 'x' [18:03:17.099] [18:03:17.099] getGlobalsAndPackages() ... DONE [18:03:17.099] run() for 'Future' ... [18:03:17.100] - state: 'created' [18:03:17.100] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.100] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.100] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.101] - Field: 'label' [18:03:17.101] - Field: 'local' [18:03:17.101] - Field: 'owner' [18:03:17.101] - Field: 'envir' [18:03:17.101] - Field: 'packages' [18:03:17.101] - Field: 'gc' [18:03:17.102] - Field: 'conditions' [18:03:17.102] - Field: 'expr' [18:03:17.102] - Field: 'uuid' [18:03:17.102] - Field: 'seed' [18:03:17.102] - Field: 'version' [18:03:17.103] - Field: 'result' [18:03:17.103] - Field: 'asynchronous' [18:03:17.103] - Field: 'calls' [18:03:17.103] - Field: 'globals' [18:03:17.103] - Field: 'stdout' [18:03:17.103] - Field: 'earlySignal' [18:03:17.104] - Field: 'lazy' [18:03:17.104] - Field: 'state' [18:03:17.104] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.104] - Launch lazy future ... [18:03:17.104] Packages needed by the future expression (n = 0): [18:03:17.105] Packages needed by future strategies (n = 0): [18:03:17.105] { [18:03:17.105] { [18:03:17.105] { [18:03:17.105] ...future.startTime <- base::Sys.time() [18:03:17.105] { [18:03:17.105] { [18:03:17.105] { [18:03:17.105] base::local({ [18:03:17.105] has_future <- base::requireNamespace("future", [18:03:17.105] quietly = TRUE) [18:03:17.105] if (has_future) { [18:03:17.105] ns <- base::getNamespace("future") [18:03:17.105] version <- ns[[".package"]][["version"]] [18:03:17.105] if (is.null(version)) [18:03:17.105] version <- utils::packageVersion("future") [18:03:17.105] } [18:03:17.105] else { [18:03:17.105] version <- NULL [18:03:17.105] } [18:03:17.105] if (!has_future || version < "1.8.0") { [18:03:17.105] info <- base::c(r_version = base::gsub("R version ", [18:03:17.105] "", base::R.version$version.string), [18:03:17.105] platform = base::sprintf("%s (%s-bit)", [18:03:17.105] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.105] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.105] "release", "version")], collapse = " "), [18:03:17.105] hostname = base::Sys.info()[["nodename"]]) [18:03:17.105] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.105] info) [18:03:17.105] info <- base::paste(info, collapse = "; ") [18:03:17.105] if (!has_future) { [18:03:17.105] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.105] info) [18:03:17.105] } [18:03:17.105] else { [18:03:17.105] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.105] info, version) [18:03:17.105] } [18:03:17.105] base::stop(msg) [18:03:17.105] } [18:03:17.105] }) [18:03:17.105] } [18:03:17.105] options(future.plan = NULL) [18:03:17.105] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.105] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.105] } [18:03:17.105] ...future.workdir <- getwd() [18:03:17.105] } [18:03:17.105] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.105] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.105] } [18:03:17.105] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.105] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.105] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.105] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.105] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.105] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.105] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.105] base::names(...future.oldOptions)) [18:03:17.105] } [18:03:17.105] if (FALSE) { [18:03:17.105] } [18:03:17.105] else { [18:03:17.105] if (TRUE) { [18:03:17.105] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.105] open = "w") [18:03:17.105] } [18:03:17.105] else { [18:03:17.105] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.105] windows = "NUL", "/dev/null"), open = "w") [18:03:17.105] } [18:03:17.105] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.105] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.105] base::sink(type = "output", split = FALSE) [18:03:17.105] base::close(...future.stdout) [18:03:17.105] }, add = TRUE) [18:03:17.105] } [18:03:17.105] ...future.frame <- base::sys.nframe() [18:03:17.105] ...future.conditions <- base::list() [18:03:17.105] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.105] if (FALSE) { [18:03:17.105] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.105] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.105] } [18:03:17.105] ...future.result <- base::tryCatch({ [18:03:17.105] base::withCallingHandlers({ [18:03:17.105] ...future.value <- base::withVisible(base::local({ [18:03:17.105] sample(x, size = 1L) [18:03:17.105] })) [18:03:17.105] future::FutureResult(value = ...future.value$value, [18:03:17.105] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.105] ...future.rng), globalenv = if (FALSE) [18:03:17.105] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.105] ...future.globalenv.names)) [18:03:17.105] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.105] }, condition = base::local({ [18:03:17.105] c <- base::c [18:03:17.105] inherits <- base::inherits [18:03:17.105] invokeRestart <- base::invokeRestart [18:03:17.105] length <- base::length [18:03:17.105] list <- base::list [18:03:17.105] seq.int <- base::seq.int [18:03:17.105] signalCondition <- base::signalCondition [18:03:17.105] sys.calls <- base::sys.calls [18:03:17.105] `[[` <- base::`[[` [18:03:17.105] `+` <- base::`+` [18:03:17.105] `<<-` <- base::`<<-` [18:03:17.105] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.105] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.105] 3L)] [18:03:17.105] } [18:03:17.105] function(cond) { [18:03:17.105] is_error <- inherits(cond, "error") [18:03:17.105] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.105] NULL) [18:03:17.105] if (is_error) { [18:03:17.105] sessionInformation <- function() { [18:03:17.105] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.105] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.105] search = base::search(), system = base::Sys.info()) [18:03:17.105] } [18:03:17.105] ...future.conditions[[length(...future.conditions) + [18:03:17.105] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.105] cond$call), session = sessionInformation(), [18:03:17.105] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.105] signalCondition(cond) [18:03:17.105] } [18:03:17.105] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.105] "immediateCondition"))) { [18:03:17.105] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.105] ...future.conditions[[length(...future.conditions) + [18:03:17.105] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.105] if (TRUE && !signal) { [18:03:17.105] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.105] { [18:03:17.105] inherits <- base::inherits [18:03:17.105] invokeRestart <- base::invokeRestart [18:03:17.105] is.null <- base::is.null [18:03:17.105] muffled <- FALSE [18:03:17.105] if (inherits(cond, "message")) { [18:03:17.105] muffled <- grepl(pattern, "muffleMessage") [18:03:17.105] if (muffled) [18:03:17.105] invokeRestart("muffleMessage") [18:03:17.105] } [18:03:17.105] else if (inherits(cond, "warning")) { [18:03:17.105] muffled <- grepl(pattern, "muffleWarning") [18:03:17.105] if (muffled) [18:03:17.105] invokeRestart("muffleWarning") [18:03:17.105] } [18:03:17.105] else if (inherits(cond, "condition")) { [18:03:17.105] if (!is.null(pattern)) { [18:03:17.105] computeRestarts <- base::computeRestarts [18:03:17.105] grepl <- base::grepl [18:03:17.105] restarts <- computeRestarts(cond) [18:03:17.105] for (restart in restarts) { [18:03:17.105] name <- restart$name [18:03:17.105] if (is.null(name)) [18:03:17.105] next [18:03:17.105] if (!grepl(pattern, name)) [18:03:17.105] next [18:03:17.105] invokeRestart(restart) [18:03:17.105] muffled <- TRUE [18:03:17.105] break [18:03:17.105] } [18:03:17.105] } [18:03:17.105] } [18:03:17.105] invisible(muffled) [18:03:17.105] } [18:03:17.105] muffleCondition(cond, pattern = "^muffle") [18:03:17.105] } [18:03:17.105] } [18:03:17.105] else { [18:03:17.105] if (TRUE) { [18:03:17.105] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.105] { [18:03:17.105] inherits <- base::inherits [18:03:17.105] invokeRestart <- base::invokeRestart [18:03:17.105] is.null <- base::is.null [18:03:17.105] muffled <- FALSE [18:03:17.105] if (inherits(cond, "message")) { [18:03:17.105] muffled <- grepl(pattern, "muffleMessage") [18:03:17.105] if (muffled) [18:03:17.105] invokeRestart("muffleMessage") [18:03:17.105] } [18:03:17.105] else if (inherits(cond, "warning")) { [18:03:17.105] muffled <- grepl(pattern, "muffleWarning") [18:03:17.105] if (muffled) [18:03:17.105] invokeRestart("muffleWarning") [18:03:17.105] } [18:03:17.105] else if (inherits(cond, "condition")) { [18:03:17.105] if (!is.null(pattern)) { [18:03:17.105] computeRestarts <- base::computeRestarts [18:03:17.105] grepl <- base::grepl [18:03:17.105] restarts <- computeRestarts(cond) [18:03:17.105] for (restart in restarts) { [18:03:17.105] name <- restart$name [18:03:17.105] if (is.null(name)) [18:03:17.105] next [18:03:17.105] if (!grepl(pattern, name)) [18:03:17.105] next [18:03:17.105] invokeRestart(restart) [18:03:17.105] muffled <- TRUE [18:03:17.105] break [18:03:17.105] } [18:03:17.105] } [18:03:17.105] } [18:03:17.105] invisible(muffled) [18:03:17.105] } [18:03:17.105] muffleCondition(cond, pattern = "^muffle") [18:03:17.105] } [18:03:17.105] } [18:03:17.105] } [18:03:17.105] })) [18:03:17.105] }, error = function(ex) { [18:03:17.105] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.105] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.105] ...future.rng), started = ...future.startTime, [18:03:17.105] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.105] version = "1.8"), class = "FutureResult") [18:03:17.105] }, finally = { [18:03:17.105] if (!identical(...future.workdir, getwd())) [18:03:17.105] setwd(...future.workdir) [18:03:17.105] { [18:03:17.105] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.105] ...future.oldOptions$nwarnings <- NULL [18:03:17.105] } [18:03:17.105] base::options(...future.oldOptions) [18:03:17.105] if (.Platform$OS.type == "windows") { [18:03:17.105] old_names <- names(...future.oldEnvVars) [18:03:17.105] envs <- base::Sys.getenv() [18:03:17.105] names <- names(envs) [18:03:17.105] common <- intersect(names, old_names) [18:03:17.105] added <- setdiff(names, old_names) [18:03:17.105] removed <- setdiff(old_names, names) [18:03:17.105] changed <- common[...future.oldEnvVars[common] != [18:03:17.105] envs[common]] [18:03:17.105] NAMES <- toupper(changed) [18:03:17.105] args <- list() [18:03:17.105] for (kk in seq_along(NAMES)) { [18:03:17.105] name <- changed[[kk]] [18:03:17.105] NAME <- NAMES[[kk]] [18:03:17.105] if (name != NAME && is.element(NAME, old_names)) [18:03:17.105] next [18:03:17.105] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.105] } [18:03:17.105] NAMES <- toupper(added) [18:03:17.105] for (kk in seq_along(NAMES)) { [18:03:17.105] name <- added[[kk]] [18:03:17.105] NAME <- NAMES[[kk]] [18:03:17.105] if (name != NAME && is.element(NAME, old_names)) [18:03:17.105] next [18:03:17.105] args[[name]] <- "" [18:03:17.105] } [18:03:17.105] NAMES <- toupper(removed) [18:03:17.105] for (kk in seq_along(NAMES)) { [18:03:17.105] name <- removed[[kk]] [18:03:17.105] NAME <- NAMES[[kk]] [18:03:17.105] if (name != NAME && is.element(NAME, old_names)) [18:03:17.105] next [18:03:17.105] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.105] } [18:03:17.105] if (length(args) > 0) [18:03:17.105] base::do.call(base::Sys.setenv, args = args) [18:03:17.105] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.105] } [18:03:17.105] else { [18:03:17.105] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.105] } [18:03:17.105] { [18:03:17.105] if (base::length(...future.futureOptionsAdded) > [18:03:17.105] 0L) { [18:03:17.105] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.105] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.105] base::options(opts) [18:03:17.105] } [18:03:17.105] { [18:03:17.105] { [18:03:17.105] base::assign(".Random.seed", c(10407L, -1977649478L, [18:03:17.105] 1197805051L, 1439847754L, -405710151L, -386021683L, [18:03:17.105] 1294114928L), envir = base::globalenv(), [18:03:17.105] inherits = FALSE) [18:03:17.105] NULL [18:03:17.105] } [18:03:17.105] options(future.plan = NULL) [18:03:17.105] if (is.na(NA_character_)) [18:03:17.105] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.105] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.105] future::plan(list(function (..., envir = parent.frame()) [18:03:17.105] { [18:03:17.105] future <- SequentialFuture(..., envir = envir) [18:03:17.105] if (!future$lazy) [18:03:17.105] future <- run(future) [18:03:17.105] invisible(future) [18:03:17.105] }), .cleanup = FALSE, .init = FALSE) [18:03:17.105] } [18:03:17.105] } [18:03:17.105] } [18:03:17.105] }) [18:03:17.105] if (TRUE) { [18:03:17.105] base::sink(type = "output", split = FALSE) [18:03:17.105] if (TRUE) { [18:03:17.105] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.105] } [18:03:17.105] else { [18:03:17.105] ...future.result["stdout"] <- base::list(NULL) [18:03:17.105] } [18:03:17.105] base::close(...future.stdout) [18:03:17.105] ...future.stdout <- NULL [18:03:17.105] } [18:03:17.105] ...future.result$conditions <- ...future.conditions [18:03:17.105] ...future.result$finished <- base::Sys.time() [18:03:17.105] ...future.result [18:03:17.105] } [18:03:17.109] assign_globals() ... [18:03:17.109] List of 1 [18:03:17.109] $ x: int [1:4] 0 1 2 3 [18:03:17.109] - attr(*, "where")=List of 1 [18:03:17.109] ..$ x: [18:03:17.109] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.109] - attr(*, "resolved")= logi FALSE [18:03:17.109] - attr(*, "total_size")= num 64 [18:03:17.109] - attr(*, "already-done")= logi TRUE [18:03:17.112] - copied 'x' to environment [18:03:17.112] assign_globals() ... done [18:03:17.113] plan(): Setting new future strategy stack: [18:03:17.113] List of future strategies: [18:03:17.113] 1. sequential: [18:03:17.113] - args: function (..., envir = parent.frame()) [18:03:17.113] - tweaked: FALSE [18:03:17.113] - call: NULL [18:03:17.113] plan(): nbrOfWorkers() = 1 [18:03:17.114] plan(): Setting new future strategy stack: [18:03:17.115] List of future strategies: [18:03:17.115] 1. sequential: [18:03:17.115] - args: function (..., envir = parent.frame()) [18:03:17.115] - tweaked: FALSE [18:03:17.115] - call: plan(strategy) [18:03:17.115] plan(): nbrOfWorkers() = 1 [18:03:17.115] SequentialFuture started (and completed) [18:03:17.115] - Launch lazy future ... done [18:03:17.116] run() for 'SequentialFuture' ... done [18:03:17.116] getGlobalsAndPackages() ... [18:03:17.116] Searching for globals... [18:03:17.117] - globals found: [3] '{', 'sample', 'x' [18:03:17.118] Searching for globals ... DONE [18:03:17.118] Resolving globals: FALSE [18:03:17.118] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.119] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.119] - globals: [1] 'x' [18:03:17.119] [18:03:17.119] getGlobalsAndPackages() ... DONE [18:03:17.120] run() for 'Future' ... [18:03:17.120] - state: 'created' [18:03:17.120] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.120] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.121] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.121] - Field: 'label' [18:03:17.121] - Field: 'local' [18:03:17.121] - Field: 'owner' [18:03:17.121] - Field: 'envir' [18:03:17.121] - Field: 'packages' [18:03:17.122] - Field: 'gc' [18:03:17.122] - Field: 'conditions' [18:03:17.122] - Field: 'expr' [18:03:17.122] - Field: 'uuid' [18:03:17.122] - Field: 'seed' [18:03:17.122] - Field: 'version' [18:03:17.123] - Field: 'result' [18:03:17.123] - Field: 'asynchronous' [18:03:17.123] - Field: 'calls' [18:03:17.123] - Field: 'globals' [18:03:17.123] - Field: 'stdout' [18:03:17.124] - Field: 'earlySignal' [18:03:17.124] - Field: 'lazy' [18:03:17.124] - Field: 'state' [18:03:17.124] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.124] - Launch lazy future ... [18:03:17.124] Packages needed by the future expression (n = 0): [18:03:17.125] Packages needed by future strategies (n = 0): [18:03:17.125] { [18:03:17.125] { [18:03:17.125] { [18:03:17.125] ...future.startTime <- base::Sys.time() [18:03:17.125] { [18:03:17.125] { [18:03:17.125] { [18:03:17.125] base::local({ [18:03:17.125] has_future <- base::requireNamespace("future", [18:03:17.125] quietly = TRUE) [18:03:17.125] if (has_future) { [18:03:17.125] ns <- base::getNamespace("future") [18:03:17.125] version <- ns[[".package"]][["version"]] [18:03:17.125] if (is.null(version)) [18:03:17.125] version <- utils::packageVersion("future") [18:03:17.125] } [18:03:17.125] else { [18:03:17.125] version <- NULL [18:03:17.125] } [18:03:17.125] if (!has_future || version < "1.8.0") { [18:03:17.125] info <- base::c(r_version = base::gsub("R version ", [18:03:17.125] "", base::R.version$version.string), [18:03:17.125] platform = base::sprintf("%s (%s-bit)", [18:03:17.125] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.125] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.125] "release", "version")], collapse = " "), [18:03:17.125] hostname = base::Sys.info()[["nodename"]]) [18:03:17.125] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.125] info) [18:03:17.125] info <- base::paste(info, collapse = "; ") [18:03:17.125] if (!has_future) { [18:03:17.125] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.125] info) [18:03:17.125] } [18:03:17.125] else { [18:03:17.125] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.125] info, version) [18:03:17.125] } [18:03:17.125] base::stop(msg) [18:03:17.125] } [18:03:17.125] }) [18:03:17.125] } [18:03:17.125] options(future.plan = NULL) [18:03:17.125] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.125] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.125] } [18:03:17.125] ...future.workdir <- getwd() [18:03:17.125] } [18:03:17.125] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.125] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.125] } [18:03:17.125] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.125] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.125] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.125] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.125] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.125] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.125] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.125] base::names(...future.oldOptions)) [18:03:17.125] } [18:03:17.125] if (FALSE) { [18:03:17.125] } [18:03:17.125] else { [18:03:17.125] if (TRUE) { [18:03:17.125] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.125] open = "w") [18:03:17.125] } [18:03:17.125] else { [18:03:17.125] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.125] windows = "NUL", "/dev/null"), open = "w") [18:03:17.125] } [18:03:17.125] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.125] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.125] base::sink(type = "output", split = FALSE) [18:03:17.125] base::close(...future.stdout) [18:03:17.125] }, add = TRUE) [18:03:17.125] } [18:03:17.125] ...future.frame <- base::sys.nframe() [18:03:17.125] ...future.conditions <- base::list() [18:03:17.125] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.125] if (FALSE) { [18:03:17.125] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.125] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.125] } [18:03:17.125] ...future.result <- base::tryCatch({ [18:03:17.125] base::withCallingHandlers({ [18:03:17.125] ...future.value <- base::withVisible(base::local({ [18:03:17.125] sample(x, size = 1L) [18:03:17.125] })) [18:03:17.125] future::FutureResult(value = ...future.value$value, [18:03:17.125] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.125] ...future.rng), globalenv = if (FALSE) [18:03:17.125] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.125] ...future.globalenv.names)) [18:03:17.125] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.125] }, condition = base::local({ [18:03:17.125] c <- base::c [18:03:17.125] inherits <- base::inherits [18:03:17.125] invokeRestart <- base::invokeRestart [18:03:17.125] length <- base::length [18:03:17.125] list <- base::list [18:03:17.125] seq.int <- base::seq.int [18:03:17.125] signalCondition <- base::signalCondition [18:03:17.125] sys.calls <- base::sys.calls [18:03:17.125] `[[` <- base::`[[` [18:03:17.125] `+` <- base::`+` [18:03:17.125] `<<-` <- base::`<<-` [18:03:17.125] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.125] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.125] 3L)] [18:03:17.125] } [18:03:17.125] function(cond) { [18:03:17.125] is_error <- inherits(cond, "error") [18:03:17.125] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.125] NULL) [18:03:17.125] if (is_error) { [18:03:17.125] sessionInformation <- function() { [18:03:17.125] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.125] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.125] search = base::search(), system = base::Sys.info()) [18:03:17.125] } [18:03:17.125] ...future.conditions[[length(...future.conditions) + [18:03:17.125] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.125] cond$call), session = sessionInformation(), [18:03:17.125] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.125] signalCondition(cond) [18:03:17.125] } [18:03:17.125] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.125] "immediateCondition"))) { [18:03:17.125] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.125] ...future.conditions[[length(...future.conditions) + [18:03:17.125] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.125] if (TRUE && !signal) { [18:03:17.125] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.125] { [18:03:17.125] inherits <- base::inherits [18:03:17.125] invokeRestart <- base::invokeRestart [18:03:17.125] is.null <- base::is.null [18:03:17.125] muffled <- FALSE [18:03:17.125] if (inherits(cond, "message")) { [18:03:17.125] muffled <- grepl(pattern, "muffleMessage") [18:03:17.125] if (muffled) [18:03:17.125] invokeRestart("muffleMessage") [18:03:17.125] } [18:03:17.125] else if (inherits(cond, "warning")) { [18:03:17.125] muffled <- grepl(pattern, "muffleWarning") [18:03:17.125] if (muffled) [18:03:17.125] invokeRestart("muffleWarning") [18:03:17.125] } [18:03:17.125] else if (inherits(cond, "condition")) { [18:03:17.125] if (!is.null(pattern)) { [18:03:17.125] computeRestarts <- base::computeRestarts [18:03:17.125] grepl <- base::grepl [18:03:17.125] restarts <- computeRestarts(cond) [18:03:17.125] for (restart in restarts) { [18:03:17.125] name <- restart$name [18:03:17.125] if (is.null(name)) [18:03:17.125] next [18:03:17.125] if (!grepl(pattern, name)) [18:03:17.125] next [18:03:17.125] invokeRestart(restart) [18:03:17.125] muffled <- TRUE [18:03:17.125] break [18:03:17.125] } [18:03:17.125] } [18:03:17.125] } [18:03:17.125] invisible(muffled) [18:03:17.125] } [18:03:17.125] muffleCondition(cond, pattern = "^muffle") [18:03:17.125] } [18:03:17.125] } [18:03:17.125] else { [18:03:17.125] if (TRUE) { [18:03:17.125] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.125] { [18:03:17.125] inherits <- base::inherits [18:03:17.125] invokeRestart <- base::invokeRestart [18:03:17.125] is.null <- base::is.null [18:03:17.125] muffled <- FALSE [18:03:17.125] if (inherits(cond, "message")) { [18:03:17.125] muffled <- grepl(pattern, "muffleMessage") [18:03:17.125] if (muffled) [18:03:17.125] invokeRestart("muffleMessage") [18:03:17.125] } [18:03:17.125] else if (inherits(cond, "warning")) { [18:03:17.125] muffled <- grepl(pattern, "muffleWarning") [18:03:17.125] if (muffled) [18:03:17.125] invokeRestart("muffleWarning") [18:03:17.125] } [18:03:17.125] else if (inherits(cond, "condition")) { [18:03:17.125] if (!is.null(pattern)) { [18:03:17.125] computeRestarts <- base::computeRestarts [18:03:17.125] grepl <- base::grepl [18:03:17.125] restarts <- computeRestarts(cond) [18:03:17.125] for (restart in restarts) { [18:03:17.125] name <- restart$name [18:03:17.125] if (is.null(name)) [18:03:17.125] next [18:03:17.125] if (!grepl(pattern, name)) [18:03:17.125] next [18:03:17.125] invokeRestart(restart) [18:03:17.125] muffled <- TRUE [18:03:17.125] break [18:03:17.125] } [18:03:17.125] } [18:03:17.125] } [18:03:17.125] invisible(muffled) [18:03:17.125] } [18:03:17.125] muffleCondition(cond, pattern = "^muffle") [18:03:17.125] } [18:03:17.125] } [18:03:17.125] } [18:03:17.125] })) [18:03:17.125] }, error = function(ex) { [18:03:17.125] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.125] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.125] ...future.rng), started = ...future.startTime, [18:03:17.125] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.125] version = "1.8"), class = "FutureResult") [18:03:17.125] }, finally = { [18:03:17.125] if (!identical(...future.workdir, getwd())) [18:03:17.125] setwd(...future.workdir) [18:03:17.125] { [18:03:17.125] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.125] ...future.oldOptions$nwarnings <- NULL [18:03:17.125] } [18:03:17.125] base::options(...future.oldOptions) [18:03:17.125] if (.Platform$OS.type == "windows") { [18:03:17.125] old_names <- names(...future.oldEnvVars) [18:03:17.125] envs <- base::Sys.getenv() [18:03:17.125] names <- names(envs) [18:03:17.125] common <- intersect(names, old_names) [18:03:17.125] added <- setdiff(names, old_names) [18:03:17.125] removed <- setdiff(old_names, names) [18:03:17.125] changed <- common[...future.oldEnvVars[common] != [18:03:17.125] envs[common]] [18:03:17.125] NAMES <- toupper(changed) [18:03:17.125] args <- list() [18:03:17.125] for (kk in seq_along(NAMES)) { [18:03:17.125] name <- changed[[kk]] [18:03:17.125] NAME <- NAMES[[kk]] [18:03:17.125] if (name != NAME && is.element(NAME, old_names)) [18:03:17.125] next [18:03:17.125] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.125] } [18:03:17.125] NAMES <- toupper(added) [18:03:17.125] for (kk in seq_along(NAMES)) { [18:03:17.125] name <- added[[kk]] [18:03:17.125] NAME <- NAMES[[kk]] [18:03:17.125] if (name != NAME && is.element(NAME, old_names)) [18:03:17.125] next [18:03:17.125] args[[name]] <- "" [18:03:17.125] } [18:03:17.125] NAMES <- toupper(removed) [18:03:17.125] for (kk in seq_along(NAMES)) { [18:03:17.125] name <- removed[[kk]] [18:03:17.125] NAME <- NAMES[[kk]] [18:03:17.125] if (name != NAME && is.element(NAME, old_names)) [18:03:17.125] next [18:03:17.125] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.125] } [18:03:17.125] if (length(args) > 0) [18:03:17.125] base::do.call(base::Sys.setenv, args = args) [18:03:17.125] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.125] } [18:03:17.125] else { [18:03:17.125] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.125] } [18:03:17.125] { [18:03:17.125] if (base::length(...future.futureOptionsAdded) > [18:03:17.125] 0L) { [18:03:17.125] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.125] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.125] base::options(opts) [18:03:17.125] } [18:03:17.125] { [18:03:17.125] { [18:03:17.125] base::assign(".Random.seed", c(10407L, 1439847754L, [18:03:17.125] 540059684L, -1452673036L, 1294114928L, 223164867L, [18:03:17.125] 1643713775L), envir = base::globalenv(), [18:03:17.125] inherits = FALSE) [18:03:17.125] NULL [18:03:17.125] } [18:03:17.125] options(future.plan = NULL) [18:03:17.125] if (is.na(NA_character_)) [18:03:17.125] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.125] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.125] future::plan(list(function (..., envir = parent.frame()) [18:03:17.125] { [18:03:17.125] future <- SequentialFuture(..., envir = envir) [18:03:17.125] if (!future$lazy) [18:03:17.125] future <- run(future) [18:03:17.125] invisible(future) [18:03:17.125] }), .cleanup = FALSE, .init = FALSE) [18:03:17.125] } [18:03:17.125] } [18:03:17.125] } [18:03:17.125] }) [18:03:17.125] if (TRUE) { [18:03:17.125] base::sink(type = "output", split = FALSE) [18:03:17.125] if (TRUE) { [18:03:17.125] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.125] } [18:03:17.125] else { [18:03:17.125] ...future.result["stdout"] <- base::list(NULL) [18:03:17.125] } [18:03:17.125] base::close(...future.stdout) [18:03:17.125] ...future.stdout <- NULL [18:03:17.125] } [18:03:17.125] ...future.result$conditions <- ...future.conditions [18:03:17.125] ...future.result$finished <- base::Sys.time() [18:03:17.125] ...future.result [18:03:17.125] } [18:03:17.129] assign_globals() ... [18:03:17.129] List of 1 [18:03:17.129] $ x: int [1:4] 0 1 2 3 [18:03:17.129] - attr(*, "where")=List of 1 [18:03:17.129] ..$ x: [18:03:17.129] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.129] - attr(*, "resolved")= logi FALSE [18:03:17.129] - attr(*, "total_size")= num 64 [18:03:17.129] - attr(*, "already-done")= logi TRUE [18:03:17.132] - copied 'x' to environment [18:03:17.132] assign_globals() ... done [18:03:17.133] plan(): Setting new future strategy stack: [18:03:17.133] List of future strategies: [18:03:17.133] 1. sequential: [18:03:17.133] - args: function (..., envir = parent.frame()) [18:03:17.133] - tweaked: FALSE [18:03:17.133] - call: NULL [18:03:17.133] plan(): nbrOfWorkers() = 1 [18:03:17.135] plan(): Setting new future strategy stack: [18:03:17.136] List of future strategies: [18:03:17.136] 1. sequential: [18:03:17.136] - args: function (..., envir = parent.frame()) [18:03:17.136] - tweaked: FALSE [18:03:17.136] - call: plan(strategy) [18:03:17.136] plan(): nbrOfWorkers() = 1 [18:03:17.136] SequentialFuture started (and completed) [18:03:17.137] - Launch lazy future ... done [18:03:17.137] run() for 'SequentialFuture' ... done [18:03:17.137] getGlobalsAndPackages() ... [18:03:17.137] Searching for globals... [18:03:17.139] - globals found: [3] '{', 'sample', 'x' [18:03:17.139] Searching for globals ... DONE [18:03:17.139] Resolving globals: FALSE [18:03:17.140] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.140] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.140] - globals: [1] 'x' [18:03:17.140] [18:03:17.140] getGlobalsAndPackages() ... DONE [18:03:17.141] run() for 'Future' ... [18:03:17.141] - state: 'created' [18:03:17.141] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.142] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.142] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.142] - Field: 'label' [18:03:17.142] - Field: 'local' [18:03:17.142] - Field: 'owner' [18:03:17.143] - Field: 'envir' [18:03:17.143] - Field: 'packages' [18:03:17.143] - Field: 'gc' [18:03:17.143] - Field: 'conditions' [18:03:17.143] - Field: 'expr' [18:03:17.143] - Field: 'uuid' [18:03:17.144] - Field: 'seed' [18:03:17.144] - Field: 'version' [18:03:17.144] - Field: 'result' [18:03:17.144] - Field: 'asynchronous' [18:03:17.144] - Field: 'calls' [18:03:17.144] - Field: 'globals' [18:03:17.145] - Field: 'stdout' [18:03:17.145] - Field: 'earlySignal' [18:03:17.145] - Field: 'lazy' [18:03:17.145] - Field: 'state' [18:03:17.145] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.145] - Launch lazy future ... [18:03:17.146] Packages needed by the future expression (n = 0): [18:03:17.146] Packages needed by future strategies (n = 0): [18:03:17.146] { [18:03:17.146] { [18:03:17.146] { [18:03:17.146] ...future.startTime <- base::Sys.time() [18:03:17.146] { [18:03:17.146] { [18:03:17.146] { [18:03:17.146] base::local({ [18:03:17.146] has_future <- base::requireNamespace("future", [18:03:17.146] quietly = TRUE) [18:03:17.146] if (has_future) { [18:03:17.146] ns <- base::getNamespace("future") [18:03:17.146] version <- ns[[".package"]][["version"]] [18:03:17.146] if (is.null(version)) [18:03:17.146] version <- utils::packageVersion("future") [18:03:17.146] } [18:03:17.146] else { [18:03:17.146] version <- NULL [18:03:17.146] } [18:03:17.146] if (!has_future || version < "1.8.0") { [18:03:17.146] info <- base::c(r_version = base::gsub("R version ", [18:03:17.146] "", base::R.version$version.string), [18:03:17.146] platform = base::sprintf("%s (%s-bit)", [18:03:17.146] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.146] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.146] "release", "version")], collapse = " "), [18:03:17.146] hostname = base::Sys.info()[["nodename"]]) [18:03:17.146] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.146] info) [18:03:17.146] info <- base::paste(info, collapse = "; ") [18:03:17.146] if (!has_future) { [18:03:17.146] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.146] info) [18:03:17.146] } [18:03:17.146] else { [18:03:17.146] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.146] info, version) [18:03:17.146] } [18:03:17.146] base::stop(msg) [18:03:17.146] } [18:03:17.146] }) [18:03:17.146] } [18:03:17.146] options(future.plan = NULL) [18:03:17.146] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.146] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.146] } [18:03:17.146] ...future.workdir <- getwd() [18:03:17.146] } [18:03:17.146] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.146] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.146] } [18:03:17.146] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.146] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.146] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.146] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.146] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.146] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.146] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.146] base::names(...future.oldOptions)) [18:03:17.146] } [18:03:17.146] if (FALSE) { [18:03:17.146] } [18:03:17.146] else { [18:03:17.146] if (TRUE) { [18:03:17.146] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.146] open = "w") [18:03:17.146] } [18:03:17.146] else { [18:03:17.146] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.146] windows = "NUL", "/dev/null"), open = "w") [18:03:17.146] } [18:03:17.146] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.146] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.146] base::sink(type = "output", split = FALSE) [18:03:17.146] base::close(...future.stdout) [18:03:17.146] }, add = TRUE) [18:03:17.146] } [18:03:17.146] ...future.frame <- base::sys.nframe() [18:03:17.146] ...future.conditions <- base::list() [18:03:17.146] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.146] if (FALSE) { [18:03:17.146] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.146] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.146] } [18:03:17.146] ...future.result <- base::tryCatch({ [18:03:17.146] base::withCallingHandlers({ [18:03:17.146] ...future.value <- base::withVisible(base::local({ [18:03:17.146] sample(x, size = 1L) [18:03:17.146] })) [18:03:17.146] future::FutureResult(value = ...future.value$value, [18:03:17.146] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.146] ...future.rng), globalenv = if (FALSE) [18:03:17.146] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.146] ...future.globalenv.names)) [18:03:17.146] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.146] }, condition = base::local({ [18:03:17.146] c <- base::c [18:03:17.146] inherits <- base::inherits [18:03:17.146] invokeRestart <- base::invokeRestart [18:03:17.146] length <- base::length [18:03:17.146] list <- base::list [18:03:17.146] seq.int <- base::seq.int [18:03:17.146] signalCondition <- base::signalCondition [18:03:17.146] sys.calls <- base::sys.calls [18:03:17.146] `[[` <- base::`[[` [18:03:17.146] `+` <- base::`+` [18:03:17.146] `<<-` <- base::`<<-` [18:03:17.146] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.146] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.146] 3L)] [18:03:17.146] } [18:03:17.146] function(cond) { [18:03:17.146] is_error <- inherits(cond, "error") [18:03:17.146] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.146] NULL) [18:03:17.146] if (is_error) { [18:03:17.146] sessionInformation <- function() { [18:03:17.146] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.146] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.146] search = base::search(), system = base::Sys.info()) [18:03:17.146] } [18:03:17.146] ...future.conditions[[length(...future.conditions) + [18:03:17.146] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.146] cond$call), session = sessionInformation(), [18:03:17.146] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.146] signalCondition(cond) [18:03:17.146] } [18:03:17.146] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.146] "immediateCondition"))) { [18:03:17.146] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.146] ...future.conditions[[length(...future.conditions) + [18:03:17.146] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.146] if (TRUE && !signal) { [18:03:17.146] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.146] { [18:03:17.146] inherits <- base::inherits [18:03:17.146] invokeRestart <- base::invokeRestart [18:03:17.146] is.null <- base::is.null [18:03:17.146] muffled <- FALSE [18:03:17.146] if (inherits(cond, "message")) { [18:03:17.146] muffled <- grepl(pattern, "muffleMessage") [18:03:17.146] if (muffled) [18:03:17.146] invokeRestart("muffleMessage") [18:03:17.146] } [18:03:17.146] else if (inherits(cond, "warning")) { [18:03:17.146] muffled <- grepl(pattern, "muffleWarning") [18:03:17.146] if (muffled) [18:03:17.146] invokeRestart("muffleWarning") [18:03:17.146] } [18:03:17.146] else if (inherits(cond, "condition")) { [18:03:17.146] if (!is.null(pattern)) { [18:03:17.146] computeRestarts <- base::computeRestarts [18:03:17.146] grepl <- base::grepl [18:03:17.146] restarts <- computeRestarts(cond) [18:03:17.146] for (restart in restarts) { [18:03:17.146] name <- restart$name [18:03:17.146] if (is.null(name)) [18:03:17.146] next [18:03:17.146] if (!grepl(pattern, name)) [18:03:17.146] next [18:03:17.146] invokeRestart(restart) [18:03:17.146] muffled <- TRUE [18:03:17.146] break [18:03:17.146] } [18:03:17.146] } [18:03:17.146] } [18:03:17.146] invisible(muffled) [18:03:17.146] } [18:03:17.146] muffleCondition(cond, pattern = "^muffle") [18:03:17.146] } [18:03:17.146] } [18:03:17.146] else { [18:03:17.146] if (TRUE) { [18:03:17.146] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.146] { [18:03:17.146] inherits <- base::inherits [18:03:17.146] invokeRestart <- base::invokeRestart [18:03:17.146] is.null <- base::is.null [18:03:17.146] muffled <- FALSE [18:03:17.146] if (inherits(cond, "message")) { [18:03:17.146] muffled <- grepl(pattern, "muffleMessage") [18:03:17.146] if (muffled) [18:03:17.146] invokeRestart("muffleMessage") [18:03:17.146] } [18:03:17.146] else if (inherits(cond, "warning")) { [18:03:17.146] muffled <- grepl(pattern, "muffleWarning") [18:03:17.146] if (muffled) [18:03:17.146] invokeRestart("muffleWarning") [18:03:17.146] } [18:03:17.146] else if (inherits(cond, "condition")) { [18:03:17.146] if (!is.null(pattern)) { [18:03:17.146] computeRestarts <- base::computeRestarts [18:03:17.146] grepl <- base::grepl [18:03:17.146] restarts <- computeRestarts(cond) [18:03:17.146] for (restart in restarts) { [18:03:17.146] name <- restart$name [18:03:17.146] if (is.null(name)) [18:03:17.146] next [18:03:17.146] if (!grepl(pattern, name)) [18:03:17.146] next [18:03:17.146] invokeRestart(restart) [18:03:17.146] muffled <- TRUE [18:03:17.146] break [18:03:17.146] } [18:03:17.146] } [18:03:17.146] } [18:03:17.146] invisible(muffled) [18:03:17.146] } [18:03:17.146] muffleCondition(cond, pattern = "^muffle") [18:03:17.146] } [18:03:17.146] } [18:03:17.146] } [18:03:17.146] })) [18:03:17.146] }, error = function(ex) { [18:03:17.146] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.146] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.146] ...future.rng), started = ...future.startTime, [18:03:17.146] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.146] version = "1.8"), class = "FutureResult") [18:03:17.146] }, finally = { [18:03:17.146] if (!identical(...future.workdir, getwd())) [18:03:17.146] setwd(...future.workdir) [18:03:17.146] { [18:03:17.146] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.146] ...future.oldOptions$nwarnings <- NULL [18:03:17.146] } [18:03:17.146] base::options(...future.oldOptions) [18:03:17.146] if (.Platform$OS.type == "windows") { [18:03:17.146] old_names <- names(...future.oldEnvVars) [18:03:17.146] envs <- base::Sys.getenv() [18:03:17.146] names <- names(envs) [18:03:17.146] common <- intersect(names, old_names) [18:03:17.146] added <- setdiff(names, old_names) [18:03:17.146] removed <- setdiff(old_names, names) [18:03:17.146] changed <- common[...future.oldEnvVars[common] != [18:03:17.146] envs[common]] [18:03:17.146] NAMES <- toupper(changed) [18:03:17.146] args <- list() [18:03:17.146] for (kk in seq_along(NAMES)) { [18:03:17.146] name <- changed[[kk]] [18:03:17.146] NAME <- NAMES[[kk]] [18:03:17.146] if (name != NAME && is.element(NAME, old_names)) [18:03:17.146] next [18:03:17.146] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.146] } [18:03:17.146] NAMES <- toupper(added) [18:03:17.146] for (kk in seq_along(NAMES)) { [18:03:17.146] name <- added[[kk]] [18:03:17.146] NAME <- NAMES[[kk]] [18:03:17.146] if (name != NAME && is.element(NAME, old_names)) [18:03:17.146] next [18:03:17.146] args[[name]] <- "" [18:03:17.146] } [18:03:17.146] NAMES <- toupper(removed) [18:03:17.146] for (kk in seq_along(NAMES)) { [18:03:17.146] name <- removed[[kk]] [18:03:17.146] NAME <- NAMES[[kk]] [18:03:17.146] if (name != NAME && is.element(NAME, old_names)) [18:03:17.146] next [18:03:17.146] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.146] } [18:03:17.146] if (length(args) > 0) [18:03:17.146] base::do.call(base::Sys.setenv, args = args) [18:03:17.146] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.146] } [18:03:17.146] else { [18:03:17.146] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.146] } [18:03:17.146] { [18:03:17.146] if (base::length(...future.futureOptionsAdded) > [18:03:17.146] 0L) { [18:03:17.146] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.146] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.146] base::options(opts) [18:03:17.146] } [18:03:17.146] { [18:03:17.146] { [18:03:17.146] base::assign(".Random.seed", c(10407L, -1452673036L, [18:03:17.146] -1850212388L, -1068983444L, 1643713775L, [18:03:17.146] 41786744L, -1605661862L), envir = base::globalenv(), [18:03:17.146] inherits = FALSE) [18:03:17.146] NULL [18:03:17.146] } [18:03:17.146] options(future.plan = NULL) [18:03:17.146] if (is.na(NA_character_)) [18:03:17.146] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.146] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.146] future::plan(list(function (..., envir = parent.frame()) [18:03:17.146] { [18:03:17.146] future <- SequentialFuture(..., envir = envir) [18:03:17.146] if (!future$lazy) [18:03:17.146] future <- run(future) [18:03:17.146] invisible(future) [18:03:17.146] }), .cleanup = FALSE, .init = FALSE) [18:03:17.146] } [18:03:17.146] } [18:03:17.146] } [18:03:17.146] }) [18:03:17.146] if (TRUE) { [18:03:17.146] base::sink(type = "output", split = FALSE) [18:03:17.146] if (TRUE) { [18:03:17.146] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.146] } [18:03:17.146] else { [18:03:17.146] ...future.result["stdout"] <- base::list(NULL) [18:03:17.146] } [18:03:17.146] base::close(...future.stdout) [18:03:17.146] ...future.stdout <- NULL [18:03:17.146] } [18:03:17.146] ...future.result$conditions <- ...future.conditions [18:03:17.146] ...future.result$finished <- base::Sys.time() [18:03:17.146] ...future.result [18:03:17.146] } [18:03:17.150] assign_globals() ... [18:03:17.150] List of 1 [18:03:17.150] $ x: int [1:4] 0 1 2 3 [18:03:17.150] - attr(*, "where")=List of 1 [18:03:17.150] ..$ x: [18:03:17.150] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.150] - attr(*, "resolved")= logi FALSE [18:03:17.150] - attr(*, "total_size")= num 64 [18:03:17.150] - attr(*, "already-done")= logi TRUE [18:03:17.153] - copied 'x' to environment [18:03:17.153] assign_globals() ... done [18:03:17.154] plan(): Setting new future strategy stack: [18:03:17.154] List of future strategies: [18:03:17.154] 1. sequential: [18:03:17.154] - args: function (..., envir = parent.frame()) [18:03:17.154] - tweaked: FALSE [18:03:17.154] - call: NULL [18:03:17.154] plan(): nbrOfWorkers() = 1 [18:03:17.156] plan(): Setting new future strategy stack: [18:03:17.156] List of future strategies: [18:03:17.156] 1. sequential: [18:03:17.156] - args: function (..., envir = parent.frame()) [18:03:17.156] - tweaked: FALSE [18:03:17.156] - call: plan(strategy) [18:03:17.156] plan(): nbrOfWorkers() = 1 [18:03:17.156] SequentialFuture started (and completed) [18:03:17.157] - Launch lazy future ... done [18:03:17.157] run() for 'SequentialFuture' ... done [18:03:17.157] getGlobalsAndPackages() ... [18:03:17.158] Searching for globals... [18:03:17.159] - globals found: [3] '{', 'sample', 'x' [18:03:17.159] Searching for globals ... DONE [18:03:17.159] Resolving globals: FALSE [18:03:17.160] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.160] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.160] - globals: [1] 'x' [18:03:17.160] [18:03:17.161] getGlobalsAndPackages() ... DONE [18:03:17.161] run() for 'Future' ... [18:03:17.161] - state: 'created' [18:03:17.161] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.162] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.162] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.162] - Field: 'label' [18:03:17.162] - Field: 'local' [18:03:17.162] - Field: 'owner' [18:03:17.163] - Field: 'envir' [18:03:17.163] - Field: 'packages' [18:03:17.163] - Field: 'gc' [18:03:17.163] - Field: 'conditions' [18:03:17.163] - Field: 'expr' [18:03:17.163] - Field: 'uuid' [18:03:17.164] - Field: 'seed' [18:03:17.164] - Field: 'version' [18:03:17.164] - Field: 'result' [18:03:17.164] - Field: 'asynchronous' [18:03:17.164] - Field: 'calls' [18:03:17.165] - Field: 'globals' [18:03:17.165] - Field: 'stdout' [18:03:17.165] - Field: 'earlySignal' [18:03:17.165] - Field: 'lazy' [18:03:17.165] - Field: 'state' [18:03:17.165] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.166] - Launch lazy future ... [18:03:17.166] Packages needed by the future expression (n = 0): [18:03:17.166] Packages needed by future strategies (n = 0): [18:03:17.167] { [18:03:17.167] { [18:03:17.167] { [18:03:17.167] ...future.startTime <- base::Sys.time() [18:03:17.167] { [18:03:17.167] { [18:03:17.167] { [18:03:17.167] base::local({ [18:03:17.167] has_future <- base::requireNamespace("future", [18:03:17.167] quietly = TRUE) [18:03:17.167] if (has_future) { [18:03:17.167] ns <- base::getNamespace("future") [18:03:17.167] version <- ns[[".package"]][["version"]] [18:03:17.167] if (is.null(version)) [18:03:17.167] version <- utils::packageVersion("future") [18:03:17.167] } [18:03:17.167] else { [18:03:17.167] version <- NULL [18:03:17.167] } [18:03:17.167] if (!has_future || version < "1.8.0") { [18:03:17.167] info <- base::c(r_version = base::gsub("R version ", [18:03:17.167] "", base::R.version$version.string), [18:03:17.167] platform = base::sprintf("%s (%s-bit)", [18:03:17.167] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.167] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.167] "release", "version")], collapse = " "), [18:03:17.167] hostname = base::Sys.info()[["nodename"]]) [18:03:17.167] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.167] info) [18:03:17.167] info <- base::paste(info, collapse = "; ") [18:03:17.167] if (!has_future) { [18:03:17.167] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.167] info) [18:03:17.167] } [18:03:17.167] else { [18:03:17.167] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.167] info, version) [18:03:17.167] } [18:03:17.167] base::stop(msg) [18:03:17.167] } [18:03:17.167] }) [18:03:17.167] } [18:03:17.167] options(future.plan = NULL) [18:03:17.167] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.167] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.167] } [18:03:17.167] ...future.workdir <- getwd() [18:03:17.167] } [18:03:17.167] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.167] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.167] } [18:03:17.167] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.167] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.167] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.167] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.167] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.167] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.167] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.167] base::names(...future.oldOptions)) [18:03:17.167] } [18:03:17.167] if (FALSE) { [18:03:17.167] } [18:03:17.167] else { [18:03:17.167] if (TRUE) { [18:03:17.167] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.167] open = "w") [18:03:17.167] } [18:03:17.167] else { [18:03:17.167] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.167] windows = "NUL", "/dev/null"), open = "w") [18:03:17.167] } [18:03:17.167] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.167] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.167] base::sink(type = "output", split = FALSE) [18:03:17.167] base::close(...future.stdout) [18:03:17.167] }, add = TRUE) [18:03:17.167] } [18:03:17.167] ...future.frame <- base::sys.nframe() [18:03:17.167] ...future.conditions <- base::list() [18:03:17.167] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.167] if (FALSE) { [18:03:17.167] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.167] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.167] } [18:03:17.167] ...future.result <- base::tryCatch({ [18:03:17.167] base::withCallingHandlers({ [18:03:17.167] ...future.value <- base::withVisible(base::local({ [18:03:17.167] sample(x, size = 1L) [18:03:17.167] })) [18:03:17.167] future::FutureResult(value = ...future.value$value, [18:03:17.167] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.167] ...future.rng), globalenv = if (FALSE) [18:03:17.167] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.167] ...future.globalenv.names)) [18:03:17.167] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.167] }, condition = base::local({ [18:03:17.167] c <- base::c [18:03:17.167] inherits <- base::inherits [18:03:17.167] invokeRestart <- base::invokeRestart [18:03:17.167] length <- base::length [18:03:17.167] list <- base::list [18:03:17.167] seq.int <- base::seq.int [18:03:17.167] signalCondition <- base::signalCondition [18:03:17.167] sys.calls <- base::sys.calls [18:03:17.167] `[[` <- base::`[[` [18:03:17.167] `+` <- base::`+` [18:03:17.167] `<<-` <- base::`<<-` [18:03:17.167] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.167] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.167] 3L)] [18:03:17.167] } [18:03:17.167] function(cond) { [18:03:17.167] is_error <- inherits(cond, "error") [18:03:17.167] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.167] NULL) [18:03:17.167] if (is_error) { [18:03:17.167] sessionInformation <- function() { [18:03:17.167] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.167] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.167] search = base::search(), system = base::Sys.info()) [18:03:17.167] } [18:03:17.167] ...future.conditions[[length(...future.conditions) + [18:03:17.167] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.167] cond$call), session = sessionInformation(), [18:03:17.167] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.167] signalCondition(cond) [18:03:17.167] } [18:03:17.167] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.167] "immediateCondition"))) { [18:03:17.167] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.167] ...future.conditions[[length(...future.conditions) + [18:03:17.167] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.167] if (TRUE && !signal) { [18:03:17.167] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.167] { [18:03:17.167] inherits <- base::inherits [18:03:17.167] invokeRestart <- base::invokeRestart [18:03:17.167] is.null <- base::is.null [18:03:17.167] muffled <- FALSE [18:03:17.167] if (inherits(cond, "message")) { [18:03:17.167] muffled <- grepl(pattern, "muffleMessage") [18:03:17.167] if (muffled) [18:03:17.167] invokeRestart("muffleMessage") [18:03:17.167] } [18:03:17.167] else if (inherits(cond, "warning")) { [18:03:17.167] muffled <- grepl(pattern, "muffleWarning") [18:03:17.167] if (muffled) [18:03:17.167] invokeRestart("muffleWarning") [18:03:17.167] } [18:03:17.167] else if (inherits(cond, "condition")) { [18:03:17.167] if (!is.null(pattern)) { [18:03:17.167] computeRestarts <- base::computeRestarts [18:03:17.167] grepl <- base::grepl [18:03:17.167] restarts <- computeRestarts(cond) [18:03:17.167] for (restart in restarts) { [18:03:17.167] name <- restart$name [18:03:17.167] if (is.null(name)) [18:03:17.167] next [18:03:17.167] if (!grepl(pattern, name)) [18:03:17.167] next [18:03:17.167] invokeRestart(restart) [18:03:17.167] muffled <- TRUE [18:03:17.167] break [18:03:17.167] } [18:03:17.167] } [18:03:17.167] } [18:03:17.167] invisible(muffled) [18:03:17.167] } [18:03:17.167] muffleCondition(cond, pattern = "^muffle") [18:03:17.167] } [18:03:17.167] } [18:03:17.167] else { [18:03:17.167] if (TRUE) { [18:03:17.167] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.167] { [18:03:17.167] inherits <- base::inherits [18:03:17.167] invokeRestart <- base::invokeRestart [18:03:17.167] is.null <- base::is.null [18:03:17.167] muffled <- FALSE [18:03:17.167] if (inherits(cond, "message")) { [18:03:17.167] muffled <- grepl(pattern, "muffleMessage") [18:03:17.167] if (muffled) [18:03:17.167] invokeRestart("muffleMessage") [18:03:17.167] } [18:03:17.167] else if (inherits(cond, "warning")) { [18:03:17.167] muffled <- grepl(pattern, "muffleWarning") [18:03:17.167] if (muffled) [18:03:17.167] invokeRestart("muffleWarning") [18:03:17.167] } [18:03:17.167] else if (inherits(cond, "condition")) { [18:03:17.167] if (!is.null(pattern)) { [18:03:17.167] computeRestarts <- base::computeRestarts [18:03:17.167] grepl <- base::grepl [18:03:17.167] restarts <- computeRestarts(cond) [18:03:17.167] for (restart in restarts) { [18:03:17.167] name <- restart$name [18:03:17.167] if (is.null(name)) [18:03:17.167] next [18:03:17.167] if (!grepl(pattern, name)) [18:03:17.167] next [18:03:17.167] invokeRestart(restart) [18:03:17.167] muffled <- TRUE [18:03:17.167] break [18:03:17.167] } [18:03:17.167] } [18:03:17.167] } [18:03:17.167] invisible(muffled) [18:03:17.167] } [18:03:17.167] muffleCondition(cond, pattern = "^muffle") [18:03:17.167] } [18:03:17.167] } [18:03:17.167] } [18:03:17.167] })) [18:03:17.167] }, error = function(ex) { [18:03:17.167] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.167] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.167] ...future.rng), started = ...future.startTime, [18:03:17.167] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.167] version = "1.8"), class = "FutureResult") [18:03:17.167] }, finally = { [18:03:17.167] if (!identical(...future.workdir, getwd())) [18:03:17.167] setwd(...future.workdir) [18:03:17.167] { [18:03:17.167] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.167] ...future.oldOptions$nwarnings <- NULL [18:03:17.167] } [18:03:17.167] base::options(...future.oldOptions) [18:03:17.167] if (.Platform$OS.type == "windows") { [18:03:17.167] old_names <- names(...future.oldEnvVars) [18:03:17.167] envs <- base::Sys.getenv() [18:03:17.167] names <- names(envs) [18:03:17.167] common <- intersect(names, old_names) [18:03:17.167] added <- setdiff(names, old_names) [18:03:17.167] removed <- setdiff(old_names, names) [18:03:17.167] changed <- common[...future.oldEnvVars[common] != [18:03:17.167] envs[common]] [18:03:17.167] NAMES <- toupper(changed) [18:03:17.167] args <- list() [18:03:17.167] for (kk in seq_along(NAMES)) { [18:03:17.167] name <- changed[[kk]] [18:03:17.167] NAME <- NAMES[[kk]] [18:03:17.167] if (name != NAME && is.element(NAME, old_names)) [18:03:17.167] next [18:03:17.167] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.167] } [18:03:17.167] NAMES <- toupper(added) [18:03:17.167] for (kk in seq_along(NAMES)) { [18:03:17.167] name <- added[[kk]] [18:03:17.167] NAME <- NAMES[[kk]] [18:03:17.167] if (name != NAME && is.element(NAME, old_names)) [18:03:17.167] next [18:03:17.167] args[[name]] <- "" [18:03:17.167] } [18:03:17.167] NAMES <- toupper(removed) [18:03:17.167] for (kk in seq_along(NAMES)) { [18:03:17.167] name <- removed[[kk]] [18:03:17.167] NAME <- NAMES[[kk]] [18:03:17.167] if (name != NAME && is.element(NAME, old_names)) [18:03:17.167] next [18:03:17.167] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.167] } [18:03:17.167] if (length(args) > 0) [18:03:17.167] base::do.call(base::Sys.setenv, args = args) [18:03:17.167] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.167] } [18:03:17.167] else { [18:03:17.167] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.167] } [18:03:17.167] { [18:03:17.167] if (base::length(...future.futureOptionsAdded) > [18:03:17.167] 0L) { [18:03:17.167] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.167] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.167] base::options(opts) [18:03:17.167] } [18:03:17.167] { [18:03:17.167] { [18:03:17.167] base::assign(".Random.seed", c(10407L, -1068983444L, [18:03:17.167] 584945907L, 1877512842L, -1605661862L, -1132989853L, [18:03:17.167] -279719367L), envir = base::globalenv(), [18:03:17.167] inherits = FALSE) [18:03:17.167] NULL [18:03:17.167] } [18:03:17.167] options(future.plan = NULL) [18:03:17.167] if (is.na(NA_character_)) [18:03:17.167] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.167] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.167] future::plan(list(function (..., envir = parent.frame()) [18:03:17.167] { [18:03:17.167] future <- SequentialFuture(..., envir = envir) [18:03:17.167] if (!future$lazy) [18:03:17.167] future <- run(future) [18:03:17.167] invisible(future) [18:03:17.167] }), .cleanup = FALSE, .init = FALSE) [18:03:17.167] } [18:03:17.167] } [18:03:17.167] } [18:03:17.167] }) [18:03:17.167] if (TRUE) { [18:03:17.167] base::sink(type = "output", split = FALSE) [18:03:17.167] if (TRUE) { [18:03:17.167] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.167] } [18:03:17.167] else { [18:03:17.167] ...future.result["stdout"] <- base::list(NULL) [18:03:17.167] } [18:03:17.167] base::close(...future.stdout) [18:03:17.167] ...future.stdout <- NULL [18:03:17.167] } [18:03:17.167] ...future.result$conditions <- ...future.conditions [18:03:17.167] ...future.result$finished <- base::Sys.time() [18:03:17.167] ...future.result [18:03:17.167] } [18:03:17.170] assign_globals() ... [18:03:17.170] List of 1 [18:03:17.170] $ x: int [1:4] 0 1 2 3 [18:03:17.170] - attr(*, "where")=List of 1 [18:03:17.170] ..$ x: [18:03:17.170] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.170] - attr(*, "resolved")= logi FALSE [18:03:17.170] - attr(*, "total_size")= num 64 [18:03:17.170] - attr(*, "already-done")= logi TRUE [18:03:17.174] - copied 'x' to environment [18:03:17.175] assign_globals() ... done [18:03:17.175] plan(): Setting new future strategy stack: [18:03:17.175] List of future strategies: [18:03:17.175] 1. sequential: [18:03:17.175] - args: function (..., envir = parent.frame()) [18:03:17.175] - tweaked: FALSE [18:03:17.175] - call: NULL [18:03:17.176] plan(): nbrOfWorkers() = 1 [18:03:17.177] plan(): Setting new future strategy stack: [18:03:17.177] List of future strategies: [18:03:17.177] 1. sequential: [18:03:17.177] - args: function (..., envir = parent.frame()) [18:03:17.177] - tweaked: FALSE [18:03:17.177] - call: plan(strategy) [18:03:17.177] plan(): nbrOfWorkers() = 1 [18:03:17.178] SequentialFuture started (and completed) [18:03:17.178] - Launch lazy future ... done [18:03:17.178] run() for 'SequentialFuture' ... done [18:03:17.179] Future state: 'finished' [18:03:17.179] signalConditions() ... [18:03:17.179] - include = 'condition' [18:03:17.179] - exclude = 'immediateCondition' [18:03:17.179] - resignal = TRUE [18:03:17.180] - Number of conditions: 1 [18:03:17.180] - Condition #1: 'RngFutureError', 'FutureError', 'error', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:17.180] signalConditions() ... done Future UUID: 0d7f6c0a-21c3-e946-9167-4862f299a883 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: SequentialFuture: Label: 'fsample_1-460976' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: FALSE Local evaluation: TRUE Environment: 0x00000235f492cea0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureError' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:17.181] getGlobalsAndPackages() ... [18:03:17.182] Searching for globals... [18:03:17.183] - globals found: [3] '{', 'sample', 'x' [18:03:17.183] Searching for globals ... DONE [18:03:17.183] Resolving globals: FALSE [18:03:17.184] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.184] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.184] - globals: [1] 'x' [18:03:17.184] [18:03:17.185] getGlobalsAndPackages() ... DONE [18:03:17.185] run() for 'Future' ... [18:03:17.185] - state: 'created' [18:03:17.185] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.186] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.186] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.186] - Field: 'label' [18:03:17.186] - Field: 'local' [18:03:17.186] - Field: 'owner' [18:03:17.186] - Field: 'envir' [18:03:17.187] - Field: 'packages' [18:03:17.187] - Field: 'gc' [18:03:17.187] - Field: 'conditions' [18:03:17.187] - Field: 'expr' [18:03:17.187] - Field: 'uuid' [18:03:17.188] - Field: 'seed' [18:03:17.188] - Field: 'version' [18:03:17.188] - Field: 'result' [18:03:17.188] - Field: 'asynchronous' [18:03:17.188] - Field: 'calls' [18:03:17.188] - Field: 'globals' [18:03:17.189] - Field: 'stdout' [18:03:17.189] - Field: 'earlySignal' [18:03:17.189] - Field: 'lazy' [18:03:17.189] - Field: 'state' [18:03:17.189] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.189] - Launch lazy future ... [18:03:17.190] Packages needed by the future expression (n = 0): [18:03:17.190] Packages needed by future strategies (n = 0): [18:03:17.190] { [18:03:17.190] { [18:03:17.190] { [18:03:17.190] ...future.startTime <- base::Sys.time() [18:03:17.190] { [18:03:17.190] { [18:03:17.190] { [18:03:17.190] base::local({ [18:03:17.190] has_future <- base::requireNamespace("future", [18:03:17.190] quietly = TRUE) [18:03:17.190] if (has_future) { [18:03:17.190] ns <- base::getNamespace("future") [18:03:17.190] version <- ns[[".package"]][["version"]] [18:03:17.190] if (is.null(version)) [18:03:17.190] version <- utils::packageVersion("future") [18:03:17.190] } [18:03:17.190] else { [18:03:17.190] version <- NULL [18:03:17.190] } [18:03:17.190] if (!has_future || version < "1.8.0") { [18:03:17.190] info <- base::c(r_version = base::gsub("R version ", [18:03:17.190] "", base::R.version$version.string), [18:03:17.190] platform = base::sprintf("%s (%s-bit)", [18:03:17.190] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.190] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.190] "release", "version")], collapse = " "), [18:03:17.190] hostname = base::Sys.info()[["nodename"]]) [18:03:17.190] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.190] info) [18:03:17.190] info <- base::paste(info, collapse = "; ") [18:03:17.190] if (!has_future) { [18:03:17.190] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.190] info) [18:03:17.190] } [18:03:17.190] else { [18:03:17.190] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.190] info, version) [18:03:17.190] } [18:03:17.190] base::stop(msg) [18:03:17.190] } [18:03:17.190] }) [18:03:17.190] } [18:03:17.190] options(future.plan = NULL) [18:03:17.190] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.190] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.190] } [18:03:17.190] ...future.workdir <- getwd() [18:03:17.190] } [18:03:17.190] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.190] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.190] } [18:03:17.190] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.190] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.190] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.190] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.190] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.190] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.190] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.190] base::names(...future.oldOptions)) [18:03:17.190] } [18:03:17.190] if (FALSE) { [18:03:17.190] } [18:03:17.190] else { [18:03:17.190] if (TRUE) { [18:03:17.190] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.190] open = "w") [18:03:17.190] } [18:03:17.190] else { [18:03:17.190] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.190] windows = "NUL", "/dev/null"), open = "w") [18:03:17.190] } [18:03:17.190] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.190] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.190] base::sink(type = "output", split = FALSE) [18:03:17.190] base::close(...future.stdout) [18:03:17.190] }, add = TRUE) [18:03:17.190] } [18:03:17.190] ...future.frame <- base::sys.nframe() [18:03:17.190] ...future.conditions <- base::list() [18:03:17.190] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.190] if (FALSE) { [18:03:17.190] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.190] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.190] } [18:03:17.190] ...future.result <- base::tryCatch({ [18:03:17.190] base::withCallingHandlers({ [18:03:17.190] ...future.value <- base::withVisible(base::local({ [18:03:17.190] sample(x, size = 1L) [18:03:17.190] })) [18:03:17.190] future::FutureResult(value = ...future.value$value, [18:03:17.190] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.190] ...future.rng), globalenv = if (FALSE) [18:03:17.190] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.190] ...future.globalenv.names)) [18:03:17.190] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.190] }, condition = base::local({ [18:03:17.190] c <- base::c [18:03:17.190] inherits <- base::inherits [18:03:17.190] invokeRestart <- base::invokeRestart [18:03:17.190] length <- base::length [18:03:17.190] list <- base::list [18:03:17.190] seq.int <- base::seq.int [18:03:17.190] signalCondition <- base::signalCondition [18:03:17.190] sys.calls <- base::sys.calls [18:03:17.190] `[[` <- base::`[[` [18:03:17.190] `+` <- base::`+` [18:03:17.190] `<<-` <- base::`<<-` [18:03:17.190] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.190] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.190] 3L)] [18:03:17.190] } [18:03:17.190] function(cond) { [18:03:17.190] is_error <- inherits(cond, "error") [18:03:17.190] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.190] NULL) [18:03:17.190] if (is_error) { [18:03:17.190] sessionInformation <- function() { [18:03:17.190] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.190] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.190] search = base::search(), system = base::Sys.info()) [18:03:17.190] } [18:03:17.190] ...future.conditions[[length(...future.conditions) + [18:03:17.190] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.190] cond$call), session = sessionInformation(), [18:03:17.190] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.190] signalCondition(cond) [18:03:17.190] } [18:03:17.190] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.190] "immediateCondition"))) { [18:03:17.190] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.190] ...future.conditions[[length(...future.conditions) + [18:03:17.190] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.190] if (TRUE && !signal) { [18:03:17.190] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.190] { [18:03:17.190] inherits <- base::inherits [18:03:17.190] invokeRestart <- base::invokeRestart [18:03:17.190] is.null <- base::is.null [18:03:17.190] muffled <- FALSE [18:03:17.190] if (inherits(cond, "message")) { [18:03:17.190] muffled <- grepl(pattern, "muffleMessage") [18:03:17.190] if (muffled) [18:03:17.190] invokeRestart("muffleMessage") [18:03:17.190] } [18:03:17.190] else if (inherits(cond, "warning")) { [18:03:17.190] muffled <- grepl(pattern, "muffleWarning") [18:03:17.190] if (muffled) [18:03:17.190] invokeRestart("muffleWarning") [18:03:17.190] } [18:03:17.190] else if (inherits(cond, "condition")) { [18:03:17.190] if (!is.null(pattern)) { [18:03:17.190] computeRestarts <- base::computeRestarts [18:03:17.190] grepl <- base::grepl [18:03:17.190] restarts <- computeRestarts(cond) [18:03:17.190] for (restart in restarts) { [18:03:17.190] name <- restart$name [18:03:17.190] if (is.null(name)) [18:03:17.190] next [18:03:17.190] if (!grepl(pattern, name)) [18:03:17.190] next [18:03:17.190] invokeRestart(restart) [18:03:17.190] muffled <- TRUE [18:03:17.190] break [18:03:17.190] } [18:03:17.190] } [18:03:17.190] } [18:03:17.190] invisible(muffled) [18:03:17.190] } [18:03:17.190] muffleCondition(cond, pattern = "^muffle") [18:03:17.190] } [18:03:17.190] } [18:03:17.190] else { [18:03:17.190] if (TRUE) { [18:03:17.190] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.190] { [18:03:17.190] inherits <- base::inherits [18:03:17.190] invokeRestart <- base::invokeRestart [18:03:17.190] is.null <- base::is.null [18:03:17.190] muffled <- FALSE [18:03:17.190] if (inherits(cond, "message")) { [18:03:17.190] muffled <- grepl(pattern, "muffleMessage") [18:03:17.190] if (muffled) [18:03:17.190] invokeRestart("muffleMessage") [18:03:17.190] } [18:03:17.190] else if (inherits(cond, "warning")) { [18:03:17.190] muffled <- grepl(pattern, "muffleWarning") [18:03:17.190] if (muffled) [18:03:17.190] invokeRestart("muffleWarning") [18:03:17.190] } [18:03:17.190] else if (inherits(cond, "condition")) { [18:03:17.190] if (!is.null(pattern)) { [18:03:17.190] computeRestarts <- base::computeRestarts [18:03:17.190] grepl <- base::grepl [18:03:17.190] restarts <- computeRestarts(cond) [18:03:17.190] for (restart in restarts) { [18:03:17.190] name <- restart$name [18:03:17.190] if (is.null(name)) [18:03:17.190] next [18:03:17.190] if (!grepl(pattern, name)) [18:03:17.190] next [18:03:17.190] invokeRestart(restart) [18:03:17.190] muffled <- TRUE [18:03:17.190] break [18:03:17.190] } [18:03:17.190] } [18:03:17.190] } [18:03:17.190] invisible(muffled) [18:03:17.190] } [18:03:17.190] muffleCondition(cond, pattern = "^muffle") [18:03:17.190] } [18:03:17.190] } [18:03:17.190] } [18:03:17.190] })) [18:03:17.190] }, error = function(ex) { [18:03:17.190] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.190] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.190] ...future.rng), started = ...future.startTime, [18:03:17.190] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.190] version = "1.8"), class = "FutureResult") [18:03:17.190] }, finally = { [18:03:17.190] if (!identical(...future.workdir, getwd())) [18:03:17.190] setwd(...future.workdir) [18:03:17.190] { [18:03:17.190] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.190] ...future.oldOptions$nwarnings <- NULL [18:03:17.190] } [18:03:17.190] base::options(...future.oldOptions) [18:03:17.190] if (.Platform$OS.type == "windows") { [18:03:17.190] old_names <- names(...future.oldEnvVars) [18:03:17.190] envs <- base::Sys.getenv() [18:03:17.190] names <- names(envs) [18:03:17.190] common <- intersect(names, old_names) [18:03:17.190] added <- setdiff(names, old_names) [18:03:17.190] removed <- setdiff(old_names, names) [18:03:17.190] changed <- common[...future.oldEnvVars[common] != [18:03:17.190] envs[common]] [18:03:17.190] NAMES <- toupper(changed) [18:03:17.190] args <- list() [18:03:17.190] for (kk in seq_along(NAMES)) { [18:03:17.190] name <- changed[[kk]] [18:03:17.190] NAME <- NAMES[[kk]] [18:03:17.190] if (name != NAME && is.element(NAME, old_names)) [18:03:17.190] next [18:03:17.190] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.190] } [18:03:17.190] NAMES <- toupper(added) [18:03:17.190] for (kk in seq_along(NAMES)) { [18:03:17.190] name <- added[[kk]] [18:03:17.190] NAME <- NAMES[[kk]] [18:03:17.190] if (name != NAME && is.element(NAME, old_names)) [18:03:17.190] next [18:03:17.190] args[[name]] <- "" [18:03:17.190] } [18:03:17.190] NAMES <- toupper(removed) [18:03:17.190] for (kk in seq_along(NAMES)) { [18:03:17.190] name <- removed[[kk]] [18:03:17.190] NAME <- NAMES[[kk]] [18:03:17.190] if (name != NAME && is.element(NAME, old_names)) [18:03:17.190] next [18:03:17.190] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.190] } [18:03:17.190] if (length(args) > 0) [18:03:17.190] base::do.call(base::Sys.setenv, args = args) [18:03:17.190] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.190] } [18:03:17.190] else { [18:03:17.190] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.190] } [18:03:17.190] { [18:03:17.190] if (base::length(...future.futureOptionsAdded) > [18:03:17.190] 0L) { [18:03:17.190] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.190] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.190] base::options(opts) [18:03:17.190] } [18:03:17.190] { [18:03:17.190] { [18:03:17.190] base::assign(".Random.seed", c(10407L, 1414277416L, [18:03:17.190] 1948718110L, -2082974517L, 1867954751L, -648911549L, [18:03:17.190] 1923131391L), envir = base::globalenv(), [18:03:17.190] inherits = FALSE) [18:03:17.190] NULL [18:03:17.190] } [18:03:17.190] options(future.plan = NULL) [18:03:17.190] if (is.na(NA_character_)) [18:03:17.190] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.190] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.190] future::plan(list(function (..., envir = parent.frame()) [18:03:17.190] { [18:03:17.190] future <- SequentialFuture(..., envir = envir) [18:03:17.190] if (!future$lazy) [18:03:17.190] future <- run(future) [18:03:17.190] invisible(future) [18:03:17.190] }), .cleanup = FALSE, .init = FALSE) [18:03:17.190] } [18:03:17.190] } [18:03:17.190] } [18:03:17.190] }) [18:03:17.190] if (TRUE) { [18:03:17.190] base::sink(type = "output", split = FALSE) [18:03:17.190] if (TRUE) { [18:03:17.190] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.190] } [18:03:17.190] else { [18:03:17.190] ...future.result["stdout"] <- base::list(NULL) [18:03:17.190] } [18:03:17.190] base::close(...future.stdout) [18:03:17.190] ...future.stdout <- NULL [18:03:17.190] } [18:03:17.190] ...future.result$conditions <- ...future.conditions [18:03:17.190] ...future.result$finished <- base::Sys.time() [18:03:17.190] ...future.result [18:03:17.190] } [18:03:17.194] assign_globals() ... [18:03:17.194] List of 1 [18:03:17.194] $ x: int [1:4] 0 1 2 3 [18:03:17.194] - attr(*, "where")=List of 1 [18:03:17.194] ..$ x: [18:03:17.194] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.194] - attr(*, "resolved")= logi FALSE [18:03:17.194] - attr(*, "total_size")= num 64 [18:03:17.194] - attr(*, "already-done")= logi TRUE [18:03:17.197] - copied 'x' to environment [18:03:17.197] assign_globals() ... done [18:03:17.198] plan(): Setting new future strategy stack: [18:03:17.198] List of future strategies: [18:03:17.198] 1. sequential: [18:03:17.198] - args: function (..., envir = parent.frame()) [18:03:17.198] - tweaked: FALSE [18:03:17.198] - call: NULL [18:03:17.198] plan(): nbrOfWorkers() = 1 [18:03:17.199] plan(): Setting new future strategy stack: [18:03:17.200] List of future strategies: [18:03:17.200] 1. sequential: [18:03:17.200] - args: function (..., envir = parent.frame()) [18:03:17.200] - tweaked: FALSE [18:03:17.200] - call: plan(strategy) [18:03:17.200] plan(): nbrOfWorkers() = 1 [18:03:17.200] SequentialFuture started (and completed) [18:03:17.201] - Launch lazy future ... done [18:03:17.201] run() for 'SequentialFuture' ... done [18:03:17.201] getGlobalsAndPackages() ... [18:03:17.201] Searching for globals... [18:03:17.203] - globals found: [3] '{', 'sample', 'x' [18:03:17.203] Searching for globals ... DONE [18:03:17.203] Resolving globals: FALSE [18:03:17.203] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.204] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.204] - globals: [1] 'x' [18:03:17.204] [18:03:17.204] getGlobalsAndPackages() ... DONE [18:03:17.205] run() for 'Future' ... [18:03:17.205] - state: 'created' [18:03:17.205] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.206] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.206] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.206] - Field: 'label' [18:03:17.206] - Field: 'local' [18:03:17.206] - Field: 'owner' [18:03:17.206] - Field: 'envir' [18:03:17.207] - Field: 'packages' [18:03:17.208] - Field: 'gc' [18:03:17.208] - Field: 'conditions' [18:03:17.208] - Field: 'expr' [18:03:17.208] - Field: 'uuid' [18:03:17.209] - Field: 'seed' [18:03:17.209] - Field: 'version' [18:03:17.209] - Field: 'result' [18:03:17.209] - Field: 'asynchronous' [18:03:17.209] - Field: 'calls' [18:03:17.210] - Field: 'globals' [18:03:17.210] - Field: 'stdout' [18:03:17.210] - Field: 'earlySignal' [18:03:17.210] - Field: 'lazy' [18:03:17.210] - Field: 'state' [18:03:17.210] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.211] - Launch lazy future ... [18:03:17.211] Packages needed by the future expression (n = 0): [18:03:17.211] Packages needed by future strategies (n = 0): [18:03:17.212] { [18:03:17.212] { [18:03:17.212] { [18:03:17.212] ...future.startTime <- base::Sys.time() [18:03:17.212] { [18:03:17.212] { [18:03:17.212] { [18:03:17.212] base::local({ [18:03:17.212] has_future <- base::requireNamespace("future", [18:03:17.212] quietly = TRUE) [18:03:17.212] if (has_future) { [18:03:17.212] ns <- base::getNamespace("future") [18:03:17.212] version <- ns[[".package"]][["version"]] [18:03:17.212] if (is.null(version)) [18:03:17.212] version <- utils::packageVersion("future") [18:03:17.212] } [18:03:17.212] else { [18:03:17.212] version <- NULL [18:03:17.212] } [18:03:17.212] if (!has_future || version < "1.8.0") { [18:03:17.212] info <- base::c(r_version = base::gsub("R version ", [18:03:17.212] "", base::R.version$version.string), [18:03:17.212] platform = base::sprintf("%s (%s-bit)", [18:03:17.212] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.212] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.212] "release", "version")], collapse = " "), [18:03:17.212] hostname = base::Sys.info()[["nodename"]]) [18:03:17.212] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.212] info) [18:03:17.212] info <- base::paste(info, collapse = "; ") [18:03:17.212] if (!has_future) { [18:03:17.212] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.212] info) [18:03:17.212] } [18:03:17.212] else { [18:03:17.212] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.212] info, version) [18:03:17.212] } [18:03:17.212] base::stop(msg) [18:03:17.212] } [18:03:17.212] }) [18:03:17.212] } [18:03:17.212] options(future.plan = NULL) [18:03:17.212] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.212] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.212] } [18:03:17.212] ...future.workdir <- getwd() [18:03:17.212] } [18:03:17.212] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.212] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.212] } [18:03:17.212] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.212] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.212] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.212] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.212] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.212] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.212] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.212] base::names(...future.oldOptions)) [18:03:17.212] } [18:03:17.212] if (FALSE) { [18:03:17.212] } [18:03:17.212] else { [18:03:17.212] if (TRUE) { [18:03:17.212] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.212] open = "w") [18:03:17.212] } [18:03:17.212] else { [18:03:17.212] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.212] windows = "NUL", "/dev/null"), open = "w") [18:03:17.212] } [18:03:17.212] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.212] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.212] base::sink(type = "output", split = FALSE) [18:03:17.212] base::close(...future.stdout) [18:03:17.212] }, add = TRUE) [18:03:17.212] } [18:03:17.212] ...future.frame <- base::sys.nframe() [18:03:17.212] ...future.conditions <- base::list() [18:03:17.212] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.212] if (FALSE) { [18:03:17.212] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.212] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.212] } [18:03:17.212] ...future.result <- base::tryCatch({ [18:03:17.212] base::withCallingHandlers({ [18:03:17.212] ...future.value <- base::withVisible(base::local({ [18:03:17.212] sample(x, size = 1L) [18:03:17.212] })) [18:03:17.212] future::FutureResult(value = ...future.value$value, [18:03:17.212] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.212] ...future.rng), globalenv = if (FALSE) [18:03:17.212] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.212] ...future.globalenv.names)) [18:03:17.212] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.212] }, condition = base::local({ [18:03:17.212] c <- base::c [18:03:17.212] inherits <- base::inherits [18:03:17.212] invokeRestart <- base::invokeRestart [18:03:17.212] length <- base::length [18:03:17.212] list <- base::list [18:03:17.212] seq.int <- base::seq.int [18:03:17.212] signalCondition <- base::signalCondition [18:03:17.212] sys.calls <- base::sys.calls [18:03:17.212] `[[` <- base::`[[` [18:03:17.212] `+` <- base::`+` [18:03:17.212] `<<-` <- base::`<<-` [18:03:17.212] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.212] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.212] 3L)] [18:03:17.212] } [18:03:17.212] function(cond) { [18:03:17.212] is_error <- inherits(cond, "error") [18:03:17.212] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.212] NULL) [18:03:17.212] if (is_error) { [18:03:17.212] sessionInformation <- function() { [18:03:17.212] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.212] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.212] search = base::search(), system = base::Sys.info()) [18:03:17.212] } [18:03:17.212] ...future.conditions[[length(...future.conditions) + [18:03:17.212] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.212] cond$call), session = sessionInformation(), [18:03:17.212] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.212] signalCondition(cond) [18:03:17.212] } [18:03:17.212] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.212] "immediateCondition"))) { [18:03:17.212] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.212] ...future.conditions[[length(...future.conditions) + [18:03:17.212] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.212] if (TRUE && !signal) { [18:03:17.212] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.212] { [18:03:17.212] inherits <- base::inherits [18:03:17.212] invokeRestart <- base::invokeRestart [18:03:17.212] is.null <- base::is.null [18:03:17.212] muffled <- FALSE [18:03:17.212] if (inherits(cond, "message")) { [18:03:17.212] muffled <- grepl(pattern, "muffleMessage") [18:03:17.212] if (muffled) [18:03:17.212] invokeRestart("muffleMessage") [18:03:17.212] } [18:03:17.212] else if (inherits(cond, "warning")) { [18:03:17.212] muffled <- grepl(pattern, "muffleWarning") [18:03:17.212] if (muffled) [18:03:17.212] invokeRestart("muffleWarning") [18:03:17.212] } [18:03:17.212] else if (inherits(cond, "condition")) { [18:03:17.212] if (!is.null(pattern)) { [18:03:17.212] computeRestarts <- base::computeRestarts [18:03:17.212] grepl <- base::grepl [18:03:17.212] restarts <- computeRestarts(cond) [18:03:17.212] for (restart in restarts) { [18:03:17.212] name <- restart$name [18:03:17.212] if (is.null(name)) [18:03:17.212] next [18:03:17.212] if (!grepl(pattern, name)) [18:03:17.212] next [18:03:17.212] invokeRestart(restart) [18:03:17.212] muffled <- TRUE [18:03:17.212] break [18:03:17.212] } [18:03:17.212] } [18:03:17.212] } [18:03:17.212] invisible(muffled) [18:03:17.212] } [18:03:17.212] muffleCondition(cond, pattern = "^muffle") [18:03:17.212] } [18:03:17.212] } [18:03:17.212] else { [18:03:17.212] if (TRUE) { [18:03:17.212] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.212] { [18:03:17.212] inherits <- base::inherits [18:03:17.212] invokeRestart <- base::invokeRestart [18:03:17.212] is.null <- base::is.null [18:03:17.212] muffled <- FALSE [18:03:17.212] if (inherits(cond, "message")) { [18:03:17.212] muffled <- grepl(pattern, "muffleMessage") [18:03:17.212] if (muffled) [18:03:17.212] invokeRestart("muffleMessage") [18:03:17.212] } [18:03:17.212] else if (inherits(cond, "warning")) { [18:03:17.212] muffled <- grepl(pattern, "muffleWarning") [18:03:17.212] if (muffled) [18:03:17.212] invokeRestart("muffleWarning") [18:03:17.212] } [18:03:17.212] else if (inherits(cond, "condition")) { [18:03:17.212] if (!is.null(pattern)) { [18:03:17.212] computeRestarts <- base::computeRestarts [18:03:17.212] grepl <- base::grepl [18:03:17.212] restarts <- computeRestarts(cond) [18:03:17.212] for (restart in restarts) { [18:03:17.212] name <- restart$name [18:03:17.212] if (is.null(name)) [18:03:17.212] next [18:03:17.212] if (!grepl(pattern, name)) [18:03:17.212] next [18:03:17.212] invokeRestart(restart) [18:03:17.212] muffled <- TRUE [18:03:17.212] break [18:03:17.212] } [18:03:17.212] } [18:03:17.212] } [18:03:17.212] invisible(muffled) [18:03:17.212] } [18:03:17.212] muffleCondition(cond, pattern = "^muffle") [18:03:17.212] } [18:03:17.212] } [18:03:17.212] } [18:03:17.212] })) [18:03:17.212] }, error = function(ex) { [18:03:17.212] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.212] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.212] ...future.rng), started = ...future.startTime, [18:03:17.212] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.212] version = "1.8"), class = "FutureResult") [18:03:17.212] }, finally = { [18:03:17.212] if (!identical(...future.workdir, getwd())) [18:03:17.212] setwd(...future.workdir) [18:03:17.212] { [18:03:17.212] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.212] ...future.oldOptions$nwarnings <- NULL [18:03:17.212] } [18:03:17.212] base::options(...future.oldOptions) [18:03:17.212] if (.Platform$OS.type == "windows") { [18:03:17.212] old_names <- names(...future.oldEnvVars) [18:03:17.212] envs <- base::Sys.getenv() [18:03:17.212] names <- names(envs) [18:03:17.212] common <- intersect(names, old_names) [18:03:17.212] added <- setdiff(names, old_names) [18:03:17.212] removed <- setdiff(old_names, names) [18:03:17.212] changed <- common[...future.oldEnvVars[common] != [18:03:17.212] envs[common]] [18:03:17.212] NAMES <- toupper(changed) [18:03:17.212] args <- list() [18:03:17.212] for (kk in seq_along(NAMES)) { [18:03:17.212] name <- changed[[kk]] [18:03:17.212] NAME <- NAMES[[kk]] [18:03:17.212] if (name != NAME && is.element(NAME, old_names)) [18:03:17.212] next [18:03:17.212] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.212] } [18:03:17.212] NAMES <- toupper(added) [18:03:17.212] for (kk in seq_along(NAMES)) { [18:03:17.212] name <- added[[kk]] [18:03:17.212] NAME <- NAMES[[kk]] [18:03:17.212] if (name != NAME && is.element(NAME, old_names)) [18:03:17.212] next [18:03:17.212] args[[name]] <- "" [18:03:17.212] } [18:03:17.212] NAMES <- toupper(removed) [18:03:17.212] for (kk in seq_along(NAMES)) { [18:03:17.212] name <- removed[[kk]] [18:03:17.212] NAME <- NAMES[[kk]] [18:03:17.212] if (name != NAME && is.element(NAME, old_names)) [18:03:17.212] next [18:03:17.212] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.212] } [18:03:17.212] if (length(args) > 0) [18:03:17.212] base::do.call(base::Sys.setenv, args = args) [18:03:17.212] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.212] } [18:03:17.212] else { [18:03:17.212] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.212] } [18:03:17.212] { [18:03:17.212] if (base::length(...future.futureOptionsAdded) > [18:03:17.212] 0L) { [18:03:17.212] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.212] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.212] base::options(opts) [18:03:17.212] } [18:03:17.212] { [18:03:17.212] { [18:03:17.212] base::assign(".Random.seed", c(10407L, -2082974517L, [18:03:17.212] -602488121L, -791131818L, 1923131391L, 428119060L, [18:03:17.212] -1991423341L), envir = base::globalenv(), [18:03:17.212] inherits = FALSE) [18:03:17.212] NULL [18:03:17.212] } [18:03:17.212] options(future.plan = NULL) [18:03:17.212] if (is.na(NA_character_)) [18:03:17.212] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.212] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.212] future::plan(list(function (..., envir = parent.frame()) [18:03:17.212] { [18:03:17.212] future <- SequentialFuture(..., envir = envir) [18:03:17.212] if (!future$lazy) [18:03:17.212] future <- run(future) [18:03:17.212] invisible(future) [18:03:17.212] }), .cleanup = FALSE, .init = FALSE) [18:03:17.212] } [18:03:17.212] } [18:03:17.212] } [18:03:17.212] }) [18:03:17.212] if (TRUE) { [18:03:17.212] base::sink(type = "output", split = FALSE) [18:03:17.212] if (TRUE) { [18:03:17.212] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.212] } [18:03:17.212] else { [18:03:17.212] ...future.result["stdout"] <- base::list(NULL) [18:03:17.212] } [18:03:17.212] base::close(...future.stdout) [18:03:17.212] ...future.stdout <- NULL [18:03:17.212] } [18:03:17.212] ...future.result$conditions <- ...future.conditions [18:03:17.212] ...future.result$finished <- base::Sys.time() [18:03:17.212] ...future.result [18:03:17.212] } [18:03:17.215] assign_globals() ... [18:03:17.215] List of 1 [18:03:17.215] $ x: int [1:4] 0 1 2 3 [18:03:17.215] - attr(*, "where")=List of 1 [18:03:17.215] ..$ x: [18:03:17.215] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.215] - attr(*, "resolved")= logi FALSE [18:03:17.215] - attr(*, "total_size")= num 64 [18:03:17.215] - attr(*, "already-done")= logi TRUE [18:03:17.218] - copied 'x' to environment [18:03:17.219] assign_globals() ... done [18:03:17.219] plan(): Setting new future strategy stack: [18:03:17.219] List of future strategies: [18:03:17.219] 1. sequential: [18:03:17.219] - args: function (..., envir = parent.frame()) [18:03:17.219] - tweaked: FALSE [18:03:17.219] - call: NULL [18:03:17.220] plan(): nbrOfWorkers() = 1 [18:03:17.221] plan(): Setting new future strategy stack: [18:03:17.221] List of future strategies: [18:03:17.221] 1. sequential: [18:03:17.221] - args: function (..., envir = parent.frame()) [18:03:17.221] - tweaked: FALSE [18:03:17.221] - call: plan(strategy) [18:03:17.221] plan(): nbrOfWorkers() = 1 [18:03:17.222] SequentialFuture started (and completed) [18:03:17.222] - Launch lazy future ... done [18:03:17.222] run() for 'SequentialFuture' ... done [18:03:17.223] getGlobalsAndPackages() ... [18:03:17.223] Searching for globals... [18:03:17.224] - globals found: [3] '{', 'sample', 'x' [18:03:17.224] Searching for globals ... DONE [18:03:17.224] Resolving globals: FALSE [18:03:17.225] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.225] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.225] - globals: [1] 'x' [18:03:17.225] [18:03:17.226] getGlobalsAndPackages() ... DONE [18:03:17.226] run() for 'Future' ... [18:03:17.226] - state: 'created' [18:03:17.226] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.227] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.227] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.227] - Field: 'label' [18:03:17.227] - Field: 'local' [18:03:17.227] - Field: 'owner' [18:03:17.228] - Field: 'envir' [18:03:17.228] - Field: 'packages' [18:03:17.228] - Field: 'gc' [18:03:17.228] - Field: 'conditions' [18:03:17.228] - Field: 'expr' [18:03:17.228] - Field: 'uuid' [18:03:17.229] - Field: 'seed' [18:03:17.229] - Field: 'version' [18:03:17.229] - Field: 'result' [18:03:17.229] - Field: 'asynchronous' [18:03:17.229] - Field: 'calls' [18:03:17.230] - Field: 'globals' [18:03:17.230] - Field: 'stdout' [18:03:17.230] - Field: 'earlySignal' [18:03:17.230] - Field: 'lazy' [18:03:17.230] - Field: 'state' [18:03:17.230] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.231] - Launch lazy future ... [18:03:17.231] Packages needed by the future expression (n = 0): [18:03:17.231] Packages needed by future strategies (n = 0): [18:03:17.231] { [18:03:17.231] { [18:03:17.231] { [18:03:17.231] ...future.startTime <- base::Sys.time() [18:03:17.231] { [18:03:17.231] { [18:03:17.231] { [18:03:17.231] base::local({ [18:03:17.231] has_future <- base::requireNamespace("future", [18:03:17.231] quietly = TRUE) [18:03:17.231] if (has_future) { [18:03:17.231] ns <- base::getNamespace("future") [18:03:17.231] version <- ns[[".package"]][["version"]] [18:03:17.231] if (is.null(version)) [18:03:17.231] version <- utils::packageVersion("future") [18:03:17.231] } [18:03:17.231] else { [18:03:17.231] version <- NULL [18:03:17.231] } [18:03:17.231] if (!has_future || version < "1.8.0") { [18:03:17.231] info <- base::c(r_version = base::gsub("R version ", [18:03:17.231] "", base::R.version$version.string), [18:03:17.231] platform = base::sprintf("%s (%s-bit)", [18:03:17.231] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.231] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.231] "release", "version")], collapse = " "), [18:03:17.231] hostname = base::Sys.info()[["nodename"]]) [18:03:17.231] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.231] info) [18:03:17.231] info <- base::paste(info, collapse = "; ") [18:03:17.231] if (!has_future) { [18:03:17.231] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.231] info) [18:03:17.231] } [18:03:17.231] else { [18:03:17.231] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.231] info, version) [18:03:17.231] } [18:03:17.231] base::stop(msg) [18:03:17.231] } [18:03:17.231] }) [18:03:17.231] } [18:03:17.231] options(future.plan = NULL) [18:03:17.231] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.231] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.231] } [18:03:17.231] ...future.workdir <- getwd() [18:03:17.231] } [18:03:17.231] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.231] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.231] } [18:03:17.231] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.231] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.231] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.231] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.231] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.231] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.231] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.231] base::names(...future.oldOptions)) [18:03:17.231] } [18:03:17.231] if (FALSE) { [18:03:17.231] } [18:03:17.231] else { [18:03:17.231] if (TRUE) { [18:03:17.231] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.231] open = "w") [18:03:17.231] } [18:03:17.231] else { [18:03:17.231] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.231] windows = "NUL", "/dev/null"), open = "w") [18:03:17.231] } [18:03:17.231] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.231] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.231] base::sink(type = "output", split = FALSE) [18:03:17.231] base::close(...future.stdout) [18:03:17.231] }, add = TRUE) [18:03:17.231] } [18:03:17.231] ...future.frame <- base::sys.nframe() [18:03:17.231] ...future.conditions <- base::list() [18:03:17.231] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.231] if (FALSE) { [18:03:17.231] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.231] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.231] } [18:03:17.231] ...future.result <- base::tryCatch({ [18:03:17.231] base::withCallingHandlers({ [18:03:17.231] ...future.value <- base::withVisible(base::local({ [18:03:17.231] sample(x, size = 1L) [18:03:17.231] })) [18:03:17.231] future::FutureResult(value = ...future.value$value, [18:03:17.231] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.231] ...future.rng), globalenv = if (FALSE) [18:03:17.231] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.231] ...future.globalenv.names)) [18:03:17.231] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.231] }, condition = base::local({ [18:03:17.231] c <- base::c [18:03:17.231] inherits <- base::inherits [18:03:17.231] invokeRestart <- base::invokeRestart [18:03:17.231] length <- base::length [18:03:17.231] list <- base::list [18:03:17.231] seq.int <- base::seq.int [18:03:17.231] signalCondition <- base::signalCondition [18:03:17.231] sys.calls <- base::sys.calls [18:03:17.231] `[[` <- base::`[[` [18:03:17.231] `+` <- base::`+` [18:03:17.231] `<<-` <- base::`<<-` [18:03:17.231] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.231] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.231] 3L)] [18:03:17.231] } [18:03:17.231] function(cond) { [18:03:17.231] is_error <- inherits(cond, "error") [18:03:17.231] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.231] NULL) [18:03:17.231] if (is_error) { [18:03:17.231] sessionInformation <- function() { [18:03:17.231] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.231] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.231] search = base::search(), system = base::Sys.info()) [18:03:17.231] } [18:03:17.231] ...future.conditions[[length(...future.conditions) + [18:03:17.231] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.231] cond$call), session = sessionInformation(), [18:03:17.231] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.231] signalCondition(cond) [18:03:17.231] } [18:03:17.231] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.231] "immediateCondition"))) { [18:03:17.231] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.231] ...future.conditions[[length(...future.conditions) + [18:03:17.231] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.231] if (TRUE && !signal) { [18:03:17.231] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.231] { [18:03:17.231] inherits <- base::inherits [18:03:17.231] invokeRestart <- base::invokeRestart [18:03:17.231] is.null <- base::is.null [18:03:17.231] muffled <- FALSE [18:03:17.231] if (inherits(cond, "message")) { [18:03:17.231] muffled <- grepl(pattern, "muffleMessage") [18:03:17.231] if (muffled) [18:03:17.231] invokeRestart("muffleMessage") [18:03:17.231] } [18:03:17.231] else if (inherits(cond, "warning")) { [18:03:17.231] muffled <- grepl(pattern, "muffleWarning") [18:03:17.231] if (muffled) [18:03:17.231] invokeRestart("muffleWarning") [18:03:17.231] } [18:03:17.231] else if (inherits(cond, "condition")) { [18:03:17.231] if (!is.null(pattern)) { [18:03:17.231] computeRestarts <- base::computeRestarts [18:03:17.231] grepl <- base::grepl [18:03:17.231] restarts <- computeRestarts(cond) [18:03:17.231] for (restart in restarts) { [18:03:17.231] name <- restart$name [18:03:17.231] if (is.null(name)) [18:03:17.231] next [18:03:17.231] if (!grepl(pattern, name)) [18:03:17.231] next [18:03:17.231] invokeRestart(restart) [18:03:17.231] muffled <- TRUE [18:03:17.231] break [18:03:17.231] } [18:03:17.231] } [18:03:17.231] } [18:03:17.231] invisible(muffled) [18:03:17.231] } [18:03:17.231] muffleCondition(cond, pattern = "^muffle") [18:03:17.231] } [18:03:17.231] } [18:03:17.231] else { [18:03:17.231] if (TRUE) { [18:03:17.231] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.231] { [18:03:17.231] inherits <- base::inherits [18:03:17.231] invokeRestart <- base::invokeRestart [18:03:17.231] is.null <- base::is.null [18:03:17.231] muffled <- FALSE [18:03:17.231] if (inherits(cond, "message")) { [18:03:17.231] muffled <- grepl(pattern, "muffleMessage") [18:03:17.231] if (muffled) [18:03:17.231] invokeRestart("muffleMessage") [18:03:17.231] } [18:03:17.231] else if (inherits(cond, "warning")) { [18:03:17.231] muffled <- grepl(pattern, "muffleWarning") [18:03:17.231] if (muffled) [18:03:17.231] invokeRestart("muffleWarning") [18:03:17.231] } [18:03:17.231] else if (inherits(cond, "condition")) { [18:03:17.231] if (!is.null(pattern)) { [18:03:17.231] computeRestarts <- base::computeRestarts [18:03:17.231] grepl <- base::grepl [18:03:17.231] restarts <- computeRestarts(cond) [18:03:17.231] for (restart in restarts) { [18:03:17.231] name <- restart$name [18:03:17.231] if (is.null(name)) [18:03:17.231] next [18:03:17.231] if (!grepl(pattern, name)) [18:03:17.231] next [18:03:17.231] invokeRestart(restart) [18:03:17.231] muffled <- TRUE [18:03:17.231] break [18:03:17.231] } [18:03:17.231] } [18:03:17.231] } [18:03:17.231] invisible(muffled) [18:03:17.231] } [18:03:17.231] muffleCondition(cond, pattern = "^muffle") [18:03:17.231] } [18:03:17.231] } [18:03:17.231] } [18:03:17.231] })) [18:03:17.231] }, error = function(ex) { [18:03:17.231] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.231] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.231] ...future.rng), started = ...future.startTime, [18:03:17.231] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.231] version = "1.8"), class = "FutureResult") [18:03:17.231] }, finally = { [18:03:17.231] if (!identical(...future.workdir, getwd())) [18:03:17.231] setwd(...future.workdir) [18:03:17.231] { [18:03:17.231] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.231] ...future.oldOptions$nwarnings <- NULL [18:03:17.231] } [18:03:17.231] base::options(...future.oldOptions) [18:03:17.231] if (.Platform$OS.type == "windows") { [18:03:17.231] old_names <- names(...future.oldEnvVars) [18:03:17.231] envs <- base::Sys.getenv() [18:03:17.231] names <- names(envs) [18:03:17.231] common <- intersect(names, old_names) [18:03:17.231] added <- setdiff(names, old_names) [18:03:17.231] removed <- setdiff(old_names, names) [18:03:17.231] changed <- common[...future.oldEnvVars[common] != [18:03:17.231] envs[common]] [18:03:17.231] NAMES <- toupper(changed) [18:03:17.231] args <- list() [18:03:17.231] for (kk in seq_along(NAMES)) { [18:03:17.231] name <- changed[[kk]] [18:03:17.231] NAME <- NAMES[[kk]] [18:03:17.231] if (name != NAME && is.element(NAME, old_names)) [18:03:17.231] next [18:03:17.231] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.231] } [18:03:17.231] NAMES <- toupper(added) [18:03:17.231] for (kk in seq_along(NAMES)) { [18:03:17.231] name <- added[[kk]] [18:03:17.231] NAME <- NAMES[[kk]] [18:03:17.231] if (name != NAME && is.element(NAME, old_names)) [18:03:17.231] next [18:03:17.231] args[[name]] <- "" [18:03:17.231] } [18:03:17.231] NAMES <- toupper(removed) [18:03:17.231] for (kk in seq_along(NAMES)) { [18:03:17.231] name <- removed[[kk]] [18:03:17.231] NAME <- NAMES[[kk]] [18:03:17.231] if (name != NAME && is.element(NAME, old_names)) [18:03:17.231] next [18:03:17.231] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.231] } [18:03:17.231] if (length(args) > 0) [18:03:17.231] base::do.call(base::Sys.setenv, args = args) [18:03:17.231] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.231] } [18:03:17.231] else { [18:03:17.231] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.231] } [18:03:17.231] { [18:03:17.231] if (base::length(...future.futureOptionsAdded) > [18:03:17.231] 0L) { [18:03:17.231] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.231] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.231] base::options(opts) [18:03:17.231] } [18:03:17.231] { [18:03:17.231] { [18:03:17.231] base::assign(".Random.seed", c(10407L, -791131818L, [18:03:17.231] 751941512L, 89962360L, -1991423341L, 204037336L, [18:03:17.231] -200088696L), envir = base::globalenv(), [18:03:17.231] inherits = FALSE) [18:03:17.231] NULL [18:03:17.231] } [18:03:17.231] options(future.plan = NULL) [18:03:17.231] if (is.na(NA_character_)) [18:03:17.231] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.231] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.231] future::plan(list(function (..., envir = parent.frame()) [18:03:17.231] { [18:03:17.231] future <- SequentialFuture(..., envir = envir) [18:03:17.231] if (!future$lazy) [18:03:17.231] future <- run(future) [18:03:17.231] invisible(future) [18:03:17.231] }), .cleanup = FALSE, .init = FALSE) [18:03:17.231] } [18:03:17.231] } [18:03:17.231] } [18:03:17.231] }) [18:03:17.231] if (TRUE) { [18:03:17.231] base::sink(type = "output", split = FALSE) [18:03:17.231] if (TRUE) { [18:03:17.231] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.231] } [18:03:17.231] else { [18:03:17.231] ...future.result["stdout"] <- base::list(NULL) [18:03:17.231] } [18:03:17.231] base::close(...future.stdout) [18:03:17.231] ...future.stdout <- NULL [18:03:17.231] } [18:03:17.231] ...future.result$conditions <- ...future.conditions [18:03:17.231] ...future.result$finished <- base::Sys.time() [18:03:17.231] ...future.result [18:03:17.231] } [18:03:17.235] assign_globals() ... [18:03:17.235] List of 1 [18:03:17.235] $ x: int [1:4] 0 1 2 3 [18:03:17.235] - attr(*, "where")=List of 1 [18:03:17.235] ..$ x: [18:03:17.235] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.235] - attr(*, "resolved")= logi FALSE [18:03:17.235] - attr(*, "total_size")= num 64 [18:03:17.235] - attr(*, "already-done")= logi TRUE [18:03:17.238] - copied 'x' to environment [18:03:17.239] assign_globals() ... done [18:03:17.239] plan(): Setting new future strategy stack: [18:03:17.239] List of future strategies: [18:03:17.239] 1. sequential: [18:03:17.239] - args: function (..., envir = parent.frame()) [18:03:17.239] - tweaked: FALSE [18:03:17.239] - call: NULL [18:03:17.240] plan(): nbrOfWorkers() = 1 [18:03:17.241] plan(): Setting new future strategy stack: [18:03:17.241] List of future strategies: [18:03:17.241] 1. sequential: [18:03:17.241] - args: function (..., envir = parent.frame()) [18:03:17.241] - tweaked: FALSE [18:03:17.241] - call: plan(strategy) [18:03:17.241] plan(): nbrOfWorkers() = 1 [18:03:17.242] SequentialFuture started (and completed) [18:03:17.242] - Launch lazy future ... done [18:03:17.242] run() for 'SequentialFuture' ... done [18:03:17.242] getGlobalsAndPackages() ... [18:03:17.243] Searching for globals... [18:03:17.245] - globals found: [3] '{', 'sample', 'x' [18:03:17.245] Searching for globals ... DONE [18:03:17.245] Resolving globals: FALSE [18:03:17.246] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:17.246] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:17.246] - globals: [1] 'x' [18:03:17.247] [18:03:17.247] getGlobalsAndPackages() ... DONE [18:03:17.247] run() for 'Future' ... [18:03:17.247] - state: 'created' [18:03:17.247] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:03:17.248] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:03:17.248] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:03:17.248] - Field: 'label' [18:03:17.248] - Field: 'local' [18:03:17.249] - Field: 'owner' [18:03:17.249] - Field: 'envir' [18:03:17.249] - Field: 'packages' [18:03:17.249] - Field: 'gc' [18:03:17.249] - Field: 'conditions' [18:03:17.249] - Field: 'expr' [18:03:17.250] - Field: 'uuid' [18:03:17.250] - Field: 'seed' [18:03:17.250] - Field: 'version' [18:03:17.250] - Field: 'result' [18:03:17.250] - Field: 'asynchronous' [18:03:17.250] - Field: 'calls' [18:03:17.251] - Field: 'globals' [18:03:17.251] - Field: 'stdout' [18:03:17.251] - Field: 'earlySignal' [18:03:17.251] - Field: 'lazy' [18:03:17.251] - Field: 'state' [18:03:17.252] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:03:17.252] - Launch lazy future ... [18:03:17.252] Packages needed by the future expression (n = 0): [18:03:17.252] Packages needed by future strategies (n = 0): [18:03:17.253] { [18:03:17.253] { [18:03:17.253] { [18:03:17.253] ...future.startTime <- base::Sys.time() [18:03:17.253] { [18:03:17.253] { [18:03:17.253] { [18:03:17.253] base::local({ [18:03:17.253] has_future <- base::requireNamespace("future", [18:03:17.253] quietly = TRUE) [18:03:17.253] if (has_future) { [18:03:17.253] ns <- base::getNamespace("future") [18:03:17.253] version <- ns[[".package"]][["version"]] [18:03:17.253] if (is.null(version)) [18:03:17.253] version <- utils::packageVersion("future") [18:03:17.253] } [18:03:17.253] else { [18:03:17.253] version <- NULL [18:03:17.253] } [18:03:17.253] if (!has_future || version < "1.8.0") { [18:03:17.253] info <- base::c(r_version = base::gsub("R version ", [18:03:17.253] "", base::R.version$version.string), [18:03:17.253] platform = base::sprintf("%s (%s-bit)", [18:03:17.253] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.253] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.253] "release", "version")], collapse = " "), [18:03:17.253] hostname = base::Sys.info()[["nodename"]]) [18:03:17.253] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.253] info) [18:03:17.253] info <- base::paste(info, collapse = "; ") [18:03:17.253] if (!has_future) { [18:03:17.253] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.253] info) [18:03:17.253] } [18:03:17.253] else { [18:03:17.253] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.253] info, version) [18:03:17.253] } [18:03:17.253] base::stop(msg) [18:03:17.253] } [18:03:17.253] }) [18:03:17.253] } [18:03:17.253] options(future.plan = NULL) [18:03:17.253] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.253] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.253] } [18:03:17.253] ...future.workdir <- getwd() [18:03:17.253] } [18:03:17.253] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.253] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.253] } [18:03:17.253] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.253] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.253] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.253] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.253] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:17.253] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.253] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.253] base::names(...future.oldOptions)) [18:03:17.253] } [18:03:17.253] if (FALSE) { [18:03:17.253] } [18:03:17.253] else { [18:03:17.253] if (TRUE) { [18:03:17.253] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.253] open = "w") [18:03:17.253] } [18:03:17.253] else { [18:03:17.253] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.253] windows = "NUL", "/dev/null"), open = "w") [18:03:17.253] } [18:03:17.253] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.253] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.253] base::sink(type = "output", split = FALSE) [18:03:17.253] base::close(...future.stdout) [18:03:17.253] }, add = TRUE) [18:03:17.253] } [18:03:17.253] ...future.frame <- base::sys.nframe() [18:03:17.253] ...future.conditions <- base::list() [18:03:17.253] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.253] if (FALSE) { [18:03:17.253] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.253] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.253] } [18:03:17.253] ...future.result <- base::tryCatch({ [18:03:17.253] base::withCallingHandlers({ [18:03:17.253] ...future.value <- base::withVisible(base::local({ [18:03:17.253] sample(x, size = 1L) [18:03:17.253] })) [18:03:17.253] future::FutureResult(value = ...future.value$value, [18:03:17.253] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.253] ...future.rng), globalenv = if (FALSE) [18:03:17.253] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.253] ...future.globalenv.names)) [18:03:17.253] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.253] }, condition = base::local({ [18:03:17.253] c <- base::c [18:03:17.253] inherits <- base::inherits [18:03:17.253] invokeRestart <- base::invokeRestart [18:03:17.253] length <- base::length [18:03:17.253] list <- base::list [18:03:17.253] seq.int <- base::seq.int [18:03:17.253] signalCondition <- base::signalCondition [18:03:17.253] sys.calls <- base::sys.calls [18:03:17.253] `[[` <- base::`[[` [18:03:17.253] `+` <- base::`+` [18:03:17.253] `<<-` <- base::`<<-` [18:03:17.253] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.253] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.253] 3L)] [18:03:17.253] } [18:03:17.253] function(cond) { [18:03:17.253] is_error <- inherits(cond, "error") [18:03:17.253] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.253] NULL) [18:03:17.253] if (is_error) { [18:03:17.253] sessionInformation <- function() { [18:03:17.253] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.253] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.253] search = base::search(), system = base::Sys.info()) [18:03:17.253] } [18:03:17.253] ...future.conditions[[length(...future.conditions) + [18:03:17.253] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.253] cond$call), session = sessionInformation(), [18:03:17.253] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.253] signalCondition(cond) [18:03:17.253] } [18:03:17.253] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.253] "immediateCondition"))) { [18:03:17.253] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.253] ...future.conditions[[length(...future.conditions) + [18:03:17.253] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.253] if (TRUE && !signal) { [18:03:17.253] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.253] { [18:03:17.253] inherits <- base::inherits [18:03:17.253] invokeRestart <- base::invokeRestart [18:03:17.253] is.null <- base::is.null [18:03:17.253] muffled <- FALSE [18:03:17.253] if (inherits(cond, "message")) { [18:03:17.253] muffled <- grepl(pattern, "muffleMessage") [18:03:17.253] if (muffled) [18:03:17.253] invokeRestart("muffleMessage") [18:03:17.253] } [18:03:17.253] else if (inherits(cond, "warning")) { [18:03:17.253] muffled <- grepl(pattern, "muffleWarning") [18:03:17.253] if (muffled) [18:03:17.253] invokeRestart("muffleWarning") [18:03:17.253] } [18:03:17.253] else if (inherits(cond, "condition")) { [18:03:17.253] if (!is.null(pattern)) { [18:03:17.253] computeRestarts <- base::computeRestarts [18:03:17.253] grepl <- base::grepl [18:03:17.253] restarts <- computeRestarts(cond) [18:03:17.253] for (restart in restarts) { [18:03:17.253] name <- restart$name [18:03:17.253] if (is.null(name)) [18:03:17.253] next [18:03:17.253] if (!grepl(pattern, name)) [18:03:17.253] next [18:03:17.253] invokeRestart(restart) [18:03:17.253] muffled <- TRUE [18:03:17.253] break [18:03:17.253] } [18:03:17.253] } [18:03:17.253] } [18:03:17.253] invisible(muffled) [18:03:17.253] } [18:03:17.253] muffleCondition(cond, pattern = "^muffle") [18:03:17.253] } [18:03:17.253] } [18:03:17.253] else { [18:03:17.253] if (TRUE) { [18:03:17.253] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.253] { [18:03:17.253] inherits <- base::inherits [18:03:17.253] invokeRestart <- base::invokeRestart [18:03:17.253] is.null <- base::is.null [18:03:17.253] muffled <- FALSE [18:03:17.253] if (inherits(cond, "message")) { [18:03:17.253] muffled <- grepl(pattern, "muffleMessage") [18:03:17.253] if (muffled) [18:03:17.253] invokeRestart("muffleMessage") [18:03:17.253] } [18:03:17.253] else if (inherits(cond, "warning")) { [18:03:17.253] muffled <- grepl(pattern, "muffleWarning") [18:03:17.253] if (muffled) [18:03:17.253] invokeRestart("muffleWarning") [18:03:17.253] } [18:03:17.253] else if (inherits(cond, "condition")) { [18:03:17.253] if (!is.null(pattern)) { [18:03:17.253] computeRestarts <- base::computeRestarts [18:03:17.253] grepl <- base::grepl [18:03:17.253] restarts <- computeRestarts(cond) [18:03:17.253] for (restart in restarts) { [18:03:17.253] name <- restart$name [18:03:17.253] if (is.null(name)) [18:03:17.253] next [18:03:17.253] if (!grepl(pattern, name)) [18:03:17.253] next [18:03:17.253] invokeRestart(restart) [18:03:17.253] muffled <- TRUE [18:03:17.253] break [18:03:17.253] } [18:03:17.253] } [18:03:17.253] } [18:03:17.253] invisible(muffled) [18:03:17.253] } [18:03:17.253] muffleCondition(cond, pattern = "^muffle") [18:03:17.253] } [18:03:17.253] } [18:03:17.253] } [18:03:17.253] })) [18:03:17.253] }, error = function(ex) { [18:03:17.253] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.253] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.253] ...future.rng), started = ...future.startTime, [18:03:17.253] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.253] version = "1.8"), class = "FutureResult") [18:03:17.253] }, finally = { [18:03:17.253] if (!identical(...future.workdir, getwd())) [18:03:17.253] setwd(...future.workdir) [18:03:17.253] { [18:03:17.253] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.253] ...future.oldOptions$nwarnings <- NULL [18:03:17.253] } [18:03:17.253] base::options(...future.oldOptions) [18:03:17.253] if (.Platform$OS.type == "windows") { [18:03:17.253] old_names <- names(...future.oldEnvVars) [18:03:17.253] envs <- base::Sys.getenv() [18:03:17.253] names <- names(envs) [18:03:17.253] common <- intersect(names, old_names) [18:03:17.253] added <- setdiff(names, old_names) [18:03:17.253] removed <- setdiff(old_names, names) [18:03:17.253] changed <- common[...future.oldEnvVars[common] != [18:03:17.253] envs[common]] [18:03:17.253] NAMES <- toupper(changed) [18:03:17.253] args <- list() [18:03:17.253] for (kk in seq_along(NAMES)) { [18:03:17.253] name <- changed[[kk]] [18:03:17.253] NAME <- NAMES[[kk]] [18:03:17.253] if (name != NAME && is.element(NAME, old_names)) [18:03:17.253] next [18:03:17.253] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.253] } [18:03:17.253] NAMES <- toupper(added) [18:03:17.253] for (kk in seq_along(NAMES)) { [18:03:17.253] name <- added[[kk]] [18:03:17.253] NAME <- NAMES[[kk]] [18:03:17.253] if (name != NAME && is.element(NAME, old_names)) [18:03:17.253] next [18:03:17.253] args[[name]] <- "" [18:03:17.253] } [18:03:17.253] NAMES <- toupper(removed) [18:03:17.253] for (kk in seq_along(NAMES)) { [18:03:17.253] name <- removed[[kk]] [18:03:17.253] NAME <- NAMES[[kk]] [18:03:17.253] if (name != NAME && is.element(NAME, old_names)) [18:03:17.253] next [18:03:17.253] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.253] } [18:03:17.253] if (length(args) > 0) [18:03:17.253] base::do.call(base::Sys.setenv, args = args) [18:03:17.253] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.253] } [18:03:17.253] else { [18:03:17.253] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.253] } [18:03:17.253] { [18:03:17.253] if (base::length(...future.futureOptionsAdded) > [18:03:17.253] 0L) { [18:03:17.253] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.253] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.253] base::options(opts) [18:03:17.253] } [18:03:17.253] { [18:03:17.253] { [18:03:17.253] base::assign(".Random.seed", c(10407L, 89962360L, [18:03:17.253] -1442612813L, 632111957L, -200088696L, 1364328500L, [18:03:17.253] 199212469L), envir = base::globalenv(), inherits = FALSE) [18:03:17.253] NULL [18:03:17.253] } [18:03:17.253] options(future.plan = NULL) [18:03:17.253] if (is.na(NA_character_)) [18:03:17.253] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.253] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.253] future::plan(list(function (..., envir = parent.frame()) [18:03:17.253] { [18:03:17.253] future <- SequentialFuture(..., envir = envir) [18:03:17.253] if (!future$lazy) [18:03:17.253] future <- run(future) [18:03:17.253] invisible(future) [18:03:17.253] }), .cleanup = FALSE, .init = FALSE) [18:03:17.253] } [18:03:17.253] } [18:03:17.253] } [18:03:17.253] }) [18:03:17.253] if (TRUE) { [18:03:17.253] base::sink(type = "output", split = FALSE) [18:03:17.253] if (TRUE) { [18:03:17.253] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.253] } [18:03:17.253] else { [18:03:17.253] ...future.result["stdout"] <- base::list(NULL) [18:03:17.253] } [18:03:17.253] base::close(...future.stdout) [18:03:17.253] ...future.stdout <- NULL [18:03:17.253] } [18:03:17.253] ...future.result$conditions <- ...future.conditions [18:03:17.253] ...future.result$finished <- base::Sys.time() [18:03:17.253] ...future.result [18:03:17.253] } [18:03:17.257] assign_globals() ... [18:03:17.257] List of 1 [18:03:17.257] $ x: int [1:4] 0 1 2 3 [18:03:17.257] - attr(*, "where")=List of 1 [18:03:17.257] ..$ x: [18:03:17.257] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:03:17.257] - attr(*, "resolved")= logi FALSE [18:03:17.257] - attr(*, "total_size")= num 64 [18:03:17.257] - attr(*, "already-done")= logi TRUE [18:03:17.260] - copied 'x' to environment [18:03:17.260] assign_globals() ... done [18:03:17.260] plan(): Setting new future strategy stack: [18:03:17.260] List of future strategies: [18:03:17.260] 1. sequential: [18:03:17.260] - args: function (..., envir = parent.frame()) [18:03:17.260] - tweaked: FALSE [18:03:17.260] - call: NULL [18:03:17.261] plan(): nbrOfWorkers() = 1 [18:03:17.262] plan(): Setting new future strategy stack: [18:03:17.262] List of future strategies: [18:03:17.262] 1. sequential: [18:03:17.262] - args: function (..., envir = parent.frame()) [18:03:17.262] - tweaked: FALSE [18:03:17.262] - call: plan(strategy) [18:03:17.263] plan(): nbrOfWorkers() = 1 [18:03:17.263] SequentialFuture started (and completed) [18:03:17.263] - Launch lazy future ... done [18:03:17.263] run() for 'SequentialFuture' ... done [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 1 [[4]] [1] 0 sequential ... done Testing with 1 cores ... DONE Testing with 2 cores ... multisession ... [18:03:17.270] plan(): Setting new future strategy stack: [18:03:17.270] List of future strategies: [18:03:17.270] 1. multisession: [18:03:17.270] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:03:17.270] - tweaked: FALSE [18:03:17.270] - call: plan(strategy) [18:03:17.270] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:03:17.271] multisession: [18:03:17.271] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:03:17.271] - tweaked: FALSE [18:03:17.271] - call: plan(strategy) [18:03:17.277] getGlobalsAndPackages() ... [18:03:17.277] Not searching for globals [18:03:17.277] - globals: [0] [18:03:17.277] getGlobalsAndPackages() ... DONE [18:03:17.278] [local output] makeClusterPSOCK() ... [18:03:17.311] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:03:17.318] [local output] Base port: 29616 [18:03:17.318] [local output] Getting setup options for 2 cluster nodes ... [18:03:17.319] [local output] - Node 1 of 2 ... [18:03:17.319] [local output] localMachine=TRUE => revtunnel=FALSE [18:03:17.320] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpA3Mszf/worker.rank=1.parallelly.parent=104804.199646128182.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpA3Mszf/worker.rank=1.parallelly.parent=104804.199646128182.pid\")"' [18:03:17.768] - Possible to infer worker's PID: TRUE [18:03:17.768] [local output] Rscript port: 29616 [18:03:17.769] [local output] - Node 2 of 2 ... [18:03:17.769] [local output] localMachine=TRUE => revtunnel=FALSE [18:03:17.771] [local output] Rscript port: 29616 [18:03:17.771] [local output] Getting setup options for 2 cluster nodes ... done [18:03:17.772] [local output] - Parallel setup requested for some PSOCK nodes [18:03:17.772] [local output] Setting up PSOCK nodes in parallel [18:03:17.773] List of 36 [18:03:17.773] $ worker : chr "localhost" [18:03:17.773] ..- attr(*, "localhost")= logi TRUE [18:03:17.773] $ master : chr "localhost" [18:03:17.773] $ port : int 29616 [18:03:17.773] $ connectTimeout : num 120 [18:03:17.773] $ timeout : num 120 [18:03:17.773] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:03:17.773] $ homogeneous : logi TRUE [18:03:17.773] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=rng.R:104804:CRANWIN3:CRAN\" -e "| __truncated__ [18:03:17.773] $ rscript_envs : NULL [18:03:17.773] $ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:03:17.773] $ rscript_startup : NULL [18:03:17.773] $ rscript_sh : chr "cmd" [18:03:17.773] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:03:17.773] $ methods : logi TRUE [18:03:17.773] $ socketOptions : chr "no-delay" [18:03:17.773] $ useXDR : logi FALSE [18:03:17.773] $ outfile : chr "/dev/null" [18:03:17.773] $ renice : int NA [18:03:17.773] $ rshcmd : NULL [18:03:17.773] $ user : chr(0) [18:03:17.773] $ revtunnel : logi FALSE [18:03:17.773] $ rshlogfile : NULL [18:03:17.773] $ rshopts : chr(0) [18:03:17.773] $ rank : int 1 [18:03:17.773] $ manual : logi FALSE [18:03:17.773] $ dryrun : logi FALSE [18:03:17.773] $ quiet : logi FALSE [18:03:17.773] $ setup_strategy : chr "parallel" [18:03:17.773] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:03:17.773] $ pidfile : chr "D:/temp/RtmpA3Mszf/worker.rank=1.parallelly.parent=104804.199646128182.pid" [18:03:17.773] $ rshcmd_label : NULL [18:03:17.773] $ rsh_call : NULL [18:03:17.773] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:03:17.773] $ localMachine : logi TRUE [18:03:17.773] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:03:17.773] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:03:17.773] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:03:17.773] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:03:17.773] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:03:17.773] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [18:03:17.773] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:03:17.773] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:03:17.773] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:03:17.773] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:03:17.773] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:03:17.773] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:03:17.773] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:03:17.773] $ arguments :List of 28 [18:03:17.773] ..$ worker : chr "localhost" [18:03:17.773] ..$ master : NULL [18:03:17.773] ..$ port : int 29616 [18:03:17.773] ..$ connectTimeout : num 120 [18:03:17.773] ..$ timeout : num 120 [18:03:17.773] ..$ rscript : NULL [18:03:17.773] ..$ homogeneous : NULL [18:03:17.773] ..$ rscript_args : NULL [18:03:17.773] ..$ rscript_envs : NULL [18:03:17.773] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:03:17.773] ..$ rscript_startup : NULL [18:03:17.773] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [18:03:17.773] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:03:17.773] ..$ methods : logi TRUE [18:03:17.773] ..$ socketOptions : chr "no-delay" [18:03:17.773] ..$ useXDR : logi FALSE [18:03:17.773] ..$ outfile : chr "/dev/null" [18:03:17.773] ..$ renice : int NA [18:03:17.773] ..$ rshcmd : NULL [18:03:17.773] ..$ user : NULL [18:03:17.773] ..$ revtunnel : logi NA [18:03:17.773] ..$ rshlogfile : NULL [18:03:17.773] ..$ rshopts : NULL [18:03:17.773] ..$ rank : int 1 [18:03:17.773] ..$ manual : logi FALSE [18:03:17.773] ..$ dryrun : logi FALSE [18:03:17.773] ..$ quiet : logi FALSE [18:03:17.773] ..$ setup_strategy : chr "parallel" [18:03:17.773] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:03:17.795] [local output] System call to launch all workers: [18:03:17.795] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=rng.R:104804:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpA3Mszf/worker.rank=1.parallelly.parent=104804.199646128182.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=29616 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:03:17.795] [local output] Starting PSOCK main server [18:03:17.804] [local output] Workers launched [18:03:17.804] [local output] Waiting for workers to connect back [18:03:17.805] - [local output] 0 workers out of 2 ready [18:03:17.978] - [local output] 0 workers out of 2 ready [18:03:17.979] - [local output] 1 workers out of 2 ready [18:03:17.979] - [local output] 2 workers out of 2 ready [18:03:17.980] [local output] Launching of workers completed [18:03:17.980] [local output] Collecting session information from workers [18:03:17.981] [local output] - Worker #1 of 2 [18:03:17.982] [local output] - Worker #2 of 2 [18:03:17.982] [local output] makeClusterPSOCK() ... done [18:03:17.995] Packages needed by the future expression (n = 0): [18:03:17.995] Packages needed by future strategies (n = 0): [18:03:17.996] { [18:03:17.996] { [18:03:17.996] { [18:03:17.996] ...future.startTime <- base::Sys.time() [18:03:17.996] { [18:03:17.996] { [18:03:17.996] { [18:03:17.996] { [18:03:17.996] base::local({ [18:03:17.996] has_future <- base::requireNamespace("future", [18:03:17.996] quietly = TRUE) [18:03:17.996] if (has_future) { [18:03:17.996] ns <- base::getNamespace("future") [18:03:17.996] version <- ns[[".package"]][["version"]] [18:03:17.996] if (is.null(version)) [18:03:17.996] version <- utils::packageVersion("future") [18:03:17.996] } [18:03:17.996] else { [18:03:17.996] version <- NULL [18:03:17.996] } [18:03:17.996] if (!has_future || version < "1.8.0") { [18:03:17.996] info <- base::c(r_version = base::gsub("R version ", [18:03:17.996] "", base::R.version$version.string), [18:03:17.996] platform = base::sprintf("%s (%s-bit)", [18:03:17.996] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:17.996] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:17.996] "release", "version")], collapse = " "), [18:03:17.996] hostname = base::Sys.info()[["nodename"]]) [18:03:17.996] info <- base::sprintf("%s: %s", base::names(info), [18:03:17.996] info) [18:03:17.996] info <- base::paste(info, collapse = "; ") [18:03:17.996] if (!has_future) { [18:03:17.996] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:17.996] info) [18:03:17.996] } [18:03:17.996] else { [18:03:17.996] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:17.996] info, version) [18:03:17.996] } [18:03:17.996] base::stop(msg) [18:03:17.996] } [18:03:17.996] }) [18:03:17.996] } [18:03:17.996] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:17.996] base::options(mc.cores = 1L) [18:03:17.996] } [18:03:17.996] options(future.plan = NULL) [18:03:17.996] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.996] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:17.996] } [18:03:17.996] ...future.workdir <- getwd() [18:03:17.996] } [18:03:17.996] ...future.oldOptions <- base::as.list(base::.Options) [18:03:17.996] ...future.oldEnvVars <- base::Sys.getenv() [18:03:17.996] } [18:03:17.996] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:17.996] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:17.996] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:17.996] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:17.996] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:17.996] future.stdout.windows.reencode = NULL, width = 80L) [18:03:17.996] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:17.996] base::names(...future.oldOptions)) [18:03:17.996] } [18:03:17.996] if (FALSE) { [18:03:17.996] } [18:03:17.996] else { [18:03:17.996] if (TRUE) { [18:03:17.996] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:17.996] open = "w") [18:03:17.996] } [18:03:17.996] else { [18:03:17.996] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:17.996] windows = "NUL", "/dev/null"), open = "w") [18:03:17.996] } [18:03:17.996] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:17.996] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:17.996] base::sink(type = "output", split = FALSE) [18:03:17.996] base::close(...future.stdout) [18:03:17.996] }, add = TRUE) [18:03:17.996] } [18:03:17.996] ...future.frame <- base::sys.nframe() [18:03:17.996] ...future.conditions <- base::list() [18:03:17.996] ...future.rng <- base::globalenv()$.Random.seed [18:03:17.996] if (FALSE) { [18:03:17.996] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:17.996] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:17.996] } [18:03:17.996] ...future.result <- base::tryCatch({ [18:03:17.996] base::withCallingHandlers({ [18:03:17.996] ...future.value <- base::withVisible(base::local({ [18:03:17.996] ...future.makeSendCondition <- local({ [18:03:17.996] sendCondition <- NULL [18:03:17.996] function(frame = 1L) { [18:03:17.996] if (is.function(sendCondition)) [18:03:17.996] return(sendCondition) [18:03:17.996] ns <- getNamespace("parallel") [18:03:17.996] if (exists("sendData", mode = "function", [18:03:17.996] envir = ns)) { [18:03:17.996] parallel_sendData <- get("sendData", mode = "function", [18:03:17.996] envir = ns) [18:03:17.996] envir <- sys.frame(frame) [18:03:17.996] master <- NULL [18:03:17.996] while (!identical(envir, .GlobalEnv) && [18:03:17.996] !identical(envir, emptyenv())) { [18:03:17.996] if (exists("master", mode = "list", envir = envir, [18:03:17.996] inherits = FALSE)) { [18:03:17.996] master <- get("master", mode = "list", [18:03:17.996] envir = envir, inherits = FALSE) [18:03:17.996] if (inherits(master, c("SOCKnode", [18:03:17.996] "SOCK0node"))) { [18:03:17.996] sendCondition <<- function(cond) { [18:03:17.996] data <- list(type = "VALUE", value = cond, [18:03:17.996] success = TRUE) [18:03:17.996] parallel_sendData(master, data) [18:03:17.996] } [18:03:17.996] return(sendCondition) [18:03:17.996] } [18:03:17.996] } [18:03:17.996] frame <- frame + 1L [18:03:17.996] envir <- sys.frame(frame) [18:03:17.996] } [18:03:17.996] } [18:03:17.996] sendCondition <<- function(cond) NULL [18:03:17.996] } [18:03:17.996] }) [18:03:17.996] withCallingHandlers({ [18:03:17.996] NA [18:03:17.996] }, immediateCondition = function(cond) { [18:03:17.996] sendCondition <- ...future.makeSendCondition() [18:03:17.996] sendCondition(cond) [18:03:17.996] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.996] { [18:03:17.996] inherits <- base::inherits [18:03:17.996] invokeRestart <- base::invokeRestart [18:03:17.996] is.null <- base::is.null [18:03:17.996] muffled <- FALSE [18:03:17.996] if (inherits(cond, "message")) { [18:03:17.996] muffled <- grepl(pattern, "muffleMessage") [18:03:17.996] if (muffled) [18:03:17.996] invokeRestart("muffleMessage") [18:03:17.996] } [18:03:17.996] else if (inherits(cond, "warning")) { [18:03:17.996] muffled <- grepl(pattern, "muffleWarning") [18:03:17.996] if (muffled) [18:03:17.996] invokeRestart("muffleWarning") [18:03:17.996] } [18:03:17.996] else if (inherits(cond, "condition")) { [18:03:17.996] if (!is.null(pattern)) { [18:03:17.996] computeRestarts <- base::computeRestarts [18:03:17.996] grepl <- base::grepl [18:03:17.996] restarts <- computeRestarts(cond) [18:03:17.996] for (restart in restarts) { [18:03:17.996] name <- restart$name [18:03:17.996] if (is.null(name)) [18:03:17.996] next [18:03:17.996] if (!grepl(pattern, name)) [18:03:17.996] next [18:03:17.996] invokeRestart(restart) [18:03:17.996] muffled <- TRUE [18:03:17.996] break [18:03:17.996] } [18:03:17.996] } [18:03:17.996] } [18:03:17.996] invisible(muffled) [18:03:17.996] } [18:03:17.996] muffleCondition(cond) [18:03:17.996] }) [18:03:17.996] })) [18:03:17.996] future::FutureResult(value = ...future.value$value, [18:03:17.996] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.996] ...future.rng), globalenv = if (FALSE) [18:03:17.996] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:17.996] ...future.globalenv.names)) [18:03:17.996] else NULL, started = ...future.startTime, version = "1.8") [18:03:17.996] }, condition = base::local({ [18:03:17.996] c <- base::c [18:03:17.996] inherits <- base::inherits [18:03:17.996] invokeRestart <- base::invokeRestart [18:03:17.996] length <- base::length [18:03:17.996] list <- base::list [18:03:17.996] seq.int <- base::seq.int [18:03:17.996] signalCondition <- base::signalCondition [18:03:17.996] sys.calls <- base::sys.calls [18:03:17.996] `[[` <- base::`[[` [18:03:17.996] `+` <- base::`+` [18:03:17.996] `<<-` <- base::`<<-` [18:03:17.996] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:17.996] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:17.996] 3L)] [18:03:17.996] } [18:03:17.996] function(cond) { [18:03:17.996] is_error <- inherits(cond, "error") [18:03:17.996] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:17.996] NULL) [18:03:17.996] if (is_error) { [18:03:17.996] sessionInformation <- function() { [18:03:17.996] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:17.996] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:17.996] search = base::search(), system = base::Sys.info()) [18:03:17.996] } [18:03:17.996] ...future.conditions[[length(...future.conditions) + [18:03:17.996] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:17.996] cond$call), session = sessionInformation(), [18:03:17.996] timestamp = base::Sys.time(), signaled = 0L) [18:03:17.996] signalCondition(cond) [18:03:17.996] } [18:03:17.996] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:17.996] "immediateCondition"))) { [18:03:17.996] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:17.996] ...future.conditions[[length(...future.conditions) + [18:03:17.996] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:17.996] if (TRUE && !signal) { [18:03:17.996] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.996] { [18:03:17.996] inherits <- base::inherits [18:03:17.996] invokeRestart <- base::invokeRestart [18:03:17.996] is.null <- base::is.null [18:03:17.996] muffled <- FALSE [18:03:17.996] if (inherits(cond, "message")) { [18:03:17.996] muffled <- grepl(pattern, "muffleMessage") [18:03:17.996] if (muffled) [18:03:17.996] invokeRestart("muffleMessage") [18:03:17.996] } [18:03:17.996] else if (inherits(cond, "warning")) { [18:03:17.996] muffled <- grepl(pattern, "muffleWarning") [18:03:17.996] if (muffled) [18:03:17.996] invokeRestart("muffleWarning") [18:03:17.996] } [18:03:17.996] else if (inherits(cond, "condition")) { [18:03:17.996] if (!is.null(pattern)) { [18:03:17.996] computeRestarts <- base::computeRestarts [18:03:17.996] grepl <- base::grepl [18:03:17.996] restarts <- computeRestarts(cond) [18:03:17.996] for (restart in restarts) { [18:03:17.996] name <- restart$name [18:03:17.996] if (is.null(name)) [18:03:17.996] next [18:03:17.996] if (!grepl(pattern, name)) [18:03:17.996] next [18:03:17.996] invokeRestart(restart) [18:03:17.996] muffled <- TRUE [18:03:17.996] break [18:03:17.996] } [18:03:17.996] } [18:03:17.996] } [18:03:17.996] invisible(muffled) [18:03:17.996] } [18:03:17.996] muffleCondition(cond, pattern = "^muffle") [18:03:17.996] } [18:03:17.996] } [18:03:17.996] else { [18:03:17.996] if (TRUE) { [18:03:17.996] muffleCondition <- function (cond, pattern = "^muffle") [18:03:17.996] { [18:03:17.996] inherits <- base::inherits [18:03:17.996] invokeRestart <- base::invokeRestart [18:03:17.996] is.null <- base::is.null [18:03:17.996] muffled <- FALSE [18:03:17.996] if (inherits(cond, "message")) { [18:03:17.996] muffled <- grepl(pattern, "muffleMessage") [18:03:17.996] if (muffled) [18:03:17.996] invokeRestart("muffleMessage") [18:03:17.996] } [18:03:17.996] else if (inherits(cond, "warning")) { [18:03:17.996] muffled <- grepl(pattern, "muffleWarning") [18:03:17.996] if (muffled) [18:03:17.996] invokeRestart("muffleWarning") [18:03:17.996] } [18:03:17.996] else if (inherits(cond, "condition")) { [18:03:17.996] if (!is.null(pattern)) { [18:03:17.996] computeRestarts <- base::computeRestarts [18:03:17.996] grepl <- base::grepl [18:03:17.996] restarts <- computeRestarts(cond) [18:03:17.996] for (restart in restarts) { [18:03:17.996] name <- restart$name [18:03:17.996] if (is.null(name)) [18:03:17.996] next [18:03:17.996] if (!grepl(pattern, name)) [18:03:17.996] next [18:03:17.996] invokeRestart(restart) [18:03:17.996] muffled <- TRUE [18:03:17.996] break [18:03:17.996] } [18:03:17.996] } [18:03:17.996] } [18:03:17.996] invisible(muffled) [18:03:17.996] } [18:03:17.996] muffleCondition(cond, pattern = "^muffle") [18:03:17.996] } [18:03:17.996] } [18:03:17.996] } [18:03:17.996] })) [18:03:17.996] }, error = function(ex) { [18:03:17.996] base::structure(base::list(value = NULL, visible = NULL, [18:03:17.996] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:17.996] ...future.rng), started = ...future.startTime, [18:03:17.996] finished = Sys.time(), session_uuid = NA_character_, [18:03:17.996] version = "1.8"), class = "FutureResult") [18:03:17.996] }, finally = { [18:03:17.996] if (!identical(...future.workdir, getwd())) [18:03:17.996] setwd(...future.workdir) [18:03:17.996] { [18:03:17.996] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:17.996] ...future.oldOptions$nwarnings <- NULL [18:03:17.996] } [18:03:17.996] base::options(...future.oldOptions) [18:03:17.996] if (.Platform$OS.type == "windows") { [18:03:17.996] old_names <- names(...future.oldEnvVars) [18:03:17.996] envs <- base::Sys.getenv() [18:03:17.996] names <- names(envs) [18:03:17.996] common <- intersect(names, old_names) [18:03:17.996] added <- setdiff(names, old_names) [18:03:17.996] removed <- setdiff(old_names, names) [18:03:17.996] changed <- common[...future.oldEnvVars[common] != [18:03:17.996] envs[common]] [18:03:17.996] NAMES <- toupper(changed) [18:03:17.996] args <- list() [18:03:17.996] for (kk in seq_along(NAMES)) { [18:03:17.996] name <- changed[[kk]] [18:03:17.996] NAME <- NAMES[[kk]] [18:03:17.996] if (name != NAME && is.element(NAME, old_names)) [18:03:17.996] next [18:03:17.996] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.996] } [18:03:17.996] NAMES <- toupper(added) [18:03:17.996] for (kk in seq_along(NAMES)) { [18:03:17.996] name <- added[[kk]] [18:03:17.996] NAME <- NAMES[[kk]] [18:03:17.996] if (name != NAME && is.element(NAME, old_names)) [18:03:17.996] next [18:03:17.996] args[[name]] <- "" [18:03:17.996] } [18:03:17.996] NAMES <- toupper(removed) [18:03:17.996] for (kk in seq_along(NAMES)) { [18:03:17.996] name <- removed[[kk]] [18:03:17.996] NAME <- NAMES[[kk]] [18:03:17.996] if (name != NAME && is.element(NAME, old_names)) [18:03:17.996] next [18:03:17.996] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:17.996] } [18:03:17.996] if (length(args) > 0) [18:03:17.996] base::do.call(base::Sys.setenv, args = args) [18:03:17.996] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:17.996] } [18:03:17.996] else { [18:03:17.996] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:17.996] } [18:03:17.996] { [18:03:17.996] if (base::length(...future.futureOptionsAdded) > [18:03:17.996] 0L) { [18:03:17.996] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:17.996] base::names(opts) <- ...future.futureOptionsAdded [18:03:17.996] base::options(opts) [18:03:17.996] } [18:03:17.996] { [18:03:17.996] { [18:03:17.996] base::options(mc.cores = ...future.mc.cores.old) [18:03:17.996] NULL [18:03:17.996] } [18:03:17.996] options(future.plan = NULL) [18:03:17.996] if (is.na(NA_character_)) [18:03:17.996] Sys.unsetenv("R_FUTURE_PLAN") [18:03:17.996] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:17.996] future::plan(list(function (..., workers = availableCores(), [18:03:17.996] lazy = FALSE, rscript_libs = .libPaths(), [18:03:17.996] envir = parent.frame()) [18:03:17.996] { [18:03:17.996] if (is.function(workers)) [18:03:17.996] workers <- workers() [18:03:17.996] workers <- structure(as.integer(workers), [18:03:17.996] class = class(workers)) [18:03:17.996] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:17.996] workers >= 1) [18:03:17.996] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:17.996] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:17.996] } [18:03:17.996] future <- MultisessionFuture(..., workers = workers, [18:03:17.996] lazy = lazy, rscript_libs = rscript_libs, [18:03:17.996] envir = envir) [18:03:17.996] if (!future$lazy) [18:03:17.996] future <- run(future) [18:03:17.996] invisible(future) [18:03:17.996] }), .cleanup = FALSE, .init = FALSE) [18:03:17.996] } [18:03:17.996] } [18:03:17.996] } [18:03:17.996] }) [18:03:17.996] if (TRUE) { [18:03:17.996] base::sink(type = "output", split = FALSE) [18:03:17.996] if (TRUE) { [18:03:17.996] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:17.996] } [18:03:17.996] else { [18:03:17.996] ...future.result["stdout"] <- base::list(NULL) [18:03:17.996] } [18:03:17.996] base::close(...future.stdout) [18:03:17.996] ...future.stdout <- NULL [18:03:17.996] } [18:03:17.996] ...future.result$conditions <- ...future.conditions [18:03:17.996] ...future.result$finished <- base::Sys.time() [18:03:17.996] ...future.result [18:03:17.996] } [18:03:18.081] MultisessionFuture started [18:03:18.081] result() for ClusterFuture ... [18:03:18.082] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.082] - Validating connection of MultisessionFuture [18:03:18.138] - received message: FutureResult [18:03:18.138] - Received FutureResult [18:03:18.141] - Erased future from FutureRegistry [18:03:18.142] result() for ClusterFuture ... [18:03:18.142] - result already collected: FutureResult [18:03:18.142] result() for ClusterFuture ... done [18:03:18.142] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.142] result() for ClusterFuture ... done [18:03:18.143] result() for ClusterFuture ... [18:03:18.143] - result already collected: FutureResult [18:03:18.143] result() for ClusterFuture ... done [18:03:18.143] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:03:18.146] plan(): nbrOfWorkers() = 2 [18:03:18.146] getGlobalsAndPackages() ... [18:03:18.146] Searching for globals... [18:03:18.148] - globals found: [3] '{', 'sample', 'x' [18:03:18.148] Searching for globals ... DONE [18:03:18.148] Resolving globals: FALSE [18:03:18.149] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.150] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.150] - globals: [1] 'x' [18:03:18.150] [18:03:18.150] getGlobalsAndPackages() ... DONE [18:03:18.151] run() for 'Future' ... [18:03:18.151] - state: 'created' [18:03:18.151] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.166] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.166] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.166] - Field: 'node' [18:03:18.166] - Field: 'label' [18:03:18.167] - Field: 'local' [18:03:18.167] - Field: 'owner' [18:03:18.167] - Field: 'envir' [18:03:18.167] - Field: 'workers' [18:03:18.167] - Field: 'packages' [18:03:18.168] - Field: 'gc' [18:03:18.168] - Field: 'conditions' [18:03:18.168] - Field: 'persistent' [18:03:18.168] - Field: 'expr' [18:03:18.168] - Field: 'uuid' [18:03:18.168] - Field: 'seed' [18:03:18.169] - Field: 'version' [18:03:18.169] - Field: 'result' [18:03:18.169] - Field: 'asynchronous' [18:03:18.169] - Field: 'calls' [18:03:18.169] - Field: 'globals' [18:03:18.170] - Field: 'stdout' [18:03:18.170] - Field: 'earlySignal' [18:03:18.170] - Field: 'lazy' [18:03:18.170] - Field: 'state' [18:03:18.170] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.171] - Launch lazy future ... [18:03:18.171] Packages needed by the future expression (n = 0): [18:03:18.171] Packages needed by future strategies (n = 0): [18:03:18.172] { [18:03:18.172] { [18:03:18.172] { [18:03:18.172] ...future.startTime <- base::Sys.time() [18:03:18.172] { [18:03:18.172] { [18:03:18.172] { [18:03:18.172] { [18:03:18.172] { [18:03:18.172] base::local({ [18:03:18.172] has_future <- base::requireNamespace("future", [18:03:18.172] quietly = TRUE) [18:03:18.172] if (has_future) { [18:03:18.172] ns <- base::getNamespace("future") [18:03:18.172] version <- ns[[".package"]][["version"]] [18:03:18.172] if (is.null(version)) [18:03:18.172] version <- utils::packageVersion("future") [18:03:18.172] } [18:03:18.172] else { [18:03:18.172] version <- NULL [18:03:18.172] } [18:03:18.172] if (!has_future || version < "1.8.0") { [18:03:18.172] info <- base::c(r_version = base::gsub("R version ", [18:03:18.172] "", base::R.version$version.string), [18:03:18.172] platform = base::sprintf("%s (%s-bit)", [18:03:18.172] base::R.version$platform, 8 * [18:03:18.172] base::.Machine$sizeof.pointer), [18:03:18.172] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.172] "release", "version")], collapse = " "), [18:03:18.172] hostname = base::Sys.info()[["nodename"]]) [18:03:18.172] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.172] info) [18:03:18.172] info <- base::paste(info, collapse = "; ") [18:03:18.172] if (!has_future) { [18:03:18.172] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.172] info) [18:03:18.172] } [18:03:18.172] else { [18:03:18.172] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.172] info, version) [18:03:18.172] } [18:03:18.172] base::stop(msg) [18:03:18.172] } [18:03:18.172] }) [18:03:18.172] } [18:03:18.172] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.172] base::options(mc.cores = 1L) [18:03:18.172] } [18:03:18.172] options(future.plan = NULL) [18:03:18.172] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.172] future::plan("default", .cleanup = FALSE, [18:03:18.172] .init = FALSE) [18:03:18.172] } [18:03:18.172] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:18.172] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:18.172] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:18.172] } [18:03:18.172] ...future.workdir <- getwd() [18:03:18.172] } [18:03:18.172] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.172] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.172] } [18:03:18.172] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.172] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.172] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.172] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.172] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.172] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.172] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.172] base::names(...future.oldOptions)) [18:03:18.172] } [18:03:18.172] if (FALSE) { [18:03:18.172] } [18:03:18.172] else { [18:03:18.172] if (TRUE) { [18:03:18.172] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.172] open = "w") [18:03:18.172] } [18:03:18.172] else { [18:03:18.172] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.172] windows = "NUL", "/dev/null"), open = "w") [18:03:18.172] } [18:03:18.172] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.172] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.172] base::sink(type = "output", split = FALSE) [18:03:18.172] base::close(...future.stdout) [18:03:18.172] }, add = TRUE) [18:03:18.172] } [18:03:18.172] ...future.frame <- base::sys.nframe() [18:03:18.172] ...future.conditions <- base::list() [18:03:18.172] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.172] if (FALSE) { [18:03:18.172] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.172] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.172] } [18:03:18.172] ...future.result <- base::tryCatch({ [18:03:18.172] base::withCallingHandlers({ [18:03:18.172] ...future.value <- base::withVisible(base::local({ [18:03:18.172] ...future.makeSendCondition <- local({ [18:03:18.172] sendCondition <- NULL [18:03:18.172] function(frame = 1L) { [18:03:18.172] if (is.function(sendCondition)) [18:03:18.172] return(sendCondition) [18:03:18.172] ns <- getNamespace("parallel") [18:03:18.172] if (exists("sendData", mode = "function", [18:03:18.172] envir = ns)) { [18:03:18.172] parallel_sendData <- get("sendData", mode = "function", [18:03:18.172] envir = ns) [18:03:18.172] envir <- sys.frame(frame) [18:03:18.172] master <- NULL [18:03:18.172] while (!identical(envir, .GlobalEnv) && [18:03:18.172] !identical(envir, emptyenv())) { [18:03:18.172] if (exists("master", mode = "list", envir = envir, [18:03:18.172] inherits = FALSE)) { [18:03:18.172] master <- get("master", mode = "list", [18:03:18.172] envir = envir, inherits = FALSE) [18:03:18.172] if (inherits(master, c("SOCKnode", [18:03:18.172] "SOCK0node"))) { [18:03:18.172] sendCondition <<- function(cond) { [18:03:18.172] data <- list(type = "VALUE", value = cond, [18:03:18.172] success = TRUE) [18:03:18.172] parallel_sendData(master, data) [18:03:18.172] } [18:03:18.172] return(sendCondition) [18:03:18.172] } [18:03:18.172] } [18:03:18.172] frame <- frame + 1L [18:03:18.172] envir <- sys.frame(frame) [18:03:18.172] } [18:03:18.172] } [18:03:18.172] sendCondition <<- function(cond) NULL [18:03:18.172] } [18:03:18.172] }) [18:03:18.172] withCallingHandlers({ [18:03:18.172] { [18:03:18.172] sample(x, size = 1L) [18:03:18.172] } [18:03:18.172] }, immediateCondition = function(cond) { [18:03:18.172] sendCondition <- ...future.makeSendCondition() [18:03:18.172] sendCondition(cond) [18:03:18.172] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.172] { [18:03:18.172] inherits <- base::inherits [18:03:18.172] invokeRestart <- base::invokeRestart [18:03:18.172] is.null <- base::is.null [18:03:18.172] muffled <- FALSE [18:03:18.172] if (inherits(cond, "message")) { [18:03:18.172] muffled <- grepl(pattern, "muffleMessage") [18:03:18.172] if (muffled) [18:03:18.172] invokeRestart("muffleMessage") [18:03:18.172] } [18:03:18.172] else if (inherits(cond, "warning")) { [18:03:18.172] muffled <- grepl(pattern, "muffleWarning") [18:03:18.172] if (muffled) [18:03:18.172] invokeRestart("muffleWarning") [18:03:18.172] } [18:03:18.172] else if (inherits(cond, "condition")) { [18:03:18.172] if (!is.null(pattern)) { [18:03:18.172] computeRestarts <- base::computeRestarts [18:03:18.172] grepl <- base::grepl [18:03:18.172] restarts <- computeRestarts(cond) [18:03:18.172] for (restart in restarts) { [18:03:18.172] name <- restart$name [18:03:18.172] if (is.null(name)) [18:03:18.172] next [18:03:18.172] if (!grepl(pattern, name)) [18:03:18.172] next [18:03:18.172] invokeRestart(restart) [18:03:18.172] muffled <- TRUE [18:03:18.172] break [18:03:18.172] } [18:03:18.172] } [18:03:18.172] } [18:03:18.172] invisible(muffled) [18:03:18.172] } [18:03:18.172] muffleCondition(cond) [18:03:18.172] }) [18:03:18.172] })) [18:03:18.172] future::FutureResult(value = ...future.value$value, [18:03:18.172] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.172] ...future.rng), globalenv = if (FALSE) [18:03:18.172] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.172] ...future.globalenv.names)) [18:03:18.172] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.172] }, condition = base::local({ [18:03:18.172] c <- base::c [18:03:18.172] inherits <- base::inherits [18:03:18.172] invokeRestart <- base::invokeRestart [18:03:18.172] length <- base::length [18:03:18.172] list <- base::list [18:03:18.172] seq.int <- base::seq.int [18:03:18.172] signalCondition <- base::signalCondition [18:03:18.172] sys.calls <- base::sys.calls [18:03:18.172] `[[` <- base::`[[` [18:03:18.172] `+` <- base::`+` [18:03:18.172] `<<-` <- base::`<<-` [18:03:18.172] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.172] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.172] 3L)] [18:03:18.172] } [18:03:18.172] function(cond) { [18:03:18.172] is_error <- inherits(cond, "error") [18:03:18.172] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.172] NULL) [18:03:18.172] if (is_error) { [18:03:18.172] sessionInformation <- function() { [18:03:18.172] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.172] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.172] search = base::search(), system = base::Sys.info()) [18:03:18.172] } [18:03:18.172] ...future.conditions[[length(...future.conditions) + [18:03:18.172] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.172] cond$call), session = sessionInformation(), [18:03:18.172] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.172] signalCondition(cond) [18:03:18.172] } [18:03:18.172] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.172] "immediateCondition"))) { [18:03:18.172] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.172] ...future.conditions[[length(...future.conditions) + [18:03:18.172] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.172] if (TRUE && !signal) { [18:03:18.172] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.172] { [18:03:18.172] inherits <- base::inherits [18:03:18.172] invokeRestart <- base::invokeRestart [18:03:18.172] is.null <- base::is.null [18:03:18.172] muffled <- FALSE [18:03:18.172] if (inherits(cond, "message")) { [18:03:18.172] muffled <- grepl(pattern, "muffleMessage") [18:03:18.172] if (muffled) [18:03:18.172] invokeRestart("muffleMessage") [18:03:18.172] } [18:03:18.172] else if (inherits(cond, "warning")) { [18:03:18.172] muffled <- grepl(pattern, "muffleWarning") [18:03:18.172] if (muffled) [18:03:18.172] invokeRestart("muffleWarning") [18:03:18.172] } [18:03:18.172] else if (inherits(cond, "condition")) { [18:03:18.172] if (!is.null(pattern)) { [18:03:18.172] computeRestarts <- base::computeRestarts [18:03:18.172] grepl <- base::grepl [18:03:18.172] restarts <- computeRestarts(cond) [18:03:18.172] for (restart in restarts) { [18:03:18.172] name <- restart$name [18:03:18.172] if (is.null(name)) [18:03:18.172] next [18:03:18.172] if (!grepl(pattern, name)) [18:03:18.172] next [18:03:18.172] invokeRestart(restart) [18:03:18.172] muffled <- TRUE [18:03:18.172] break [18:03:18.172] } [18:03:18.172] } [18:03:18.172] } [18:03:18.172] invisible(muffled) [18:03:18.172] } [18:03:18.172] muffleCondition(cond, pattern = "^muffle") [18:03:18.172] } [18:03:18.172] } [18:03:18.172] else { [18:03:18.172] if (TRUE) { [18:03:18.172] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.172] { [18:03:18.172] inherits <- base::inherits [18:03:18.172] invokeRestart <- base::invokeRestart [18:03:18.172] is.null <- base::is.null [18:03:18.172] muffled <- FALSE [18:03:18.172] if (inherits(cond, "message")) { [18:03:18.172] muffled <- grepl(pattern, "muffleMessage") [18:03:18.172] if (muffled) [18:03:18.172] invokeRestart("muffleMessage") [18:03:18.172] } [18:03:18.172] else if (inherits(cond, "warning")) { [18:03:18.172] muffled <- grepl(pattern, "muffleWarning") [18:03:18.172] if (muffled) [18:03:18.172] invokeRestart("muffleWarning") [18:03:18.172] } [18:03:18.172] else if (inherits(cond, "condition")) { [18:03:18.172] if (!is.null(pattern)) { [18:03:18.172] computeRestarts <- base::computeRestarts [18:03:18.172] grepl <- base::grepl [18:03:18.172] restarts <- computeRestarts(cond) [18:03:18.172] for (restart in restarts) { [18:03:18.172] name <- restart$name [18:03:18.172] if (is.null(name)) [18:03:18.172] next [18:03:18.172] if (!grepl(pattern, name)) [18:03:18.172] next [18:03:18.172] invokeRestart(restart) [18:03:18.172] muffled <- TRUE [18:03:18.172] break [18:03:18.172] } [18:03:18.172] } [18:03:18.172] } [18:03:18.172] invisible(muffled) [18:03:18.172] } [18:03:18.172] muffleCondition(cond, pattern = "^muffle") [18:03:18.172] } [18:03:18.172] } [18:03:18.172] } [18:03:18.172] })) [18:03:18.172] }, error = function(ex) { [18:03:18.172] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.172] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.172] ...future.rng), started = ...future.startTime, [18:03:18.172] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.172] version = "1.8"), class = "FutureResult") [18:03:18.172] }, finally = { [18:03:18.172] if (!identical(...future.workdir, getwd())) [18:03:18.172] setwd(...future.workdir) [18:03:18.172] { [18:03:18.172] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.172] ...future.oldOptions$nwarnings <- NULL [18:03:18.172] } [18:03:18.172] base::options(...future.oldOptions) [18:03:18.172] if (.Platform$OS.type == "windows") { [18:03:18.172] old_names <- names(...future.oldEnvVars) [18:03:18.172] envs <- base::Sys.getenv() [18:03:18.172] names <- names(envs) [18:03:18.172] common <- intersect(names, old_names) [18:03:18.172] added <- setdiff(names, old_names) [18:03:18.172] removed <- setdiff(old_names, names) [18:03:18.172] changed <- common[...future.oldEnvVars[common] != [18:03:18.172] envs[common]] [18:03:18.172] NAMES <- toupper(changed) [18:03:18.172] args <- list() [18:03:18.172] for (kk in seq_along(NAMES)) { [18:03:18.172] name <- changed[[kk]] [18:03:18.172] NAME <- NAMES[[kk]] [18:03:18.172] if (name != NAME && is.element(NAME, old_names)) [18:03:18.172] next [18:03:18.172] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.172] } [18:03:18.172] NAMES <- toupper(added) [18:03:18.172] for (kk in seq_along(NAMES)) { [18:03:18.172] name <- added[[kk]] [18:03:18.172] NAME <- NAMES[[kk]] [18:03:18.172] if (name != NAME && is.element(NAME, old_names)) [18:03:18.172] next [18:03:18.172] args[[name]] <- "" [18:03:18.172] } [18:03:18.172] NAMES <- toupper(removed) [18:03:18.172] for (kk in seq_along(NAMES)) { [18:03:18.172] name <- removed[[kk]] [18:03:18.172] NAME <- NAMES[[kk]] [18:03:18.172] if (name != NAME && is.element(NAME, old_names)) [18:03:18.172] next [18:03:18.172] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.172] } [18:03:18.172] if (length(args) > 0) [18:03:18.172] base::do.call(base::Sys.setenv, args = args) [18:03:18.172] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.172] } [18:03:18.172] else { [18:03:18.172] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.172] } [18:03:18.172] { [18:03:18.172] if (base::length(...future.futureOptionsAdded) > [18:03:18.172] 0L) { [18:03:18.172] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.172] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.172] base::options(opts) [18:03:18.172] } [18:03:18.172] { [18:03:18.172] { [18:03:18.172] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.172] NULL [18:03:18.172] } [18:03:18.172] options(future.plan = NULL) [18:03:18.172] if (is.na(NA_character_)) [18:03:18.172] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.172] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.172] future::plan(list(function (..., workers = availableCores(), [18:03:18.172] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.172] envir = parent.frame()) [18:03:18.172] { [18:03:18.172] if (is.function(workers)) [18:03:18.172] workers <- workers() [18:03:18.172] workers <- structure(as.integer(workers), [18:03:18.172] class = class(workers)) [18:03:18.172] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.172] workers >= 1) [18:03:18.172] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.172] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.172] } [18:03:18.172] future <- MultisessionFuture(..., workers = workers, [18:03:18.172] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.172] envir = envir) [18:03:18.172] if (!future$lazy) [18:03:18.172] future <- run(future) [18:03:18.172] invisible(future) [18:03:18.172] }), .cleanup = FALSE, .init = FALSE) [18:03:18.172] } [18:03:18.172] } [18:03:18.172] } [18:03:18.172] }) [18:03:18.172] if (TRUE) { [18:03:18.172] base::sink(type = "output", split = FALSE) [18:03:18.172] if (TRUE) { [18:03:18.172] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.172] } [18:03:18.172] else { [18:03:18.172] ...future.result["stdout"] <- base::list(NULL) [18:03:18.172] } [18:03:18.172] base::close(...future.stdout) [18:03:18.172] ...future.stdout <- NULL [18:03:18.172] } [18:03:18.172] ...future.result$conditions <- ...future.conditions [18:03:18.172] ...future.result$finished <- base::Sys.time() [18:03:18.172] ...future.result [18:03:18.172] } [18:03:18.178] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.178] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.178] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.178] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.179] MultisessionFuture started [18:03:18.180] - Launch lazy future ... done [18:03:18.180] run() for 'MultisessionFuture' ... done [18:03:18.180] getGlobalsAndPackages() ... [18:03:18.180] Searching for globals... [18:03:18.182] - globals found: [3] '{', 'sample', 'x' [18:03:18.182] Searching for globals ... DONE [18:03:18.182] Resolving globals: FALSE [18:03:18.183] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.183] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.183] - globals: [1] 'x' [18:03:18.184] [18:03:18.184] getGlobalsAndPackages() ... DONE [18:03:18.184] run() for 'Future' ... [18:03:18.184] - state: 'created' [18:03:18.185] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.199] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.199] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.200] - Field: 'node' [18:03:18.200] - Field: 'label' [18:03:18.200] - Field: 'local' [18:03:18.200] - Field: 'owner' [18:03:18.200] - Field: 'envir' [18:03:18.201] - Field: 'workers' [18:03:18.201] - Field: 'packages' [18:03:18.201] - Field: 'gc' [18:03:18.201] - Field: 'conditions' [18:03:18.201] - Field: 'persistent' [18:03:18.202] - Field: 'expr' [18:03:18.202] - Field: 'uuid' [18:03:18.202] - Field: 'seed' [18:03:18.202] - Field: 'version' [18:03:18.202] - Field: 'result' [18:03:18.203] - Field: 'asynchronous' [18:03:18.203] - Field: 'calls' [18:03:18.203] - Field: 'globals' [18:03:18.203] - Field: 'stdout' [18:03:18.203] - Field: 'earlySignal' [18:03:18.204] - Field: 'lazy' [18:03:18.204] - Field: 'state' [18:03:18.204] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.204] - Launch lazy future ... [18:03:18.205] Packages needed by the future expression (n = 0): [18:03:18.205] Packages needed by future strategies (n = 0): [18:03:18.206] { [18:03:18.206] { [18:03:18.206] { [18:03:18.206] ...future.startTime <- base::Sys.time() [18:03:18.206] { [18:03:18.206] { [18:03:18.206] { [18:03:18.206] { [18:03:18.206] { [18:03:18.206] base::local({ [18:03:18.206] has_future <- base::requireNamespace("future", [18:03:18.206] quietly = TRUE) [18:03:18.206] if (has_future) { [18:03:18.206] ns <- base::getNamespace("future") [18:03:18.206] version <- ns[[".package"]][["version"]] [18:03:18.206] if (is.null(version)) [18:03:18.206] version <- utils::packageVersion("future") [18:03:18.206] } [18:03:18.206] else { [18:03:18.206] version <- NULL [18:03:18.206] } [18:03:18.206] if (!has_future || version < "1.8.0") { [18:03:18.206] info <- base::c(r_version = base::gsub("R version ", [18:03:18.206] "", base::R.version$version.string), [18:03:18.206] platform = base::sprintf("%s (%s-bit)", [18:03:18.206] base::R.version$platform, 8 * [18:03:18.206] base::.Machine$sizeof.pointer), [18:03:18.206] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.206] "release", "version")], collapse = " "), [18:03:18.206] hostname = base::Sys.info()[["nodename"]]) [18:03:18.206] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.206] info) [18:03:18.206] info <- base::paste(info, collapse = "; ") [18:03:18.206] if (!has_future) { [18:03:18.206] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.206] info) [18:03:18.206] } [18:03:18.206] else { [18:03:18.206] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.206] info, version) [18:03:18.206] } [18:03:18.206] base::stop(msg) [18:03:18.206] } [18:03:18.206] }) [18:03:18.206] } [18:03:18.206] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.206] base::options(mc.cores = 1L) [18:03:18.206] } [18:03:18.206] options(future.plan = NULL) [18:03:18.206] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.206] future::plan("default", .cleanup = FALSE, [18:03:18.206] .init = FALSE) [18:03:18.206] } [18:03:18.206] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:18.206] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:18.206] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:18.206] } [18:03:18.206] ...future.workdir <- getwd() [18:03:18.206] } [18:03:18.206] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.206] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.206] } [18:03:18.206] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.206] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.206] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.206] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.206] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.206] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.206] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.206] base::names(...future.oldOptions)) [18:03:18.206] } [18:03:18.206] if (FALSE) { [18:03:18.206] } [18:03:18.206] else { [18:03:18.206] if (TRUE) { [18:03:18.206] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.206] open = "w") [18:03:18.206] } [18:03:18.206] else { [18:03:18.206] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.206] windows = "NUL", "/dev/null"), open = "w") [18:03:18.206] } [18:03:18.206] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.206] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.206] base::sink(type = "output", split = FALSE) [18:03:18.206] base::close(...future.stdout) [18:03:18.206] }, add = TRUE) [18:03:18.206] } [18:03:18.206] ...future.frame <- base::sys.nframe() [18:03:18.206] ...future.conditions <- base::list() [18:03:18.206] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.206] if (FALSE) { [18:03:18.206] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.206] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.206] } [18:03:18.206] ...future.result <- base::tryCatch({ [18:03:18.206] base::withCallingHandlers({ [18:03:18.206] ...future.value <- base::withVisible(base::local({ [18:03:18.206] ...future.makeSendCondition <- local({ [18:03:18.206] sendCondition <- NULL [18:03:18.206] function(frame = 1L) { [18:03:18.206] if (is.function(sendCondition)) [18:03:18.206] return(sendCondition) [18:03:18.206] ns <- getNamespace("parallel") [18:03:18.206] if (exists("sendData", mode = "function", [18:03:18.206] envir = ns)) { [18:03:18.206] parallel_sendData <- get("sendData", mode = "function", [18:03:18.206] envir = ns) [18:03:18.206] envir <- sys.frame(frame) [18:03:18.206] master <- NULL [18:03:18.206] while (!identical(envir, .GlobalEnv) && [18:03:18.206] !identical(envir, emptyenv())) { [18:03:18.206] if (exists("master", mode = "list", envir = envir, [18:03:18.206] inherits = FALSE)) { [18:03:18.206] master <- get("master", mode = "list", [18:03:18.206] envir = envir, inherits = FALSE) [18:03:18.206] if (inherits(master, c("SOCKnode", [18:03:18.206] "SOCK0node"))) { [18:03:18.206] sendCondition <<- function(cond) { [18:03:18.206] data <- list(type = "VALUE", value = cond, [18:03:18.206] success = TRUE) [18:03:18.206] parallel_sendData(master, data) [18:03:18.206] } [18:03:18.206] return(sendCondition) [18:03:18.206] } [18:03:18.206] } [18:03:18.206] frame <- frame + 1L [18:03:18.206] envir <- sys.frame(frame) [18:03:18.206] } [18:03:18.206] } [18:03:18.206] sendCondition <<- function(cond) NULL [18:03:18.206] } [18:03:18.206] }) [18:03:18.206] withCallingHandlers({ [18:03:18.206] { [18:03:18.206] sample(x, size = 1L) [18:03:18.206] } [18:03:18.206] }, immediateCondition = function(cond) { [18:03:18.206] sendCondition <- ...future.makeSendCondition() [18:03:18.206] sendCondition(cond) [18:03:18.206] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.206] { [18:03:18.206] inherits <- base::inherits [18:03:18.206] invokeRestart <- base::invokeRestart [18:03:18.206] is.null <- base::is.null [18:03:18.206] muffled <- FALSE [18:03:18.206] if (inherits(cond, "message")) { [18:03:18.206] muffled <- grepl(pattern, "muffleMessage") [18:03:18.206] if (muffled) [18:03:18.206] invokeRestart("muffleMessage") [18:03:18.206] } [18:03:18.206] else if (inherits(cond, "warning")) { [18:03:18.206] muffled <- grepl(pattern, "muffleWarning") [18:03:18.206] if (muffled) [18:03:18.206] invokeRestart("muffleWarning") [18:03:18.206] } [18:03:18.206] else if (inherits(cond, "condition")) { [18:03:18.206] if (!is.null(pattern)) { [18:03:18.206] computeRestarts <- base::computeRestarts [18:03:18.206] grepl <- base::grepl [18:03:18.206] restarts <- computeRestarts(cond) [18:03:18.206] for (restart in restarts) { [18:03:18.206] name <- restart$name [18:03:18.206] if (is.null(name)) [18:03:18.206] next [18:03:18.206] if (!grepl(pattern, name)) [18:03:18.206] next [18:03:18.206] invokeRestart(restart) [18:03:18.206] muffled <- TRUE [18:03:18.206] break [18:03:18.206] } [18:03:18.206] } [18:03:18.206] } [18:03:18.206] invisible(muffled) [18:03:18.206] } [18:03:18.206] muffleCondition(cond) [18:03:18.206] }) [18:03:18.206] })) [18:03:18.206] future::FutureResult(value = ...future.value$value, [18:03:18.206] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.206] ...future.rng), globalenv = if (FALSE) [18:03:18.206] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.206] ...future.globalenv.names)) [18:03:18.206] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.206] }, condition = base::local({ [18:03:18.206] c <- base::c [18:03:18.206] inherits <- base::inherits [18:03:18.206] invokeRestart <- base::invokeRestart [18:03:18.206] length <- base::length [18:03:18.206] list <- base::list [18:03:18.206] seq.int <- base::seq.int [18:03:18.206] signalCondition <- base::signalCondition [18:03:18.206] sys.calls <- base::sys.calls [18:03:18.206] `[[` <- base::`[[` [18:03:18.206] `+` <- base::`+` [18:03:18.206] `<<-` <- base::`<<-` [18:03:18.206] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.206] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.206] 3L)] [18:03:18.206] } [18:03:18.206] function(cond) { [18:03:18.206] is_error <- inherits(cond, "error") [18:03:18.206] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.206] NULL) [18:03:18.206] if (is_error) { [18:03:18.206] sessionInformation <- function() { [18:03:18.206] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.206] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.206] search = base::search(), system = base::Sys.info()) [18:03:18.206] } [18:03:18.206] ...future.conditions[[length(...future.conditions) + [18:03:18.206] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.206] cond$call), session = sessionInformation(), [18:03:18.206] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.206] signalCondition(cond) [18:03:18.206] } [18:03:18.206] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.206] "immediateCondition"))) { [18:03:18.206] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.206] ...future.conditions[[length(...future.conditions) + [18:03:18.206] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.206] if (TRUE && !signal) { [18:03:18.206] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.206] { [18:03:18.206] inherits <- base::inherits [18:03:18.206] invokeRestart <- base::invokeRestart [18:03:18.206] is.null <- base::is.null [18:03:18.206] muffled <- FALSE [18:03:18.206] if (inherits(cond, "message")) { [18:03:18.206] muffled <- grepl(pattern, "muffleMessage") [18:03:18.206] if (muffled) [18:03:18.206] invokeRestart("muffleMessage") [18:03:18.206] } [18:03:18.206] else if (inherits(cond, "warning")) { [18:03:18.206] muffled <- grepl(pattern, "muffleWarning") [18:03:18.206] if (muffled) [18:03:18.206] invokeRestart("muffleWarning") [18:03:18.206] } [18:03:18.206] else if (inherits(cond, "condition")) { [18:03:18.206] if (!is.null(pattern)) { [18:03:18.206] computeRestarts <- base::computeRestarts [18:03:18.206] grepl <- base::grepl [18:03:18.206] restarts <- computeRestarts(cond) [18:03:18.206] for (restart in restarts) { [18:03:18.206] name <- restart$name [18:03:18.206] if (is.null(name)) [18:03:18.206] next [18:03:18.206] if (!grepl(pattern, name)) [18:03:18.206] next [18:03:18.206] invokeRestart(restart) [18:03:18.206] muffled <- TRUE [18:03:18.206] break [18:03:18.206] } [18:03:18.206] } [18:03:18.206] } [18:03:18.206] invisible(muffled) [18:03:18.206] } [18:03:18.206] muffleCondition(cond, pattern = "^muffle") [18:03:18.206] } [18:03:18.206] } [18:03:18.206] else { [18:03:18.206] if (TRUE) { [18:03:18.206] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.206] { [18:03:18.206] inherits <- base::inherits [18:03:18.206] invokeRestart <- base::invokeRestart [18:03:18.206] is.null <- base::is.null [18:03:18.206] muffled <- FALSE [18:03:18.206] if (inherits(cond, "message")) { [18:03:18.206] muffled <- grepl(pattern, "muffleMessage") [18:03:18.206] if (muffled) [18:03:18.206] invokeRestart("muffleMessage") [18:03:18.206] } [18:03:18.206] else if (inherits(cond, "warning")) { [18:03:18.206] muffled <- grepl(pattern, "muffleWarning") [18:03:18.206] if (muffled) [18:03:18.206] invokeRestart("muffleWarning") [18:03:18.206] } [18:03:18.206] else if (inherits(cond, "condition")) { [18:03:18.206] if (!is.null(pattern)) { [18:03:18.206] computeRestarts <- base::computeRestarts [18:03:18.206] grepl <- base::grepl [18:03:18.206] restarts <- computeRestarts(cond) [18:03:18.206] for (restart in restarts) { [18:03:18.206] name <- restart$name [18:03:18.206] if (is.null(name)) [18:03:18.206] next [18:03:18.206] if (!grepl(pattern, name)) [18:03:18.206] next [18:03:18.206] invokeRestart(restart) [18:03:18.206] muffled <- TRUE [18:03:18.206] break [18:03:18.206] } [18:03:18.206] } [18:03:18.206] } [18:03:18.206] invisible(muffled) [18:03:18.206] } [18:03:18.206] muffleCondition(cond, pattern = "^muffle") [18:03:18.206] } [18:03:18.206] } [18:03:18.206] } [18:03:18.206] })) [18:03:18.206] }, error = function(ex) { [18:03:18.206] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.206] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.206] ...future.rng), started = ...future.startTime, [18:03:18.206] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.206] version = "1.8"), class = "FutureResult") [18:03:18.206] }, finally = { [18:03:18.206] if (!identical(...future.workdir, getwd())) [18:03:18.206] setwd(...future.workdir) [18:03:18.206] { [18:03:18.206] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.206] ...future.oldOptions$nwarnings <- NULL [18:03:18.206] } [18:03:18.206] base::options(...future.oldOptions) [18:03:18.206] if (.Platform$OS.type == "windows") { [18:03:18.206] old_names <- names(...future.oldEnvVars) [18:03:18.206] envs <- base::Sys.getenv() [18:03:18.206] names <- names(envs) [18:03:18.206] common <- intersect(names, old_names) [18:03:18.206] added <- setdiff(names, old_names) [18:03:18.206] removed <- setdiff(old_names, names) [18:03:18.206] changed <- common[...future.oldEnvVars[common] != [18:03:18.206] envs[common]] [18:03:18.206] NAMES <- toupper(changed) [18:03:18.206] args <- list() [18:03:18.206] for (kk in seq_along(NAMES)) { [18:03:18.206] name <- changed[[kk]] [18:03:18.206] NAME <- NAMES[[kk]] [18:03:18.206] if (name != NAME && is.element(NAME, old_names)) [18:03:18.206] next [18:03:18.206] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.206] } [18:03:18.206] NAMES <- toupper(added) [18:03:18.206] for (kk in seq_along(NAMES)) { [18:03:18.206] name <- added[[kk]] [18:03:18.206] NAME <- NAMES[[kk]] [18:03:18.206] if (name != NAME && is.element(NAME, old_names)) [18:03:18.206] next [18:03:18.206] args[[name]] <- "" [18:03:18.206] } [18:03:18.206] NAMES <- toupper(removed) [18:03:18.206] for (kk in seq_along(NAMES)) { [18:03:18.206] name <- removed[[kk]] [18:03:18.206] NAME <- NAMES[[kk]] [18:03:18.206] if (name != NAME && is.element(NAME, old_names)) [18:03:18.206] next [18:03:18.206] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.206] } [18:03:18.206] if (length(args) > 0) [18:03:18.206] base::do.call(base::Sys.setenv, args = args) [18:03:18.206] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.206] } [18:03:18.206] else { [18:03:18.206] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.206] } [18:03:18.206] { [18:03:18.206] if (base::length(...future.futureOptionsAdded) > [18:03:18.206] 0L) { [18:03:18.206] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.206] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.206] base::options(opts) [18:03:18.206] } [18:03:18.206] { [18:03:18.206] { [18:03:18.206] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.206] NULL [18:03:18.206] } [18:03:18.206] options(future.plan = NULL) [18:03:18.206] if (is.na(NA_character_)) [18:03:18.206] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.206] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.206] future::plan(list(function (..., workers = availableCores(), [18:03:18.206] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.206] envir = parent.frame()) [18:03:18.206] { [18:03:18.206] if (is.function(workers)) [18:03:18.206] workers <- workers() [18:03:18.206] workers <- structure(as.integer(workers), [18:03:18.206] class = class(workers)) [18:03:18.206] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.206] workers >= 1) [18:03:18.206] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.206] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.206] } [18:03:18.206] future <- MultisessionFuture(..., workers = workers, [18:03:18.206] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.206] envir = envir) [18:03:18.206] if (!future$lazy) [18:03:18.206] future <- run(future) [18:03:18.206] invisible(future) [18:03:18.206] }), .cleanup = FALSE, .init = FALSE) [18:03:18.206] } [18:03:18.206] } [18:03:18.206] } [18:03:18.206] }) [18:03:18.206] if (TRUE) { [18:03:18.206] base::sink(type = "output", split = FALSE) [18:03:18.206] if (TRUE) { [18:03:18.206] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.206] } [18:03:18.206] else { [18:03:18.206] ...future.result["stdout"] <- base::list(NULL) [18:03:18.206] } [18:03:18.206] base::close(...future.stdout) [18:03:18.206] ...future.stdout <- NULL [18:03:18.206] } [18:03:18.206] ...future.result$conditions <- ...future.conditions [18:03:18.206] ...future.result$finished <- base::Sys.time() [18:03:18.206] ...future.result [18:03:18.206] } [18:03:18.291] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:18.291] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:18.291] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:18.292] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:18.292] MultisessionFuture started [18:03:18.293] - Launch lazy future ... done [18:03:18.293] run() for 'MultisessionFuture' ... done [18:03:18.293] getGlobalsAndPackages() ... [18:03:18.293] Searching for globals... [18:03:18.295] - globals found: [3] '{', 'sample', 'x' [18:03:18.295] Searching for globals ... DONE [18:03:18.295] Resolving globals: FALSE [18:03:18.296] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.296] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.297] - globals: [1] 'x' [18:03:18.297] [18:03:18.297] getGlobalsAndPackages() ... DONE [18:03:18.297] run() for 'Future' ... [18:03:18.298] - state: 'created' [18:03:18.298] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.312] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.312] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.312] - Field: 'node' [18:03:18.313] - Field: 'label' [18:03:18.313] - Field: 'local' [18:03:18.313] - Field: 'owner' [18:03:18.313] - Field: 'envir' [18:03:18.313] - Field: 'workers' [18:03:18.314] - Field: 'packages' [18:03:18.314] - Field: 'gc' [18:03:18.314] - Field: 'conditions' [18:03:18.314] - Field: 'persistent' [18:03:18.314] - Field: 'expr' [18:03:18.315] - Field: 'uuid' [18:03:18.315] - Field: 'seed' [18:03:18.315] - Field: 'version' [18:03:18.315] - Field: 'result' [18:03:18.315] - Field: 'asynchronous' [18:03:18.316] - Field: 'calls' [18:03:18.316] - Field: 'globals' [18:03:18.316] - Field: 'stdout' [18:03:18.316] - Field: 'earlySignal' [18:03:18.316] - Field: 'lazy' [18:03:18.317] - Field: 'state' [18:03:18.317] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.317] - Launch lazy future ... [18:03:18.318] Packages needed by the future expression (n = 0): [18:03:18.318] Packages needed by future strategies (n = 0): [18:03:18.318] { [18:03:18.318] { [18:03:18.318] { [18:03:18.318] ...future.startTime <- base::Sys.time() [18:03:18.318] { [18:03:18.318] { [18:03:18.318] { [18:03:18.318] { [18:03:18.318] { [18:03:18.318] base::local({ [18:03:18.318] has_future <- base::requireNamespace("future", [18:03:18.318] quietly = TRUE) [18:03:18.318] if (has_future) { [18:03:18.318] ns <- base::getNamespace("future") [18:03:18.318] version <- ns[[".package"]][["version"]] [18:03:18.318] if (is.null(version)) [18:03:18.318] version <- utils::packageVersion("future") [18:03:18.318] } [18:03:18.318] else { [18:03:18.318] version <- NULL [18:03:18.318] } [18:03:18.318] if (!has_future || version < "1.8.0") { [18:03:18.318] info <- base::c(r_version = base::gsub("R version ", [18:03:18.318] "", base::R.version$version.string), [18:03:18.318] platform = base::sprintf("%s (%s-bit)", [18:03:18.318] base::R.version$platform, 8 * [18:03:18.318] base::.Machine$sizeof.pointer), [18:03:18.318] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.318] "release", "version")], collapse = " "), [18:03:18.318] hostname = base::Sys.info()[["nodename"]]) [18:03:18.318] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.318] info) [18:03:18.318] info <- base::paste(info, collapse = "; ") [18:03:18.318] if (!has_future) { [18:03:18.318] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.318] info) [18:03:18.318] } [18:03:18.318] else { [18:03:18.318] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.318] info, version) [18:03:18.318] } [18:03:18.318] base::stop(msg) [18:03:18.318] } [18:03:18.318] }) [18:03:18.318] } [18:03:18.318] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.318] base::options(mc.cores = 1L) [18:03:18.318] } [18:03:18.318] options(future.plan = NULL) [18:03:18.318] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.318] future::plan("default", .cleanup = FALSE, [18:03:18.318] .init = FALSE) [18:03:18.318] } [18:03:18.318] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:18.318] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:18.318] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:18.318] } [18:03:18.318] ...future.workdir <- getwd() [18:03:18.318] } [18:03:18.318] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.318] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.318] } [18:03:18.318] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.318] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.318] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.318] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.318] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.318] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.318] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.318] base::names(...future.oldOptions)) [18:03:18.318] } [18:03:18.318] if (FALSE) { [18:03:18.318] } [18:03:18.318] else { [18:03:18.318] if (TRUE) { [18:03:18.318] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.318] open = "w") [18:03:18.318] } [18:03:18.318] else { [18:03:18.318] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.318] windows = "NUL", "/dev/null"), open = "w") [18:03:18.318] } [18:03:18.318] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.318] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.318] base::sink(type = "output", split = FALSE) [18:03:18.318] base::close(...future.stdout) [18:03:18.318] }, add = TRUE) [18:03:18.318] } [18:03:18.318] ...future.frame <- base::sys.nframe() [18:03:18.318] ...future.conditions <- base::list() [18:03:18.318] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.318] if (FALSE) { [18:03:18.318] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.318] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.318] } [18:03:18.318] ...future.result <- base::tryCatch({ [18:03:18.318] base::withCallingHandlers({ [18:03:18.318] ...future.value <- base::withVisible(base::local({ [18:03:18.318] ...future.makeSendCondition <- local({ [18:03:18.318] sendCondition <- NULL [18:03:18.318] function(frame = 1L) { [18:03:18.318] if (is.function(sendCondition)) [18:03:18.318] return(sendCondition) [18:03:18.318] ns <- getNamespace("parallel") [18:03:18.318] if (exists("sendData", mode = "function", [18:03:18.318] envir = ns)) { [18:03:18.318] parallel_sendData <- get("sendData", mode = "function", [18:03:18.318] envir = ns) [18:03:18.318] envir <- sys.frame(frame) [18:03:18.318] master <- NULL [18:03:18.318] while (!identical(envir, .GlobalEnv) && [18:03:18.318] !identical(envir, emptyenv())) { [18:03:18.318] if (exists("master", mode = "list", envir = envir, [18:03:18.318] inherits = FALSE)) { [18:03:18.318] master <- get("master", mode = "list", [18:03:18.318] envir = envir, inherits = FALSE) [18:03:18.318] if (inherits(master, c("SOCKnode", [18:03:18.318] "SOCK0node"))) { [18:03:18.318] sendCondition <<- function(cond) { [18:03:18.318] data <- list(type = "VALUE", value = cond, [18:03:18.318] success = TRUE) [18:03:18.318] parallel_sendData(master, data) [18:03:18.318] } [18:03:18.318] return(sendCondition) [18:03:18.318] } [18:03:18.318] } [18:03:18.318] frame <- frame + 1L [18:03:18.318] envir <- sys.frame(frame) [18:03:18.318] } [18:03:18.318] } [18:03:18.318] sendCondition <<- function(cond) NULL [18:03:18.318] } [18:03:18.318] }) [18:03:18.318] withCallingHandlers({ [18:03:18.318] { [18:03:18.318] sample(x, size = 1L) [18:03:18.318] } [18:03:18.318] }, immediateCondition = function(cond) { [18:03:18.318] sendCondition <- ...future.makeSendCondition() [18:03:18.318] sendCondition(cond) [18:03:18.318] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.318] { [18:03:18.318] inherits <- base::inherits [18:03:18.318] invokeRestart <- base::invokeRestart [18:03:18.318] is.null <- base::is.null [18:03:18.318] muffled <- FALSE [18:03:18.318] if (inherits(cond, "message")) { [18:03:18.318] muffled <- grepl(pattern, "muffleMessage") [18:03:18.318] if (muffled) [18:03:18.318] invokeRestart("muffleMessage") [18:03:18.318] } [18:03:18.318] else if (inherits(cond, "warning")) { [18:03:18.318] muffled <- grepl(pattern, "muffleWarning") [18:03:18.318] if (muffled) [18:03:18.318] invokeRestart("muffleWarning") [18:03:18.318] } [18:03:18.318] else if (inherits(cond, "condition")) { [18:03:18.318] if (!is.null(pattern)) { [18:03:18.318] computeRestarts <- base::computeRestarts [18:03:18.318] grepl <- base::grepl [18:03:18.318] restarts <- computeRestarts(cond) [18:03:18.318] for (restart in restarts) { [18:03:18.318] name <- restart$name [18:03:18.318] if (is.null(name)) [18:03:18.318] next [18:03:18.318] if (!grepl(pattern, name)) [18:03:18.318] next [18:03:18.318] invokeRestart(restart) [18:03:18.318] muffled <- TRUE [18:03:18.318] break [18:03:18.318] } [18:03:18.318] } [18:03:18.318] } [18:03:18.318] invisible(muffled) [18:03:18.318] } [18:03:18.318] muffleCondition(cond) [18:03:18.318] }) [18:03:18.318] })) [18:03:18.318] future::FutureResult(value = ...future.value$value, [18:03:18.318] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.318] ...future.rng), globalenv = if (FALSE) [18:03:18.318] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.318] ...future.globalenv.names)) [18:03:18.318] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.318] }, condition = base::local({ [18:03:18.318] c <- base::c [18:03:18.318] inherits <- base::inherits [18:03:18.318] invokeRestart <- base::invokeRestart [18:03:18.318] length <- base::length [18:03:18.318] list <- base::list [18:03:18.318] seq.int <- base::seq.int [18:03:18.318] signalCondition <- base::signalCondition [18:03:18.318] sys.calls <- base::sys.calls [18:03:18.318] `[[` <- base::`[[` [18:03:18.318] `+` <- base::`+` [18:03:18.318] `<<-` <- base::`<<-` [18:03:18.318] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.318] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.318] 3L)] [18:03:18.318] } [18:03:18.318] function(cond) { [18:03:18.318] is_error <- inherits(cond, "error") [18:03:18.318] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.318] NULL) [18:03:18.318] if (is_error) { [18:03:18.318] sessionInformation <- function() { [18:03:18.318] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.318] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.318] search = base::search(), system = base::Sys.info()) [18:03:18.318] } [18:03:18.318] ...future.conditions[[length(...future.conditions) + [18:03:18.318] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.318] cond$call), session = sessionInformation(), [18:03:18.318] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.318] signalCondition(cond) [18:03:18.318] } [18:03:18.318] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.318] "immediateCondition"))) { [18:03:18.318] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.318] ...future.conditions[[length(...future.conditions) + [18:03:18.318] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.318] if (TRUE && !signal) { [18:03:18.318] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.318] { [18:03:18.318] inherits <- base::inherits [18:03:18.318] invokeRestart <- base::invokeRestart [18:03:18.318] is.null <- base::is.null [18:03:18.318] muffled <- FALSE [18:03:18.318] if (inherits(cond, "message")) { [18:03:18.318] muffled <- grepl(pattern, "muffleMessage") [18:03:18.318] if (muffled) [18:03:18.318] invokeRestart("muffleMessage") [18:03:18.318] } [18:03:18.318] else if (inherits(cond, "warning")) { [18:03:18.318] muffled <- grepl(pattern, "muffleWarning") [18:03:18.318] if (muffled) [18:03:18.318] invokeRestart("muffleWarning") [18:03:18.318] } [18:03:18.318] else if (inherits(cond, "condition")) { [18:03:18.318] if (!is.null(pattern)) { [18:03:18.318] computeRestarts <- base::computeRestarts [18:03:18.318] grepl <- base::grepl [18:03:18.318] restarts <- computeRestarts(cond) [18:03:18.318] for (restart in restarts) { [18:03:18.318] name <- restart$name [18:03:18.318] if (is.null(name)) [18:03:18.318] next [18:03:18.318] if (!grepl(pattern, name)) [18:03:18.318] next [18:03:18.318] invokeRestart(restart) [18:03:18.318] muffled <- TRUE [18:03:18.318] break [18:03:18.318] } [18:03:18.318] } [18:03:18.318] } [18:03:18.318] invisible(muffled) [18:03:18.318] } [18:03:18.318] muffleCondition(cond, pattern = "^muffle") [18:03:18.318] } [18:03:18.318] } [18:03:18.318] else { [18:03:18.318] if (TRUE) { [18:03:18.318] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.318] { [18:03:18.318] inherits <- base::inherits [18:03:18.318] invokeRestart <- base::invokeRestart [18:03:18.318] is.null <- base::is.null [18:03:18.318] muffled <- FALSE [18:03:18.318] if (inherits(cond, "message")) { [18:03:18.318] muffled <- grepl(pattern, "muffleMessage") [18:03:18.318] if (muffled) [18:03:18.318] invokeRestart("muffleMessage") [18:03:18.318] } [18:03:18.318] else if (inherits(cond, "warning")) { [18:03:18.318] muffled <- grepl(pattern, "muffleWarning") [18:03:18.318] if (muffled) [18:03:18.318] invokeRestart("muffleWarning") [18:03:18.318] } [18:03:18.318] else if (inherits(cond, "condition")) { [18:03:18.318] if (!is.null(pattern)) { [18:03:18.318] computeRestarts <- base::computeRestarts [18:03:18.318] grepl <- base::grepl [18:03:18.318] restarts <- computeRestarts(cond) [18:03:18.318] for (restart in restarts) { [18:03:18.318] name <- restart$name [18:03:18.318] if (is.null(name)) [18:03:18.318] next [18:03:18.318] if (!grepl(pattern, name)) [18:03:18.318] next [18:03:18.318] invokeRestart(restart) [18:03:18.318] muffled <- TRUE [18:03:18.318] break [18:03:18.318] } [18:03:18.318] } [18:03:18.318] } [18:03:18.318] invisible(muffled) [18:03:18.318] } [18:03:18.318] muffleCondition(cond, pattern = "^muffle") [18:03:18.318] } [18:03:18.318] } [18:03:18.318] } [18:03:18.318] })) [18:03:18.318] }, error = function(ex) { [18:03:18.318] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.318] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.318] ...future.rng), started = ...future.startTime, [18:03:18.318] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.318] version = "1.8"), class = "FutureResult") [18:03:18.318] }, finally = { [18:03:18.318] if (!identical(...future.workdir, getwd())) [18:03:18.318] setwd(...future.workdir) [18:03:18.318] { [18:03:18.318] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.318] ...future.oldOptions$nwarnings <- NULL [18:03:18.318] } [18:03:18.318] base::options(...future.oldOptions) [18:03:18.318] if (.Platform$OS.type == "windows") { [18:03:18.318] old_names <- names(...future.oldEnvVars) [18:03:18.318] envs <- base::Sys.getenv() [18:03:18.318] names <- names(envs) [18:03:18.318] common <- intersect(names, old_names) [18:03:18.318] added <- setdiff(names, old_names) [18:03:18.318] removed <- setdiff(old_names, names) [18:03:18.318] changed <- common[...future.oldEnvVars[common] != [18:03:18.318] envs[common]] [18:03:18.318] NAMES <- toupper(changed) [18:03:18.318] args <- list() [18:03:18.318] for (kk in seq_along(NAMES)) { [18:03:18.318] name <- changed[[kk]] [18:03:18.318] NAME <- NAMES[[kk]] [18:03:18.318] if (name != NAME && is.element(NAME, old_names)) [18:03:18.318] next [18:03:18.318] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.318] } [18:03:18.318] NAMES <- toupper(added) [18:03:18.318] for (kk in seq_along(NAMES)) { [18:03:18.318] name <- added[[kk]] [18:03:18.318] NAME <- NAMES[[kk]] [18:03:18.318] if (name != NAME && is.element(NAME, old_names)) [18:03:18.318] next [18:03:18.318] args[[name]] <- "" [18:03:18.318] } [18:03:18.318] NAMES <- toupper(removed) [18:03:18.318] for (kk in seq_along(NAMES)) { [18:03:18.318] name <- removed[[kk]] [18:03:18.318] NAME <- NAMES[[kk]] [18:03:18.318] if (name != NAME && is.element(NAME, old_names)) [18:03:18.318] next [18:03:18.318] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.318] } [18:03:18.318] if (length(args) > 0) [18:03:18.318] base::do.call(base::Sys.setenv, args = args) [18:03:18.318] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.318] } [18:03:18.318] else { [18:03:18.318] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.318] } [18:03:18.318] { [18:03:18.318] if (base::length(...future.futureOptionsAdded) > [18:03:18.318] 0L) { [18:03:18.318] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.318] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.318] base::options(opts) [18:03:18.318] } [18:03:18.318] { [18:03:18.318] { [18:03:18.318] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.318] NULL [18:03:18.318] } [18:03:18.318] options(future.plan = NULL) [18:03:18.318] if (is.na(NA_character_)) [18:03:18.318] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.318] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.318] future::plan(list(function (..., workers = availableCores(), [18:03:18.318] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.318] envir = parent.frame()) [18:03:18.318] { [18:03:18.318] if (is.function(workers)) [18:03:18.318] workers <- workers() [18:03:18.318] workers <- structure(as.integer(workers), [18:03:18.318] class = class(workers)) [18:03:18.318] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.318] workers >= 1) [18:03:18.318] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.318] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.318] } [18:03:18.318] future <- MultisessionFuture(..., workers = workers, [18:03:18.318] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.318] envir = envir) [18:03:18.318] if (!future$lazy) [18:03:18.318] future <- run(future) [18:03:18.318] invisible(future) [18:03:18.318] }), .cleanup = FALSE, .init = FALSE) [18:03:18.318] } [18:03:18.318] } [18:03:18.318] } [18:03:18.318] }) [18:03:18.318] if (TRUE) { [18:03:18.318] base::sink(type = "output", split = FALSE) [18:03:18.318] if (TRUE) { [18:03:18.318] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.318] } [18:03:18.318] else { [18:03:18.318] ...future.result["stdout"] <- base::list(NULL) [18:03:18.318] } [18:03:18.318] base::close(...future.stdout) [18:03:18.318] ...future.stdout <- NULL [18:03:18.318] } [18:03:18.318] ...future.result$conditions <- ...future.conditions [18:03:18.318] ...future.result$finished <- base::Sys.time() [18:03:18.318] ...future.result [18:03:18.318] } [18:03:18.324] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:18.346] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.346] - Validating connection of MultisessionFuture [18:03:18.347] - received message: FutureResult [18:03:18.347] - Received FutureResult [18:03:18.347] - Erased future from FutureRegistry [18:03:18.347] result() for ClusterFuture ... [18:03:18.347] - result already collected: FutureResult [18:03:18.348] result() for ClusterFuture ... done [18:03:18.348] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.348] result() for ClusterFuture ... [18:03:18.348] - result already collected: FutureResult [18:03:18.348] result() for ClusterFuture ... done [18:03:18.349] result() for ClusterFuture ... [18:03:18.349] - result already collected: FutureResult [18:03:18.349] result() for ClusterFuture ... done [18:03:18.350] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.350] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.351] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.351] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.351] MultisessionFuture started [18:03:18.352] - Launch lazy future ... done [18:03:18.352] run() for 'MultisessionFuture' ... done [18:03:18.352] getGlobalsAndPackages() ... [18:03:18.352] Searching for globals... [18:03:18.354] - globals found: [3] '{', 'sample', 'x' [18:03:18.354] Searching for globals ... DONE [18:03:18.354] Resolving globals: FALSE [18:03:18.355] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.358] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.358] - globals: [1] 'x' [18:03:18.358] [18:03:18.359] getGlobalsAndPackages() ... DONE [18:03:18.359] run() for 'Future' ... [18:03:18.359] - state: 'created' [18:03:18.359] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.373] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.373] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.374] - Field: 'node' [18:03:18.374] - Field: 'label' [18:03:18.374] - Field: 'local' [18:03:18.374] - Field: 'owner' [18:03:18.374] - Field: 'envir' [18:03:18.375] - Field: 'workers' [18:03:18.375] - Field: 'packages' [18:03:18.375] - Field: 'gc' [18:03:18.375] - Field: 'conditions' [18:03:18.375] - Field: 'persistent' [18:03:18.375] - Field: 'expr' [18:03:18.376] - Field: 'uuid' [18:03:18.376] - Field: 'seed' [18:03:18.376] - Field: 'version' [18:03:18.376] - Field: 'result' [18:03:18.376] - Field: 'asynchronous' [18:03:18.377] - Field: 'calls' [18:03:18.377] - Field: 'globals' [18:03:18.377] - Field: 'stdout' [18:03:18.377] - Field: 'earlySignal' [18:03:18.377] - Field: 'lazy' [18:03:18.377] - Field: 'state' [18:03:18.378] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.378] - Launch lazy future ... [18:03:18.378] Packages needed by the future expression (n = 0): [18:03:18.378] Packages needed by future strategies (n = 0): [18:03:18.379] { [18:03:18.379] { [18:03:18.379] { [18:03:18.379] ...future.startTime <- base::Sys.time() [18:03:18.379] { [18:03:18.379] { [18:03:18.379] { [18:03:18.379] { [18:03:18.379] { [18:03:18.379] base::local({ [18:03:18.379] has_future <- base::requireNamespace("future", [18:03:18.379] quietly = TRUE) [18:03:18.379] if (has_future) { [18:03:18.379] ns <- base::getNamespace("future") [18:03:18.379] version <- ns[[".package"]][["version"]] [18:03:18.379] if (is.null(version)) [18:03:18.379] version <- utils::packageVersion("future") [18:03:18.379] } [18:03:18.379] else { [18:03:18.379] version <- NULL [18:03:18.379] } [18:03:18.379] if (!has_future || version < "1.8.0") { [18:03:18.379] info <- base::c(r_version = base::gsub("R version ", [18:03:18.379] "", base::R.version$version.string), [18:03:18.379] platform = base::sprintf("%s (%s-bit)", [18:03:18.379] base::R.version$platform, 8 * [18:03:18.379] base::.Machine$sizeof.pointer), [18:03:18.379] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.379] "release", "version")], collapse = " "), [18:03:18.379] hostname = base::Sys.info()[["nodename"]]) [18:03:18.379] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.379] info) [18:03:18.379] info <- base::paste(info, collapse = "; ") [18:03:18.379] if (!has_future) { [18:03:18.379] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.379] info) [18:03:18.379] } [18:03:18.379] else { [18:03:18.379] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.379] info, version) [18:03:18.379] } [18:03:18.379] base::stop(msg) [18:03:18.379] } [18:03:18.379] }) [18:03:18.379] } [18:03:18.379] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.379] base::options(mc.cores = 1L) [18:03:18.379] } [18:03:18.379] options(future.plan = NULL) [18:03:18.379] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.379] future::plan("default", .cleanup = FALSE, [18:03:18.379] .init = FALSE) [18:03:18.379] } [18:03:18.379] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:18.379] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:18.379] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:18.379] } [18:03:18.379] ...future.workdir <- getwd() [18:03:18.379] } [18:03:18.379] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.379] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.379] } [18:03:18.379] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.379] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.379] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.379] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.379] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.379] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.379] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.379] base::names(...future.oldOptions)) [18:03:18.379] } [18:03:18.379] if (FALSE) { [18:03:18.379] } [18:03:18.379] else { [18:03:18.379] if (TRUE) { [18:03:18.379] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.379] open = "w") [18:03:18.379] } [18:03:18.379] else { [18:03:18.379] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.379] windows = "NUL", "/dev/null"), open = "w") [18:03:18.379] } [18:03:18.379] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.379] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.379] base::sink(type = "output", split = FALSE) [18:03:18.379] base::close(...future.stdout) [18:03:18.379] }, add = TRUE) [18:03:18.379] } [18:03:18.379] ...future.frame <- base::sys.nframe() [18:03:18.379] ...future.conditions <- base::list() [18:03:18.379] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.379] if (FALSE) { [18:03:18.379] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.379] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.379] } [18:03:18.379] ...future.result <- base::tryCatch({ [18:03:18.379] base::withCallingHandlers({ [18:03:18.379] ...future.value <- base::withVisible(base::local({ [18:03:18.379] ...future.makeSendCondition <- local({ [18:03:18.379] sendCondition <- NULL [18:03:18.379] function(frame = 1L) { [18:03:18.379] if (is.function(sendCondition)) [18:03:18.379] return(sendCondition) [18:03:18.379] ns <- getNamespace("parallel") [18:03:18.379] if (exists("sendData", mode = "function", [18:03:18.379] envir = ns)) { [18:03:18.379] parallel_sendData <- get("sendData", mode = "function", [18:03:18.379] envir = ns) [18:03:18.379] envir <- sys.frame(frame) [18:03:18.379] master <- NULL [18:03:18.379] while (!identical(envir, .GlobalEnv) && [18:03:18.379] !identical(envir, emptyenv())) { [18:03:18.379] if (exists("master", mode = "list", envir = envir, [18:03:18.379] inherits = FALSE)) { [18:03:18.379] master <- get("master", mode = "list", [18:03:18.379] envir = envir, inherits = FALSE) [18:03:18.379] if (inherits(master, c("SOCKnode", [18:03:18.379] "SOCK0node"))) { [18:03:18.379] sendCondition <<- function(cond) { [18:03:18.379] data <- list(type = "VALUE", value = cond, [18:03:18.379] success = TRUE) [18:03:18.379] parallel_sendData(master, data) [18:03:18.379] } [18:03:18.379] return(sendCondition) [18:03:18.379] } [18:03:18.379] } [18:03:18.379] frame <- frame + 1L [18:03:18.379] envir <- sys.frame(frame) [18:03:18.379] } [18:03:18.379] } [18:03:18.379] sendCondition <<- function(cond) NULL [18:03:18.379] } [18:03:18.379] }) [18:03:18.379] withCallingHandlers({ [18:03:18.379] { [18:03:18.379] sample(x, size = 1L) [18:03:18.379] } [18:03:18.379] }, immediateCondition = function(cond) { [18:03:18.379] sendCondition <- ...future.makeSendCondition() [18:03:18.379] sendCondition(cond) [18:03:18.379] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.379] { [18:03:18.379] inherits <- base::inherits [18:03:18.379] invokeRestart <- base::invokeRestart [18:03:18.379] is.null <- base::is.null [18:03:18.379] muffled <- FALSE [18:03:18.379] if (inherits(cond, "message")) { [18:03:18.379] muffled <- grepl(pattern, "muffleMessage") [18:03:18.379] if (muffled) [18:03:18.379] invokeRestart("muffleMessage") [18:03:18.379] } [18:03:18.379] else if (inherits(cond, "warning")) { [18:03:18.379] muffled <- grepl(pattern, "muffleWarning") [18:03:18.379] if (muffled) [18:03:18.379] invokeRestart("muffleWarning") [18:03:18.379] } [18:03:18.379] else if (inherits(cond, "condition")) { [18:03:18.379] if (!is.null(pattern)) { [18:03:18.379] computeRestarts <- base::computeRestarts [18:03:18.379] grepl <- base::grepl [18:03:18.379] restarts <- computeRestarts(cond) [18:03:18.379] for (restart in restarts) { [18:03:18.379] name <- restart$name [18:03:18.379] if (is.null(name)) [18:03:18.379] next [18:03:18.379] if (!grepl(pattern, name)) [18:03:18.379] next [18:03:18.379] invokeRestart(restart) [18:03:18.379] muffled <- TRUE [18:03:18.379] break [18:03:18.379] } [18:03:18.379] } [18:03:18.379] } [18:03:18.379] invisible(muffled) [18:03:18.379] } [18:03:18.379] muffleCondition(cond) [18:03:18.379] }) [18:03:18.379] })) [18:03:18.379] future::FutureResult(value = ...future.value$value, [18:03:18.379] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.379] ...future.rng), globalenv = if (FALSE) [18:03:18.379] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.379] ...future.globalenv.names)) [18:03:18.379] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.379] }, condition = base::local({ [18:03:18.379] c <- base::c [18:03:18.379] inherits <- base::inherits [18:03:18.379] invokeRestart <- base::invokeRestart [18:03:18.379] length <- base::length [18:03:18.379] list <- base::list [18:03:18.379] seq.int <- base::seq.int [18:03:18.379] signalCondition <- base::signalCondition [18:03:18.379] sys.calls <- base::sys.calls [18:03:18.379] `[[` <- base::`[[` [18:03:18.379] `+` <- base::`+` [18:03:18.379] `<<-` <- base::`<<-` [18:03:18.379] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.379] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.379] 3L)] [18:03:18.379] } [18:03:18.379] function(cond) { [18:03:18.379] is_error <- inherits(cond, "error") [18:03:18.379] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.379] NULL) [18:03:18.379] if (is_error) { [18:03:18.379] sessionInformation <- function() { [18:03:18.379] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.379] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.379] search = base::search(), system = base::Sys.info()) [18:03:18.379] } [18:03:18.379] ...future.conditions[[length(...future.conditions) + [18:03:18.379] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.379] cond$call), session = sessionInformation(), [18:03:18.379] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.379] signalCondition(cond) [18:03:18.379] } [18:03:18.379] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.379] "immediateCondition"))) { [18:03:18.379] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.379] ...future.conditions[[length(...future.conditions) + [18:03:18.379] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.379] if (TRUE && !signal) { [18:03:18.379] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.379] { [18:03:18.379] inherits <- base::inherits [18:03:18.379] invokeRestart <- base::invokeRestart [18:03:18.379] is.null <- base::is.null [18:03:18.379] muffled <- FALSE [18:03:18.379] if (inherits(cond, "message")) { [18:03:18.379] muffled <- grepl(pattern, "muffleMessage") [18:03:18.379] if (muffled) [18:03:18.379] invokeRestart("muffleMessage") [18:03:18.379] } [18:03:18.379] else if (inherits(cond, "warning")) { [18:03:18.379] muffled <- grepl(pattern, "muffleWarning") [18:03:18.379] if (muffled) [18:03:18.379] invokeRestart("muffleWarning") [18:03:18.379] } [18:03:18.379] else if (inherits(cond, "condition")) { [18:03:18.379] if (!is.null(pattern)) { [18:03:18.379] computeRestarts <- base::computeRestarts [18:03:18.379] grepl <- base::grepl [18:03:18.379] restarts <- computeRestarts(cond) [18:03:18.379] for (restart in restarts) { [18:03:18.379] name <- restart$name [18:03:18.379] if (is.null(name)) [18:03:18.379] next [18:03:18.379] if (!grepl(pattern, name)) [18:03:18.379] next [18:03:18.379] invokeRestart(restart) [18:03:18.379] muffled <- TRUE [18:03:18.379] break [18:03:18.379] } [18:03:18.379] } [18:03:18.379] } [18:03:18.379] invisible(muffled) [18:03:18.379] } [18:03:18.379] muffleCondition(cond, pattern = "^muffle") [18:03:18.379] } [18:03:18.379] } [18:03:18.379] else { [18:03:18.379] if (TRUE) { [18:03:18.379] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.379] { [18:03:18.379] inherits <- base::inherits [18:03:18.379] invokeRestart <- base::invokeRestart [18:03:18.379] is.null <- base::is.null [18:03:18.379] muffled <- FALSE [18:03:18.379] if (inherits(cond, "message")) { [18:03:18.379] muffled <- grepl(pattern, "muffleMessage") [18:03:18.379] if (muffled) [18:03:18.379] invokeRestart("muffleMessage") [18:03:18.379] } [18:03:18.379] else if (inherits(cond, "warning")) { [18:03:18.379] muffled <- grepl(pattern, "muffleWarning") [18:03:18.379] if (muffled) [18:03:18.379] invokeRestart("muffleWarning") [18:03:18.379] } [18:03:18.379] else if (inherits(cond, "condition")) { [18:03:18.379] if (!is.null(pattern)) { [18:03:18.379] computeRestarts <- base::computeRestarts [18:03:18.379] grepl <- base::grepl [18:03:18.379] restarts <- computeRestarts(cond) [18:03:18.379] for (restart in restarts) { [18:03:18.379] name <- restart$name [18:03:18.379] if (is.null(name)) [18:03:18.379] next [18:03:18.379] if (!grepl(pattern, name)) [18:03:18.379] next [18:03:18.379] invokeRestart(restart) [18:03:18.379] muffled <- TRUE [18:03:18.379] break [18:03:18.379] } [18:03:18.379] } [18:03:18.379] } [18:03:18.379] invisible(muffled) [18:03:18.379] } [18:03:18.379] muffleCondition(cond, pattern = "^muffle") [18:03:18.379] } [18:03:18.379] } [18:03:18.379] } [18:03:18.379] })) [18:03:18.379] }, error = function(ex) { [18:03:18.379] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.379] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.379] ...future.rng), started = ...future.startTime, [18:03:18.379] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.379] version = "1.8"), class = "FutureResult") [18:03:18.379] }, finally = { [18:03:18.379] if (!identical(...future.workdir, getwd())) [18:03:18.379] setwd(...future.workdir) [18:03:18.379] { [18:03:18.379] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.379] ...future.oldOptions$nwarnings <- NULL [18:03:18.379] } [18:03:18.379] base::options(...future.oldOptions) [18:03:18.379] if (.Platform$OS.type == "windows") { [18:03:18.379] old_names <- names(...future.oldEnvVars) [18:03:18.379] envs <- base::Sys.getenv() [18:03:18.379] names <- names(envs) [18:03:18.379] common <- intersect(names, old_names) [18:03:18.379] added <- setdiff(names, old_names) [18:03:18.379] removed <- setdiff(old_names, names) [18:03:18.379] changed <- common[...future.oldEnvVars[common] != [18:03:18.379] envs[common]] [18:03:18.379] NAMES <- toupper(changed) [18:03:18.379] args <- list() [18:03:18.379] for (kk in seq_along(NAMES)) { [18:03:18.379] name <- changed[[kk]] [18:03:18.379] NAME <- NAMES[[kk]] [18:03:18.379] if (name != NAME && is.element(NAME, old_names)) [18:03:18.379] next [18:03:18.379] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.379] } [18:03:18.379] NAMES <- toupper(added) [18:03:18.379] for (kk in seq_along(NAMES)) { [18:03:18.379] name <- added[[kk]] [18:03:18.379] NAME <- NAMES[[kk]] [18:03:18.379] if (name != NAME && is.element(NAME, old_names)) [18:03:18.379] next [18:03:18.379] args[[name]] <- "" [18:03:18.379] } [18:03:18.379] NAMES <- toupper(removed) [18:03:18.379] for (kk in seq_along(NAMES)) { [18:03:18.379] name <- removed[[kk]] [18:03:18.379] NAME <- NAMES[[kk]] [18:03:18.379] if (name != NAME && is.element(NAME, old_names)) [18:03:18.379] next [18:03:18.379] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.379] } [18:03:18.379] if (length(args) > 0) [18:03:18.379] base::do.call(base::Sys.setenv, args = args) [18:03:18.379] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.379] } [18:03:18.379] else { [18:03:18.379] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.379] } [18:03:18.379] { [18:03:18.379] if (base::length(...future.futureOptionsAdded) > [18:03:18.379] 0L) { [18:03:18.379] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.379] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.379] base::options(opts) [18:03:18.379] } [18:03:18.379] { [18:03:18.379] { [18:03:18.379] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.379] NULL [18:03:18.379] } [18:03:18.379] options(future.plan = NULL) [18:03:18.379] if (is.na(NA_character_)) [18:03:18.379] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.379] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.379] future::plan(list(function (..., workers = availableCores(), [18:03:18.379] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.379] envir = parent.frame()) [18:03:18.379] { [18:03:18.379] if (is.function(workers)) [18:03:18.379] workers <- workers() [18:03:18.379] workers <- structure(as.integer(workers), [18:03:18.379] class = class(workers)) [18:03:18.379] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.379] workers >= 1) [18:03:18.379] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.379] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.379] } [18:03:18.379] future <- MultisessionFuture(..., workers = workers, [18:03:18.379] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.379] envir = envir) [18:03:18.379] if (!future$lazy) [18:03:18.379] future <- run(future) [18:03:18.379] invisible(future) [18:03:18.379] }), .cleanup = FALSE, .init = FALSE) [18:03:18.379] } [18:03:18.379] } [18:03:18.379] } [18:03:18.379] }) [18:03:18.379] if (TRUE) { [18:03:18.379] base::sink(type = "output", split = FALSE) [18:03:18.379] if (TRUE) { [18:03:18.379] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.379] } [18:03:18.379] else { [18:03:18.379] ...future.result["stdout"] <- base::list(NULL) [18:03:18.379] } [18:03:18.379] base::close(...future.stdout) [18:03:18.379] ...future.stdout <- NULL [18:03:18.379] } [18:03:18.379] ...future.result$conditions <- ...future.conditions [18:03:18.379] ...future.result$finished <- base::Sys.time() [18:03:18.379] ...future.result [18:03:18.379] } [18:03:18.384] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:18.418] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.418] - Validating connection of MultisessionFuture [18:03:18.418] - received message: FutureResult [18:03:18.419] - Received FutureResult [18:03:18.419] - Erased future from FutureRegistry [18:03:18.419] result() for ClusterFuture ... [18:03:18.419] - result already collected: FutureResult [18:03:18.419] result() for ClusterFuture ... done [18:03:18.419] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.420] result() for ClusterFuture ... [18:03:18.420] - result already collected: FutureResult [18:03:18.420] result() for ClusterFuture ... done [18:03:18.420] result() for ClusterFuture ... [18:03:18.420] - result already collected: FutureResult [18:03:18.420] result() for ClusterFuture ... done [18:03:18.421] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:18.421] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:18.422] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:18.422] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:18.423] MultisessionFuture started [18:03:18.423] - Launch lazy future ... done [18:03:18.423] run() for 'MultisessionFuture' ... done [18:03:18.423] resolve() on list ... [18:03:18.423] recursive: 0 [18:03:18.424] length: 4 [18:03:18.424] [18:03:18.424] Future #1 [18:03:18.424] result() for ClusterFuture ... [18:03:18.424] - result already collected: FutureResult [18:03:18.424] result() for ClusterFuture ... done [18:03:18.425] result() for ClusterFuture ... [18:03:18.425] - result already collected: FutureResult [18:03:18.425] result() for ClusterFuture ... done [18:03:18.425] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:18.425] - nx: 4 [18:03:18.425] - relay: TRUE [18:03:18.426] - stdout: TRUE [18:03:18.426] - signal: TRUE [18:03:18.426] - resignal: FALSE [18:03:18.426] - force: TRUE [18:03:18.426] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:18.426] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:18.427] - until=1 [18:03:18.427] - relaying element #1 [18:03:18.427] result() for ClusterFuture ... [18:03:18.427] - result already collected: FutureResult [18:03:18.427] result() for ClusterFuture ... done [18:03:18.427] result() for ClusterFuture ... [18:03:18.427] - result already collected: FutureResult [18:03:18.428] result() for ClusterFuture ... done [18:03:18.428] result() for ClusterFuture ... [18:03:18.428] - result already collected: FutureResult [18:03:18.428] result() for ClusterFuture ... done [18:03:18.428] result() for ClusterFuture ... [18:03:18.428] - result already collected: FutureResult [18:03:18.429] result() for ClusterFuture ... done [18:03:18.429] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.429] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.429] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:03:18.429] length: 3 (resolved future 1) [18:03:18.429] Future #2 [18:03:18.430] result() for ClusterFuture ... [18:03:18.430] - result already collected: FutureResult [18:03:18.430] result() for ClusterFuture ... done [18:03:18.430] result() for ClusterFuture ... [18:03:18.430] - result already collected: FutureResult [18:03:18.430] result() for ClusterFuture ... done [18:03:18.431] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:03:18.431] - nx: 4 [18:03:18.431] - relay: TRUE [18:03:18.431] - stdout: TRUE [18:03:18.431] - signal: TRUE [18:03:18.431] - resignal: FALSE [18:03:18.432] - force: TRUE [18:03:18.432] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.432] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.432] - until=2 [18:03:18.432] - relaying element #2 [18:03:18.432] result() for ClusterFuture ... [18:03:18.433] - result already collected: FutureResult [18:03:18.433] result() for ClusterFuture ... done [18:03:18.433] result() for ClusterFuture ... [18:03:18.433] - result already collected: FutureResult [18:03:18.433] result() for ClusterFuture ... done [18:03:18.433] result() for ClusterFuture ... [18:03:18.433] - result already collected: FutureResult [18:03:18.434] result() for ClusterFuture ... done [18:03:18.434] result() for ClusterFuture ... [18:03:18.434] - result already collected: FutureResult [18:03:18.434] result() for ClusterFuture ... done [18:03:18.434] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.434] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.435] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:03:18.435] length: 2 (resolved future 2) [18:03:18.435] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.435] - Validating connection of MultisessionFuture [18:03:18.436] - received message: FutureResult [18:03:18.436] - Received FutureResult [18:03:18.436] - Erased future from FutureRegistry [18:03:18.436] result() for ClusterFuture ... [18:03:18.436] - result already collected: FutureResult [18:03:18.437] result() for ClusterFuture ... done [18:03:18.437] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.437] Future #3 [18:03:18.437] result() for ClusterFuture ... [18:03:18.437] - result already collected: FutureResult [18:03:18.437] result() for ClusterFuture ... done [18:03:18.437] result() for ClusterFuture ... [18:03:18.438] - result already collected: FutureResult [18:03:18.438] result() for ClusterFuture ... done [18:03:18.438] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:03:18.438] - nx: 4 [18:03:18.438] - relay: TRUE [18:03:18.438] - stdout: TRUE [18:03:18.439] - signal: TRUE [18:03:18.439] - resignal: FALSE [18:03:18.439] - force: TRUE [18:03:18.439] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.439] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.439] - until=3 [18:03:18.440] - relaying element #3 [18:03:18.440] result() for ClusterFuture ... [18:03:18.440] - result already collected: FutureResult [18:03:18.440] result() for ClusterFuture ... done [18:03:18.440] result() for ClusterFuture ... [18:03:18.440] - result already collected: FutureResult [18:03:18.440] result() for ClusterFuture ... done [18:03:18.441] result() for ClusterFuture ... [18:03:18.441] - result already collected: FutureResult [18:03:18.441] result() for ClusterFuture ... done [18:03:18.441] result() for ClusterFuture ... [18:03:18.441] - result already collected: FutureResult [18:03:18.441] result() for ClusterFuture ... done [18:03:18.442] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.442] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.442] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:03:18.442] length: 1 (resolved future 3) [18:03:18.442] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.443] - Validating connection of MultisessionFuture [18:03:18.443] - received message: FutureResult [18:03:18.443] - Received FutureResult [18:03:18.443] - Erased future from FutureRegistry [18:03:18.443] result() for ClusterFuture ... [18:03:18.444] - result already collected: FutureResult [18:03:18.444] result() for ClusterFuture ... done [18:03:18.444] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.444] Future #4 [18:03:18.444] result() for ClusterFuture ... [18:03:18.444] - result already collected: FutureResult [18:03:18.445] result() for ClusterFuture ... done [18:03:18.445] result() for ClusterFuture ... [18:03:18.445] - result already collected: FutureResult [18:03:18.445] result() for ClusterFuture ... done [18:03:18.445] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:03:18.445] - nx: 4 [18:03:18.446] - relay: TRUE [18:03:18.446] - stdout: TRUE [18:03:18.446] - signal: TRUE [18:03:18.446] - resignal: FALSE [18:03:18.446] - force: TRUE [18:03:18.446] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.446] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.447] - until=4 [18:03:18.447] - relaying element #4 [18:03:18.447] result() for ClusterFuture ... [18:03:18.447] - result already collected: FutureResult [18:03:18.447] result() for ClusterFuture ... done [18:03:18.447] result() for ClusterFuture ... [18:03:18.448] - result already collected: FutureResult [18:03:18.448] result() for ClusterFuture ... done [18:03:18.448] result() for ClusterFuture ... [18:03:18.448] - result already collected: FutureResult [18:03:18.448] result() for ClusterFuture ... done [18:03:18.448] result() for ClusterFuture ... [18:03:18.449] - result already collected: FutureResult [18:03:18.449] result() for ClusterFuture ... done [18:03:18.449] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.449] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.449] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:03:18.449] length: 0 (resolved future 4) [18:03:18.449] Relaying remaining futures [18:03:18.450] signalConditionsASAP(NULL, pos=0) ... [18:03:18.450] - nx: 4 [18:03:18.450] - relay: TRUE [18:03:18.450] - stdout: TRUE [18:03:18.450] - signal: TRUE [18:03:18.450] - resignal: FALSE [18:03:18.451] - force: TRUE [18:03:18.451] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.451] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:18.451] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.451] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.451] signalConditionsASAP(NULL, pos=0) ... done [18:03:18.452] resolve() on list ... DONE [18:03:18.452] result() for ClusterFuture ... [18:03:18.452] - result already collected: FutureResult [18:03:18.452] result() for ClusterFuture ... done [18:03:18.452] result() for ClusterFuture ... [18:03:18.452] - result already collected: FutureResult [18:03:18.453] result() for ClusterFuture ... done [18:03:18.453] result() for ClusterFuture ... [18:03:18.453] - result already collected: FutureResult [18:03:18.453] result() for ClusterFuture ... done [18:03:18.453] result() for ClusterFuture ... [18:03:18.453] - result already collected: FutureResult [18:03:18.453] result() for ClusterFuture ... done [18:03:18.454] result() for ClusterFuture ... [18:03:18.454] - result already collected: FutureResult [18:03:18.454] result() for ClusterFuture ... done [18:03:18.454] result() for ClusterFuture ... [18:03:18.454] - result already collected: FutureResult [18:03:18.454] result() for ClusterFuture ... done [18:03:18.455] result() for ClusterFuture ... [18:03:18.455] - result already collected: FutureResult [18:03:18.455] result() for ClusterFuture ... done [18:03:18.455] result() for ClusterFuture ... [18:03:18.455] - result already collected: FutureResult [18:03:18.455] result() for ClusterFuture ... done [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:18.456] getGlobalsAndPackages() ... [18:03:18.456] Searching for globals... [18:03:18.457] - globals found: [3] '{', 'sample', 'x' [18:03:18.457] Searching for globals ... DONE [18:03:18.458] Resolving globals: FALSE [18:03:18.458] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.458] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.459] - globals: [1] 'x' [18:03:18.459] [18:03:18.459] getGlobalsAndPackages() ... DONE [18:03:18.459] run() for 'Future' ... [18:03:18.460] - state: 'created' [18:03:18.460] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.473] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.474] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.474] - Field: 'node' [18:03:18.474] - Field: 'label' [18:03:18.474] - Field: 'local' [18:03:18.474] - Field: 'owner' [18:03:18.474] - Field: 'envir' [18:03:18.475] - Field: 'workers' [18:03:18.475] - Field: 'packages' [18:03:18.475] - Field: 'gc' [18:03:18.475] - Field: 'conditions' [18:03:18.475] - Field: 'persistent' [18:03:18.476] - Field: 'expr' [18:03:18.476] - Field: 'uuid' [18:03:18.476] - Field: 'seed' [18:03:18.476] - Field: 'version' [18:03:18.476] - Field: 'result' [18:03:18.476] - Field: 'asynchronous' [18:03:18.477] - Field: 'calls' [18:03:18.477] - Field: 'globals' [18:03:18.477] - Field: 'stdout' [18:03:18.477] - Field: 'earlySignal' [18:03:18.477] - Field: 'lazy' [18:03:18.477] - Field: 'state' [18:03:18.478] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.478] - Launch lazy future ... [18:03:18.478] Packages needed by the future expression (n = 0): [18:03:18.478] Packages needed by future strategies (n = 0): [18:03:18.479] { [18:03:18.479] { [18:03:18.479] { [18:03:18.479] ...future.startTime <- base::Sys.time() [18:03:18.479] { [18:03:18.479] { [18:03:18.479] { [18:03:18.479] { [18:03:18.479] { [18:03:18.479] base::local({ [18:03:18.479] has_future <- base::requireNamespace("future", [18:03:18.479] quietly = TRUE) [18:03:18.479] if (has_future) { [18:03:18.479] ns <- base::getNamespace("future") [18:03:18.479] version <- ns[[".package"]][["version"]] [18:03:18.479] if (is.null(version)) [18:03:18.479] version <- utils::packageVersion("future") [18:03:18.479] } [18:03:18.479] else { [18:03:18.479] version <- NULL [18:03:18.479] } [18:03:18.479] if (!has_future || version < "1.8.0") { [18:03:18.479] info <- base::c(r_version = base::gsub("R version ", [18:03:18.479] "", base::R.version$version.string), [18:03:18.479] platform = base::sprintf("%s (%s-bit)", [18:03:18.479] base::R.version$platform, 8 * [18:03:18.479] base::.Machine$sizeof.pointer), [18:03:18.479] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.479] "release", "version")], collapse = " "), [18:03:18.479] hostname = base::Sys.info()[["nodename"]]) [18:03:18.479] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.479] info) [18:03:18.479] info <- base::paste(info, collapse = "; ") [18:03:18.479] if (!has_future) { [18:03:18.479] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.479] info) [18:03:18.479] } [18:03:18.479] else { [18:03:18.479] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.479] info, version) [18:03:18.479] } [18:03:18.479] base::stop(msg) [18:03:18.479] } [18:03:18.479] }) [18:03:18.479] } [18:03:18.479] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.479] base::options(mc.cores = 1L) [18:03:18.479] } [18:03:18.479] options(future.plan = NULL) [18:03:18.479] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.479] future::plan("default", .cleanup = FALSE, [18:03:18.479] .init = FALSE) [18:03:18.479] } [18:03:18.479] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:18.479] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:18.479] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:18.479] } [18:03:18.479] ...future.workdir <- getwd() [18:03:18.479] } [18:03:18.479] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.479] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.479] } [18:03:18.479] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.479] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.479] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.479] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.479] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.479] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.479] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.479] base::names(...future.oldOptions)) [18:03:18.479] } [18:03:18.479] if (FALSE) { [18:03:18.479] } [18:03:18.479] else { [18:03:18.479] if (TRUE) { [18:03:18.479] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.479] open = "w") [18:03:18.479] } [18:03:18.479] else { [18:03:18.479] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.479] windows = "NUL", "/dev/null"), open = "w") [18:03:18.479] } [18:03:18.479] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.479] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.479] base::sink(type = "output", split = FALSE) [18:03:18.479] base::close(...future.stdout) [18:03:18.479] }, add = TRUE) [18:03:18.479] } [18:03:18.479] ...future.frame <- base::sys.nframe() [18:03:18.479] ...future.conditions <- base::list() [18:03:18.479] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.479] if (FALSE) { [18:03:18.479] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.479] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.479] } [18:03:18.479] ...future.result <- base::tryCatch({ [18:03:18.479] base::withCallingHandlers({ [18:03:18.479] ...future.value <- base::withVisible(base::local({ [18:03:18.479] ...future.makeSendCondition <- local({ [18:03:18.479] sendCondition <- NULL [18:03:18.479] function(frame = 1L) { [18:03:18.479] if (is.function(sendCondition)) [18:03:18.479] return(sendCondition) [18:03:18.479] ns <- getNamespace("parallel") [18:03:18.479] if (exists("sendData", mode = "function", [18:03:18.479] envir = ns)) { [18:03:18.479] parallel_sendData <- get("sendData", mode = "function", [18:03:18.479] envir = ns) [18:03:18.479] envir <- sys.frame(frame) [18:03:18.479] master <- NULL [18:03:18.479] while (!identical(envir, .GlobalEnv) && [18:03:18.479] !identical(envir, emptyenv())) { [18:03:18.479] if (exists("master", mode = "list", envir = envir, [18:03:18.479] inherits = FALSE)) { [18:03:18.479] master <- get("master", mode = "list", [18:03:18.479] envir = envir, inherits = FALSE) [18:03:18.479] if (inherits(master, c("SOCKnode", [18:03:18.479] "SOCK0node"))) { [18:03:18.479] sendCondition <<- function(cond) { [18:03:18.479] data <- list(type = "VALUE", value = cond, [18:03:18.479] success = TRUE) [18:03:18.479] parallel_sendData(master, data) [18:03:18.479] } [18:03:18.479] return(sendCondition) [18:03:18.479] } [18:03:18.479] } [18:03:18.479] frame <- frame + 1L [18:03:18.479] envir <- sys.frame(frame) [18:03:18.479] } [18:03:18.479] } [18:03:18.479] sendCondition <<- function(cond) NULL [18:03:18.479] } [18:03:18.479] }) [18:03:18.479] withCallingHandlers({ [18:03:18.479] { [18:03:18.479] sample(x, size = 1L) [18:03:18.479] } [18:03:18.479] }, immediateCondition = function(cond) { [18:03:18.479] sendCondition <- ...future.makeSendCondition() [18:03:18.479] sendCondition(cond) [18:03:18.479] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.479] { [18:03:18.479] inherits <- base::inherits [18:03:18.479] invokeRestart <- base::invokeRestart [18:03:18.479] is.null <- base::is.null [18:03:18.479] muffled <- FALSE [18:03:18.479] if (inherits(cond, "message")) { [18:03:18.479] muffled <- grepl(pattern, "muffleMessage") [18:03:18.479] if (muffled) [18:03:18.479] invokeRestart("muffleMessage") [18:03:18.479] } [18:03:18.479] else if (inherits(cond, "warning")) { [18:03:18.479] muffled <- grepl(pattern, "muffleWarning") [18:03:18.479] if (muffled) [18:03:18.479] invokeRestart("muffleWarning") [18:03:18.479] } [18:03:18.479] else if (inherits(cond, "condition")) { [18:03:18.479] if (!is.null(pattern)) { [18:03:18.479] computeRestarts <- base::computeRestarts [18:03:18.479] grepl <- base::grepl [18:03:18.479] restarts <- computeRestarts(cond) [18:03:18.479] for (restart in restarts) { [18:03:18.479] name <- restart$name [18:03:18.479] if (is.null(name)) [18:03:18.479] next [18:03:18.479] if (!grepl(pattern, name)) [18:03:18.479] next [18:03:18.479] invokeRestart(restart) [18:03:18.479] muffled <- TRUE [18:03:18.479] break [18:03:18.479] } [18:03:18.479] } [18:03:18.479] } [18:03:18.479] invisible(muffled) [18:03:18.479] } [18:03:18.479] muffleCondition(cond) [18:03:18.479] }) [18:03:18.479] })) [18:03:18.479] future::FutureResult(value = ...future.value$value, [18:03:18.479] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.479] ...future.rng), globalenv = if (FALSE) [18:03:18.479] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.479] ...future.globalenv.names)) [18:03:18.479] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.479] }, condition = base::local({ [18:03:18.479] c <- base::c [18:03:18.479] inherits <- base::inherits [18:03:18.479] invokeRestart <- base::invokeRestart [18:03:18.479] length <- base::length [18:03:18.479] list <- base::list [18:03:18.479] seq.int <- base::seq.int [18:03:18.479] signalCondition <- base::signalCondition [18:03:18.479] sys.calls <- base::sys.calls [18:03:18.479] `[[` <- base::`[[` [18:03:18.479] `+` <- base::`+` [18:03:18.479] `<<-` <- base::`<<-` [18:03:18.479] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.479] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.479] 3L)] [18:03:18.479] } [18:03:18.479] function(cond) { [18:03:18.479] is_error <- inherits(cond, "error") [18:03:18.479] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.479] NULL) [18:03:18.479] if (is_error) { [18:03:18.479] sessionInformation <- function() { [18:03:18.479] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.479] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.479] search = base::search(), system = base::Sys.info()) [18:03:18.479] } [18:03:18.479] ...future.conditions[[length(...future.conditions) + [18:03:18.479] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.479] cond$call), session = sessionInformation(), [18:03:18.479] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.479] signalCondition(cond) [18:03:18.479] } [18:03:18.479] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.479] "immediateCondition"))) { [18:03:18.479] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.479] ...future.conditions[[length(...future.conditions) + [18:03:18.479] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.479] if (TRUE && !signal) { [18:03:18.479] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.479] { [18:03:18.479] inherits <- base::inherits [18:03:18.479] invokeRestart <- base::invokeRestart [18:03:18.479] is.null <- base::is.null [18:03:18.479] muffled <- FALSE [18:03:18.479] if (inherits(cond, "message")) { [18:03:18.479] muffled <- grepl(pattern, "muffleMessage") [18:03:18.479] if (muffled) [18:03:18.479] invokeRestart("muffleMessage") [18:03:18.479] } [18:03:18.479] else if (inherits(cond, "warning")) { [18:03:18.479] muffled <- grepl(pattern, "muffleWarning") [18:03:18.479] if (muffled) [18:03:18.479] invokeRestart("muffleWarning") [18:03:18.479] } [18:03:18.479] else if (inherits(cond, "condition")) { [18:03:18.479] if (!is.null(pattern)) { [18:03:18.479] computeRestarts <- base::computeRestarts [18:03:18.479] grepl <- base::grepl [18:03:18.479] restarts <- computeRestarts(cond) [18:03:18.479] for (restart in restarts) { [18:03:18.479] name <- restart$name [18:03:18.479] if (is.null(name)) [18:03:18.479] next [18:03:18.479] if (!grepl(pattern, name)) [18:03:18.479] next [18:03:18.479] invokeRestart(restart) [18:03:18.479] muffled <- TRUE [18:03:18.479] break [18:03:18.479] } [18:03:18.479] } [18:03:18.479] } [18:03:18.479] invisible(muffled) [18:03:18.479] } [18:03:18.479] muffleCondition(cond, pattern = "^muffle") [18:03:18.479] } [18:03:18.479] } [18:03:18.479] else { [18:03:18.479] if (TRUE) { [18:03:18.479] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.479] { [18:03:18.479] inherits <- base::inherits [18:03:18.479] invokeRestart <- base::invokeRestart [18:03:18.479] is.null <- base::is.null [18:03:18.479] muffled <- FALSE [18:03:18.479] if (inherits(cond, "message")) { [18:03:18.479] muffled <- grepl(pattern, "muffleMessage") [18:03:18.479] if (muffled) [18:03:18.479] invokeRestart("muffleMessage") [18:03:18.479] } [18:03:18.479] else if (inherits(cond, "warning")) { [18:03:18.479] muffled <- grepl(pattern, "muffleWarning") [18:03:18.479] if (muffled) [18:03:18.479] invokeRestart("muffleWarning") [18:03:18.479] } [18:03:18.479] else if (inherits(cond, "condition")) { [18:03:18.479] if (!is.null(pattern)) { [18:03:18.479] computeRestarts <- base::computeRestarts [18:03:18.479] grepl <- base::grepl [18:03:18.479] restarts <- computeRestarts(cond) [18:03:18.479] for (restart in restarts) { [18:03:18.479] name <- restart$name [18:03:18.479] if (is.null(name)) [18:03:18.479] next [18:03:18.479] if (!grepl(pattern, name)) [18:03:18.479] next [18:03:18.479] invokeRestart(restart) [18:03:18.479] muffled <- TRUE [18:03:18.479] break [18:03:18.479] } [18:03:18.479] } [18:03:18.479] } [18:03:18.479] invisible(muffled) [18:03:18.479] } [18:03:18.479] muffleCondition(cond, pattern = "^muffle") [18:03:18.479] } [18:03:18.479] } [18:03:18.479] } [18:03:18.479] })) [18:03:18.479] }, error = function(ex) { [18:03:18.479] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.479] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.479] ...future.rng), started = ...future.startTime, [18:03:18.479] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.479] version = "1.8"), class = "FutureResult") [18:03:18.479] }, finally = { [18:03:18.479] if (!identical(...future.workdir, getwd())) [18:03:18.479] setwd(...future.workdir) [18:03:18.479] { [18:03:18.479] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.479] ...future.oldOptions$nwarnings <- NULL [18:03:18.479] } [18:03:18.479] base::options(...future.oldOptions) [18:03:18.479] if (.Platform$OS.type == "windows") { [18:03:18.479] old_names <- names(...future.oldEnvVars) [18:03:18.479] envs <- base::Sys.getenv() [18:03:18.479] names <- names(envs) [18:03:18.479] common <- intersect(names, old_names) [18:03:18.479] added <- setdiff(names, old_names) [18:03:18.479] removed <- setdiff(old_names, names) [18:03:18.479] changed <- common[...future.oldEnvVars[common] != [18:03:18.479] envs[common]] [18:03:18.479] NAMES <- toupper(changed) [18:03:18.479] args <- list() [18:03:18.479] for (kk in seq_along(NAMES)) { [18:03:18.479] name <- changed[[kk]] [18:03:18.479] NAME <- NAMES[[kk]] [18:03:18.479] if (name != NAME && is.element(NAME, old_names)) [18:03:18.479] next [18:03:18.479] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.479] } [18:03:18.479] NAMES <- toupper(added) [18:03:18.479] for (kk in seq_along(NAMES)) { [18:03:18.479] name <- added[[kk]] [18:03:18.479] NAME <- NAMES[[kk]] [18:03:18.479] if (name != NAME && is.element(NAME, old_names)) [18:03:18.479] next [18:03:18.479] args[[name]] <- "" [18:03:18.479] } [18:03:18.479] NAMES <- toupper(removed) [18:03:18.479] for (kk in seq_along(NAMES)) { [18:03:18.479] name <- removed[[kk]] [18:03:18.479] NAME <- NAMES[[kk]] [18:03:18.479] if (name != NAME && is.element(NAME, old_names)) [18:03:18.479] next [18:03:18.479] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.479] } [18:03:18.479] if (length(args) > 0) [18:03:18.479] base::do.call(base::Sys.setenv, args = args) [18:03:18.479] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.479] } [18:03:18.479] else { [18:03:18.479] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.479] } [18:03:18.479] { [18:03:18.479] if (base::length(...future.futureOptionsAdded) > [18:03:18.479] 0L) { [18:03:18.479] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.479] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.479] base::options(opts) [18:03:18.479] } [18:03:18.479] { [18:03:18.479] { [18:03:18.479] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.479] NULL [18:03:18.479] } [18:03:18.479] options(future.plan = NULL) [18:03:18.479] if (is.na(NA_character_)) [18:03:18.479] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.479] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.479] future::plan(list(function (..., workers = availableCores(), [18:03:18.479] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.479] envir = parent.frame()) [18:03:18.479] { [18:03:18.479] if (is.function(workers)) [18:03:18.479] workers <- workers() [18:03:18.479] workers <- structure(as.integer(workers), [18:03:18.479] class = class(workers)) [18:03:18.479] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.479] workers >= 1) [18:03:18.479] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.479] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.479] } [18:03:18.479] future <- MultisessionFuture(..., workers = workers, [18:03:18.479] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.479] envir = envir) [18:03:18.479] if (!future$lazy) [18:03:18.479] future <- run(future) [18:03:18.479] invisible(future) [18:03:18.479] }), .cleanup = FALSE, .init = FALSE) [18:03:18.479] } [18:03:18.479] } [18:03:18.479] } [18:03:18.479] }) [18:03:18.479] if (TRUE) { [18:03:18.479] base::sink(type = "output", split = FALSE) [18:03:18.479] if (TRUE) { [18:03:18.479] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.479] } [18:03:18.479] else { [18:03:18.479] ...future.result["stdout"] <- base::list(NULL) [18:03:18.479] } [18:03:18.479] base::close(...future.stdout) [18:03:18.479] ...future.stdout <- NULL [18:03:18.479] } [18:03:18.479] ...future.result$conditions <- ...future.conditions [18:03:18.479] ...future.result$finished <- base::Sys.time() [18:03:18.479] ...future.result [18:03:18.479] } [18:03:18.484] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.485] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.485] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.485] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.486] MultisessionFuture started [18:03:18.486] - Launch lazy future ... done [18:03:18.486] run() for 'MultisessionFuture' ... done [18:03:18.487] getGlobalsAndPackages() ... [18:03:18.487] Searching for globals... [18:03:18.488] - globals found: [3] '{', 'sample', 'x' [18:03:18.488] Searching for globals ... DONE [18:03:18.488] Resolving globals: FALSE [18:03:18.489] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.489] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.489] - globals: [1] 'x' [18:03:18.490] [18:03:18.490] getGlobalsAndPackages() ... DONE [18:03:18.490] run() for 'Future' ... [18:03:18.490] - state: 'created' [18:03:18.490] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.504] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.504] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.504] - Field: 'node' [18:03:18.505] - Field: 'label' [18:03:18.505] - Field: 'local' [18:03:18.505] - Field: 'owner' [18:03:18.505] - Field: 'envir' [18:03:18.505] - Field: 'workers' [18:03:18.506] - Field: 'packages' [18:03:18.506] - Field: 'gc' [18:03:18.506] - Field: 'conditions' [18:03:18.506] - Field: 'persistent' [18:03:18.506] - Field: 'expr' [18:03:18.506] - Field: 'uuid' [18:03:18.507] - Field: 'seed' [18:03:18.507] - Field: 'version' [18:03:18.507] - Field: 'result' [18:03:18.507] - Field: 'asynchronous' [18:03:18.507] - Field: 'calls' [18:03:18.507] - Field: 'globals' [18:03:18.508] - Field: 'stdout' [18:03:18.508] - Field: 'earlySignal' [18:03:18.508] - Field: 'lazy' [18:03:18.508] - Field: 'state' [18:03:18.508] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.509] - Launch lazy future ... [18:03:18.509] Packages needed by the future expression (n = 0): [18:03:18.509] Packages needed by future strategies (n = 0): [18:03:18.510] { [18:03:18.510] { [18:03:18.510] { [18:03:18.510] ...future.startTime <- base::Sys.time() [18:03:18.510] { [18:03:18.510] { [18:03:18.510] { [18:03:18.510] { [18:03:18.510] { [18:03:18.510] base::local({ [18:03:18.510] has_future <- base::requireNamespace("future", [18:03:18.510] quietly = TRUE) [18:03:18.510] if (has_future) { [18:03:18.510] ns <- base::getNamespace("future") [18:03:18.510] version <- ns[[".package"]][["version"]] [18:03:18.510] if (is.null(version)) [18:03:18.510] version <- utils::packageVersion("future") [18:03:18.510] } [18:03:18.510] else { [18:03:18.510] version <- NULL [18:03:18.510] } [18:03:18.510] if (!has_future || version < "1.8.0") { [18:03:18.510] info <- base::c(r_version = base::gsub("R version ", [18:03:18.510] "", base::R.version$version.string), [18:03:18.510] platform = base::sprintf("%s (%s-bit)", [18:03:18.510] base::R.version$platform, 8 * [18:03:18.510] base::.Machine$sizeof.pointer), [18:03:18.510] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.510] "release", "version")], collapse = " "), [18:03:18.510] hostname = base::Sys.info()[["nodename"]]) [18:03:18.510] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.510] info) [18:03:18.510] info <- base::paste(info, collapse = "; ") [18:03:18.510] if (!has_future) { [18:03:18.510] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.510] info) [18:03:18.510] } [18:03:18.510] else { [18:03:18.510] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.510] info, version) [18:03:18.510] } [18:03:18.510] base::stop(msg) [18:03:18.510] } [18:03:18.510] }) [18:03:18.510] } [18:03:18.510] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.510] base::options(mc.cores = 1L) [18:03:18.510] } [18:03:18.510] options(future.plan = NULL) [18:03:18.510] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.510] future::plan("default", .cleanup = FALSE, [18:03:18.510] .init = FALSE) [18:03:18.510] } [18:03:18.510] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:18.510] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:18.510] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:18.510] } [18:03:18.510] ...future.workdir <- getwd() [18:03:18.510] } [18:03:18.510] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.510] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.510] } [18:03:18.510] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.510] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.510] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.510] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.510] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.510] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.510] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.510] base::names(...future.oldOptions)) [18:03:18.510] } [18:03:18.510] if (FALSE) { [18:03:18.510] } [18:03:18.510] else { [18:03:18.510] if (TRUE) { [18:03:18.510] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.510] open = "w") [18:03:18.510] } [18:03:18.510] else { [18:03:18.510] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.510] windows = "NUL", "/dev/null"), open = "w") [18:03:18.510] } [18:03:18.510] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.510] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.510] base::sink(type = "output", split = FALSE) [18:03:18.510] base::close(...future.stdout) [18:03:18.510] }, add = TRUE) [18:03:18.510] } [18:03:18.510] ...future.frame <- base::sys.nframe() [18:03:18.510] ...future.conditions <- base::list() [18:03:18.510] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.510] if (FALSE) { [18:03:18.510] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.510] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.510] } [18:03:18.510] ...future.result <- base::tryCatch({ [18:03:18.510] base::withCallingHandlers({ [18:03:18.510] ...future.value <- base::withVisible(base::local({ [18:03:18.510] ...future.makeSendCondition <- local({ [18:03:18.510] sendCondition <- NULL [18:03:18.510] function(frame = 1L) { [18:03:18.510] if (is.function(sendCondition)) [18:03:18.510] return(sendCondition) [18:03:18.510] ns <- getNamespace("parallel") [18:03:18.510] if (exists("sendData", mode = "function", [18:03:18.510] envir = ns)) { [18:03:18.510] parallel_sendData <- get("sendData", mode = "function", [18:03:18.510] envir = ns) [18:03:18.510] envir <- sys.frame(frame) [18:03:18.510] master <- NULL [18:03:18.510] while (!identical(envir, .GlobalEnv) && [18:03:18.510] !identical(envir, emptyenv())) { [18:03:18.510] if (exists("master", mode = "list", envir = envir, [18:03:18.510] inherits = FALSE)) { [18:03:18.510] master <- get("master", mode = "list", [18:03:18.510] envir = envir, inherits = FALSE) [18:03:18.510] if (inherits(master, c("SOCKnode", [18:03:18.510] "SOCK0node"))) { [18:03:18.510] sendCondition <<- function(cond) { [18:03:18.510] data <- list(type = "VALUE", value = cond, [18:03:18.510] success = TRUE) [18:03:18.510] parallel_sendData(master, data) [18:03:18.510] } [18:03:18.510] return(sendCondition) [18:03:18.510] } [18:03:18.510] } [18:03:18.510] frame <- frame + 1L [18:03:18.510] envir <- sys.frame(frame) [18:03:18.510] } [18:03:18.510] } [18:03:18.510] sendCondition <<- function(cond) NULL [18:03:18.510] } [18:03:18.510] }) [18:03:18.510] withCallingHandlers({ [18:03:18.510] { [18:03:18.510] sample(x, size = 1L) [18:03:18.510] } [18:03:18.510] }, immediateCondition = function(cond) { [18:03:18.510] sendCondition <- ...future.makeSendCondition() [18:03:18.510] sendCondition(cond) [18:03:18.510] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.510] { [18:03:18.510] inherits <- base::inherits [18:03:18.510] invokeRestart <- base::invokeRestart [18:03:18.510] is.null <- base::is.null [18:03:18.510] muffled <- FALSE [18:03:18.510] if (inherits(cond, "message")) { [18:03:18.510] muffled <- grepl(pattern, "muffleMessage") [18:03:18.510] if (muffled) [18:03:18.510] invokeRestart("muffleMessage") [18:03:18.510] } [18:03:18.510] else if (inherits(cond, "warning")) { [18:03:18.510] muffled <- grepl(pattern, "muffleWarning") [18:03:18.510] if (muffled) [18:03:18.510] invokeRestart("muffleWarning") [18:03:18.510] } [18:03:18.510] else if (inherits(cond, "condition")) { [18:03:18.510] if (!is.null(pattern)) { [18:03:18.510] computeRestarts <- base::computeRestarts [18:03:18.510] grepl <- base::grepl [18:03:18.510] restarts <- computeRestarts(cond) [18:03:18.510] for (restart in restarts) { [18:03:18.510] name <- restart$name [18:03:18.510] if (is.null(name)) [18:03:18.510] next [18:03:18.510] if (!grepl(pattern, name)) [18:03:18.510] next [18:03:18.510] invokeRestart(restart) [18:03:18.510] muffled <- TRUE [18:03:18.510] break [18:03:18.510] } [18:03:18.510] } [18:03:18.510] } [18:03:18.510] invisible(muffled) [18:03:18.510] } [18:03:18.510] muffleCondition(cond) [18:03:18.510] }) [18:03:18.510] })) [18:03:18.510] future::FutureResult(value = ...future.value$value, [18:03:18.510] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.510] ...future.rng), globalenv = if (FALSE) [18:03:18.510] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.510] ...future.globalenv.names)) [18:03:18.510] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.510] }, condition = base::local({ [18:03:18.510] c <- base::c [18:03:18.510] inherits <- base::inherits [18:03:18.510] invokeRestart <- base::invokeRestart [18:03:18.510] length <- base::length [18:03:18.510] list <- base::list [18:03:18.510] seq.int <- base::seq.int [18:03:18.510] signalCondition <- base::signalCondition [18:03:18.510] sys.calls <- base::sys.calls [18:03:18.510] `[[` <- base::`[[` [18:03:18.510] `+` <- base::`+` [18:03:18.510] `<<-` <- base::`<<-` [18:03:18.510] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.510] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.510] 3L)] [18:03:18.510] } [18:03:18.510] function(cond) { [18:03:18.510] is_error <- inherits(cond, "error") [18:03:18.510] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.510] NULL) [18:03:18.510] if (is_error) { [18:03:18.510] sessionInformation <- function() { [18:03:18.510] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.510] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.510] search = base::search(), system = base::Sys.info()) [18:03:18.510] } [18:03:18.510] ...future.conditions[[length(...future.conditions) + [18:03:18.510] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.510] cond$call), session = sessionInformation(), [18:03:18.510] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.510] signalCondition(cond) [18:03:18.510] } [18:03:18.510] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.510] "immediateCondition"))) { [18:03:18.510] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.510] ...future.conditions[[length(...future.conditions) + [18:03:18.510] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.510] if (TRUE && !signal) { [18:03:18.510] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.510] { [18:03:18.510] inherits <- base::inherits [18:03:18.510] invokeRestart <- base::invokeRestart [18:03:18.510] is.null <- base::is.null [18:03:18.510] muffled <- FALSE [18:03:18.510] if (inherits(cond, "message")) { [18:03:18.510] muffled <- grepl(pattern, "muffleMessage") [18:03:18.510] if (muffled) [18:03:18.510] invokeRestart("muffleMessage") [18:03:18.510] } [18:03:18.510] else if (inherits(cond, "warning")) { [18:03:18.510] muffled <- grepl(pattern, "muffleWarning") [18:03:18.510] if (muffled) [18:03:18.510] invokeRestart("muffleWarning") [18:03:18.510] } [18:03:18.510] else if (inherits(cond, "condition")) { [18:03:18.510] if (!is.null(pattern)) { [18:03:18.510] computeRestarts <- base::computeRestarts [18:03:18.510] grepl <- base::grepl [18:03:18.510] restarts <- computeRestarts(cond) [18:03:18.510] for (restart in restarts) { [18:03:18.510] name <- restart$name [18:03:18.510] if (is.null(name)) [18:03:18.510] next [18:03:18.510] if (!grepl(pattern, name)) [18:03:18.510] next [18:03:18.510] invokeRestart(restart) [18:03:18.510] muffled <- TRUE [18:03:18.510] break [18:03:18.510] } [18:03:18.510] } [18:03:18.510] } [18:03:18.510] invisible(muffled) [18:03:18.510] } [18:03:18.510] muffleCondition(cond, pattern = "^muffle") [18:03:18.510] } [18:03:18.510] } [18:03:18.510] else { [18:03:18.510] if (TRUE) { [18:03:18.510] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.510] { [18:03:18.510] inherits <- base::inherits [18:03:18.510] invokeRestart <- base::invokeRestart [18:03:18.510] is.null <- base::is.null [18:03:18.510] muffled <- FALSE [18:03:18.510] if (inherits(cond, "message")) { [18:03:18.510] muffled <- grepl(pattern, "muffleMessage") [18:03:18.510] if (muffled) [18:03:18.510] invokeRestart("muffleMessage") [18:03:18.510] } [18:03:18.510] else if (inherits(cond, "warning")) { [18:03:18.510] muffled <- grepl(pattern, "muffleWarning") [18:03:18.510] if (muffled) [18:03:18.510] invokeRestart("muffleWarning") [18:03:18.510] } [18:03:18.510] else if (inherits(cond, "condition")) { [18:03:18.510] if (!is.null(pattern)) { [18:03:18.510] computeRestarts <- base::computeRestarts [18:03:18.510] grepl <- base::grepl [18:03:18.510] restarts <- computeRestarts(cond) [18:03:18.510] for (restart in restarts) { [18:03:18.510] name <- restart$name [18:03:18.510] if (is.null(name)) [18:03:18.510] next [18:03:18.510] if (!grepl(pattern, name)) [18:03:18.510] next [18:03:18.510] invokeRestart(restart) [18:03:18.510] muffled <- TRUE [18:03:18.510] break [18:03:18.510] } [18:03:18.510] } [18:03:18.510] } [18:03:18.510] invisible(muffled) [18:03:18.510] } [18:03:18.510] muffleCondition(cond, pattern = "^muffle") [18:03:18.510] } [18:03:18.510] } [18:03:18.510] } [18:03:18.510] })) [18:03:18.510] }, error = function(ex) { [18:03:18.510] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.510] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.510] ...future.rng), started = ...future.startTime, [18:03:18.510] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.510] version = "1.8"), class = "FutureResult") [18:03:18.510] }, finally = { [18:03:18.510] if (!identical(...future.workdir, getwd())) [18:03:18.510] setwd(...future.workdir) [18:03:18.510] { [18:03:18.510] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.510] ...future.oldOptions$nwarnings <- NULL [18:03:18.510] } [18:03:18.510] base::options(...future.oldOptions) [18:03:18.510] if (.Platform$OS.type == "windows") { [18:03:18.510] old_names <- names(...future.oldEnvVars) [18:03:18.510] envs <- base::Sys.getenv() [18:03:18.510] names <- names(envs) [18:03:18.510] common <- intersect(names, old_names) [18:03:18.510] added <- setdiff(names, old_names) [18:03:18.510] removed <- setdiff(old_names, names) [18:03:18.510] changed <- common[...future.oldEnvVars[common] != [18:03:18.510] envs[common]] [18:03:18.510] NAMES <- toupper(changed) [18:03:18.510] args <- list() [18:03:18.510] for (kk in seq_along(NAMES)) { [18:03:18.510] name <- changed[[kk]] [18:03:18.510] NAME <- NAMES[[kk]] [18:03:18.510] if (name != NAME && is.element(NAME, old_names)) [18:03:18.510] next [18:03:18.510] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.510] } [18:03:18.510] NAMES <- toupper(added) [18:03:18.510] for (kk in seq_along(NAMES)) { [18:03:18.510] name <- added[[kk]] [18:03:18.510] NAME <- NAMES[[kk]] [18:03:18.510] if (name != NAME && is.element(NAME, old_names)) [18:03:18.510] next [18:03:18.510] args[[name]] <- "" [18:03:18.510] } [18:03:18.510] NAMES <- toupper(removed) [18:03:18.510] for (kk in seq_along(NAMES)) { [18:03:18.510] name <- removed[[kk]] [18:03:18.510] NAME <- NAMES[[kk]] [18:03:18.510] if (name != NAME && is.element(NAME, old_names)) [18:03:18.510] next [18:03:18.510] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.510] } [18:03:18.510] if (length(args) > 0) [18:03:18.510] base::do.call(base::Sys.setenv, args = args) [18:03:18.510] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.510] } [18:03:18.510] else { [18:03:18.510] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.510] } [18:03:18.510] { [18:03:18.510] if (base::length(...future.futureOptionsAdded) > [18:03:18.510] 0L) { [18:03:18.510] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.510] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.510] base::options(opts) [18:03:18.510] } [18:03:18.510] { [18:03:18.510] { [18:03:18.510] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.510] NULL [18:03:18.510] } [18:03:18.510] options(future.plan = NULL) [18:03:18.510] if (is.na(NA_character_)) [18:03:18.510] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.510] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.510] future::plan(list(function (..., workers = availableCores(), [18:03:18.510] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.510] envir = parent.frame()) [18:03:18.510] { [18:03:18.510] if (is.function(workers)) [18:03:18.510] workers <- workers() [18:03:18.510] workers <- structure(as.integer(workers), [18:03:18.510] class = class(workers)) [18:03:18.510] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.510] workers >= 1) [18:03:18.510] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.510] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.510] } [18:03:18.510] future <- MultisessionFuture(..., workers = workers, [18:03:18.510] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.510] envir = envir) [18:03:18.510] if (!future$lazy) [18:03:18.510] future <- run(future) [18:03:18.510] invisible(future) [18:03:18.510] }), .cleanup = FALSE, .init = FALSE) [18:03:18.510] } [18:03:18.510] } [18:03:18.510] } [18:03:18.510] }) [18:03:18.510] if (TRUE) { [18:03:18.510] base::sink(type = "output", split = FALSE) [18:03:18.510] if (TRUE) { [18:03:18.510] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.510] } [18:03:18.510] else { [18:03:18.510] ...future.result["stdout"] <- base::list(NULL) [18:03:18.510] } [18:03:18.510] base::close(...future.stdout) [18:03:18.510] ...future.stdout <- NULL [18:03:18.510] } [18:03:18.510] ...future.result$conditions <- ...future.conditions [18:03:18.510] ...future.result$finished <- base::Sys.time() [18:03:18.510] ...future.result [18:03:18.510] } [18:03:18.515] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:18.515] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:18.516] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:18.516] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:18.516] MultisessionFuture started [18:03:18.517] - Launch lazy future ... done [18:03:18.517] run() for 'MultisessionFuture' ... done [18:03:18.517] getGlobalsAndPackages() ... [18:03:18.517] Searching for globals... [18:03:18.518] - globals found: [3] '{', 'sample', 'x' [18:03:18.519] Searching for globals ... DONE [18:03:18.519] Resolving globals: FALSE [18:03:18.519] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.520] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.520] - globals: [1] 'x' [18:03:18.520] [18:03:18.520] getGlobalsAndPackages() ... DONE [18:03:18.521] run() for 'Future' ... [18:03:18.521] - state: 'created' [18:03:18.521] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.535] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.535] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.535] - Field: 'node' [18:03:18.535] - Field: 'label' [18:03:18.535] - Field: 'local' [18:03:18.536] - Field: 'owner' [18:03:18.536] - Field: 'envir' [18:03:18.536] - Field: 'workers' [18:03:18.536] - Field: 'packages' [18:03:18.536] - Field: 'gc' [18:03:18.536] - Field: 'conditions' [18:03:18.537] - Field: 'persistent' [18:03:18.537] - Field: 'expr' [18:03:18.537] - Field: 'uuid' [18:03:18.537] - Field: 'seed' [18:03:18.537] - Field: 'version' [18:03:18.538] - Field: 'result' [18:03:18.538] - Field: 'asynchronous' [18:03:18.538] - Field: 'calls' [18:03:18.538] - Field: 'globals' [18:03:18.538] - Field: 'stdout' [18:03:18.538] - Field: 'earlySignal' [18:03:18.539] - Field: 'lazy' [18:03:18.539] - Field: 'state' [18:03:18.539] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.539] - Launch lazy future ... [18:03:18.539] Packages needed by the future expression (n = 0): [18:03:18.540] Packages needed by future strategies (n = 0): [18:03:18.540] { [18:03:18.540] { [18:03:18.540] { [18:03:18.540] ...future.startTime <- base::Sys.time() [18:03:18.540] { [18:03:18.540] { [18:03:18.540] { [18:03:18.540] { [18:03:18.540] { [18:03:18.540] base::local({ [18:03:18.540] has_future <- base::requireNamespace("future", [18:03:18.540] quietly = TRUE) [18:03:18.540] if (has_future) { [18:03:18.540] ns <- base::getNamespace("future") [18:03:18.540] version <- ns[[".package"]][["version"]] [18:03:18.540] if (is.null(version)) [18:03:18.540] version <- utils::packageVersion("future") [18:03:18.540] } [18:03:18.540] else { [18:03:18.540] version <- NULL [18:03:18.540] } [18:03:18.540] if (!has_future || version < "1.8.0") { [18:03:18.540] info <- base::c(r_version = base::gsub("R version ", [18:03:18.540] "", base::R.version$version.string), [18:03:18.540] platform = base::sprintf("%s (%s-bit)", [18:03:18.540] base::R.version$platform, 8 * [18:03:18.540] base::.Machine$sizeof.pointer), [18:03:18.540] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.540] "release", "version")], collapse = " "), [18:03:18.540] hostname = base::Sys.info()[["nodename"]]) [18:03:18.540] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.540] info) [18:03:18.540] info <- base::paste(info, collapse = "; ") [18:03:18.540] if (!has_future) { [18:03:18.540] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.540] info) [18:03:18.540] } [18:03:18.540] else { [18:03:18.540] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.540] info, version) [18:03:18.540] } [18:03:18.540] base::stop(msg) [18:03:18.540] } [18:03:18.540] }) [18:03:18.540] } [18:03:18.540] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.540] base::options(mc.cores = 1L) [18:03:18.540] } [18:03:18.540] options(future.plan = NULL) [18:03:18.540] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.540] future::plan("default", .cleanup = FALSE, [18:03:18.540] .init = FALSE) [18:03:18.540] } [18:03:18.540] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:18.540] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:18.540] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:18.540] } [18:03:18.540] ...future.workdir <- getwd() [18:03:18.540] } [18:03:18.540] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.540] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.540] } [18:03:18.540] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.540] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.540] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.540] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.540] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.540] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.540] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.540] base::names(...future.oldOptions)) [18:03:18.540] } [18:03:18.540] if (FALSE) { [18:03:18.540] } [18:03:18.540] else { [18:03:18.540] if (TRUE) { [18:03:18.540] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.540] open = "w") [18:03:18.540] } [18:03:18.540] else { [18:03:18.540] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.540] windows = "NUL", "/dev/null"), open = "w") [18:03:18.540] } [18:03:18.540] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.540] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.540] base::sink(type = "output", split = FALSE) [18:03:18.540] base::close(...future.stdout) [18:03:18.540] }, add = TRUE) [18:03:18.540] } [18:03:18.540] ...future.frame <- base::sys.nframe() [18:03:18.540] ...future.conditions <- base::list() [18:03:18.540] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.540] if (FALSE) { [18:03:18.540] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.540] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.540] } [18:03:18.540] ...future.result <- base::tryCatch({ [18:03:18.540] base::withCallingHandlers({ [18:03:18.540] ...future.value <- base::withVisible(base::local({ [18:03:18.540] ...future.makeSendCondition <- local({ [18:03:18.540] sendCondition <- NULL [18:03:18.540] function(frame = 1L) { [18:03:18.540] if (is.function(sendCondition)) [18:03:18.540] return(sendCondition) [18:03:18.540] ns <- getNamespace("parallel") [18:03:18.540] if (exists("sendData", mode = "function", [18:03:18.540] envir = ns)) { [18:03:18.540] parallel_sendData <- get("sendData", mode = "function", [18:03:18.540] envir = ns) [18:03:18.540] envir <- sys.frame(frame) [18:03:18.540] master <- NULL [18:03:18.540] while (!identical(envir, .GlobalEnv) && [18:03:18.540] !identical(envir, emptyenv())) { [18:03:18.540] if (exists("master", mode = "list", envir = envir, [18:03:18.540] inherits = FALSE)) { [18:03:18.540] master <- get("master", mode = "list", [18:03:18.540] envir = envir, inherits = FALSE) [18:03:18.540] if (inherits(master, c("SOCKnode", [18:03:18.540] "SOCK0node"))) { [18:03:18.540] sendCondition <<- function(cond) { [18:03:18.540] data <- list(type = "VALUE", value = cond, [18:03:18.540] success = TRUE) [18:03:18.540] parallel_sendData(master, data) [18:03:18.540] } [18:03:18.540] return(sendCondition) [18:03:18.540] } [18:03:18.540] } [18:03:18.540] frame <- frame + 1L [18:03:18.540] envir <- sys.frame(frame) [18:03:18.540] } [18:03:18.540] } [18:03:18.540] sendCondition <<- function(cond) NULL [18:03:18.540] } [18:03:18.540] }) [18:03:18.540] withCallingHandlers({ [18:03:18.540] { [18:03:18.540] sample(x, size = 1L) [18:03:18.540] } [18:03:18.540] }, immediateCondition = function(cond) { [18:03:18.540] sendCondition <- ...future.makeSendCondition() [18:03:18.540] sendCondition(cond) [18:03:18.540] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.540] { [18:03:18.540] inherits <- base::inherits [18:03:18.540] invokeRestart <- base::invokeRestart [18:03:18.540] is.null <- base::is.null [18:03:18.540] muffled <- FALSE [18:03:18.540] if (inherits(cond, "message")) { [18:03:18.540] muffled <- grepl(pattern, "muffleMessage") [18:03:18.540] if (muffled) [18:03:18.540] invokeRestart("muffleMessage") [18:03:18.540] } [18:03:18.540] else if (inherits(cond, "warning")) { [18:03:18.540] muffled <- grepl(pattern, "muffleWarning") [18:03:18.540] if (muffled) [18:03:18.540] invokeRestart("muffleWarning") [18:03:18.540] } [18:03:18.540] else if (inherits(cond, "condition")) { [18:03:18.540] if (!is.null(pattern)) { [18:03:18.540] computeRestarts <- base::computeRestarts [18:03:18.540] grepl <- base::grepl [18:03:18.540] restarts <- computeRestarts(cond) [18:03:18.540] for (restart in restarts) { [18:03:18.540] name <- restart$name [18:03:18.540] if (is.null(name)) [18:03:18.540] next [18:03:18.540] if (!grepl(pattern, name)) [18:03:18.540] next [18:03:18.540] invokeRestart(restart) [18:03:18.540] muffled <- TRUE [18:03:18.540] break [18:03:18.540] } [18:03:18.540] } [18:03:18.540] } [18:03:18.540] invisible(muffled) [18:03:18.540] } [18:03:18.540] muffleCondition(cond) [18:03:18.540] }) [18:03:18.540] })) [18:03:18.540] future::FutureResult(value = ...future.value$value, [18:03:18.540] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.540] ...future.rng), globalenv = if (FALSE) [18:03:18.540] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.540] ...future.globalenv.names)) [18:03:18.540] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.540] }, condition = base::local({ [18:03:18.540] c <- base::c [18:03:18.540] inherits <- base::inherits [18:03:18.540] invokeRestart <- base::invokeRestart [18:03:18.540] length <- base::length [18:03:18.540] list <- base::list [18:03:18.540] seq.int <- base::seq.int [18:03:18.540] signalCondition <- base::signalCondition [18:03:18.540] sys.calls <- base::sys.calls [18:03:18.540] `[[` <- base::`[[` [18:03:18.540] `+` <- base::`+` [18:03:18.540] `<<-` <- base::`<<-` [18:03:18.540] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.540] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.540] 3L)] [18:03:18.540] } [18:03:18.540] function(cond) { [18:03:18.540] is_error <- inherits(cond, "error") [18:03:18.540] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.540] NULL) [18:03:18.540] if (is_error) { [18:03:18.540] sessionInformation <- function() { [18:03:18.540] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.540] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.540] search = base::search(), system = base::Sys.info()) [18:03:18.540] } [18:03:18.540] ...future.conditions[[length(...future.conditions) + [18:03:18.540] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.540] cond$call), session = sessionInformation(), [18:03:18.540] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.540] signalCondition(cond) [18:03:18.540] } [18:03:18.540] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.540] "immediateCondition"))) { [18:03:18.540] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.540] ...future.conditions[[length(...future.conditions) + [18:03:18.540] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.540] if (TRUE && !signal) { [18:03:18.540] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.540] { [18:03:18.540] inherits <- base::inherits [18:03:18.540] invokeRestart <- base::invokeRestart [18:03:18.540] is.null <- base::is.null [18:03:18.540] muffled <- FALSE [18:03:18.540] if (inherits(cond, "message")) { [18:03:18.540] muffled <- grepl(pattern, "muffleMessage") [18:03:18.540] if (muffled) [18:03:18.540] invokeRestart("muffleMessage") [18:03:18.540] } [18:03:18.540] else if (inherits(cond, "warning")) { [18:03:18.540] muffled <- grepl(pattern, "muffleWarning") [18:03:18.540] if (muffled) [18:03:18.540] invokeRestart("muffleWarning") [18:03:18.540] } [18:03:18.540] else if (inherits(cond, "condition")) { [18:03:18.540] if (!is.null(pattern)) { [18:03:18.540] computeRestarts <- base::computeRestarts [18:03:18.540] grepl <- base::grepl [18:03:18.540] restarts <- computeRestarts(cond) [18:03:18.540] for (restart in restarts) { [18:03:18.540] name <- restart$name [18:03:18.540] if (is.null(name)) [18:03:18.540] next [18:03:18.540] if (!grepl(pattern, name)) [18:03:18.540] next [18:03:18.540] invokeRestart(restart) [18:03:18.540] muffled <- TRUE [18:03:18.540] break [18:03:18.540] } [18:03:18.540] } [18:03:18.540] } [18:03:18.540] invisible(muffled) [18:03:18.540] } [18:03:18.540] muffleCondition(cond, pattern = "^muffle") [18:03:18.540] } [18:03:18.540] } [18:03:18.540] else { [18:03:18.540] if (TRUE) { [18:03:18.540] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.540] { [18:03:18.540] inherits <- base::inherits [18:03:18.540] invokeRestart <- base::invokeRestart [18:03:18.540] is.null <- base::is.null [18:03:18.540] muffled <- FALSE [18:03:18.540] if (inherits(cond, "message")) { [18:03:18.540] muffled <- grepl(pattern, "muffleMessage") [18:03:18.540] if (muffled) [18:03:18.540] invokeRestart("muffleMessage") [18:03:18.540] } [18:03:18.540] else if (inherits(cond, "warning")) { [18:03:18.540] muffled <- grepl(pattern, "muffleWarning") [18:03:18.540] if (muffled) [18:03:18.540] invokeRestart("muffleWarning") [18:03:18.540] } [18:03:18.540] else if (inherits(cond, "condition")) { [18:03:18.540] if (!is.null(pattern)) { [18:03:18.540] computeRestarts <- base::computeRestarts [18:03:18.540] grepl <- base::grepl [18:03:18.540] restarts <- computeRestarts(cond) [18:03:18.540] for (restart in restarts) { [18:03:18.540] name <- restart$name [18:03:18.540] if (is.null(name)) [18:03:18.540] next [18:03:18.540] if (!grepl(pattern, name)) [18:03:18.540] next [18:03:18.540] invokeRestart(restart) [18:03:18.540] muffled <- TRUE [18:03:18.540] break [18:03:18.540] } [18:03:18.540] } [18:03:18.540] } [18:03:18.540] invisible(muffled) [18:03:18.540] } [18:03:18.540] muffleCondition(cond, pattern = "^muffle") [18:03:18.540] } [18:03:18.540] } [18:03:18.540] } [18:03:18.540] })) [18:03:18.540] }, error = function(ex) { [18:03:18.540] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.540] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.540] ...future.rng), started = ...future.startTime, [18:03:18.540] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.540] version = "1.8"), class = "FutureResult") [18:03:18.540] }, finally = { [18:03:18.540] if (!identical(...future.workdir, getwd())) [18:03:18.540] setwd(...future.workdir) [18:03:18.540] { [18:03:18.540] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.540] ...future.oldOptions$nwarnings <- NULL [18:03:18.540] } [18:03:18.540] base::options(...future.oldOptions) [18:03:18.540] if (.Platform$OS.type == "windows") { [18:03:18.540] old_names <- names(...future.oldEnvVars) [18:03:18.540] envs <- base::Sys.getenv() [18:03:18.540] names <- names(envs) [18:03:18.540] common <- intersect(names, old_names) [18:03:18.540] added <- setdiff(names, old_names) [18:03:18.540] removed <- setdiff(old_names, names) [18:03:18.540] changed <- common[...future.oldEnvVars[common] != [18:03:18.540] envs[common]] [18:03:18.540] NAMES <- toupper(changed) [18:03:18.540] args <- list() [18:03:18.540] for (kk in seq_along(NAMES)) { [18:03:18.540] name <- changed[[kk]] [18:03:18.540] NAME <- NAMES[[kk]] [18:03:18.540] if (name != NAME && is.element(NAME, old_names)) [18:03:18.540] next [18:03:18.540] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.540] } [18:03:18.540] NAMES <- toupper(added) [18:03:18.540] for (kk in seq_along(NAMES)) { [18:03:18.540] name <- added[[kk]] [18:03:18.540] NAME <- NAMES[[kk]] [18:03:18.540] if (name != NAME && is.element(NAME, old_names)) [18:03:18.540] next [18:03:18.540] args[[name]] <- "" [18:03:18.540] } [18:03:18.540] NAMES <- toupper(removed) [18:03:18.540] for (kk in seq_along(NAMES)) { [18:03:18.540] name <- removed[[kk]] [18:03:18.540] NAME <- NAMES[[kk]] [18:03:18.540] if (name != NAME && is.element(NAME, old_names)) [18:03:18.540] next [18:03:18.540] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.540] } [18:03:18.540] if (length(args) > 0) [18:03:18.540] base::do.call(base::Sys.setenv, args = args) [18:03:18.540] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.540] } [18:03:18.540] else { [18:03:18.540] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.540] } [18:03:18.540] { [18:03:18.540] if (base::length(...future.futureOptionsAdded) > [18:03:18.540] 0L) { [18:03:18.540] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.540] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.540] base::options(opts) [18:03:18.540] } [18:03:18.540] { [18:03:18.540] { [18:03:18.540] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.540] NULL [18:03:18.540] } [18:03:18.540] options(future.plan = NULL) [18:03:18.540] if (is.na(NA_character_)) [18:03:18.540] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.540] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.540] future::plan(list(function (..., workers = availableCores(), [18:03:18.540] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.540] envir = parent.frame()) [18:03:18.540] { [18:03:18.540] if (is.function(workers)) [18:03:18.540] workers <- workers() [18:03:18.540] workers <- structure(as.integer(workers), [18:03:18.540] class = class(workers)) [18:03:18.540] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.540] workers >= 1) [18:03:18.540] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.540] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.540] } [18:03:18.540] future <- MultisessionFuture(..., workers = workers, [18:03:18.540] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.540] envir = envir) [18:03:18.540] if (!future$lazy) [18:03:18.540] future <- run(future) [18:03:18.540] invisible(future) [18:03:18.540] }), .cleanup = FALSE, .init = FALSE) [18:03:18.540] } [18:03:18.540] } [18:03:18.540] } [18:03:18.540] }) [18:03:18.540] if (TRUE) { [18:03:18.540] base::sink(type = "output", split = FALSE) [18:03:18.540] if (TRUE) { [18:03:18.540] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.540] } [18:03:18.540] else { [18:03:18.540] ...future.result["stdout"] <- base::list(NULL) [18:03:18.540] } [18:03:18.540] base::close(...future.stdout) [18:03:18.540] ...future.stdout <- NULL [18:03:18.540] } [18:03:18.540] ...future.result$conditions <- ...future.conditions [18:03:18.540] ...future.result$finished <- base::Sys.time() [18:03:18.540] ...future.result [18:03:18.540] } [18:03:18.547] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:18.564] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.565] - Validating connection of MultisessionFuture [18:03:18.565] - received message: FutureResult [18:03:18.565] - Received FutureResult [18:03:18.565] - Erased future from FutureRegistry [18:03:18.565] result() for ClusterFuture ... [18:03:18.566] - result already collected: FutureResult [18:03:18.566] result() for ClusterFuture ... done [18:03:18.566] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.566] result() for ClusterFuture ... [18:03:18.566] - result already collected: FutureResult [18:03:18.566] result() for ClusterFuture ... done [18:03:18.567] result() for ClusterFuture ... [18:03:18.567] - result already collected: FutureResult [18:03:18.567] result() for ClusterFuture ... done [18:03:18.567] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.568] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.568] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.568] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.569] MultisessionFuture started [18:03:18.569] - Launch lazy future ... done [18:03:18.569] run() for 'MultisessionFuture' ... done [18:03:18.570] getGlobalsAndPackages() ... [18:03:18.570] Searching for globals... [18:03:18.571] - globals found: [3] '{', 'sample', 'x' [18:03:18.571] Searching for globals ... DONE [18:03:18.571] Resolving globals: FALSE [18:03:18.572] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.572] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.572] - globals: [1] 'x' [18:03:18.573] [18:03:18.573] getGlobalsAndPackages() ... DONE [18:03:18.573] run() for 'Future' ... [18:03:18.573] - state: 'created' [18:03:18.574] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.587] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.587] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.587] - Field: 'node' [18:03:18.587] - Field: 'label' [18:03:18.587] - Field: 'local' [18:03:18.588] - Field: 'owner' [18:03:18.588] - Field: 'envir' [18:03:18.588] - Field: 'workers' [18:03:18.588] - Field: 'packages' [18:03:18.588] - Field: 'gc' [18:03:18.589] - Field: 'conditions' [18:03:18.589] - Field: 'persistent' [18:03:18.589] - Field: 'expr' [18:03:18.589] - Field: 'uuid' [18:03:18.589] - Field: 'seed' [18:03:18.589] - Field: 'version' [18:03:18.590] - Field: 'result' [18:03:18.590] - Field: 'asynchronous' [18:03:18.590] - Field: 'calls' [18:03:18.590] - Field: 'globals' [18:03:18.590] - Field: 'stdout' [18:03:18.590] - Field: 'earlySignal' [18:03:18.591] - Field: 'lazy' [18:03:18.591] - Field: 'state' [18:03:18.591] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.591] - Launch lazy future ... [18:03:18.592] Packages needed by the future expression (n = 0): [18:03:18.592] Packages needed by future strategies (n = 0): [18:03:18.592] { [18:03:18.592] { [18:03:18.592] { [18:03:18.592] ...future.startTime <- base::Sys.time() [18:03:18.592] { [18:03:18.592] { [18:03:18.592] { [18:03:18.592] { [18:03:18.592] { [18:03:18.592] base::local({ [18:03:18.592] has_future <- base::requireNamespace("future", [18:03:18.592] quietly = TRUE) [18:03:18.592] if (has_future) { [18:03:18.592] ns <- base::getNamespace("future") [18:03:18.592] version <- ns[[".package"]][["version"]] [18:03:18.592] if (is.null(version)) [18:03:18.592] version <- utils::packageVersion("future") [18:03:18.592] } [18:03:18.592] else { [18:03:18.592] version <- NULL [18:03:18.592] } [18:03:18.592] if (!has_future || version < "1.8.0") { [18:03:18.592] info <- base::c(r_version = base::gsub("R version ", [18:03:18.592] "", base::R.version$version.string), [18:03:18.592] platform = base::sprintf("%s (%s-bit)", [18:03:18.592] base::R.version$platform, 8 * [18:03:18.592] base::.Machine$sizeof.pointer), [18:03:18.592] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.592] "release", "version")], collapse = " "), [18:03:18.592] hostname = base::Sys.info()[["nodename"]]) [18:03:18.592] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.592] info) [18:03:18.592] info <- base::paste(info, collapse = "; ") [18:03:18.592] if (!has_future) { [18:03:18.592] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.592] info) [18:03:18.592] } [18:03:18.592] else { [18:03:18.592] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.592] info, version) [18:03:18.592] } [18:03:18.592] base::stop(msg) [18:03:18.592] } [18:03:18.592] }) [18:03:18.592] } [18:03:18.592] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.592] base::options(mc.cores = 1L) [18:03:18.592] } [18:03:18.592] options(future.plan = NULL) [18:03:18.592] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.592] future::plan("default", .cleanup = FALSE, [18:03:18.592] .init = FALSE) [18:03:18.592] } [18:03:18.592] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:18.592] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:18.592] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:18.592] } [18:03:18.592] ...future.workdir <- getwd() [18:03:18.592] } [18:03:18.592] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.592] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.592] } [18:03:18.592] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.592] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.592] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.592] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.592] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.592] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.592] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.592] base::names(...future.oldOptions)) [18:03:18.592] } [18:03:18.592] if (FALSE) { [18:03:18.592] } [18:03:18.592] else { [18:03:18.592] if (TRUE) { [18:03:18.592] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.592] open = "w") [18:03:18.592] } [18:03:18.592] else { [18:03:18.592] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.592] windows = "NUL", "/dev/null"), open = "w") [18:03:18.592] } [18:03:18.592] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.592] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.592] base::sink(type = "output", split = FALSE) [18:03:18.592] base::close(...future.stdout) [18:03:18.592] }, add = TRUE) [18:03:18.592] } [18:03:18.592] ...future.frame <- base::sys.nframe() [18:03:18.592] ...future.conditions <- base::list() [18:03:18.592] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.592] if (FALSE) { [18:03:18.592] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.592] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.592] } [18:03:18.592] ...future.result <- base::tryCatch({ [18:03:18.592] base::withCallingHandlers({ [18:03:18.592] ...future.value <- base::withVisible(base::local({ [18:03:18.592] ...future.makeSendCondition <- local({ [18:03:18.592] sendCondition <- NULL [18:03:18.592] function(frame = 1L) { [18:03:18.592] if (is.function(sendCondition)) [18:03:18.592] return(sendCondition) [18:03:18.592] ns <- getNamespace("parallel") [18:03:18.592] if (exists("sendData", mode = "function", [18:03:18.592] envir = ns)) { [18:03:18.592] parallel_sendData <- get("sendData", mode = "function", [18:03:18.592] envir = ns) [18:03:18.592] envir <- sys.frame(frame) [18:03:18.592] master <- NULL [18:03:18.592] while (!identical(envir, .GlobalEnv) && [18:03:18.592] !identical(envir, emptyenv())) { [18:03:18.592] if (exists("master", mode = "list", envir = envir, [18:03:18.592] inherits = FALSE)) { [18:03:18.592] master <- get("master", mode = "list", [18:03:18.592] envir = envir, inherits = FALSE) [18:03:18.592] if (inherits(master, c("SOCKnode", [18:03:18.592] "SOCK0node"))) { [18:03:18.592] sendCondition <<- function(cond) { [18:03:18.592] data <- list(type = "VALUE", value = cond, [18:03:18.592] success = TRUE) [18:03:18.592] parallel_sendData(master, data) [18:03:18.592] } [18:03:18.592] return(sendCondition) [18:03:18.592] } [18:03:18.592] } [18:03:18.592] frame <- frame + 1L [18:03:18.592] envir <- sys.frame(frame) [18:03:18.592] } [18:03:18.592] } [18:03:18.592] sendCondition <<- function(cond) NULL [18:03:18.592] } [18:03:18.592] }) [18:03:18.592] withCallingHandlers({ [18:03:18.592] { [18:03:18.592] sample(x, size = 1L) [18:03:18.592] } [18:03:18.592] }, immediateCondition = function(cond) { [18:03:18.592] sendCondition <- ...future.makeSendCondition() [18:03:18.592] sendCondition(cond) [18:03:18.592] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.592] { [18:03:18.592] inherits <- base::inherits [18:03:18.592] invokeRestart <- base::invokeRestart [18:03:18.592] is.null <- base::is.null [18:03:18.592] muffled <- FALSE [18:03:18.592] if (inherits(cond, "message")) { [18:03:18.592] muffled <- grepl(pattern, "muffleMessage") [18:03:18.592] if (muffled) [18:03:18.592] invokeRestart("muffleMessage") [18:03:18.592] } [18:03:18.592] else if (inherits(cond, "warning")) { [18:03:18.592] muffled <- grepl(pattern, "muffleWarning") [18:03:18.592] if (muffled) [18:03:18.592] invokeRestart("muffleWarning") [18:03:18.592] } [18:03:18.592] else if (inherits(cond, "condition")) { [18:03:18.592] if (!is.null(pattern)) { [18:03:18.592] computeRestarts <- base::computeRestarts [18:03:18.592] grepl <- base::grepl [18:03:18.592] restarts <- computeRestarts(cond) [18:03:18.592] for (restart in restarts) { [18:03:18.592] name <- restart$name [18:03:18.592] if (is.null(name)) [18:03:18.592] next [18:03:18.592] if (!grepl(pattern, name)) [18:03:18.592] next [18:03:18.592] invokeRestart(restart) [18:03:18.592] muffled <- TRUE [18:03:18.592] break [18:03:18.592] } [18:03:18.592] } [18:03:18.592] } [18:03:18.592] invisible(muffled) [18:03:18.592] } [18:03:18.592] muffleCondition(cond) [18:03:18.592] }) [18:03:18.592] })) [18:03:18.592] future::FutureResult(value = ...future.value$value, [18:03:18.592] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.592] ...future.rng), globalenv = if (FALSE) [18:03:18.592] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.592] ...future.globalenv.names)) [18:03:18.592] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.592] }, condition = base::local({ [18:03:18.592] c <- base::c [18:03:18.592] inherits <- base::inherits [18:03:18.592] invokeRestart <- base::invokeRestart [18:03:18.592] length <- base::length [18:03:18.592] list <- base::list [18:03:18.592] seq.int <- base::seq.int [18:03:18.592] signalCondition <- base::signalCondition [18:03:18.592] sys.calls <- base::sys.calls [18:03:18.592] `[[` <- base::`[[` [18:03:18.592] `+` <- base::`+` [18:03:18.592] `<<-` <- base::`<<-` [18:03:18.592] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.592] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.592] 3L)] [18:03:18.592] } [18:03:18.592] function(cond) { [18:03:18.592] is_error <- inherits(cond, "error") [18:03:18.592] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.592] NULL) [18:03:18.592] if (is_error) { [18:03:18.592] sessionInformation <- function() { [18:03:18.592] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.592] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.592] search = base::search(), system = base::Sys.info()) [18:03:18.592] } [18:03:18.592] ...future.conditions[[length(...future.conditions) + [18:03:18.592] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.592] cond$call), session = sessionInformation(), [18:03:18.592] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.592] signalCondition(cond) [18:03:18.592] } [18:03:18.592] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.592] "immediateCondition"))) { [18:03:18.592] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.592] ...future.conditions[[length(...future.conditions) + [18:03:18.592] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.592] if (TRUE && !signal) { [18:03:18.592] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.592] { [18:03:18.592] inherits <- base::inherits [18:03:18.592] invokeRestart <- base::invokeRestart [18:03:18.592] is.null <- base::is.null [18:03:18.592] muffled <- FALSE [18:03:18.592] if (inherits(cond, "message")) { [18:03:18.592] muffled <- grepl(pattern, "muffleMessage") [18:03:18.592] if (muffled) [18:03:18.592] invokeRestart("muffleMessage") [18:03:18.592] } [18:03:18.592] else if (inherits(cond, "warning")) { [18:03:18.592] muffled <- grepl(pattern, "muffleWarning") [18:03:18.592] if (muffled) [18:03:18.592] invokeRestart("muffleWarning") [18:03:18.592] } [18:03:18.592] else if (inherits(cond, "condition")) { [18:03:18.592] if (!is.null(pattern)) { [18:03:18.592] computeRestarts <- base::computeRestarts [18:03:18.592] grepl <- base::grepl [18:03:18.592] restarts <- computeRestarts(cond) [18:03:18.592] for (restart in restarts) { [18:03:18.592] name <- restart$name [18:03:18.592] if (is.null(name)) [18:03:18.592] next [18:03:18.592] if (!grepl(pattern, name)) [18:03:18.592] next [18:03:18.592] invokeRestart(restart) [18:03:18.592] muffled <- TRUE [18:03:18.592] break [18:03:18.592] } [18:03:18.592] } [18:03:18.592] } [18:03:18.592] invisible(muffled) [18:03:18.592] } [18:03:18.592] muffleCondition(cond, pattern = "^muffle") [18:03:18.592] } [18:03:18.592] } [18:03:18.592] else { [18:03:18.592] if (TRUE) { [18:03:18.592] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.592] { [18:03:18.592] inherits <- base::inherits [18:03:18.592] invokeRestart <- base::invokeRestart [18:03:18.592] is.null <- base::is.null [18:03:18.592] muffled <- FALSE [18:03:18.592] if (inherits(cond, "message")) { [18:03:18.592] muffled <- grepl(pattern, "muffleMessage") [18:03:18.592] if (muffled) [18:03:18.592] invokeRestart("muffleMessage") [18:03:18.592] } [18:03:18.592] else if (inherits(cond, "warning")) { [18:03:18.592] muffled <- grepl(pattern, "muffleWarning") [18:03:18.592] if (muffled) [18:03:18.592] invokeRestart("muffleWarning") [18:03:18.592] } [18:03:18.592] else if (inherits(cond, "condition")) { [18:03:18.592] if (!is.null(pattern)) { [18:03:18.592] computeRestarts <- base::computeRestarts [18:03:18.592] grepl <- base::grepl [18:03:18.592] restarts <- computeRestarts(cond) [18:03:18.592] for (restart in restarts) { [18:03:18.592] name <- restart$name [18:03:18.592] if (is.null(name)) [18:03:18.592] next [18:03:18.592] if (!grepl(pattern, name)) [18:03:18.592] next [18:03:18.592] invokeRestart(restart) [18:03:18.592] muffled <- TRUE [18:03:18.592] break [18:03:18.592] } [18:03:18.592] } [18:03:18.592] } [18:03:18.592] invisible(muffled) [18:03:18.592] } [18:03:18.592] muffleCondition(cond, pattern = "^muffle") [18:03:18.592] } [18:03:18.592] } [18:03:18.592] } [18:03:18.592] })) [18:03:18.592] }, error = function(ex) { [18:03:18.592] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.592] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.592] ...future.rng), started = ...future.startTime, [18:03:18.592] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.592] version = "1.8"), class = "FutureResult") [18:03:18.592] }, finally = { [18:03:18.592] if (!identical(...future.workdir, getwd())) [18:03:18.592] setwd(...future.workdir) [18:03:18.592] { [18:03:18.592] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.592] ...future.oldOptions$nwarnings <- NULL [18:03:18.592] } [18:03:18.592] base::options(...future.oldOptions) [18:03:18.592] if (.Platform$OS.type == "windows") { [18:03:18.592] old_names <- names(...future.oldEnvVars) [18:03:18.592] envs <- base::Sys.getenv() [18:03:18.592] names <- names(envs) [18:03:18.592] common <- intersect(names, old_names) [18:03:18.592] added <- setdiff(names, old_names) [18:03:18.592] removed <- setdiff(old_names, names) [18:03:18.592] changed <- common[...future.oldEnvVars[common] != [18:03:18.592] envs[common]] [18:03:18.592] NAMES <- toupper(changed) [18:03:18.592] args <- list() [18:03:18.592] for (kk in seq_along(NAMES)) { [18:03:18.592] name <- changed[[kk]] [18:03:18.592] NAME <- NAMES[[kk]] [18:03:18.592] if (name != NAME && is.element(NAME, old_names)) [18:03:18.592] next [18:03:18.592] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.592] } [18:03:18.592] NAMES <- toupper(added) [18:03:18.592] for (kk in seq_along(NAMES)) { [18:03:18.592] name <- added[[kk]] [18:03:18.592] NAME <- NAMES[[kk]] [18:03:18.592] if (name != NAME && is.element(NAME, old_names)) [18:03:18.592] next [18:03:18.592] args[[name]] <- "" [18:03:18.592] } [18:03:18.592] NAMES <- toupper(removed) [18:03:18.592] for (kk in seq_along(NAMES)) { [18:03:18.592] name <- removed[[kk]] [18:03:18.592] NAME <- NAMES[[kk]] [18:03:18.592] if (name != NAME && is.element(NAME, old_names)) [18:03:18.592] next [18:03:18.592] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.592] } [18:03:18.592] if (length(args) > 0) [18:03:18.592] base::do.call(base::Sys.setenv, args = args) [18:03:18.592] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.592] } [18:03:18.592] else { [18:03:18.592] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.592] } [18:03:18.592] { [18:03:18.592] if (base::length(...future.futureOptionsAdded) > [18:03:18.592] 0L) { [18:03:18.592] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.592] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.592] base::options(opts) [18:03:18.592] } [18:03:18.592] { [18:03:18.592] { [18:03:18.592] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.592] NULL [18:03:18.592] } [18:03:18.592] options(future.plan = NULL) [18:03:18.592] if (is.na(NA_character_)) [18:03:18.592] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.592] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.592] future::plan(list(function (..., workers = availableCores(), [18:03:18.592] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.592] envir = parent.frame()) [18:03:18.592] { [18:03:18.592] if (is.function(workers)) [18:03:18.592] workers <- workers() [18:03:18.592] workers <- structure(as.integer(workers), [18:03:18.592] class = class(workers)) [18:03:18.592] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.592] workers >= 1) [18:03:18.592] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.592] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.592] } [18:03:18.592] future <- MultisessionFuture(..., workers = workers, [18:03:18.592] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.592] envir = envir) [18:03:18.592] if (!future$lazy) [18:03:18.592] future <- run(future) [18:03:18.592] invisible(future) [18:03:18.592] }), .cleanup = FALSE, .init = FALSE) [18:03:18.592] } [18:03:18.592] } [18:03:18.592] } [18:03:18.592] }) [18:03:18.592] if (TRUE) { [18:03:18.592] base::sink(type = "output", split = FALSE) [18:03:18.592] if (TRUE) { [18:03:18.592] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.592] } [18:03:18.592] else { [18:03:18.592] ...future.result["stdout"] <- base::list(NULL) [18:03:18.592] } [18:03:18.592] base::close(...future.stdout) [18:03:18.592] ...future.stdout <- NULL [18:03:18.592] } [18:03:18.592] ...future.result$conditions <- ...future.conditions [18:03:18.592] ...future.result$finished <- base::Sys.time() [18:03:18.592] ...future.result [18:03:18.592] } [18:03:18.597] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:18.611] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.611] - Validating connection of MultisessionFuture [18:03:18.612] - received message: FutureResult [18:03:18.612] - Received FutureResult [18:03:18.612] - Erased future from FutureRegistry [18:03:18.612] result() for ClusterFuture ... [18:03:18.612] - result already collected: FutureResult [18:03:18.613] result() for ClusterFuture ... done [18:03:18.613] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.613] result() for ClusterFuture ... [18:03:18.613] - result already collected: FutureResult [18:03:18.613] result() for ClusterFuture ... done [18:03:18.613] result() for ClusterFuture ... [18:03:18.614] - result already collected: FutureResult [18:03:18.614] result() for ClusterFuture ... done [18:03:18.614] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:18.615] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:18.615] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:18.615] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:18.616] MultisessionFuture started [18:03:18.616] - Launch lazy future ... done [18:03:18.616] run() for 'MultisessionFuture' ... done [18:03:18.617] resolve() on list ... [18:03:18.617] recursive: 0 [18:03:18.617] length: 4 [18:03:18.617] [18:03:18.617] Future #1 [18:03:18.617] result() for ClusterFuture ... [18:03:18.618] - result already collected: FutureResult [18:03:18.618] result() for ClusterFuture ... done [18:03:18.618] result() for ClusterFuture ... [18:03:18.618] - result already collected: FutureResult [18:03:18.618] result() for ClusterFuture ... done [18:03:18.618] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:18.618] - nx: 4 [18:03:18.619] - relay: TRUE [18:03:18.619] - stdout: TRUE [18:03:18.619] - signal: TRUE [18:03:18.619] - resignal: FALSE [18:03:18.619] - force: TRUE [18:03:18.619] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:18.620] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:18.620] - until=1 [18:03:18.620] - relaying element #1 [18:03:18.620] result() for ClusterFuture ... [18:03:18.620] - result already collected: FutureResult [18:03:18.620] result() for ClusterFuture ... done [18:03:18.621] result() for ClusterFuture ... [18:03:18.621] - result already collected: FutureResult [18:03:18.621] result() for ClusterFuture ... done [18:03:18.621] result() for ClusterFuture ... [18:03:18.621] - result already collected: FutureResult [18:03:18.621] result() for ClusterFuture ... done [18:03:18.622] result() for ClusterFuture ... [18:03:18.622] - result already collected: FutureResult [18:03:18.622] result() for ClusterFuture ... done [18:03:18.622] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.622] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.622] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:03:18.623] length: 3 (resolved future 1) [18:03:18.623] Future #2 [18:03:18.623] result() for ClusterFuture ... [18:03:18.623] - result already collected: FutureResult [18:03:18.623] result() for ClusterFuture ... done [18:03:18.623] result() for ClusterFuture ... [18:03:18.624] - result already collected: FutureResult [18:03:18.624] result() for ClusterFuture ... done [18:03:18.624] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:03:18.624] - nx: 4 [18:03:18.624] - relay: TRUE [18:03:18.624] - stdout: TRUE [18:03:18.624] - signal: TRUE [18:03:18.625] - resignal: FALSE [18:03:18.625] - force: TRUE [18:03:18.625] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.625] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.625] - until=2 [18:03:18.625] - relaying element #2 [18:03:18.626] result() for ClusterFuture ... [18:03:18.626] - result already collected: FutureResult [18:03:18.626] result() for ClusterFuture ... done [18:03:18.626] result() for ClusterFuture ... [18:03:18.626] - result already collected: FutureResult [18:03:18.626] result() for ClusterFuture ... done [18:03:18.627] result() for ClusterFuture ... [18:03:18.627] - result already collected: FutureResult [18:03:18.627] result() for ClusterFuture ... done [18:03:18.627] result() for ClusterFuture ... [18:03:18.627] - result already collected: FutureResult [18:03:18.627] result() for ClusterFuture ... done [18:03:18.628] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.628] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.628] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:03:18.628] length: 2 (resolved future 2) [18:03:18.628] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.629] - Validating connection of MultisessionFuture [18:03:18.629] - received message: FutureResult [18:03:18.629] - Received FutureResult [18:03:18.629] - Erased future from FutureRegistry [18:03:18.629] result() for ClusterFuture ... [18:03:18.630] - result already collected: FutureResult [18:03:18.630] result() for ClusterFuture ... done [18:03:18.630] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.630] Future #3 [18:03:18.630] result() for ClusterFuture ... [18:03:18.630] - result already collected: FutureResult [18:03:18.631] result() for ClusterFuture ... done [18:03:18.631] result() for ClusterFuture ... [18:03:18.631] - result already collected: FutureResult [18:03:18.631] result() for ClusterFuture ... done [18:03:18.631] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:03:18.631] - nx: 4 [18:03:18.632] - relay: TRUE [18:03:18.632] - stdout: TRUE [18:03:18.632] - signal: TRUE [18:03:18.632] - resignal: FALSE [18:03:18.632] - force: TRUE [18:03:18.632] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.632] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.633] - until=3 [18:03:18.633] - relaying element #3 [18:03:18.633] result() for ClusterFuture ... [18:03:18.633] - result already collected: FutureResult [18:03:18.633] result() for ClusterFuture ... done [18:03:18.633] result() for ClusterFuture ... [18:03:18.634] - result already collected: FutureResult [18:03:18.634] result() for ClusterFuture ... done [18:03:18.634] result() for ClusterFuture ... [18:03:18.634] - result already collected: FutureResult [18:03:18.634] result() for ClusterFuture ... done [18:03:18.634] result() for ClusterFuture ... [18:03:18.635] - result already collected: FutureResult [18:03:18.635] result() for ClusterFuture ... done [18:03:18.635] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.635] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.635] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:03:18.635] length: 1 (resolved future 3) [18:03:18.636] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.636] - Validating connection of MultisessionFuture [18:03:18.636] - received message: FutureResult [18:03:18.636] - Received FutureResult [18:03:18.637] - Erased future from FutureRegistry [18:03:18.637] result() for ClusterFuture ... [18:03:18.637] - result already collected: FutureResult [18:03:18.637] result() for ClusterFuture ... done [18:03:18.637] receiveMessageFromWorker() for ClusterFuture ... done [18:03:18.637] Future #4 [18:03:18.638] result() for ClusterFuture ... [18:03:18.638] - result already collected: FutureResult [18:03:18.638] result() for ClusterFuture ... done [18:03:18.638] result() for ClusterFuture ... [18:03:18.638] - result already collected: FutureResult [18:03:18.638] result() for ClusterFuture ... done [18:03:18.638] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:03:18.639] - nx: 4 [18:03:18.639] - relay: TRUE [18:03:18.639] - stdout: TRUE [18:03:18.639] - signal: TRUE [18:03:18.639] - resignal: FALSE [18:03:18.639] - force: TRUE [18:03:18.640] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.640] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.640] - until=4 [18:03:18.640] - relaying element #4 [18:03:18.640] result() for ClusterFuture ... [18:03:18.640] - result already collected: FutureResult [18:03:18.640] result() for ClusterFuture ... done [18:03:18.641] result() for ClusterFuture ... [18:03:18.641] - result already collected: FutureResult [18:03:18.641] result() for ClusterFuture ... done [18:03:18.641] result() for ClusterFuture ... [18:03:18.641] - result already collected: FutureResult [18:03:18.641] result() for ClusterFuture ... done [18:03:18.642] result() for ClusterFuture ... [18:03:18.642] - result already collected: FutureResult [18:03:18.642] result() for ClusterFuture ... done [18:03:18.642] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.642] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.642] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:03:18.643] length: 0 (resolved future 4) [18:03:18.643] Relaying remaining futures [18:03:18.643] signalConditionsASAP(NULL, pos=0) ... [18:03:18.643] - nx: 4 [18:03:18.643] - relay: TRUE [18:03:18.643] - stdout: TRUE [18:03:18.643] - signal: TRUE [18:03:18.644] - resignal: FALSE [18:03:18.644] - force: TRUE [18:03:18.644] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.644] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:18.644] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.644] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.645] signalConditionsASAP(NULL, pos=0) ... done [18:03:18.645] resolve() on list ... DONE [18:03:18.645] result() for ClusterFuture ... [18:03:18.645] - result already collected: FutureResult [18:03:18.645] result() for ClusterFuture ... done [18:03:18.645] result() for ClusterFuture ... [18:03:18.646] - result already collected: FutureResult [18:03:18.646] result() for ClusterFuture ... done [18:03:18.646] result() for ClusterFuture ... [18:03:18.646] - result already collected: FutureResult [18:03:18.646] result() for ClusterFuture ... done [18:03:18.646] result() for ClusterFuture ... [18:03:18.647] - result already collected: FutureResult [18:03:18.647] result() for ClusterFuture ... done [18:03:18.647] result() for ClusterFuture ... [18:03:18.647] - result already collected: FutureResult [18:03:18.647] result() for ClusterFuture ... done [18:03:18.647] result() for ClusterFuture ... [18:03:18.648] - result already collected: FutureResult [18:03:18.648] result() for ClusterFuture ... done [18:03:18.648] result() for ClusterFuture ... [18:03:18.648] - result already collected: FutureResult [18:03:18.648] result() for ClusterFuture ... done [18:03:18.648] result() for ClusterFuture ... [18:03:18.648] - result already collected: FutureResult [18:03:18.649] result() for ClusterFuture ... done [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:18.649] getGlobalsAndPackages() ... [18:03:18.649] Searching for globals... [18:03:18.650] - globals found: [3] '{', 'sample', 'x' [18:03:18.651] Searching for globals ... DONE [18:03:18.651] Resolving globals: FALSE [18:03:18.651] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.652] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.652] - globals: [1] 'x' [18:03:18.652] [18:03:18.652] getGlobalsAndPackages() ... DONE [18:03:18.653] run() for 'Future' ... [18:03:18.653] - state: 'created' [18:03:18.653] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.666] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.667] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.667] - Field: 'node' [18:03:18.667] - Field: 'label' [18:03:18.667] - Field: 'local' [18:03:18.667] - Field: 'owner' [18:03:18.668] - Field: 'envir' [18:03:18.668] - Field: 'workers' [18:03:18.668] - Field: 'packages' [18:03:18.668] - Field: 'gc' [18:03:18.668] - Field: 'conditions' [18:03:18.669] - Field: 'persistent' [18:03:18.669] - Field: 'expr' [18:03:18.669] - Field: 'uuid' [18:03:18.669] - Field: 'seed' [18:03:18.669] - Field: 'version' [18:03:18.669] - Field: 'result' [18:03:18.670] - Field: 'asynchronous' [18:03:18.670] - Field: 'calls' [18:03:18.670] - Field: 'globals' [18:03:18.670] - Field: 'stdout' [18:03:18.670] - Field: 'earlySignal' [18:03:18.671] - Field: 'lazy' [18:03:18.671] - Field: 'state' [18:03:18.671] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.671] - Launch lazy future ... [18:03:18.671] Packages needed by the future expression (n = 0): [18:03:18.672] Packages needed by future strategies (n = 0): [18:03:18.672] { [18:03:18.672] { [18:03:18.672] { [18:03:18.672] ...future.startTime <- base::Sys.time() [18:03:18.672] { [18:03:18.672] { [18:03:18.672] { [18:03:18.672] { [18:03:18.672] base::local({ [18:03:18.672] has_future <- base::requireNamespace("future", [18:03:18.672] quietly = TRUE) [18:03:18.672] if (has_future) { [18:03:18.672] ns <- base::getNamespace("future") [18:03:18.672] version <- ns[[".package"]][["version"]] [18:03:18.672] if (is.null(version)) [18:03:18.672] version <- utils::packageVersion("future") [18:03:18.672] } [18:03:18.672] else { [18:03:18.672] version <- NULL [18:03:18.672] } [18:03:18.672] if (!has_future || version < "1.8.0") { [18:03:18.672] info <- base::c(r_version = base::gsub("R version ", [18:03:18.672] "", base::R.version$version.string), [18:03:18.672] platform = base::sprintf("%s (%s-bit)", [18:03:18.672] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:18.672] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.672] "release", "version")], collapse = " "), [18:03:18.672] hostname = base::Sys.info()[["nodename"]]) [18:03:18.672] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.672] info) [18:03:18.672] info <- base::paste(info, collapse = "; ") [18:03:18.672] if (!has_future) { [18:03:18.672] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.672] info) [18:03:18.672] } [18:03:18.672] else { [18:03:18.672] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.672] info, version) [18:03:18.672] } [18:03:18.672] base::stop(msg) [18:03:18.672] } [18:03:18.672] }) [18:03:18.672] } [18:03:18.672] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.672] base::options(mc.cores = 1L) [18:03:18.672] } [18:03:18.672] options(future.plan = NULL) [18:03:18.672] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.672] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:18.672] } [18:03:18.672] ...future.workdir <- getwd() [18:03:18.672] } [18:03:18.672] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.672] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.672] } [18:03:18.672] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.672] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.672] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.672] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.672] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.672] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.672] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.672] base::names(...future.oldOptions)) [18:03:18.672] } [18:03:18.672] if (FALSE) { [18:03:18.672] } [18:03:18.672] else { [18:03:18.672] if (TRUE) { [18:03:18.672] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.672] open = "w") [18:03:18.672] } [18:03:18.672] else { [18:03:18.672] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.672] windows = "NUL", "/dev/null"), open = "w") [18:03:18.672] } [18:03:18.672] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.672] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.672] base::sink(type = "output", split = FALSE) [18:03:18.672] base::close(...future.stdout) [18:03:18.672] }, add = TRUE) [18:03:18.672] } [18:03:18.672] ...future.frame <- base::sys.nframe() [18:03:18.672] ...future.conditions <- base::list() [18:03:18.672] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.672] if (FALSE) { [18:03:18.672] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.672] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.672] } [18:03:18.672] ...future.result <- base::tryCatch({ [18:03:18.672] base::withCallingHandlers({ [18:03:18.672] ...future.value <- base::withVisible(base::local({ [18:03:18.672] ...future.makeSendCondition <- local({ [18:03:18.672] sendCondition <- NULL [18:03:18.672] function(frame = 1L) { [18:03:18.672] if (is.function(sendCondition)) [18:03:18.672] return(sendCondition) [18:03:18.672] ns <- getNamespace("parallel") [18:03:18.672] if (exists("sendData", mode = "function", [18:03:18.672] envir = ns)) { [18:03:18.672] parallel_sendData <- get("sendData", mode = "function", [18:03:18.672] envir = ns) [18:03:18.672] envir <- sys.frame(frame) [18:03:18.672] master <- NULL [18:03:18.672] while (!identical(envir, .GlobalEnv) && [18:03:18.672] !identical(envir, emptyenv())) { [18:03:18.672] if (exists("master", mode = "list", envir = envir, [18:03:18.672] inherits = FALSE)) { [18:03:18.672] master <- get("master", mode = "list", [18:03:18.672] envir = envir, inherits = FALSE) [18:03:18.672] if (inherits(master, c("SOCKnode", [18:03:18.672] "SOCK0node"))) { [18:03:18.672] sendCondition <<- function(cond) { [18:03:18.672] data <- list(type = "VALUE", value = cond, [18:03:18.672] success = TRUE) [18:03:18.672] parallel_sendData(master, data) [18:03:18.672] } [18:03:18.672] return(sendCondition) [18:03:18.672] } [18:03:18.672] } [18:03:18.672] frame <- frame + 1L [18:03:18.672] envir <- sys.frame(frame) [18:03:18.672] } [18:03:18.672] } [18:03:18.672] sendCondition <<- function(cond) NULL [18:03:18.672] } [18:03:18.672] }) [18:03:18.672] withCallingHandlers({ [18:03:18.672] { [18:03:18.672] sample(x, size = 1L) [18:03:18.672] } [18:03:18.672] }, immediateCondition = function(cond) { [18:03:18.672] sendCondition <- ...future.makeSendCondition() [18:03:18.672] sendCondition(cond) [18:03:18.672] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.672] { [18:03:18.672] inherits <- base::inherits [18:03:18.672] invokeRestart <- base::invokeRestart [18:03:18.672] is.null <- base::is.null [18:03:18.672] muffled <- FALSE [18:03:18.672] if (inherits(cond, "message")) { [18:03:18.672] muffled <- grepl(pattern, "muffleMessage") [18:03:18.672] if (muffled) [18:03:18.672] invokeRestart("muffleMessage") [18:03:18.672] } [18:03:18.672] else if (inherits(cond, "warning")) { [18:03:18.672] muffled <- grepl(pattern, "muffleWarning") [18:03:18.672] if (muffled) [18:03:18.672] invokeRestart("muffleWarning") [18:03:18.672] } [18:03:18.672] else if (inherits(cond, "condition")) { [18:03:18.672] if (!is.null(pattern)) { [18:03:18.672] computeRestarts <- base::computeRestarts [18:03:18.672] grepl <- base::grepl [18:03:18.672] restarts <- computeRestarts(cond) [18:03:18.672] for (restart in restarts) { [18:03:18.672] name <- restart$name [18:03:18.672] if (is.null(name)) [18:03:18.672] next [18:03:18.672] if (!grepl(pattern, name)) [18:03:18.672] next [18:03:18.672] invokeRestart(restart) [18:03:18.672] muffled <- TRUE [18:03:18.672] break [18:03:18.672] } [18:03:18.672] } [18:03:18.672] } [18:03:18.672] invisible(muffled) [18:03:18.672] } [18:03:18.672] muffleCondition(cond) [18:03:18.672] }) [18:03:18.672] })) [18:03:18.672] future::FutureResult(value = ...future.value$value, [18:03:18.672] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.672] ...future.rng), globalenv = if (FALSE) [18:03:18.672] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.672] ...future.globalenv.names)) [18:03:18.672] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.672] }, condition = base::local({ [18:03:18.672] c <- base::c [18:03:18.672] inherits <- base::inherits [18:03:18.672] invokeRestart <- base::invokeRestart [18:03:18.672] length <- base::length [18:03:18.672] list <- base::list [18:03:18.672] seq.int <- base::seq.int [18:03:18.672] signalCondition <- base::signalCondition [18:03:18.672] sys.calls <- base::sys.calls [18:03:18.672] `[[` <- base::`[[` [18:03:18.672] `+` <- base::`+` [18:03:18.672] `<<-` <- base::`<<-` [18:03:18.672] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.672] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.672] 3L)] [18:03:18.672] } [18:03:18.672] function(cond) { [18:03:18.672] is_error <- inherits(cond, "error") [18:03:18.672] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.672] NULL) [18:03:18.672] if (is_error) { [18:03:18.672] sessionInformation <- function() { [18:03:18.672] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.672] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.672] search = base::search(), system = base::Sys.info()) [18:03:18.672] } [18:03:18.672] ...future.conditions[[length(...future.conditions) + [18:03:18.672] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.672] cond$call), session = sessionInformation(), [18:03:18.672] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.672] signalCondition(cond) [18:03:18.672] } [18:03:18.672] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.672] "immediateCondition"))) { [18:03:18.672] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.672] ...future.conditions[[length(...future.conditions) + [18:03:18.672] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.672] if (TRUE && !signal) { [18:03:18.672] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.672] { [18:03:18.672] inherits <- base::inherits [18:03:18.672] invokeRestart <- base::invokeRestart [18:03:18.672] is.null <- base::is.null [18:03:18.672] muffled <- FALSE [18:03:18.672] if (inherits(cond, "message")) { [18:03:18.672] muffled <- grepl(pattern, "muffleMessage") [18:03:18.672] if (muffled) [18:03:18.672] invokeRestart("muffleMessage") [18:03:18.672] } [18:03:18.672] else if (inherits(cond, "warning")) { [18:03:18.672] muffled <- grepl(pattern, "muffleWarning") [18:03:18.672] if (muffled) [18:03:18.672] invokeRestart("muffleWarning") [18:03:18.672] } [18:03:18.672] else if (inherits(cond, "condition")) { [18:03:18.672] if (!is.null(pattern)) { [18:03:18.672] computeRestarts <- base::computeRestarts [18:03:18.672] grepl <- base::grepl [18:03:18.672] restarts <- computeRestarts(cond) [18:03:18.672] for (restart in restarts) { [18:03:18.672] name <- restart$name [18:03:18.672] if (is.null(name)) [18:03:18.672] next [18:03:18.672] if (!grepl(pattern, name)) [18:03:18.672] next [18:03:18.672] invokeRestart(restart) [18:03:18.672] muffled <- TRUE [18:03:18.672] break [18:03:18.672] } [18:03:18.672] } [18:03:18.672] } [18:03:18.672] invisible(muffled) [18:03:18.672] } [18:03:18.672] muffleCondition(cond, pattern = "^muffle") [18:03:18.672] } [18:03:18.672] } [18:03:18.672] else { [18:03:18.672] if (TRUE) { [18:03:18.672] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.672] { [18:03:18.672] inherits <- base::inherits [18:03:18.672] invokeRestart <- base::invokeRestart [18:03:18.672] is.null <- base::is.null [18:03:18.672] muffled <- FALSE [18:03:18.672] if (inherits(cond, "message")) { [18:03:18.672] muffled <- grepl(pattern, "muffleMessage") [18:03:18.672] if (muffled) [18:03:18.672] invokeRestart("muffleMessage") [18:03:18.672] } [18:03:18.672] else if (inherits(cond, "warning")) { [18:03:18.672] muffled <- grepl(pattern, "muffleWarning") [18:03:18.672] if (muffled) [18:03:18.672] invokeRestart("muffleWarning") [18:03:18.672] } [18:03:18.672] else if (inherits(cond, "condition")) { [18:03:18.672] if (!is.null(pattern)) { [18:03:18.672] computeRestarts <- base::computeRestarts [18:03:18.672] grepl <- base::grepl [18:03:18.672] restarts <- computeRestarts(cond) [18:03:18.672] for (restart in restarts) { [18:03:18.672] name <- restart$name [18:03:18.672] if (is.null(name)) [18:03:18.672] next [18:03:18.672] if (!grepl(pattern, name)) [18:03:18.672] next [18:03:18.672] invokeRestart(restart) [18:03:18.672] muffled <- TRUE [18:03:18.672] break [18:03:18.672] } [18:03:18.672] } [18:03:18.672] } [18:03:18.672] invisible(muffled) [18:03:18.672] } [18:03:18.672] muffleCondition(cond, pattern = "^muffle") [18:03:18.672] } [18:03:18.672] } [18:03:18.672] } [18:03:18.672] })) [18:03:18.672] }, error = function(ex) { [18:03:18.672] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.672] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.672] ...future.rng), started = ...future.startTime, [18:03:18.672] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.672] version = "1.8"), class = "FutureResult") [18:03:18.672] }, finally = { [18:03:18.672] if (!identical(...future.workdir, getwd())) [18:03:18.672] setwd(...future.workdir) [18:03:18.672] { [18:03:18.672] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.672] ...future.oldOptions$nwarnings <- NULL [18:03:18.672] } [18:03:18.672] base::options(...future.oldOptions) [18:03:18.672] if (.Platform$OS.type == "windows") { [18:03:18.672] old_names <- names(...future.oldEnvVars) [18:03:18.672] envs <- base::Sys.getenv() [18:03:18.672] names <- names(envs) [18:03:18.672] common <- intersect(names, old_names) [18:03:18.672] added <- setdiff(names, old_names) [18:03:18.672] removed <- setdiff(old_names, names) [18:03:18.672] changed <- common[...future.oldEnvVars[common] != [18:03:18.672] envs[common]] [18:03:18.672] NAMES <- toupper(changed) [18:03:18.672] args <- list() [18:03:18.672] for (kk in seq_along(NAMES)) { [18:03:18.672] name <- changed[[kk]] [18:03:18.672] NAME <- NAMES[[kk]] [18:03:18.672] if (name != NAME && is.element(NAME, old_names)) [18:03:18.672] next [18:03:18.672] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.672] } [18:03:18.672] NAMES <- toupper(added) [18:03:18.672] for (kk in seq_along(NAMES)) { [18:03:18.672] name <- added[[kk]] [18:03:18.672] NAME <- NAMES[[kk]] [18:03:18.672] if (name != NAME && is.element(NAME, old_names)) [18:03:18.672] next [18:03:18.672] args[[name]] <- "" [18:03:18.672] } [18:03:18.672] NAMES <- toupper(removed) [18:03:18.672] for (kk in seq_along(NAMES)) { [18:03:18.672] name <- removed[[kk]] [18:03:18.672] NAME <- NAMES[[kk]] [18:03:18.672] if (name != NAME && is.element(NAME, old_names)) [18:03:18.672] next [18:03:18.672] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.672] } [18:03:18.672] if (length(args) > 0) [18:03:18.672] base::do.call(base::Sys.setenv, args = args) [18:03:18.672] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.672] } [18:03:18.672] else { [18:03:18.672] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.672] } [18:03:18.672] { [18:03:18.672] if (base::length(...future.futureOptionsAdded) > [18:03:18.672] 0L) { [18:03:18.672] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.672] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.672] base::options(opts) [18:03:18.672] } [18:03:18.672] { [18:03:18.672] { [18:03:18.672] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.672] NULL [18:03:18.672] } [18:03:18.672] options(future.plan = NULL) [18:03:18.672] if (is.na(NA_character_)) [18:03:18.672] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.672] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.672] future::plan(list(function (..., workers = availableCores(), [18:03:18.672] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.672] envir = parent.frame()) [18:03:18.672] { [18:03:18.672] if (is.function(workers)) [18:03:18.672] workers <- workers() [18:03:18.672] workers <- structure(as.integer(workers), [18:03:18.672] class = class(workers)) [18:03:18.672] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.672] workers >= 1) [18:03:18.672] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.672] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.672] } [18:03:18.672] future <- MultisessionFuture(..., workers = workers, [18:03:18.672] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.672] envir = envir) [18:03:18.672] if (!future$lazy) [18:03:18.672] future <- run(future) [18:03:18.672] invisible(future) [18:03:18.672] }), .cleanup = FALSE, .init = FALSE) [18:03:18.672] } [18:03:18.672] } [18:03:18.672] } [18:03:18.672] }) [18:03:18.672] if (TRUE) { [18:03:18.672] base::sink(type = "output", split = FALSE) [18:03:18.672] if (TRUE) { [18:03:18.672] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.672] } [18:03:18.672] else { [18:03:18.672] ...future.result["stdout"] <- base::list(NULL) [18:03:18.672] } [18:03:18.672] base::close(...future.stdout) [18:03:18.672] ...future.stdout <- NULL [18:03:18.672] } [18:03:18.672] ...future.result$conditions <- ...future.conditions [18:03:18.672] ...future.result$finished <- base::Sys.time() [18:03:18.672] ...future.result [18:03:18.672] } [18:03:18.677] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.678] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.678] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.678] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.679] MultisessionFuture started [18:03:18.679] - Launch lazy future ... done [18:03:18.679] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_1-495147' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5e84538 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:18.696] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.697] - Validating connection of MultisessionFuture [18:03:18.697] - received message: FutureResult [18:03:18.697] - Received FutureResult [18:03:18.697] - Erased future from FutureRegistry [18:03:18.697] result() for ClusterFuture ... [18:03:18.698] - result already collected: FutureResult [18:03:18.698] result() for ClusterFuture ... done [18:03:18.698] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.698] getGlobalsAndPackages() ... [18:03:18.698] Searching for globals... [18:03:18.699] - globals found: [3] '{', 'sample', 'x' [18:03:18.700] Searching for globals ... DONE [18:03:18.700] Resolving globals: FALSE [18:03:18.700] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.701] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.701] - globals: [1] 'x' [18:03:18.701] [18:03:18.701] getGlobalsAndPackages() ... DONE [18:03:18.702] run() for 'Future' ... [18:03:18.702] - state: 'created' [18:03:18.702] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.715] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.716] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.716] - Field: 'node' [18:03:18.716] - Field: 'label' [18:03:18.716] - Field: 'local' [18:03:18.716] - Field: 'owner' [18:03:18.716] - Field: 'envir' [18:03:18.717] - Field: 'workers' [18:03:18.717] - Field: 'packages' [18:03:18.717] - Field: 'gc' [18:03:18.717] - Field: 'conditions' [18:03:18.717] - Field: 'persistent' [18:03:18.718] - Field: 'expr' [18:03:18.718] - Field: 'uuid' [18:03:18.718] - Field: 'seed' [18:03:18.718] - Field: 'version' [18:03:18.718] - Field: 'result' [18:03:18.718] - Field: 'asynchronous' [18:03:18.719] - Field: 'calls' [18:03:18.719] - Field: 'globals' [18:03:18.719] - Field: 'stdout' [18:03:18.719] - Field: 'earlySignal' [18:03:18.719] - Field: 'lazy' [18:03:18.719] - Field: 'state' [18:03:18.720] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.720] - Launch lazy future ... [18:03:18.720] Packages needed by the future expression (n = 0): [18:03:18.720] Packages needed by future strategies (n = 0): [18:03:18.721] { [18:03:18.721] { [18:03:18.721] { [18:03:18.721] ...future.startTime <- base::Sys.time() [18:03:18.721] { [18:03:18.721] { [18:03:18.721] { [18:03:18.721] { [18:03:18.721] base::local({ [18:03:18.721] has_future <- base::requireNamespace("future", [18:03:18.721] quietly = TRUE) [18:03:18.721] if (has_future) { [18:03:18.721] ns <- base::getNamespace("future") [18:03:18.721] version <- ns[[".package"]][["version"]] [18:03:18.721] if (is.null(version)) [18:03:18.721] version <- utils::packageVersion("future") [18:03:18.721] } [18:03:18.721] else { [18:03:18.721] version <- NULL [18:03:18.721] } [18:03:18.721] if (!has_future || version < "1.8.0") { [18:03:18.721] info <- base::c(r_version = base::gsub("R version ", [18:03:18.721] "", base::R.version$version.string), [18:03:18.721] platform = base::sprintf("%s (%s-bit)", [18:03:18.721] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:18.721] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.721] "release", "version")], collapse = " "), [18:03:18.721] hostname = base::Sys.info()[["nodename"]]) [18:03:18.721] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.721] info) [18:03:18.721] info <- base::paste(info, collapse = "; ") [18:03:18.721] if (!has_future) { [18:03:18.721] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.721] info) [18:03:18.721] } [18:03:18.721] else { [18:03:18.721] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.721] info, version) [18:03:18.721] } [18:03:18.721] base::stop(msg) [18:03:18.721] } [18:03:18.721] }) [18:03:18.721] } [18:03:18.721] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.721] base::options(mc.cores = 1L) [18:03:18.721] } [18:03:18.721] options(future.plan = NULL) [18:03:18.721] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.721] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:18.721] } [18:03:18.721] ...future.workdir <- getwd() [18:03:18.721] } [18:03:18.721] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.721] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.721] } [18:03:18.721] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.721] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.721] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.721] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.721] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.721] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.721] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.721] base::names(...future.oldOptions)) [18:03:18.721] } [18:03:18.721] if (FALSE) { [18:03:18.721] } [18:03:18.721] else { [18:03:18.721] if (TRUE) { [18:03:18.721] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.721] open = "w") [18:03:18.721] } [18:03:18.721] else { [18:03:18.721] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.721] windows = "NUL", "/dev/null"), open = "w") [18:03:18.721] } [18:03:18.721] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.721] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.721] base::sink(type = "output", split = FALSE) [18:03:18.721] base::close(...future.stdout) [18:03:18.721] }, add = TRUE) [18:03:18.721] } [18:03:18.721] ...future.frame <- base::sys.nframe() [18:03:18.721] ...future.conditions <- base::list() [18:03:18.721] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.721] if (FALSE) { [18:03:18.721] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.721] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.721] } [18:03:18.721] ...future.result <- base::tryCatch({ [18:03:18.721] base::withCallingHandlers({ [18:03:18.721] ...future.value <- base::withVisible(base::local({ [18:03:18.721] ...future.makeSendCondition <- local({ [18:03:18.721] sendCondition <- NULL [18:03:18.721] function(frame = 1L) { [18:03:18.721] if (is.function(sendCondition)) [18:03:18.721] return(sendCondition) [18:03:18.721] ns <- getNamespace("parallel") [18:03:18.721] if (exists("sendData", mode = "function", [18:03:18.721] envir = ns)) { [18:03:18.721] parallel_sendData <- get("sendData", mode = "function", [18:03:18.721] envir = ns) [18:03:18.721] envir <- sys.frame(frame) [18:03:18.721] master <- NULL [18:03:18.721] while (!identical(envir, .GlobalEnv) && [18:03:18.721] !identical(envir, emptyenv())) { [18:03:18.721] if (exists("master", mode = "list", envir = envir, [18:03:18.721] inherits = FALSE)) { [18:03:18.721] master <- get("master", mode = "list", [18:03:18.721] envir = envir, inherits = FALSE) [18:03:18.721] if (inherits(master, c("SOCKnode", [18:03:18.721] "SOCK0node"))) { [18:03:18.721] sendCondition <<- function(cond) { [18:03:18.721] data <- list(type = "VALUE", value = cond, [18:03:18.721] success = TRUE) [18:03:18.721] parallel_sendData(master, data) [18:03:18.721] } [18:03:18.721] return(sendCondition) [18:03:18.721] } [18:03:18.721] } [18:03:18.721] frame <- frame + 1L [18:03:18.721] envir <- sys.frame(frame) [18:03:18.721] } [18:03:18.721] } [18:03:18.721] sendCondition <<- function(cond) NULL [18:03:18.721] } [18:03:18.721] }) [18:03:18.721] withCallingHandlers({ [18:03:18.721] { [18:03:18.721] sample(x, size = 1L) [18:03:18.721] } [18:03:18.721] }, immediateCondition = function(cond) { [18:03:18.721] sendCondition <- ...future.makeSendCondition() [18:03:18.721] sendCondition(cond) [18:03:18.721] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.721] { [18:03:18.721] inherits <- base::inherits [18:03:18.721] invokeRestart <- base::invokeRestart [18:03:18.721] is.null <- base::is.null [18:03:18.721] muffled <- FALSE [18:03:18.721] if (inherits(cond, "message")) { [18:03:18.721] muffled <- grepl(pattern, "muffleMessage") [18:03:18.721] if (muffled) [18:03:18.721] invokeRestart("muffleMessage") [18:03:18.721] } [18:03:18.721] else if (inherits(cond, "warning")) { [18:03:18.721] muffled <- grepl(pattern, "muffleWarning") [18:03:18.721] if (muffled) [18:03:18.721] invokeRestart("muffleWarning") [18:03:18.721] } [18:03:18.721] else if (inherits(cond, "condition")) { [18:03:18.721] if (!is.null(pattern)) { [18:03:18.721] computeRestarts <- base::computeRestarts [18:03:18.721] grepl <- base::grepl [18:03:18.721] restarts <- computeRestarts(cond) [18:03:18.721] for (restart in restarts) { [18:03:18.721] name <- restart$name [18:03:18.721] if (is.null(name)) [18:03:18.721] next [18:03:18.721] if (!grepl(pattern, name)) [18:03:18.721] next [18:03:18.721] invokeRestart(restart) [18:03:18.721] muffled <- TRUE [18:03:18.721] break [18:03:18.721] } [18:03:18.721] } [18:03:18.721] } [18:03:18.721] invisible(muffled) [18:03:18.721] } [18:03:18.721] muffleCondition(cond) [18:03:18.721] }) [18:03:18.721] })) [18:03:18.721] future::FutureResult(value = ...future.value$value, [18:03:18.721] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.721] ...future.rng), globalenv = if (FALSE) [18:03:18.721] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.721] ...future.globalenv.names)) [18:03:18.721] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.721] }, condition = base::local({ [18:03:18.721] c <- base::c [18:03:18.721] inherits <- base::inherits [18:03:18.721] invokeRestart <- base::invokeRestart [18:03:18.721] length <- base::length [18:03:18.721] list <- base::list [18:03:18.721] seq.int <- base::seq.int [18:03:18.721] signalCondition <- base::signalCondition [18:03:18.721] sys.calls <- base::sys.calls [18:03:18.721] `[[` <- base::`[[` [18:03:18.721] `+` <- base::`+` [18:03:18.721] `<<-` <- base::`<<-` [18:03:18.721] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.721] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.721] 3L)] [18:03:18.721] } [18:03:18.721] function(cond) { [18:03:18.721] is_error <- inherits(cond, "error") [18:03:18.721] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.721] NULL) [18:03:18.721] if (is_error) { [18:03:18.721] sessionInformation <- function() { [18:03:18.721] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.721] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.721] search = base::search(), system = base::Sys.info()) [18:03:18.721] } [18:03:18.721] ...future.conditions[[length(...future.conditions) + [18:03:18.721] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.721] cond$call), session = sessionInformation(), [18:03:18.721] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.721] signalCondition(cond) [18:03:18.721] } [18:03:18.721] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.721] "immediateCondition"))) { [18:03:18.721] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.721] ...future.conditions[[length(...future.conditions) + [18:03:18.721] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.721] if (TRUE && !signal) { [18:03:18.721] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.721] { [18:03:18.721] inherits <- base::inherits [18:03:18.721] invokeRestart <- base::invokeRestart [18:03:18.721] is.null <- base::is.null [18:03:18.721] muffled <- FALSE [18:03:18.721] if (inherits(cond, "message")) { [18:03:18.721] muffled <- grepl(pattern, "muffleMessage") [18:03:18.721] if (muffled) [18:03:18.721] invokeRestart("muffleMessage") [18:03:18.721] } [18:03:18.721] else if (inherits(cond, "warning")) { [18:03:18.721] muffled <- grepl(pattern, "muffleWarning") [18:03:18.721] if (muffled) [18:03:18.721] invokeRestart("muffleWarning") [18:03:18.721] } [18:03:18.721] else if (inherits(cond, "condition")) { [18:03:18.721] if (!is.null(pattern)) { [18:03:18.721] computeRestarts <- base::computeRestarts [18:03:18.721] grepl <- base::grepl [18:03:18.721] restarts <- computeRestarts(cond) [18:03:18.721] for (restart in restarts) { [18:03:18.721] name <- restart$name [18:03:18.721] if (is.null(name)) [18:03:18.721] next [18:03:18.721] if (!grepl(pattern, name)) [18:03:18.721] next [18:03:18.721] invokeRestart(restart) [18:03:18.721] muffled <- TRUE [18:03:18.721] break [18:03:18.721] } [18:03:18.721] } [18:03:18.721] } [18:03:18.721] invisible(muffled) [18:03:18.721] } [18:03:18.721] muffleCondition(cond, pattern = "^muffle") [18:03:18.721] } [18:03:18.721] } [18:03:18.721] else { [18:03:18.721] if (TRUE) { [18:03:18.721] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.721] { [18:03:18.721] inherits <- base::inherits [18:03:18.721] invokeRestart <- base::invokeRestart [18:03:18.721] is.null <- base::is.null [18:03:18.721] muffled <- FALSE [18:03:18.721] if (inherits(cond, "message")) { [18:03:18.721] muffled <- grepl(pattern, "muffleMessage") [18:03:18.721] if (muffled) [18:03:18.721] invokeRestart("muffleMessage") [18:03:18.721] } [18:03:18.721] else if (inherits(cond, "warning")) { [18:03:18.721] muffled <- grepl(pattern, "muffleWarning") [18:03:18.721] if (muffled) [18:03:18.721] invokeRestart("muffleWarning") [18:03:18.721] } [18:03:18.721] else if (inherits(cond, "condition")) { [18:03:18.721] if (!is.null(pattern)) { [18:03:18.721] computeRestarts <- base::computeRestarts [18:03:18.721] grepl <- base::grepl [18:03:18.721] restarts <- computeRestarts(cond) [18:03:18.721] for (restart in restarts) { [18:03:18.721] name <- restart$name [18:03:18.721] if (is.null(name)) [18:03:18.721] next [18:03:18.721] if (!grepl(pattern, name)) [18:03:18.721] next [18:03:18.721] invokeRestart(restart) [18:03:18.721] muffled <- TRUE [18:03:18.721] break [18:03:18.721] } [18:03:18.721] } [18:03:18.721] } [18:03:18.721] invisible(muffled) [18:03:18.721] } [18:03:18.721] muffleCondition(cond, pattern = "^muffle") [18:03:18.721] } [18:03:18.721] } [18:03:18.721] } [18:03:18.721] })) [18:03:18.721] }, error = function(ex) { [18:03:18.721] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.721] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.721] ...future.rng), started = ...future.startTime, [18:03:18.721] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.721] version = "1.8"), class = "FutureResult") [18:03:18.721] }, finally = { [18:03:18.721] if (!identical(...future.workdir, getwd())) [18:03:18.721] setwd(...future.workdir) [18:03:18.721] { [18:03:18.721] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.721] ...future.oldOptions$nwarnings <- NULL [18:03:18.721] } [18:03:18.721] base::options(...future.oldOptions) [18:03:18.721] if (.Platform$OS.type == "windows") { [18:03:18.721] old_names <- names(...future.oldEnvVars) [18:03:18.721] envs <- base::Sys.getenv() [18:03:18.721] names <- names(envs) [18:03:18.721] common <- intersect(names, old_names) [18:03:18.721] added <- setdiff(names, old_names) [18:03:18.721] removed <- setdiff(old_names, names) [18:03:18.721] changed <- common[...future.oldEnvVars[common] != [18:03:18.721] envs[common]] [18:03:18.721] NAMES <- toupper(changed) [18:03:18.721] args <- list() [18:03:18.721] for (kk in seq_along(NAMES)) { [18:03:18.721] name <- changed[[kk]] [18:03:18.721] NAME <- NAMES[[kk]] [18:03:18.721] if (name != NAME && is.element(NAME, old_names)) [18:03:18.721] next [18:03:18.721] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.721] } [18:03:18.721] NAMES <- toupper(added) [18:03:18.721] for (kk in seq_along(NAMES)) { [18:03:18.721] name <- added[[kk]] [18:03:18.721] NAME <- NAMES[[kk]] [18:03:18.721] if (name != NAME && is.element(NAME, old_names)) [18:03:18.721] next [18:03:18.721] args[[name]] <- "" [18:03:18.721] } [18:03:18.721] NAMES <- toupper(removed) [18:03:18.721] for (kk in seq_along(NAMES)) { [18:03:18.721] name <- removed[[kk]] [18:03:18.721] NAME <- NAMES[[kk]] [18:03:18.721] if (name != NAME && is.element(NAME, old_names)) [18:03:18.721] next [18:03:18.721] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.721] } [18:03:18.721] if (length(args) > 0) [18:03:18.721] base::do.call(base::Sys.setenv, args = args) [18:03:18.721] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.721] } [18:03:18.721] else { [18:03:18.721] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.721] } [18:03:18.721] { [18:03:18.721] if (base::length(...future.futureOptionsAdded) > [18:03:18.721] 0L) { [18:03:18.721] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.721] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.721] base::options(opts) [18:03:18.721] } [18:03:18.721] { [18:03:18.721] { [18:03:18.721] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.721] NULL [18:03:18.721] } [18:03:18.721] options(future.plan = NULL) [18:03:18.721] if (is.na(NA_character_)) [18:03:18.721] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.721] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.721] future::plan(list(function (..., workers = availableCores(), [18:03:18.721] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.721] envir = parent.frame()) [18:03:18.721] { [18:03:18.721] if (is.function(workers)) [18:03:18.721] workers <- workers() [18:03:18.721] workers <- structure(as.integer(workers), [18:03:18.721] class = class(workers)) [18:03:18.721] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.721] workers >= 1) [18:03:18.721] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.721] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.721] } [18:03:18.721] future <- MultisessionFuture(..., workers = workers, [18:03:18.721] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.721] envir = envir) [18:03:18.721] if (!future$lazy) [18:03:18.721] future <- run(future) [18:03:18.721] invisible(future) [18:03:18.721] }), .cleanup = FALSE, .init = FALSE) [18:03:18.721] } [18:03:18.721] } [18:03:18.721] } [18:03:18.721] }) [18:03:18.721] if (TRUE) { [18:03:18.721] base::sink(type = "output", split = FALSE) [18:03:18.721] if (TRUE) { [18:03:18.721] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.721] } [18:03:18.721] else { [18:03:18.721] ...future.result["stdout"] <- base::list(NULL) [18:03:18.721] } [18:03:18.721] base::close(...future.stdout) [18:03:18.721] ...future.stdout <- NULL [18:03:18.721] } [18:03:18.721] ...future.result$conditions <- ...future.conditions [18:03:18.721] ...future.result$finished <- base::Sys.time() [18:03:18.721] ...future.result [18:03:18.721] } [18:03:18.726] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.726] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.727] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.727] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.728] MultisessionFuture started [18:03:18.728] - Launch lazy future ... done [18:03:18.728] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_2-687115' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5e84538 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:18.744] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.745] - Validating connection of MultisessionFuture [18:03:18.745] - received message: FutureResult [18:03:18.745] - Received FutureResult [18:03:18.745] - Erased future from FutureRegistry [18:03:18.746] result() for ClusterFuture ... [18:03:18.746] - result already collected: FutureResult [18:03:18.746] result() for ClusterFuture ... done [18:03:18.746] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.746] getGlobalsAndPackages() ... [18:03:18.746] Searching for globals... [18:03:18.748] - globals found: [3] '{', 'sample', 'x' [18:03:18.748] Searching for globals ... DONE [18:03:18.748] Resolving globals: FALSE [18:03:18.748] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.749] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.749] - globals: [1] 'x' [18:03:18.749] [18:03:18.749] getGlobalsAndPackages() ... DONE [18:03:18.750] run() for 'Future' ... [18:03:18.750] - state: 'created' [18:03:18.750] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.764] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.764] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.764] - Field: 'node' [18:03:18.764] - Field: 'label' [18:03:18.764] - Field: 'local' [18:03:18.765] - Field: 'owner' [18:03:18.765] - Field: 'envir' [18:03:18.765] - Field: 'workers' [18:03:18.765] - Field: 'packages' [18:03:18.765] - Field: 'gc' [18:03:18.766] - Field: 'conditions' [18:03:18.766] - Field: 'persistent' [18:03:18.766] - Field: 'expr' [18:03:18.766] - Field: 'uuid' [18:03:18.766] - Field: 'seed' [18:03:18.766] - Field: 'version' [18:03:18.767] - Field: 'result' [18:03:18.767] - Field: 'asynchronous' [18:03:18.767] - Field: 'calls' [18:03:18.767] - Field: 'globals' [18:03:18.767] - Field: 'stdout' [18:03:18.767] - Field: 'earlySignal' [18:03:18.768] - Field: 'lazy' [18:03:18.768] - Field: 'state' [18:03:18.768] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.768] - Launch lazy future ... [18:03:18.769] Packages needed by the future expression (n = 0): [18:03:18.769] Packages needed by future strategies (n = 0): [18:03:18.769] { [18:03:18.769] { [18:03:18.769] { [18:03:18.769] ...future.startTime <- base::Sys.time() [18:03:18.769] { [18:03:18.769] { [18:03:18.769] { [18:03:18.769] { [18:03:18.769] base::local({ [18:03:18.769] has_future <- base::requireNamespace("future", [18:03:18.769] quietly = TRUE) [18:03:18.769] if (has_future) { [18:03:18.769] ns <- base::getNamespace("future") [18:03:18.769] version <- ns[[".package"]][["version"]] [18:03:18.769] if (is.null(version)) [18:03:18.769] version <- utils::packageVersion("future") [18:03:18.769] } [18:03:18.769] else { [18:03:18.769] version <- NULL [18:03:18.769] } [18:03:18.769] if (!has_future || version < "1.8.0") { [18:03:18.769] info <- base::c(r_version = base::gsub("R version ", [18:03:18.769] "", base::R.version$version.string), [18:03:18.769] platform = base::sprintf("%s (%s-bit)", [18:03:18.769] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:18.769] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.769] "release", "version")], collapse = " "), [18:03:18.769] hostname = base::Sys.info()[["nodename"]]) [18:03:18.769] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.769] info) [18:03:18.769] info <- base::paste(info, collapse = "; ") [18:03:18.769] if (!has_future) { [18:03:18.769] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.769] info) [18:03:18.769] } [18:03:18.769] else { [18:03:18.769] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.769] info, version) [18:03:18.769] } [18:03:18.769] base::stop(msg) [18:03:18.769] } [18:03:18.769] }) [18:03:18.769] } [18:03:18.769] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.769] base::options(mc.cores = 1L) [18:03:18.769] } [18:03:18.769] options(future.plan = NULL) [18:03:18.769] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.769] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:18.769] } [18:03:18.769] ...future.workdir <- getwd() [18:03:18.769] } [18:03:18.769] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.769] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.769] } [18:03:18.769] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.769] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.769] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.769] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.769] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.769] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.769] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.769] base::names(...future.oldOptions)) [18:03:18.769] } [18:03:18.769] if (FALSE) { [18:03:18.769] } [18:03:18.769] else { [18:03:18.769] if (TRUE) { [18:03:18.769] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.769] open = "w") [18:03:18.769] } [18:03:18.769] else { [18:03:18.769] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.769] windows = "NUL", "/dev/null"), open = "w") [18:03:18.769] } [18:03:18.769] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.769] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.769] base::sink(type = "output", split = FALSE) [18:03:18.769] base::close(...future.stdout) [18:03:18.769] }, add = TRUE) [18:03:18.769] } [18:03:18.769] ...future.frame <- base::sys.nframe() [18:03:18.769] ...future.conditions <- base::list() [18:03:18.769] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.769] if (FALSE) { [18:03:18.769] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.769] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.769] } [18:03:18.769] ...future.result <- base::tryCatch({ [18:03:18.769] base::withCallingHandlers({ [18:03:18.769] ...future.value <- base::withVisible(base::local({ [18:03:18.769] ...future.makeSendCondition <- local({ [18:03:18.769] sendCondition <- NULL [18:03:18.769] function(frame = 1L) { [18:03:18.769] if (is.function(sendCondition)) [18:03:18.769] return(sendCondition) [18:03:18.769] ns <- getNamespace("parallel") [18:03:18.769] if (exists("sendData", mode = "function", [18:03:18.769] envir = ns)) { [18:03:18.769] parallel_sendData <- get("sendData", mode = "function", [18:03:18.769] envir = ns) [18:03:18.769] envir <- sys.frame(frame) [18:03:18.769] master <- NULL [18:03:18.769] while (!identical(envir, .GlobalEnv) && [18:03:18.769] !identical(envir, emptyenv())) { [18:03:18.769] if (exists("master", mode = "list", envir = envir, [18:03:18.769] inherits = FALSE)) { [18:03:18.769] master <- get("master", mode = "list", [18:03:18.769] envir = envir, inherits = FALSE) [18:03:18.769] if (inherits(master, c("SOCKnode", [18:03:18.769] "SOCK0node"))) { [18:03:18.769] sendCondition <<- function(cond) { [18:03:18.769] data <- list(type = "VALUE", value = cond, [18:03:18.769] success = TRUE) [18:03:18.769] parallel_sendData(master, data) [18:03:18.769] } [18:03:18.769] return(sendCondition) [18:03:18.769] } [18:03:18.769] } [18:03:18.769] frame <- frame + 1L [18:03:18.769] envir <- sys.frame(frame) [18:03:18.769] } [18:03:18.769] } [18:03:18.769] sendCondition <<- function(cond) NULL [18:03:18.769] } [18:03:18.769] }) [18:03:18.769] withCallingHandlers({ [18:03:18.769] { [18:03:18.769] sample(x, size = 1L) [18:03:18.769] } [18:03:18.769] }, immediateCondition = function(cond) { [18:03:18.769] sendCondition <- ...future.makeSendCondition() [18:03:18.769] sendCondition(cond) [18:03:18.769] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.769] { [18:03:18.769] inherits <- base::inherits [18:03:18.769] invokeRestart <- base::invokeRestart [18:03:18.769] is.null <- base::is.null [18:03:18.769] muffled <- FALSE [18:03:18.769] if (inherits(cond, "message")) { [18:03:18.769] muffled <- grepl(pattern, "muffleMessage") [18:03:18.769] if (muffled) [18:03:18.769] invokeRestart("muffleMessage") [18:03:18.769] } [18:03:18.769] else if (inherits(cond, "warning")) { [18:03:18.769] muffled <- grepl(pattern, "muffleWarning") [18:03:18.769] if (muffled) [18:03:18.769] invokeRestart("muffleWarning") [18:03:18.769] } [18:03:18.769] else if (inherits(cond, "condition")) { [18:03:18.769] if (!is.null(pattern)) { [18:03:18.769] computeRestarts <- base::computeRestarts [18:03:18.769] grepl <- base::grepl [18:03:18.769] restarts <- computeRestarts(cond) [18:03:18.769] for (restart in restarts) { [18:03:18.769] name <- restart$name [18:03:18.769] if (is.null(name)) [18:03:18.769] next [18:03:18.769] if (!grepl(pattern, name)) [18:03:18.769] next [18:03:18.769] invokeRestart(restart) [18:03:18.769] muffled <- TRUE [18:03:18.769] break [18:03:18.769] } [18:03:18.769] } [18:03:18.769] } [18:03:18.769] invisible(muffled) [18:03:18.769] } [18:03:18.769] muffleCondition(cond) [18:03:18.769] }) [18:03:18.769] })) [18:03:18.769] future::FutureResult(value = ...future.value$value, [18:03:18.769] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.769] ...future.rng), globalenv = if (FALSE) [18:03:18.769] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.769] ...future.globalenv.names)) [18:03:18.769] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.769] }, condition = base::local({ [18:03:18.769] c <- base::c [18:03:18.769] inherits <- base::inherits [18:03:18.769] invokeRestart <- base::invokeRestart [18:03:18.769] length <- base::length [18:03:18.769] list <- base::list [18:03:18.769] seq.int <- base::seq.int [18:03:18.769] signalCondition <- base::signalCondition [18:03:18.769] sys.calls <- base::sys.calls [18:03:18.769] `[[` <- base::`[[` [18:03:18.769] `+` <- base::`+` [18:03:18.769] `<<-` <- base::`<<-` [18:03:18.769] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.769] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.769] 3L)] [18:03:18.769] } [18:03:18.769] function(cond) { [18:03:18.769] is_error <- inherits(cond, "error") [18:03:18.769] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.769] NULL) [18:03:18.769] if (is_error) { [18:03:18.769] sessionInformation <- function() { [18:03:18.769] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.769] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.769] search = base::search(), system = base::Sys.info()) [18:03:18.769] } [18:03:18.769] ...future.conditions[[length(...future.conditions) + [18:03:18.769] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.769] cond$call), session = sessionInformation(), [18:03:18.769] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.769] signalCondition(cond) [18:03:18.769] } [18:03:18.769] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.769] "immediateCondition"))) { [18:03:18.769] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.769] ...future.conditions[[length(...future.conditions) + [18:03:18.769] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.769] if (TRUE && !signal) { [18:03:18.769] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.769] { [18:03:18.769] inherits <- base::inherits [18:03:18.769] invokeRestart <- base::invokeRestart [18:03:18.769] is.null <- base::is.null [18:03:18.769] muffled <- FALSE [18:03:18.769] if (inherits(cond, "message")) { [18:03:18.769] muffled <- grepl(pattern, "muffleMessage") [18:03:18.769] if (muffled) [18:03:18.769] invokeRestart("muffleMessage") [18:03:18.769] } [18:03:18.769] else if (inherits(cond, "warning")) { [18:03:18.769] muffled <- grepl(pattern, "muffleWarning") [18:03:18.769] if (muffled) [18:03:18.769] invokeRestart("muffleWarning") [18:03:18.769] } [18:03:18.769] else if (inherits(cond, "condition")) { [18:03:18.769] if (!is.null(pattern)) { [18:03:18.769] computeRestarts <- base::computeRestarts [18:03:18.769] grepl <- base::grepl [18:03:18.769] restarts <- computeRestarts(cond) [18:03:18.769] for (restart in restarts) { [18:03:18.769] name <- restart$name [18:03:18.769] if (is.null(name)) [18:03:18.769] next [18:03:18.769] if (!grepl(pattern, name)) [18:03:18.769] next [18:03:18.769] invokeRestart(restart) [18:03:18.769] muffled <- TRUE [18:03:18.769] break [18:03:18.769] } [18:03:18.769] } [18:03:18.769] } [18:03:18.769] invisible(muffled) [18:03:18.769] } [18:03:18.769] muffleCondition(cond, pattern = "^muffle") [18:03:18.769] } [18:03:18.769] } [18:03:18.769] else { [18:03:18.769] if (TRUE) { [18:03:18.769] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.769] { [18:03:18.769] inherits <- base::inherits [18:03:18.769] invokeRestart <- base::invokeRestart [18:03:18.769] is.null <- base::is.null [18:03:18.769] muffled <- FALSE [18:03:18.769] if (inherits(cond, "message")) { [18:03:18.769] muffled <- grepl(pattern, "muffleMessage") [18:03:18.769] if (muffled) [18:03:18.769] invokeRestart("muffleMessage") [18:03:18.769] } [18:03:18.769] else if (inherits(cond, "warning")) { [18:03:18.769] muffled <- grepl(pattern, "muffleWarning") [18:03:18.769] if (muffled) [18:03:18.769] invokeRestart("muffleWarning") [18:03:18.769] } [18:03:18.769] else if (inherits(cond, "condition")) { [18:03:18.769] if (!is.null(pattern)) { [18:03:18.769] computeRestarts <- base::computeRestarts [18:03:18.769] grepl <- base::grepl [18:03:18.769] restarts <- computeRestarts(cond) [18:03:18.769] for (restart in restarts) { [18:03:18.769] name <- restart$name [18:03:18.769] if (is.null(name)) [18:03:18.769] next [18:03:18.769] if (!grepl(pattern, name)) [18:03:18.769] next [18:03:18.769] invokeRestart(restart) [18:03:18.769] muffled <- TRUE [18:03:18.769] break [18:03:18.769] } [18:03:18.769] } [18:03:18.769] } [18:03:18.769] invisible(muffled) [18:03:18.769] } [18:03:18.769] muffleCondition(cond, pattern = "^muffle") [18:03:18.769] } [18:03:18.769] } [18:03:18.769] } [18:03:18.769] })) [18:03:18.769] }, error = function(ex) { [18:03:18.769] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.769] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.769] ...future.rng), started = ...future.startTime, [18:03:18.769] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.769] version = "1.8"), class = "FutureResult") [18:03:18.769] }, finally = { [18:03:18.769] if (!identical(...future.workdir, getwd())) [18:03:18.769] setwd(...future.workdir) [18:03:18.769] { [18:03:18.769] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.769] ...future.oldOptions$nwarnings <- NULL [18:03:18.769] } [18:03:18.769] base::options(...future.oldOptions) [18:03:18.769] if (.Platform$OS.type == "windows") { [18:03:18.769] old_names <- names(...future.oldEnvVars) [18:03:18.769] envs <- base::Sys.getenv() [18:03:18.769] names <- names(envs) [18:03:18.769] common <- intersect(names, old_names) [18:03:18.769] added <- setdiff(names, old_names) [18:03:18.769] removed <- setdiff(old_names, names) [18:03:18.769] changed <- common[...future.oldEnvVars[common] != [18:03:18.769] envs[common]] [18:03:18.769] NAMES <- toupper(changed) [18:03:18.769] args <- list() [18:03:18.769] for (kk in seq_along(NAMES)) { [18:03:18.769] name <- changed[[kk]] [18:03:18.769] NAME <- NAMES[[kk]] [18:03:18.769] if (name != NAME && is.element(NAME, old_names)) [18:03:18.769] next [18:03:18.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.769] } [18:03:18.769] NAMES <- toupper(added) [18:03:18.769] for (kk in seq_along(NAMES)) { [18:03:18.769] name <- added[[kk]] [18:03:18.769] NAME <- NAMES[[kk]] [18:03:18.769] if (name != NAME && is.element(NAME, old_names)) [18:03:18.769] next [18:03:18.769] args[[name]] <- "" [18:03:18.769] } [18:03:18.769] NAMES <- toupper(removed) [18:03:18.769] for (kk in seq_along(NAMES)) { [18:03:18.769] name <- removed[[kk]] [18:03:18.769] NAME <- NAMES[[kk]] [18:03:18.769] if (name != NAME && is.element(NAME, old_names)) [18:03:18.769] next [18:03:18.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.769] } [18:03:18.769] if (length(args) > 0) [18:03:18.769] base::do.call(base::Sys.setenv, args = args) [18:03:18.769] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.769] } [18:03:18.769] else { [18:03:18.769] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.769] } [18:03:18.769] { [18:03:18.769] if (base::length(...future.futureOptionsAdded) > [18:03:18.769] 0L) { [18:03:18.769] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.769] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.769] base::options(opts) [18:03:18.769] } [18:03:18.769] { [18:03:18.769] { [18:03:18.769] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.769] NULL [18:03:18.769] } [18:03:18.769] options(future.plan = NULL) [18:03:18.769] if (is.na(NA_character_)) [18:03:18.769] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.769] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.769] future::plan(list(function (..., workers = availableCores(), [18:03:18.769] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.769] envir = parent.frame()) [18:03:18.769] { [18:03:18.769] if (is.function(workers)) [18:03:18.769] workers <- workers() [18:03:18.769] workers <- structure(as.integer(workers), [18:03:18.769] class = class(workers)) [18:03:18.769] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.769] workers >= 1) [18:03:18.769] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.769] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.769] } [18:03:18.769] future <- MultisessionFuture(..., workers = workers, [18:03:18.769] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.769] envir = envir) [18:03:18.769] if (!future$lazy) [18:03:18.769] future <- run(future) [18:03:18.769] invisible(future) [18:03:18.769] }), .cleanup = FALSE, .init = FALSE) [18:03:18.769] } [18:03:18.769] } [18:03:18.769] } [18:03:18.769] }) [18:03:18.769] if (TRUE) { [18:03:18.769] base::sink(type = "output", split = FALSE) [18:03:18.769] if (TRUE) { [18:03:18.769] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.769] } [18:03:18.769] else { [18:03:18.769] ...future.result["stdout"] <- base::list(NULL) [18:03:18.769] } [18:03:18.769] base::close(...future.stdout) [18:03:18.769] ...future.stdout <- NULL [18:03:18.769] } [18:03:18.769] ...future.result$conditions <- ...future.conditions [18:03:18.769] ...future.result$finished <- base::Sys.time() [18:03:18.769] ...future.result [18:03:18.769] } [18:03:18.774] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.775] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.775] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.775] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.776] MultisessionFuture started [18:03:18.776] - Launch lazy future ... done [18:03:18.776] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_3-990500' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5e84538 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:18.792] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.792] - Validating connection of MultisessionFuture [18:03:18.792] - received message: FutureResult [18:03:18.792] - Received FutureResult [18:03:18.792] - Erased future from FutureRegistry [18:03:18.793] result() for ClusterFuture ... [18:03:18.793] - result already collected: FutureResult [18:03:18.793] result() for ClusterFuture ... done [18:03:18.793] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.793] getGlobalsAndPackages() ... [18:03:18.794] Searching for globals... [18:03:18.795] - globals found: [3] '{', 'sample', 'x' [18:03:18.795] Searching for globals ... DONE [18:03:18.795] Resolving globals: FALSE [18:03:18.796] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.796] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.796] - globals: [1] 'x' [18:03:18.796] [18:03:18.797] getGlobalsAndPackages() ... DONE [18:03:18.797] run() for 'Future' ... [18:03:18.797] - state: 'created' [18:03:18.797] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.811] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.811] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.811] - Field: 'node' [18:03:18.812] - Field: 'label' [18:03:18.812] - Field: 'local' [18:03:18.812] - Field: 'owner' [18:03:18.812] - Field: 'envir' [18:03:18.812] - Field: 'workers' [18:03:18.813] - Field: 'packages' [18:03:18.813] - Field: 'gc' [18:03:18.813] - Field: 'conditions' [18:03:18.813] - Field: 'persistent' [18:03:18.813] - Field: 'expr' [18:03:18.813] - Field: 'uuid' [18:03:18.814] - Field: 'seed' [18:03:18.814] - Field: 'version' [18:03:18.814] - Field: 'result' [18:03:18.814] - Field: 'asynchronous' [18:03:18.814] - Field: 'calls' [18:03:18.814] - Field: 'globals' [18:03:18.815] - Field: 'stdout' [18:03:18.815] - Field: 'earlySignal' [18:03:18.815] - Field: 'lazy' [18:03:18.815] - Field: 'state' [18:03:18.815] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.816] - Launch lazy future ... [18:03:18.816] Packages needed by the future expression (n = 0): [18:03:18.816] Packages needed by future strategies (n = 0): [18:03:18.817] { [18:03:18.817] { [18:03:18.817] { [18:03:18.817] ...future.startTime <- base::Sys.time() [18:03:18.817] { [18:03:18.817] { [18:03:18.817] { [18:03:18.817] { [18:03:18.817] base::local({ [18:03:18.817] has_future <- base::requireNamespace("future", [18:03:18.817] quietly = TRUE) [18:03:18.817] if (has_future) { [18:03:18.817] ns <- base::getNamespace("future") [18:03:18.817] version <- ns[[".package"]][["version"]] [18:03:18.817] if (is.null(version)) [18:03:18.817] version <- utils::packageVersion("future") [18:03:18.817] } [18:03:18.817] else { [18:03:18.817] version <- NULL [18:03:18.817] } [18:03:18.817] if (!has_future || version < "1.8.0") { [18:03:18.817] info <- base::c(r_version = base::gsub("R version ", [18:03:18.817] "", base::R.version$version.string), [18:03:18.817] platform = base::sprintf("%s (%s-bit)", [18:03:18.817] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:18.817] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.817] "release", "version")], collapse = " "), [18:03:18.817] hostname = base::Sys.info()[["nodename"]]) [18:03:18.817] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.817] info) [18:03:18.817] info <- base::paste(info, collapse = "; ") [18:03:18.817] if (!has_future) { [18:03:18.817] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.817] info) [18:03:18.817] } [18:03:18.817] else { [18:03:18.817] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.817] info, version) [18:03:18.817] } [18:03:18.817] base::stop(msg) [18:03:18.817] } [18:03:18.817] }) [18:03:18.817] } [18:03:18.817] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.817] base::options(mc.cores = 1L) [18:03:18.817] } [18:03:18.817] options(future.plan = NULL) [18:03:18.817] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.817] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:18.817] } [18:03:18.817] ...future.workdir <- getwd() [18:03:18.817] } [18:03:18.817] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.817] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.817] } [18:03:18.817] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.817] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.817] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.817] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.817] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.817] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.817] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.817] base::names(...future.oldOptions)) [18:03:18.817] } [18:03:18.817] if (FALSE) { [18:03:18.817] } [18:03:18.817] else { [18:03:18.817] if (TRUE) { [18:03:18.817] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.817] open = "w") [18:03:18.817] } [18:03:18.817] else { [18:03:18.817] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.817] windows = "NUL", "/dev/null"), open = "w") [18:03:18.817] } [18:03:18.817] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.817] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.817] base::sink(type = "output", split = FALSE) [18:03:18.817] base::close(...future.stdout) [18:03:18.817] }, add = TRUE) [18:03:18.817] } [18:03:18.817] ...future.frame <- base::sys.nframe() [18:03:18.817] ...future.conditions <- base::list() [18:03:18.817] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.817] if (FALSE) { [18:03:18.817] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.817] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.817] } [18:03:18.817] ...future.result <- base::tryCatch({ [18:03:18.817] base::withCallingHandlers({ [18:03:18.817] ...future.value <- base::withVisible(base::local({ [18:03:18.817] ...future.makeSendCondition <- local({ [18:03:18.817] sendCondition <- NULL [18:03:18.817] function(frame = 1L) { [18:03:18.817] if (is.function(sendCondition)) [18:03:18.817] return(sendCondition) [18:03:18.817] ns <- getNamespace("parallel") [18:03:18.817] if (exists("sendData", mode = "function", [18:03:18.817] envir = ns)) { [18:03:18.817] parallel_sendData <- get("sendData", mode = "function", [18:03:18.817] envir = ns) [18:03:18.817] envir <- sys.frame(frame) [18:03:18.817] master <- NULL [18:03:18.817] while (!identical(envir, .GlobalEnv) && [18:03:18.817] !identical(envir, emptyenv())) { [18:03:18.817] if (exists("master", mode = "list", envir = envir, [18:03:18.817] inherits = FALSE)) { [18:03:18.817] master <- get("master", mode = "list", [18:03:18.817] envir = envir, inherits = FALSE) [18:03:18.817] if (inherits(master, c("SOCKnode", [18:03:18.817] "SOCK0node"))) { [18:03:18.817] sendCondition <<- function(cond) { [18:03:18.817] data <- list(type = "VALUE", value = cond, [18:03:18.817] success = TRUE) [18:03:18.817] parallel_sendData(master, data) [18:03:18.817] } [18:03:18.817] return(sendCondition) [18:03:18.817] } [18:03:18.817] } [18:03:18.817] frame <- frame + 1L [18:03:18.817] envir <- sys.frame(frame) [18:03:18.817] } [18:03:18.817] } [18:03:18.817] sendCondition <<- function(cond) NULL [18:03:18.817] } [18:03:18.817] }) [18:03:18.817] withCallingHandlers({ [18:03:18.817] { [18:03:18.817] sample(x, size = 1L) [18:03:18.817] } [18:03:18.817] }, immediateCondition = function(cond) { [18:03:18.817] sendCondition <- ...future.makeSendCondition() [18:03:18.817] sendCondition(cond) [18:03:18.817] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.817] { [18:03:18.817] inherits <- base::inherits [18:03:18.817] invokeRestart <- base::invokeRestart [18:03:18.817] is.null <- base::is.null [18:03:18.817] muffled <- FALSE [18:03:18.817] if (inherits(cond, "message")) { [18:03:18.817] muffled <- grepl(pattern, "muffleMessage") [18:03:18.817] if (muffled) [18:03:18.817] invokeRestart("muffleMessage") [18:03:18.817] } [18:03:18.817] else if (inherits(cond, "warning")) { [18:03:18.817] muffled <- grepl(pattern, "muffleWarning") [18:03:18.817] if (muffled) [18:03:18.817] invokeRestart("muffleWarning") [18:03:18.817] } [18:03:18.817] else if (inherits(cond, "condition")) { [18:03:18.817] if (!is.null(pattern)) { [18:03:18.817] computeRestarts <- base::computeRestarts [18:03:18.817] grepl <- base::grepl [18:03:18.817] restarts <- computeRestarts(cond) [18:03:18.817] for (restart in restarts) { [18:03:18.817] name <- restart$name [18:03:18.817] if (is.null(name)) [18:03:18.817] next [18:03:18.817] if (!grepl(pattern, name)) [18:03:18.817] next [18:03:18.817] invokeRestart(restart) [18:03:18.817] muffled <- TRUE [18:03:18.817] break [18:03:18.817] } [18:03:18.817] } [18:03:18.817] } [18:03:18.817] invisible(muffled) [18:03:18.817] } [18:03:18.817] muffleCondition(cond) [18:03:18.817] }) [18:03:18.817] })) [18:03:18.817] future::FutureResult(value = ...future.value$value, [18:03:18.817] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.817] ...future.rng), globalenv = if (FALSE) [18:03:18.817] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.817] ...future.globalenv.names)) [18:03:18.817] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.817] }, condition = base::local({ [18:03:18.817] c <- base::c [18:03:18.817] inherits <- base::inherits [18:03:18.817] invokeRestart <- base::invokeRestart [18:03:18.817] length <- base::length [18:03:18.817] list <- base::list [18:03:18.817] seq.int <- base::seq.int [18:03:18.817] signalCondition <- base::signalCondition [18:03:18.817] sys.calls <- base::sys.calls [18:03:18.817] `[[` <- base::`[[` [18:03:18.817] `+` <- base::`+` [18:03:18.817] `<<-` <- base::`<<-` [18:03:18.817] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.817] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.817] 3L)] [18:03:18.817] } [18:03:18.817] function(cond) { [18:03:18.817] is_error <- inherits(cond, "error") [18:03:18.817] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.817] NULL) [18:03:18.817] if (is_error) { [18:03:18.817] sessionInformation <- function() { [18:03:18.817] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.817] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.817] search = base::search(), system = base::Sys.info()) [18:03:18.817] } [18:03:18.817] ...future.conditions[[length(...future.conditions) + [18:03:18.817] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.817] cond$call), session = sessionInformation(), [18:03:18.817] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.817] signalCondition(cond) [18:03:18.817] } [18:03:18.817] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.817] "immediateCondition"))) { [18:03:18.817] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.817] ...future.conditions[[length(...future.conditions) + [18:03:18.817] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.817] if (TRUE && !signal) { [18:03:18.817] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.817] { [18:03:18.817] inherits <- base::inherits [18:03:18.817] invokeRestart <- base::invokeRestart [18:03:18.817] is.null <- base::is.null [18:03:18.817] muffled <- FALSE [18:03:18.817] if (inherits(cond, "message")) { [18:03:18.817] muffled <- grepl(pattern, "muffleMessage") [18:03:18.817] if (muffled) [18:03:18.817] invokeRestart("muffleMessage") [18:03:18.817] } [18:03:18.817] else if (inherits(cond, "warning")) { [18:03:18.817] muffled <- grepl(pattern, "muffleWarning") [18:03:18.817] if (muffled) [18:03:18.817] invokeRestart("muffleWarning") [18:03:18.817] } [18:03:18.817] else if (inherits(cond, "condition")) { [18:03:18.817] if (!is.null(pattern)) { [18:03:18.817] computeRestarts <- base::computeRestarts [18:03:18.817] grepl <- base::grepl [18:03:18.817] restarts <- computeRestarts(cond) [18:03:18.817] for (restart in restarts) { [18:03:18.817] name <- restart$name [18:03:18.817] if (is.null(name)) [18:03:18.817] next [18:03:18.817] if (!grepl(pattern, name)) [18:03:18.817] next [18:03:18.817] invokeRestart(restart) [18:03:18.817] muffled <- TRUE [18:03:18.817] break [18:03:18.817] } [18:03:18.817] } [18:03:18.817] } [18:03:18.817] invisible(muffled) [18:03:18.817] } [18:03:18.817] muffleCondition(cond, pattern = "^muffle") [18:03:18.817] } [18:03:18.817] } [18:03:18.817] else { [18:03:18.817] if (TRUE) { [18:03:18.817] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.817] { [18:03:18.817] inherits <- base::inherits [18:03:18.817] invokeRestart <- base::invokeRestart [18:03:18.817] is.null <- base::is.null [18:03:18.817] muffled <- FALSE [18:03:18.817] if (inherits(cond, "message")) { [18:03:18.817] muffled <- grepl(pattern, "muffleMessage") [18:03:18.817] if (muffled) [18:03:18.817] invokeRestart("muffleMessage") [18:03:18.817] } [18:03:18.817] else if (inherits(cond, "warning")) { [18:03:18.817] muffled <- grepl(pattern, "muffleWarning") [18:03:18.817] if (muffled) [18:03:18.817] invokeRestart("muffleWarning") [18:03:18.817] } [18:03:18.817] else if (inherits(cond, "condition")) { [18:03:18.817] if (!is.null(pattern)) { [18:03:18.817] computeRestarts <- base::computeRestarts [18:03:18.817] grepl <- base::grepl [18:03:18.817] restarts <- computeRestarts(cond) [18:03:18.817] for (restart in restarts) { [18:03:18.817] name <- restart$name [18:03:18.817] if (is.null(name)) [18:03:18.817] next [18:03:18.817] if (!grepl(pattern, name)) [18:03:18.817] next [18:03:18.817] invokeRestart(restart) [18:03:18.817] muffled <- TRUE [18:03:18.817] break [18:03:18.817] } [18:03:18.817] } [18:03:18.817] } [18:03:18.817] invisible(muffled) [18:03:18.817] } [18:03:18.817] muffleCondition(cond, pattern = "^muffle") [18:03:18.817] } [18:03:18.817] } [18:03:18.817] } [18:03:18.817] })) [18:03:18.817] }, error = function(ex) { [18:03:18.817] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.817] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.817] ...future.rng), started = ...future.startTime, [18:03:18.817] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.817] version = "1.8"), class = "FutureResult") [18:03:18.817] }, finally = { [18:03:18.817] if (!identical(...future.workdir, getwd())) [18:03:18.817] setwd(...future.workdir) [18:03:18.817] { [18:03:18.817] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.817] ...future.oldOptions$nwarnings <- NULL [18:03:18.817] } [18:03:18.817] base::options(...future.oldOptions) [18:03:18.817] if (.Platform$OS.type == "windows") { [18:03:18.817] old_names <- names(...future.oldEnvVars) [18:03:18.817] envs <- base::Sys.getenv() [18:03:18.817] names <- names(envs) [18:03:18.817] common <- intersect(names, old_names) [18:03:18.817] added <- setdiff(names, old_names) [18:03:18.817] removed <- setdiff(old_names, names) [18:03:18.817] changed <- common[...future.oldEnvVars[common] != [18:03:18.817] envs[common]] [18:03:18.817] NAMES <- toupper(changed) [18:03:18.817] args <- list() [18:03:18.817] for (kk in seq_along(NAMES)) { [18:03:18.817] name <- changed[[kk]] [18:03:18.817] NAME <- NAMES[[kk]] [18:03:18.817] if (name != NAME && is.element(NAME, old_names)) [18:03:18.817] next [18:03:18.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.817] } [18:03:18.817] NAMES <- toupper(added) [18:03:18.817] for (kk in seq_along(NAMES)) { [18:03:18.817] name <- added[[kk]] [18:03:18.817] NAME <- NAMES[[kk]] [18:03:18.817] if (name != NAME && is.element(NAME, old_names)) [18:03:18.817] next [18:03:18.817] args[[name]] <- "" [18:03:18.817] } [18:03:18.817] NAMES <- toupper(removed) [18:03:18.817] for (kk in seq_along(NAMES)) { [18:03:18.817] name <- removed[[kk]] [18:03:18.817] NAME <- NAMES[[kk]] [18:03:18.817] if (name != NAME && is.element(NAME, old_names)) [18:03:18.817] next [18:03:18.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.817] } [18:03:18.817] if (length(args) > 0) [18:03:18.817] base::do.call(base::Sys.setenv, args = args) [18:03:18.817] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.817] } [18:03:18.817] else { [18:03:18.817] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.817] } [18:03:18.817] { [18:03:18.817] if (base::length(...future.futureOptionsAdded) > [18:03:18.817] 0L) { [18:03:18.817] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.817] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.817] base::options(opts) [18:03:18.817] } [18:03:18.817] { [18:03:18.817] { [18:03:18.817] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.817] NULL [18:03:18.817] } [18:03:18.817] options(future.plan = NULL) [18:03:18.817] if (is.na(NA_character_)) [18:03:18.817] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.817] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.817] future::plan(list(function (..., workers = availableCores(), [18:03:18.817] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.817] envir = parent.frame()) [18:03:18.817] { [18:03:18.817] if (is.function(workers)) [18:03:18.817] workers <- workers() [18:03:18.817] workers <- structure(as.integer(workers), [18:03:18.817] class = class(workers)) [18:03:18.817] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.817] workers >= 1) [18:03:18.817] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.817] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.817] } [18:03:18.817] future <- MultisessionFuture(..., workers = workers, [18:03:18.817] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.817] envir = envir) [18:03:18.817] if (!future$lazy) [18:03:18.817] future <- run(future) [18:03:18.817] invisible(future) [18:03:18.817] }), .cleanup = FALSE, .init = FALSE) [18:03:18.817] } [18:03:18.817] } [18:03:18.817] } [18:03:18.817] }) [18:03:18.817] if (TRUE) { [18:03:18.817] base::sink(type = "output", split = FALSE) [18:03:18.817] if (TRUE) { [18:03:18.817] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.817] } [18:03:18.817] else { [18:03:18.817] ...future.result["stdout"] <- base::list(NULL) [18:03:18.817] } [18:03:18.817] base::close(...future.stdout) [18:03:18.817] ...future.stdout <- NULL [18:03:18.817] } [18:03:18.817] ...future.result$conditions <- ...future.conditions [18:03:18.817] ...future.result$finished <- base::Sys.time() [18:03:18.817] ...future.result [18:03:18.817] } [18:03:18.822] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.822] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.822] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.823] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.823] MultisessionFuture started [18:03:18.824] - Launch lazy future ... done [18:03:18.824] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_4-197344' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5e84538 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:18.852] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.852] - Validating connection of MultisessionFuture [18:03:18.852] - received message: FutureResult [18:03:18.852] - Received FutureResult [18:03:18.852] - Erased future from FutureRegistry [18:03:18.853] result() for ClusterFuture ... [18:03:18.853] - result already collected: FutureResult [18:03:18.853] result() for ClusterFuture ... done [18:03:18.853] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.853] resolve() on list ... [18:03:18.854] recursive: 0 [18:03:18.854] length: 4 [18:03:18.854] [18:03:18.854] Future #1 [18:03:18.854] result() for ClusterFuture ... [18:03:18.854] - result already collected: FutureResult [18:03:18.855] result() for ClusterFuture ... done [18:03:18.855] result() for ClusterFuture ... [18:03:18.855] - result already collected: FutureResult [18:03:18.855] result() for ClusterFuture ... done [18:03:18.855] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:18.855] - nx: 4 [18:03:18.856] - relay: TRUE [18:03:18.856] - stdout: TRUE [18:03:18.856] - signal: TRUE [18:03:18.856] - resignal: FALSE [18:03:18.856] - force: TRUE [18:03:18.856] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:18.857] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:18.857] - until=1 [18:03:18.857] - relaying element #1 [18:03:18.857] result() for ClusterFuture ... [18:03:18.857] - result already collected: FutureResult [18:03:18.857] result() for ClusterFuture ... done [18:03:18.857] result() for ClusterFuture ... [18:03:18.858] - result already collected: FutureResult [18:03:18.858] result() for ClusterFuture ... done [18:03:18.858] result() for ClusterFuture ... [18:03:18.858] - result already collected: FutureResult [18:03:18.858] result() for ClusterFuture ... done [18:03:18.858] result() for ClusterFuture ... [18:03:18.859] - result already collected: FutureResult [18:03:18.859] result() for ClusterFuture ... done [18:03:18.859] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.859] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.859] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:03:18.859] length: 3 (resolved future 1) [18:03:18.860] Future #2 [18:03:18.860] result() for ClusterFuture ... [18:03:18.860] - result already collected: FutureResult [18:03:18.860] result() for ClusterFuture ... done [18:03:18.860] result() for ClusterFuture ... [18:03:18.860] - result already collected: FutureResult [18:03:18.861] result() for ClusterFuture ... done [18:03:18.861] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:03:18.861] - nx: 4 [18:03:18.861] - relay: TRUE [18:03:18.861] - stdout: TRUE [18:03:18.861] - signal: TRUE [18:03:18.862] - resignal: FALSE [18:03:18.862] - force: TRUE [18:03:18.862] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.862] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:18.862] - until=2 [18:03:18.862] - relaying element #2 [18:03:18.863] result() for ClusterFuture ... [18:03:18.863] - result already collected: FutureResult [18:03:18.863] result() for ClusterFuture ... done [18:03:18.863] result() for ClusterFuture ... [18:03:18.863] - result already collected: FutureResult [18:03:18.864] result() for ClusterFuture ... done [18:03:18.864] result() for ClusterFuture ... [18:03:18.864] - result already collected: FutureResult [18:03:18.864] result() for ClusterFuture ... done [18:03:18.864] result() for ClusterFuture ... [18:03:18.864] - result already collected: FutureResult [18:03:18.865] result() for ClusterFuture ... done [18:03:18.865] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.865] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.865] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:03:18.865] length: 2 (resolved future 2) [18:03:18.865] Future #3 [18:03:18.866] result() for ClusterFuture ... [18:03:18.866] - result already collected: FutureResult [18:03:18.866] result() for ClusterFuture ... done [18:03:18.866] result() for ClusterFuture ... [18:03:18.866] - result already collected: FutureResult [18:03:18.866] result() for ClusterFuture ... done [18:03:18.867] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:03:18.867] - nx: 4 [18:03:18.867] - relay: TRUE [18:03:18.867] - stdout: TRUE [18:03:18.867] - signal: TRUE [18:03:18.868] - resignal: FALSE [18:03:18.868] - force: TRUE [18:03:18.868] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.868] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:18.868] - until=3 [18:03:18.868] - relaying element #3 [18:03:18.869] result() for ClusterFuture ... [18:03:18.869] - result already collected: FutureResult [18:03:18.869] result() for ClusterFuture ... done [18:03:18.869] result() for ClusterFuture ... [18:03:18.869] - result already collected: FutureResult [18:03:18.869] result() for ClusterFuture ... done [18:03:18.870] result() for ClusterFuture ... [18:03:18.870] - result already collected: FutureResult [18:03:18.870] result() for ClusterFuture ... done [18:03:18.870] result() for ClusterFuture ... [18:03:18.870] - result already collected: FutureResult [18:03:18.870] result() for ClusterFuture ... done [18:03:18.871] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.871] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.871] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:03:18.871] length: 1 (resolved future 3) [18:03:18.871] Future #4 [18:03:18.871] result() for ClusterFuture ... [18:03:18.872] - result already collected: FutureResult [18:03:18.872] result() for ClusterFuture ... done [18:03:18.872] result() for ClusterFuture ... [18:03:18.872] - result already collected: FutureResult [18:03:18.872] result() for ClusterFuture ... done [18:03:18.873] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:03:18.873] - nx: 4 [18:03:18.873] - relay: TRUE [18:03:18.873] - stdout: TRUE [18:03:18.873] - signal: TRUE [18:03:18.873] - resignal: FALSE [18:03:18.873] - force: TRUE [18:03:18.874] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.874] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:18.874] - until=4 [18:03:18.874] - relaying element #4 [18:03:18.874] result() for ClusterFuture ... [18:03:18.874] - result already collected: FutureResult [18:03:18.875] result() for ClusterFuture ... done [18:03:18.875] result() for ClusterFuture ... [18:03:18.875] - result already collected: FutureResult [18:03:18.875] result() for ClusterFuture ... done [18:03:18.875] result() for ClusterFuture ... [18:03:18.875] - result already collected: FutureResult [18:03:18.876] result() for ClusterFuture ... done [18:03:18.876] result() for ClusterFuture ... [18:03:18.876] - result already collected: FutureResult [18:03:18.876] result() for ClusterFuture ... done [18:03:18.876] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.876] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.877] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:03:18.877] length: 0 (resolved future 4) [18:03:18.877] Relaying remaining futures [18:03:18.877] signalConditionsASAP(NULL, pos=0) ... [18:03:18.877] - nx: 4 [18:03:18.878] - relay: TRUE [18:03:18.878] - stdout: TRUE [18:03:18.878] - signal: TRUE [18:03:18.878] - resignal: FALSE [18:03:18.878] - force: TRUE [18:03:18.878] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.878] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:18.879] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.879] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:18.879] signalConditionsASAP(NULL, pos=0) ... done [18:03:18.879] resolve() on list ... DONE [18:03:18.879] result() for ClusterFuture ... [18:03:18.880] - result already collected: FutureResult [18:03:18.880] result() for ClusterFuture ... done [18:03:18.880] result() for ClusterFuture ... [18:03:18.880] - result already collected: FutureResult [18:03:18.880] result() for ClusterFuture ... done [18:03:18.880] result() for ClusterFuture ... [18:03:18.881] - result already collected: FutureResult [18:03:18.881] result() for ClusterFuture ... done [18:03:18.881] result() for ClusterFuture ... [18:03:18.881] - result already collected: FutureResult [18:03:18.881] result() for ClusterFuture ... done [18:03:18.881] result() for ClusterFuture ... [18:03:18.882] - result already collected: FutureResult [18:03:18.882] result() for ClusterFuture ... done [18:03:18.882] result() for ClusterFuture ... [18:03:18.882] - result already collected: FutureResult [18:03:18.882] result() for ClusterFuture ... done [18:03:18.882] result() for ClusterFuture ... [18:03:18.883] - result already collected: FutureResult [18:03:18.883] result() for ClusterFuture ... done [18:03:18.883] result() for ClusterFuture ... [18:03:18.883] - result already collected: FutureResult [18:03:18.883] result() for ClusterFuture ... done [[1]] [1] 3 [[2]] [1] 2 [[3]] [1] 0 [[4]] [1] 1 [18:03:18.884] getGlobalsAndPackages() ... [18:03:18.884] Searching for globals... [18:03:18.885] - globals found: [3] '{', 'sample', 'x' [18:03:18.885] Searching for globals ... DONE [18:03:18.885] Resolving globals: FALSE [18:03:18.886] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.886] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.886] - globals: [1] 'x' [18:03:18.887] [18:03:18.887] getGlobalsAndPackages() ... DONE [18:03:18.887] run() for 'Future' ... [18:03:18.887] - state: 'created' [18:03:18.888] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.901] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.901] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.902] - Field: 'node' [18:03:18.902] - Field: 'label' [18:03:18.902] - Field: 'local' [18:03:18.902] - Field: 'owner' [18:03:18.902] - Field: 'envir' [18:03:18.903] - Field: 'workers' [18:03:18.903] - Field: 'packages' [18:03:18.903] - Field: 'gc' [18:03:18.903] - Field: 'conditions' [18:03:18.903] - Field: 'persistent' [18:03:18.903] - Field: 'expr' [18:03:18.904] - Field: 'uuid' [18:03:18.904] - Field: 'seed' [18:03:18.904] - Field: 'version' [18:03:18.904] - Field: 'result' [18:03:18.904] - Field: 'asynchronous' [18:03:18.904] - Field: 'calls' [18:03:18.905] - Field: 'globals' [18:03:18.905] - Field: 'stdout' [18:03:18.905] - Field: 'earlySignal' [18:03:18.905] - Field: 'lazy' [18:03:18.905] - Field: 'state' [18:03:18.906] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.906] - Launch lazy future ... [18:03:18.906] Packages needed by the future expression (n = 0): [18:03:18.906] Packages needed by future strategies (n = 0): [18:03:18.907] { [18:03:18.907] { [18:03:18.907] { [18:03:18.907] ...future.startTime <- base::Sys.time() [18:03:18.907] { [18:03:18.907] { [18:03:18.907] { [18:03:18.907] { [18:03:18.907] base::local({ [18:03:18.907] has_future <- base::requireNamespace("future", [18:03:18.907] quietly = TRUE) [18:03:18.907] if (has_future) { [18:03:18.907] ns <- base::getNamespace("future") [18:03:18.907] version <- ns[[".package"]][["version"]] [18:03:18.907] if (is.null(version)) [18:03:18.907] version <- utils::packageVersion("future") [18:03:18.907] } [18:03:18.907] else { [18:03:18.907] version <- NULL [18:03:18.907] } [18:03:18.907] if (!has_future || version < "1.8.0") { [18:03:18.907] info <- base::c(r_version = base::gsub("R version ", [18:03:18.907] "", base::R.version$version.string), [18:03:18.907] platform = base::sprintf("%s (%s-bit)", [18:03:18.907] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:18.907] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.907] "release", "version")], collapse = " "), [18:03:18.907] hostname = base::Sys.info()[["nodename"]]) [18:03:18.907] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.907] info) [18:03:18.907] info <- base::paste(info, collapse = "; ") [18:03:18.907] if (!has_future) { [18:03:18.907] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.907] info) [18:03:18.907] } [18:03:18.907] else { [18:03:18.907] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.907] info, version) [18:03:18.907] } [18:03:18.907] base::stop(msg) [18:03:18.907] } [18:03:18.907] }) [18:03:18.907] } [18:03:18.907] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.907] base::options(mc.cores = 1L) [18:03:18.907] } [18:03:18.907] options(future.plan = NULL) [18:03:18.907] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.907] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:18.907] } [18:03:18.907] ...future.workdir <- getwd() [18:03:18.907] } [18:03:18.907] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.907] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.907] } [18:03:18.907] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.907] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.907] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.907] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.907] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.907] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.907] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.907] base::names(...future.oldOptions)) [18:03:18.907] } [18:03:18.907] if (FALSE) { [18:03:18.907] } [18:03:18.907] else { [18:03:18.907] if (TRUE) { [18:03:18.907] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.907] open = "w") [18:03:18.907] } [18:03:18.907] else { [18:03:18.907] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.907] windows = "NUL", "/dev/null"), open = "w") [18:03:18.907] } [18:03:18.907] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.907] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.907] base::sink(type = "output", split = FALSE) [18:03:18.907] base::close(...future.stdout) [18:03:18.907] }, add = TRUE) [18:03:18.907] } [18:03:18.907] ...future.frame <- base::sys.nframe() [18:03:18.907] ...future.conditions <- base::list() [18:03:18.907] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.907] if (FALSE) { [18:03:18.907] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.907] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.907] } [18:03:18.907] ...future.result <- base::tryCatch({ [18:03:18.907] base::withCallingHandlers({ [18:03:18.907] ...future.value <- base::withVisible(base::local({ [18:03:18.907] ...future.makeSendCondition <- local({ [18:03:18.907] sendCondition <- NULL [18:03:18.907] function(frame = 1L) { [18:03:18.907] if (is.function(sendCondition)) [18:03:18.907] return(sendCondition) [18:03:18.907] ns <- getNamespace("parallel") [18:03:18.907] if (exists("sendData", mode = "function", [18:03:18.907] envir = ns)) { [18:03:18.907] parallel_sendData <- get("sendData", mode = "function", [18:03:18.907] envir = ns) [18:03:18.907] envir <- sys.frame(frame) [18:03:18.907] master <- NULL [18:03:18.907] while (!identical(envir, .GlobalEnv) && [18:03:18.907] !identical(envir, emptyenv())) { [18:03:18.907] if (exists("master", mode = "list", envir = envir, [18:03:18.907] inherits = FALSE)) { [18:03:18.907] master <- get("master", mode = "list", [18:03:18.907] envir = envir, inherits = FALSE) [18:03:18.907] if (inherits(master, c("SOCKnode", [18:03:18.907] "SOCK0node"))) { [18:03:18.907] sendCondition <<- function(cond) { [18:03:18.907] data <- list(type = "VALUE", value = cond, [18:03:18.907] success = TRUE) [18:03:18.907] parallel_sendData(master, data) [18:03:18.907] } [18:03:18.907] return(sendCondition) [18:03:18.907] } [18:03:18.907] } [18:03:18.907] frame <- frame + 1L [18:03:18.907] envir <- sys.frame(frame) [18:03:18.907] } [18:03:18.907] } [18:03:18.907] sendCondition <<- function(cond) NULL [18:03:18.907] } [18:03:18.907] }) [18:03:18.907] withCallingHandlers({ [18:03:18.907] { [18:03:18.907] sample(x, size = 1L) [18:03:18.907] } [18:03:18.907] }, immediateCondition = function(cond) { [18:03:18.907] sendCondition <- ...future.makeSendCondition() [18:03:18.907] sendCondition(cond) [18:03:18.907] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.907] { [18:03:18.907] inherits <- base::inherits [18:03:18.907] invokeRestart <- base::invokeRestart [18:03:18.907] is.null <- base::is.null [18:03:18.907] muffled <- FALSE [18:03:18.907] if (inherits(cond, "message")) { [18:03:18.907] muffled <- grepl(pattern, "muffleMessage") [18:03:18.907] if (muffled) [18:03:18.907] invokeRestart("muffleMessage") [18:03:18.907] } [18:03:18.907] else if (inherits(cond, "warning")) { [18:03:18.907] muffled <- grepl(pattern, "muffleWarning") [18:03:18.907] if (muffled) [18:03:18.907] invokeRestart("muffleWarning") [18:03:18.907] } [18:03:18.907] else if (inherits(cond, "condition")) { [18:03:18.907] if (!is.null(pattern)) { [18:03:18.907] computeRestarts <- base::computeRestarts [18:03:18.907] grepl <- base::grepl [18:03:18.907] restarts <- computeRestarts(cond) [18:03:18.907] for (restart in restarts) { [18:03:18.907] name <- restart$name [18:03:18.907] if (is.null(name)) [18:03:18.907] next [18:03:18.907] if (!grepl(pattern, name)) [18:03:18.907] next [18:03:18.907] invokeRestart(restart) [18:03:18.907] muffled <- TRUE [18:03:18.907] break [18:03:18.907] } [18:03:18.907] } [18:03:18.907] } [18:03:18.907] invisible(muffled) [18:03:18.907] } [18:03:18.907] muffleCondition(cond) [18:03:18.907] }) [18:03:18.907] })) [18:03:18.907] future::FutureResult(value = ...future.value$value, [18:03:18.907] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.907] ...future.rng), globalenv = if (FALSE) [18:03:18.907] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.907] ...future.globalenv.names)) [18:03:18.907] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.907] }, condition = base::local({ [18:03:18.907] c <- base::c [18:03:18.907] inherits <- base::inherits [18:03:18.907] invokeRestart <- base::invokeRestart [18:03:18.907] length <- base::length [18:03:18.907] list <- base::list [18:03:18.907] seq.int <- base::seq.int [18:03:18.907] signalCondition <- base::signalCondition [18:03:18.907] sys.calls <- base::sys.calls [18:03:18.907] `[[` <- base::`[[` [18:03:18.907] `+` <- base::`+` [18:03:18.907] `<<-` <- base::`<<-` [18:03:18.907] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.907] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.907] 3L)] [18:03:18.907] } [18:03:18.907] function(cond) { [18:03:18.907] is_error <- inherits(cond, "error") [18:03:18.907] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.907] NULL) [18:03:18.907] if (is_error) { [18:03:18.907] sessionInformation <- function() { [18:03:18.907] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.907] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.907] search = base::search(), system = base::Sys.info()) [18:03:18.907] } [18:03:18.907] ...future.conditions[[length(...future.conditions) + [18:03:18.907] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.907] cond$call), session = sessionInformation(), [18:03:18.907] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.907] signalCondition(cond) [18:03:18.907] } [18:03:18.907] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.907] "immediateCondition"))) { [18:03:18.907] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.907] ...future.conditions[[length(...future.conditions) + [18:03:18.907] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.907] if (TRUE && !signal) { [18:03:18.907] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.907] { [18:03:18.907] inherits <- base::inherits [18:03:18.907] invokeRestart <- base::invokeRestart [18:03:18.907] is.null <- base::is.null [18:03:18.907] muffled <- FALSE [18:03:18.907] if (inherits(cond, "message")) { [18:03:18.907] muffled <- grepl(pattern, "muffleMessage") [18:03:18.907] if (muffled) [18:03:18.907] invokeRestart("muffleMessage") [18:03:18.907] } [18:03:18.907] else if (inherits(cond, "warning")) { [18:03:18.907] muffled <- grepl(pattern, "muffleWarning") [18:03:18.907] if (muffled) [18:03:18.907] invokeRestart("muffleWarning") [18:03:18.907] } [18:03:18.907] else if (inherits(cond, "condition")) { [18:03:18.907] if (!is.null(pattern)) { [18:03:18.907] computeRestarts <- base::computeRestarts [18:03:18.907] grepl <- base::grepl [18:03:18.907] restarts <- computeRestarts(cond) [18:03:18.907] for (restart in restarts) { [18:03:18.907] name <- restart$name [18:03:18.907] if (is.null(name)) [18:03:18.907] next [18:03:18.907] if (!grepl(pattern, name)) [18:03:18.907] next [18:03:18.907] invokeRestart(restart) [18:03:18.907] muffled <- TRUE [18:03:18.907] break [18:03:18.907] } [18:03:18.907] } [18:03:18.907] } [18:03:18.907] invisible(muffled) [18:03:18.907] } [18:03:18.907] muffleCondition(cond, pattern = "^muffle") [18:03:18.907] } [18:03:18.907] } [18:03:18.907] else { [18:03:18.907] if (TRUE) { [18:03:18.907] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.907] { [18:03:18.907] inherits <- base::inherits [18:03:18.907] invokeRestart <- base::invokeRestart [18:03:18.907] is.null <- base::is.null [18:03:18.907] muffled <- FALSE [18:03:18.907] if (inherits(cond, "message")) { [18:03:18.907] muffled <- grepl(pattern, "muffleMessage") [18:03:18.907] if (muffled) [18:03:18.907] invokeRestart("muffleMessage") [18:03:18.907] } [18:03:18.907] else if (inherits(cond, "warning")) { [18:03:18.907] muffled <- grepl(pattern, "muffleWarning") [18:03:18.907] if (muffled) [18:03:18.907] invokeRestart("muffleWarning") [18:03:18.907] } [18:03:18.907] else if (inherits(cond, "condition")) { [18:03:18.907] if (!is.null(pattern)) { [18:03:18.907] computeRestarts <- base::computeRestarts [18:03:18.907] grepl <- base::grepl [18:03:18.907] restarts <- computeRestarts(cond) [18:03:18.907] for (restart in restarts) { [18:03:18.907] name <- restart$name [18:03:18.907] if (is.null(name)) [18:03:18.907] next [18:03:18.907] if (!grepl(pattern, name)) [18:03:18.907] next [18:03:18.907] invokeRestart(restart) [18:03:18.907] muffled <- TRUE [18:03:18.907] break [18:03:18.907] } [18:03:18.907] } [18:03:18.907] } [18:03:18.907] invisible(muffled) [18:03:18.907] } [18:03:18.907] muffleCondition(cond, pattern = "^muffle") [18:03:18.907] } [18:03:18.907] } [18:03:18.907] } [18:03:18.907] })) [18:03:18.907] }, error = function(ex) { [18:03:18.907] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.907] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.907] ...future.rng), started = ...future.startTime, [18:03:18.907] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.907] version = "1.8"), class = "FutureResult") [18:03:18.907] }, finally = { [18:03:18.907] if (!identical(...future.workdir, getwd())) [18:03:18.907] setwd(...future.workdir) [18:03:18.907] { [18:03:18.907] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.907] ...future.oldOptions$nwarnings <- NULL [18:03:18.907] } [18:03:18.907] base::options(...future.oldOptions) [18:03:18.907] if (.Platform$OS.type == "windows") { [18:03:18.907] old_names <- names(...future.oldEnvVars) [18:03:18.907] envs <- base::Sys.getenv() [18:03:18.907] names <- names(envs) [18:03:18.907] common <- intersect(names, old_names) [18:03:18.907] added <- setdiff(names, old_names) [18:03:18.907] removed <- setdiff(old_names, names) [18:03:18.907] changed <- common[...future.oldEnvVars[common] != [18:03:18.907] envs[common]] [18:03:18.907] NAMES <- toupper(changed) [18:03:18.907] args <- list() [18:03:18.907] for (kk in seq_along(NAMES)) { [18:03:18.907] name <- changed[[kk]] [18:03:18.907] NAME <- NAMES[[kk]] [18:03:18.907] if (name != NAME && is.element(NAME, old_names)) [18:03:18.907] next [18:03:18.907] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.907] } [18:03:18.907] NAMES <- toupper(added) [18:03:18.907] for (kk in seq_along(NAMES)) { [18:03:18.907] name <- added[[kk]] [18:03:18.907] NAME <- NAMES[[kk]] [18:03:18.907] if (name != NAME && is.element(NAME, old_names)) [18:03:18.907] next [18:03:18.907] args[[name]] <- "" [18:03:18.907] } [18:03:18.907] NAMES <- toupper(removed) [18:03:18.907] for (kk in seq_along(NAMES)) { [18:03:18.907] name <- removed[[kk]] [18:03:18.907] NAME <- NAMES[[kk]] [18:03:18.907] if (name != NAME && is.element(NAME, old_names)) [18:03:18.907] next [18:03:18.907] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.907] } [18:03:18.907] if (length(args) > 0) [18:03:18.907] base::do.call(base::Sys.setenv, args = args) [18:03:18.907] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.907] } [18:03:18.907] else { [18:03:18.907] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.907] } [18:03:18.907] { [18:03:18.907] if (base::length(...future.futureOptionsAdded) > [18:03:18.907] 0L) { [18:03:18.907] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.907] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.907] base::options(opts) [18:03:18.907] } [18:03:18.907] { [18:03:18.907] { [18:03:18.907] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.907] NULL [18:03:18.907] } [18:03:18.907] options(future.plan = NULL) [18:03:18.907] if (is.na(NA_character_)) [18:03:18.907] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.907] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.907] future::plan(list(function (..., workers = availableCores(), [18:03:18.907] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.907] envir = parent.frame()) [18:03:18.907] { [18:03:18.907] if (is.function(workers)) [18:03:18.907] workers <- workers() [18:03:18.907] workers <- structure(as.integer(workers), [18:03:18.907] class = class(workers)) [18:03:18.907] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.907] workers >= 1) [18:03:18.907] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.907] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.907] } [18:03:18.907] future <- MultisessionFuture(..., workers = workers, [18:03:18.907] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.907] envir = envir) [18:03:18.907] if (!future$lazy) [18:03:18.907] future <- run(future) [18:03:18.907] invisible(future) [18:03:18.907] }), .cleanup = FALSE, .init = FALSE) [18:03:18.907] } [18:03:18.907] } [18:03:18.907] } [18:03:18.907] }) [18:03:18.907] if (TRUE) { [18:03:18.907] base::sink(type = "output", split = FALSE) [18:03:18.907] if (TRUE) { [18:03:18.907] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.907] } [18:03:18.907] else { [18:03:18.907] ...future.result["stdout"] <- base::list(NULL) [18:03:18.907] } [18:03:18.907] base::close(...future.stdout) [18:03:18.907] ...future.stdout <- NULL [18:03:18.907] } [18:03:18.907] ...future.result$conditions <- ...future.conditions [18:03:18.907] ...future.result$finished <- base::Sys.time() [18:03:18.907] ...future.result [18:03:18.907] } [18:03:18.912] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.913] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.913] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.913] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.914] MultisessionFuture started [18:03:18.914] - Launch lazy future ... done [18:03:18.914] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_1-166823' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5b0b990 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:18.931] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.932] - Validating connection of MultisessionFuture [18:03:18.932] - received message: FutureResult [18:03:18.932] - Received FutureResult [18:03:18.932] - Erased future from FutureRegistry [18:03:18.932] result() for ClusterFuture ... [18:03:18.933] - result already collected: FutureResult [18:03:18.933] result() for ClusterFuture ... done [18:03:18.933] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.933] getGlobalsAndPackages() ... [18:03:18.933] Searching for globals... [18:03:18.935] - globals found: [3] '{', 'sample', 'x' [18:03:18.935] Searching for globals ... DONE [18:03:18.935] Resolving globals: FALSE [18:03:18.935] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.936] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.936] - globals: [1] 'x' [18:03:18.936] [18:03:18.936] getGlobalsAndPackages() ... DONE [18:03:18.937] run() for 'Future' ... [18:03:18.937] - state: 'created' [18:03:18.937] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:18.951] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.951] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:18.951] - Field: 'node' [18:03:18.951] - Field: 'label' [18:03:18.952] - Field: 'local' [18:03:18.952] - Field: 'owner' [18:03:18.952] - Field: 'envir' [18:03:18.952] - Field: 'workers' [18:03:18.952] - Field: 'packages' [18:03:18.953] - Field: 'gc' [18:03:18.953] - Field: 'conditions' [18:03:18.953] - Field: 'persistent' [18:03:18.953] - Field: 'expr' [18:03:18.953] - Field: 'uuid' [18:03:18.953] - Field: 'seed' [18:03:18.954] - Field: 'version' [18:03:18.954] - Field: 'result' [18:03:18.954] - Field: 'asynchronous' [18:03:18.954] - Field: 'calls' [18:03:18.954] - Field: 'globals' [18:03:18.955] - Field: 'stdout' [18:03:18.955] - Field: 'earlySignal' [18:03:18.955] - Field: 'lazy' [18:03:18.955] - Field: 'state' [18:03:18.955] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:18.956] - Launch lazy future ... [18:03:18.956] Packages needed by the future expression (n = 0): [18:03:18.956] Packages needed by future strategies (n = 0): [18:03:18.957] { [18:03:18.957] { [18:03:18.957] { [18:03:18.957] ...future.startTime <- base::Sys.time() [18:03:18.957] { [18:03:18.957] { [18:03:18.957] { [18:03:18.957] { [18:03:18.957] base::local({ [18:03:18.957] has_future <- base::requireNamespace("future", [18:03:18.957] quietly = TRUE) [18:03:18.957] if (has_future) { [18:03:18.957] ns <- base::getNamespace("future") [18:03:18.957] version <- ns[[".package"]][["version"]] [18:03:18.957] if (is.null(version)) [18:03:18.957] version <- utils::packageVersion("future") [18:03:18.957] } [18:03:18.957] else { [18:03:18.957] version <- NULL [18:03:18.957] } [18:03:18.957] if (!has_future || version < "1.8.0") { [18:03:18.957] info <- base::c(r_version = base::gsub("R version ", [18:03:18.957] "", base::R.version$version.string), [18:03:18.957] platform = base::sprintf("%s (%s-bit)", [18:03:18.957] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:18.957] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:18.957] "release", "version")], collapse = " "), [18:03:18.957] hostname = base::Sys.info()[["nodename"]]) [18:03:18.957] info <- base::sprintf("%s: %s", base::names(info), [18:03:18.957] info) [18:03:18.957] info <- base::paste(info, collapse = "; ") [18:03:18.957] if (!has_future) { [18:03:18.957] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:18.957] info) [18:03:18.957] } [18:03:18.957] else { [18:03:18.957] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:18.957] info, version) [18:03:18.957] } [18:03:18.957] base::stop(msg) [18:03:18.957] } [18:03:18.957] }) [18:03:18.957] } [18:03:18.957] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:18.957] base::options(mc.cores = 1L) [18:03:18.957] } [18:03:18.957] options(future.plan = NULL) [18:03:18.957] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.957] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:18.957] } [18:03:18.957] ...future.workdir <- getwd() [18:03:18.957] } [18:03:18.957] ...future.oldOptions <- base::as.list(base::.Options) [18:03:18.957] ...future.oldEnvVars <- base::Sys.getenv() [18:03:18.957] } [18:03:18.957] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:18.957] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:18.957] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:18.957] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:18.957] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:18.957] future.stdout.windows.reencode = NULL, width = 80L) [18:03:18.957] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:18.957] base::names(...future.oldOptions)) [18:03:18.957] } [18:03:18.957] if (FALSE) { [18:03:18.957] } [18:03:18.957] else { [18:03:18.957] if (TRUE) { [18:03:18.957] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:18.957] open = "w") [18:03:18.957] } [18:03:18.957] else { [18:03:18.957] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:18.957] windows = "NUL", "/dev/null"), open = "w") [18:03:18.957] } [18:03:18.957] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:18.957] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:18.957] base::sink(type = "output", split = FALSE) [18:03:18.957] base::close(...future.stdout) [18:03:18.957] }, add = TRUE) [18:03:18.957] } [18:03:18.957] ...future.frame <- base::sys.nframe() [18:03:18.957] ...future.conditions <- base::list() [18:03:18.957] ...future.rng <- base::globalenv()$.Random.seed [18:03:18.957] if (FALSE) { [18:03:18.957] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:18.957] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:18.957] } [18:03:18.957] ...future.result <- base::tryCatch({ [18:03:18.957] base::withCallingHandlers({ [18:03:18.957] ...future.value <- base::withVisible(base::local({ [18:03:18.957] ...future.makeSendCondition <- local({ [18:03:18.957] sendCondition <- NULL [18:03:18.957] function(frame = 1L) { [18:03:18.957] if (is.function(sendCondition)) [18:03:18.957] return(sendCondition) [18:03:18.957] ns <- getNamespace("parallel") [18:03:18.957] if (exists("sendData", mode = "function", [18:03:18.957] envir = ns)) { [18:03:18.957] parallel_sendData <- get("sendData", mode = "function", [18:03:18.957] envir = ns) [18:03:18.957] envir <- sys.frame(frame) [18:03:18.957] master <- NULL [18:03:18.957] while (!identical(envir, .GlobalEnv) && [18:03:18.957] !identical(envir, emptyenv())) { [18:03:18.957] if (exists("master", mode = "list", envir = envir, [18:03:18.957] inherits = FALSE)) { [18:03:18.957] master <- get("master", mode = "list", [18:03:18.957] envir = envir, inherits = FALSE) [18:03:18.957] if (inherits(master, c("SOCKnode", [18:03:18.957] "SOCK0node"))) { [18:03:18.957] sendCondition <<- function(cond) { [18:03:18.957] data <- list(type = "VALUE", value = cond, [18:03:18.957] success = TRUE) [18:03:18.957] parallel_sendData(master, data) [18:03:18.957] } [18:03:18.957] return(sendCondition) [18:03:18.957] } [18:03:18.957] } [18:03:18.957] frame <- frame + 1L [18:03:18.957] envir <- sys.frame(frame) [18:03:18.957] } [18:03:18.957] } [18:03:18.957] sendCondition <<- function(cond) NULL [18:03:18.957] } [18:03:18.957] }) [18:03:18.957] withCallingHandlers({ [18:03:18.957] { [18:03:18.957] sample(x, size = 1L) [18:03:18.957] } [18:03:18.957] }, immediateCondition = function(cond) { [18:03:18.957] sendCondition <- ...future.makeSendCondition() [18:03:18.957] sendCondition(cond) [18:03:18.957] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.957] { [18:03:18.957] inherits <- base::inherits [18:03:18.957] invokeRestart <- base::invokeRestart [18:03:18.957] is.null <- base::is.null [18:03:18.957] muffled <- FALSE [18:03:18.957] if (inherits(cond, "message")) { [18:03:18.957] muffled <- grepl(pattern, "muffleMessage") [18:03:18.957] if (muffled) [18:03:18.957] invokeRestart("muffleMessage") [18:03:18.957] } [18:03:18.957] else if (inherits(cond, "warning")) { [18:03:18.957] muffled <- grepl(pattern, "muffleWarning") [18:03:18.957] if (muffled) [18:03:18.957] invokeRestart("muffleWarning") [18:03:18.957] } [18:03:18.957] else if (inherits(cond, "condition")) { [18:03:18.957] if (!is.null(pattern)) { [18:03:18.957] computeRestarts <- base::computeRestarts [18:03:18.957] grepl <- base::grepl [18:03:18.957] restarts <- computeRestarts(cond) [18:03:18.957] for (restart in restarts) { [18:03:18.957] name <- restart$name [18:03:18.957] if (is.null(name)) [18:03:18.957] next [18:03:18.957] if (!grepl(pattern, name)) [18:03:18.957] next [18:03:18.957] invokeRestart(restart) [18:03:18.957] muffled <- TRUE [18:03:18.957] break [18:03:18.957] } [18:03:18.957] } [18:03:18.957] } [18:03:18.957] invisible(muffled) [18:03:18.957] } [18:03:18.957] muffleCondition(cond) [18:03:18.957] }) [18:03:18.957] })) [18:03:18.957] future::FutureResult(value = ...future.value$value, [18:03:18.957] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.957] ...future.rng), globalenv = if (FALSE) [18:03:18.957] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:18.957] ...future.globalenv.names)) [18:03:18.957] else NULL, started = ...future.startTime, version = "1.8") [18:03:18.957] }, condition = base::local({ [18:03:18.957] c <- base::c [18:03:18.957] inherits <- base::inherits [18:03:18.957] invokeRestart <- base::invokeRestart [18:03:18.957] length <- base::length [18:03:18.957] list <- base::list [18:03:18.957] seq.int <- base::seq.int [18:03:18.957] signalCondition <- base::signalCondition [18:03:18.957] sys.calls <- base::sys.calls [18:03:18.957] `[[` <- base::`[[` [18:03:18.957] `+` <- base::`+` [18:03:18.957] `<<-` <- base::`<<-` [18:03:18.957] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:18.957] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:18.957] 3L)] [18:03:18.957] } [18:03:18.957] function(cond) { [18:03:18.957] is_error <- inherits(cond, "error") [18:03:18.957] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:18.957] NULL) [18:03:18.957] if (is_error) { [18:03:18.957] sessionInformation <- function() { [18:03:18.957] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:18.957] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:18.957] search = base::search(), system = base::Sys.info()) [18:03:18.957] } [18:03:18.957] ...future.conditions[[length(...future.conditions) + [18:03:18.957] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:18.957] cond$call), session = sessionInformation(), [18:03:18.957] timestamp = base::Sys.time(), signaled = 0L) [18:03:18.957] signalCondition(cond) [18:03:18.957] } [18:03:18.957] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:18.957] "immediateCondition"))) { [18:03:18.957] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:18.957] ...future.conditions[[length(...future.conditions) + [18:03:18.957] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:18.957] if (TRUE && !signal) { [18:03:18.957] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.957] { [18:03:18.957] inherits <- base::inherits [18:03:18.957] invokeRestart <- base::invokeRestart [18:03:18.957] is.null <- base::is.null [18:03:18.957] muffled <- FALSE [18:03:18.957] if (inherits(cond, "message")) { [18:03:18.957] muffled <- grepl(pattern, "muffleMessage") [18:03:18.957] if (muffled) [18:03:18.957] invokeRestart("muffleMessage") [18:03:18.957] } [18:03:18.957] else if (inherits(cond, "warning")) { [18:03:18.957] muffled <- grepl(pattern, "muffleWarning") [18:03:18.957] if (muffled) [18:03:18.957] invokeRestart("muffleWarning") [18:03:18.957] } [18:03:18.957] else if (inherits(cond, "condition")) { [18:03:18.957] if (!is.null(pattern)) { [18:03:18.957] computeRestarts <- base::computeRestarts [18:03:18.957] grepl <- base::grepl [18:03:18.957] restarts <- computeRestarts(cond) [18:03:18.957] for (restart in restarts) { [18:03:18.957] name <- restart$name [18:03:18.957] if (is.null(name)) [18:03:18.957] next [18:03:18.957] if (!grepl(pattern, name)) [18:03:18.957] next [18:03:18.957] invokeRestart(restart) [18:03:18.957] muffled <- TRUE [18:03:18.957] break [18:03:18.957] } [18:03:18.957] } [18:03:18.957] } [18:03:18.957] invisible(muffled) [18:03:18.957] } [18:03:18.957] muffleCondition(cond, pattern = "^muffle") [18:03:18.957] } [18:03:18.957] } [18:03:18.957] else { [18:03:18.957] if (TRUE) { [18:03:18.957] muffleCondition <- function (cond, pattern = "^muffle") [18:03:18.957] { [18:03:18.957] inherits <- base::inherits [18:03:18.957] invokeRestart <- base::invokeRestart [18:03:18.957] is.null <- base::is.null [18:03:18.957] muffled <- FALSE [18:03:18.957] if (inherits(cond, "message")) { [18:03:18.957] muffled <- grepl(pattern, "muffleMessage") [18:03:18.957] if (muffled) [18:03:18.957] invokeRestart("muffleMessage") [18:03:18.957] } [18:03:18.957] else if (inherits(cond, "warning")) { [18:03:18.957] muffled <- grepl(pattern, "muffleWarning") [18:03:18.957] if (muffled) [18:03:18.957] invokeRestart("muffleWarning") [18:03:18.957] } [18:03:18.957] else if (inherits(cond, "condition")) { [18:03:18.957] if (!is.null(pattern)) { [18:03:18.957] computeRestarts <- base::computeRestarts [18:03:18.957] grepl <- base::grepl [18:03:18.957] restarts <- computeRestarts(cond) [18:03:18.957] for (restart in restarts) { [18:03:18.957] name <- restart$name [18:03:18.957] if (is.null(name)) [18:03:18.957] next [18:03:18.957] if (!grepl(pattern, name)) [18:03:18.957] next [18:03:18.957] invokeRestart(restart) [18:03:18.957] muffled <- TRUE [18:03:18.957] break [18:03:18.957] } [18:03:18.957] } [18:03:18.957] } [18:03:18.957] invisible(muffled) [18:03:18.957] } [18:03:18.957] muffleCondition(cond, pattern = "^muffle") [18:03:18.957] } [18:03:18.957] } [18:03:18.957] } [18:03:18.957] })) [18:03:18.957] }, error = function(ex) { [18:03:18.957] base::structure(base::list(value = NULL, visible = NULL, [18:03:18.957] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:18.957] ...future.rng), started = ...future.startTime, [18:03:18.957] finished = Sys.time(), session_uuid = NA_character_, [18:03:18.957] version = "1.8"), class = "FutureResult") [18:03:18.957] }, finally = { [18:03:18.957] if (!identical(...future.workdir, getwd())) [18:03:18.957] setwd(...future.workdir) [18:03:18.957] { [18:03:18.957] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:18.957] ...future.oldOptions$nwarnings <- NULL [18:03:18.957] } [18:03:18.957] base::options(...future.oldOptions) [18:03:18.957] if (.Platform$OS.type == "windows") { [18:03:18.957] old_names <- names(...future.oldEnvVars) [18:03:18.957] envs <- base::Sys.getenv() [18:03:18.957] names <- names(envs) [18:03:18.957] common <- intersect(names, old_names) [18:03:18.957] added <- setdiff(names, old_names) [18:03:18.957] removed <- setdiff(old_names, names) [18:03:18.957] changed <- common[...future.oldEnvVars[common] != [18:03:18.957] envs[common]] [18:03:18.957] NAMES <- toupper(changed) [18:03:18.957] args <- list() [18:03:18.957] for (kk in seq_along(NAMES)) { [18:03:18.957] name <- changed[[kk]] [18:03:18.957] NAME <- NAMES[[kk]] [18:03:18.957] if (name != NAME && is.element(NAME, old_names)) [18:03:18.957] next [18:03:18.957] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.957] } [18:03:18.957] NAMES <- toupper(added) [18:03:18.957] for (kk in seq_along(NAMES)) { [18:03:18.957] name <- added[[kk]] [18:03:18.957] NAME <- NAMES[[kk]] [18:03:18.957] if (name != NAME && is.element(NAME, old_names)) [18:03:18.957] next [18:03:18.957] args[[name]] <- "" [18:03:18.957] } [18:03:18.957] NAMES <- toupper(removed) [18:03:18.957] for (kk in seq_along(NAMES)) { [18:03:18.957] name <- removed[[kk]] [18:03:18.957] NAME <- NAMES[[kk]] [18:03:18.957] if (name != NAME && is.element(NAME, old_names)) [18:03:18.957] next [18:03:18.957] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:18.957] } [18:03:18.957] if (length(args) > 0) [18:03:18.957] base::do.call(base::Sys.setenv, args = args) [18:03:18.957] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:18.957] } [18:03:18.957] else { [18:03:18.957] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:18.957] } [18:03:18.957] { [18:03:18.957] if (base::length(...future.futureOptionsAdded) > [18:03:18.957] 0L) { [18:03:18.957] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:18.957] base::names(opts) <- ...future.futureOptionsAdded [18:03:18.957] base::options(opts) [18:03:18.957] } [18:03:18.957] { [18:03:18.957] { [18:03:18.957] base::options(mc.cores = ...future.mc.cores.old) [18:03:18.957] NULL [18:03:18.957] } [18:03:18.957] options(future.plan = NULL) [18:03:18.957] if (is.na(NA_character_)) [18:03:18.957] Sys.unsetenv("R_FUTURE_PLAN") [18:03:18.957] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:18.957] future::plan(list(function (..., workers = availableCores(), [18:03:18.957] lazy = FALSE, rscript_libs = .libPaths(), [18:03:18.957] envir = parent.frame()) [18:03:18.957] { [18:03:18.957] if (is.function(workers)) [18:03:18.957] workers <- workers() [18:03:18.957] workers <- structure(as.integer(workers), [18:03:18.957] class = class(workers)) [18:03:18.957] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:18.957] workers >= 1) [18:03:18.957] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:18.957] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:18.957] } [18:03:18.957] future <- MultisessionFuture(..., workers = workers, [18:03:18.957] lazy = lazy, rscript_libs = rscript_libs, [18:03:18.957] envir = envir) [18:03:18.957] if (!future$lazy) [18:03:18.957] future <- run(future) [18:03:18.957] invisible(future) [18:03:18.957] }), .cleanup = FALSE, .init = FALSE) [18:03:18.957] } [18:03:18.957] } [18:03:18.957] } [18:03:18.957] }) [18:03:18.957] if (TRUE) { [18:03:18.957] base::sink(type = "output", split = FALSE) [18:03:18.957] if (TRUE) { [18:03:18.957] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:18.957] } [18:03:18.957] else { [18:03:18.957] ...future.result["stdout"] <- base::list(NULL) [18:03:18.957] } [18:03:18.957] base::close(...future.stdout) [18:03:18.957] ...future.stdout <- NULL [18:03:18.957] } [18:03:18.957] ...future.result$conditions <- ...future.conditions [18:03:18.957] ...future.result$finished <- base::Sys.time() [18:03:18.957] ...future.result [18:03:18.957] } [18:03:18.962] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:18.962] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:18.963] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:18.963] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:18.963] MultisessionFuture started [18:03:18.964] - Launch lazy future ... done [18:03:18.964] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_2-535116' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5b0b990 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:18.987] receiveMessageFromWorker() for ClusterFuture ... [18:03:18.988] - Validating connection of MultisessionFuture [18:03:18.988] - received message: FutureResult [18:03:18.988] - Received FutureResult [18:03:18.988] - Erased future from FutureRegistry [18:03:18.988] result() for ClusterFuture ... [18:03:18.989] - result already collected: FutureResult [18:03:18.989] result() for ClusterFuture ... done [18:03:18.989] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:18.989] getGlobalsAndPackages() ... [18:03:18.989] Searching for globals... [18:03:18.990] - globals found: [3] '{', 'sample', 'x' [18:03:18.991] Searching for globals ... DONE [18:03:18.991] Resolving globals: FALSE [18:03:18.991] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:18.992] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:18.992] - globals: [1] 'x' [18:03:18.992] [18:03:18.992] getGlobalsAndPackages() ... DONE [18:03:18.993] run() for 'Future' ... [18:03:18.993] - state: 'created' [18:03:18.993] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.007] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.007] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.007] - Field: 'node' [18:03:19.007] - Field: 'label' [18:03:19.008] - Field: 'local' [18:03:19.008] - Field: 'owner' [18:03:19.008] - Field: 'envir' [18:03:19.008] - Field: 'workers' [18:03:19.008] - Field: 'packages' [18:03:19.009] - Field: 'gc' [18:03:19.009] - Field: 'conditions' [18:03:19.009] - Field: 'persistent' [18:03:19.009] - Field: 'expr' [18:03:19.009] - Field: 'uuid' [18:03:19.009] - Field: 'seed' [18:03:19.010] - Field: 'version' [18:03:19.010] - Field: 'result' [18:03:19.010] - Field: 'asynchronous' [18:03:19.010] - Field: 'calls' [18:03:19.010] - Field: 'globals' [18:03:19.011] - Field: 'stdout' [18:03:19.011] - Field: 'earlySignal' [18:03:19.011] - Field: 'lazy' [18:03:19.011] - Field: 'state' [18:03:19.011] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.011] - Launch lazy future ... [18:03:19.012] Packages needed by the future expression (n = 0): [18:03:19.012] Packages needed by future strategies (n = 0): [18:03:19.013] { [18:03:19.013] { [18:03:19.013] { [18:03:19.013] ...future.startTime <- base::Sys.time() [18:03:19.013] { [18:03:19.013] { [18:03:19.013] { [18:03:19.013] { [18:03:19.013] base::local({ [18:03:19.013] has_future <- base::requireNamespace("future", [18:03:19.013] quietly = TRUE) [18:03:19.013] if (has_future) { [18:03:19.013] ns <- base::getNamespace("future") [18:03:19.013] version <- ns[[".package"]][["version"]] [18:03:19.013] if (is.null(version)) [18:03:19.013] version <- utils::packageVersion("future") [18:03:19.013] } [18:03:19.013] else { [18:03:19.013] version <- NULL [18:03:19.013] } [18:03:19.013] if (!has_future || version < "1.8.0") { [18:03:19.013] info <- base::c(r_version = base::gsub("R version ", [18:03:19.013] "", base::R.version$version.string), [18:03:19.013] platform = base::sprintf("%s (%s-bit)", [18:03:19.013] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.013] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.013] "release", "version")], collapse = " "), [18:03:19.013] hostname = base::Sys.info()[["nodename"]]) [18:03:19.013] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.013] info) [18:03:19.013] info <- base::paste(info, collapse = "; ") [18:03:19.013] if (!has_future) { [18:03:19.013] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.013] info) [18:03:19.013] } [18:03:19.013] else { [18:03:19.013] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.013] info, version) [18:03:19.013] } [18:03:19.013] base::stop(msg) [18:03:19.013] } [18:03:19.013] }) [18:03:19.013] } [18:03:19.013] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.013] base::options(mc.cores = 1L) [18:03:19.013] } [18:03:19.013] options(future.plan = NULL) [18:03:19.013] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.013] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.013] } [18:03:19.013] ...future.workdir <- getwd() [18:03:19.013] } [18:03:19.013] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.013] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.013] } [18:03:19.013] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.013] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.013] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.013] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.013] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:19.013] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.013] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.013] base::names(...future.oldOptions)) [18:03:19.013] } [18:03:19.013] if (FALSE) { [18:03:19.013] } [18:03:19.013] else { [18:03:19.013] if (TRUE) { [18:03:19.013] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.013] open = "w") [18:03:19.013] } [18:03:19.013] else { [18:03:19.013] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.013] windows = "NUL", "/dev/null"), open = "w") [18:03:19.013] } [18:03:19.013] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.013] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.013] base::sink(type = "output", split = FALSE) [18:03:19.013] base::close(...future.stdout) [18:03:19.013] }, add = TRUE) [18:03:19.013] } [18:03:19.013] ...future.frame <- base::sys.nframe() [18:03:19.013] ...future.conditions <- base::list() [18:03:19.013] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.013] if (FALSE) { [18:03:19.013] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.013] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.013] } [18:03:19.013] ...future.result <- base::tryCatch({ [18:03:19.013] base::withCallingHandlers({ [18:03:19.013] ...future.value <- base::withVisible(base::local({ [18:03:19.013] ...future.makeSendCondition <- local({ [18:03:19.013] sendCondition <- NULL [18:03:19.013] function(frame = 1L) { [18:03:19.013] if (is.function(sendCondition)) [18:03:19.013] return(sendCondition) [18:03:19.013] ns <- getNamespace("parallel") [18:03:19.013] if (exists("sendData", mode = "function", [18:03:19.013] envir = ns)) { [18:03:19.013] parallel_sendData <- get("sendData", mode = "function", [18:03:19.013] envir = ns) [18:03:19.013] envir <- sys.frame(frame) [18:03:19.013] master <- NULL [18:03:19.013] while (!identical(envir, .GlobalEnv) && [18:03:19.013] !identical(envir, emptyenv())) { [18:03:19.013] if (exists("master", mode = "list", envir = envir, [18:03:19.013] inherits = FALSE)) { [18:03:19.013] master <- get("master", mode = "list", [18:03:19.013] envir = envir, inherits = FALSE) [18:03:19.013] if (inherits(master, c("SOCKnode", [18:03:19.013] "SOCK0node"))) { [18:03:19.013] sendCondition <<- function(cond) { [18:03:19.013] data <- list(type = "VALUE", value = cond, [18:03:19.013] success = TRUE) [18:03:19.013] parallel_sendData(master, data) [18:03:19.013] } [18:03:19.013] return(sendCondition) [18:03:19.013] } [18:03:19.013] } [18:03:19.013] frame <- frame + 1L [18:03:19.013] envir <- sys.frame(frame) [18:03:19.013] } [18:03:19.013] } [18:03:19.013] sendCondition <<- function(cond) NULL [18:03:19.013] } [18:03:19.013] }) [18:03:19.013] withCallingHandlers({ [18:03:19.013] { [18:03:19.013] sample(x, size = 1L) [18:03:19.013] } [18:03:19.013] }, immediateCondition = function(cond) { [18:03:19.013] sendCondition <- ...future.makeSendCondition() [18:03:19.013] sendCondition(cond) [18:03:19.013] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.013] { [18:03:19.013] inherits <- base::inherits [18:03:19.013] invokeRestart <- base::invokeRestart [18:03:19.013] is.null <- base::is.null [18:03:19.013] muffled <- FALSE [18:03:19.013] if (inherits(cond, "message")) { [18:03:19.013] muffled <- grepl(pattern, "muffleMessage") [18:03:19.013] if (muffled) [18:03:19.013] invokeRestart("muffleMessage") [18:03:19.013] } [18:03:19.013] else if (inherits(cond, "warning")) { [18:03:19.013] muffled <- grepl(pattern, "muffleWarning") [18:03:19.013] if (muffled) [18:03:19.013] invokeRestart("muffleWarning") [18:03:19.013] } [18:03:19.013] else if (inherits(cond, "condition")) { [18:03:19.013] if (!is.null(pattern)) { [18:03:19.013] computeRestarts <- base::computeRestarts [18:03:19.013] grepl <- base::grepl [18:03:19.013] restarts <- computeRestarts(cond) [18:03:19.013] for (restart in restarts) { [18:03:19.013] name <- restart$name [18:03:19.013] if (is.null(name)) [18:03:19.013] next [18:03:19.013] if (!grepl(pattern, name)) [18:03:19.013] next [18:03:19.013] invokeRestart(restart) [18:03:19.013] muffled <- TRUE [18:03:19.013] break [18:03:19.013] } [18:03:19.013] } [18:03:19.013] } [18:03:19.013] invisible(muffled) [18:03:19.013] } [18:03:19.013] muffleCondition(cond) [18:03:19.013] }) [18:03:19.013] })) [18:03:19.013] future::FutureResult(value = ...future.value$value, [18:03:19.013] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.013] ...future.rng), globalenv = if (FALSE) [18:03:19.013] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.013] ...future.globalenv.names)) [18:03:19.013] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.013] }, condition = base::local({ [18:03:19.013] c <- base::c [18:03:19.013] inherits <- base::inherits [18:03:19.013] invokeRestart <- base::invokeRestart [18:03:19.013] length <- base::length [18:03:19.013] list <- base::list [18:03:19.013] seq.int <- base::seq.int [18:03:19.013] signalCondition <- base::signalCondition [18:03:19.013] sys.calls <- base::sys.calls [18:03:19.013] `[[` <- base::`[[` [18:03:19.013] `+` <- base::`+` [18:03:19.013] `<<-` <- base::`<<-` [18:03:19.013] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.013] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.013] 3L)] [18:03:19.013] } [18:03:19.013] function(cond) { [18:03:19.013] is_error <- inherits(cond, "error") [18:03:19.013] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.013] NULL) [18:03:19.013] if (is_error) { [18:03:19.013] sessionInformation <- function() { [18:03:19.013] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.013] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.013] search = base::search(), system = base::Sys.info()) [18:03:19.013] } [18:03:19.013] ...future.conditions[[length(...future.conditions) + [18:03:19.013] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.013] cond$call), session = sessionInformation(), [18:03:19.013] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.013] signalCondition(cond) [18:03:19.013] } [18:03:19.013] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.013] "immediateCondition"))) { [18:03:19.013] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.013] ...future.conditions[[length(...future.conditions) + [18:03:19.013] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.013] if (TRUE && !signal) { [18:03:19.013] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.013] { [18:03:19.013] inherits <- base::inherits [18:03:19.013] invokeRestart <- base::invokeRestart [18:03:19.013] is.null <- base::is.null [18:03:19.013] muffled <- FALSE [18:03:19.013] if (inherits(cond, "message")) { [18:03:19.013] muffled <- grepl(pattern, "muffleMessage") [18:03:19.013] if (muffled) [18:03:19.013] invokeRestart("muffleMessage") [18:03:19.013] } [18:03:19.013] else if (inherits(cond, "warning")) { [18:03:19.013] muffled <- grepl(pattern, "muffleWarning") [18:03:19.013] if (muffled) [18:03:19.013] invokeRestart("muffleWarning") [18:03:19.013] } [18:03:19.013] else if (inherits(cond, "condition")) { [18:03:19.013] if (!is.null(pattern)) { [18:03:19.013] computeRestarts <- base::computeRestarts [18:03:19.013] grepl <- base::grepl [18:03:19.013] restarts <- computeRestarts(cond) [18:03:19.013] for (restart in restarts) { [18:03:19.013] name <- restart$name [18:03:19.013] if (is.null(name)) [18:03:19.013] next [18:03:19.013] if (!grepl(pattern, name)) [18:03:19.013] next [18:03:19.013] invokeRestart(restart) [18:03:19.013] muffled <- TRUE [18:03:19.013] break [18:03:19.013] } [18:03:19.013] } [18:03:19.013] } [18:03:19.013] invisible(muffled) [18:03:19.013] } [18:03:19.013] muffleCondition(cond, pattern = "^muffle") [18:03:19.013] } [18:03:19.013] } [18:03:19.013] else { [18:03:19.013] if (TRUE) { [18:03:19.013] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.013] { [18:03:19.013] inherits <- base::inherits [18:03:19.013] invokeRestart <- base::invokeRestart [18:03:19.013] is.null <- base::is.null [18:03:19.013] muffled <- FALSE [18:03:19.013] if (inherits(cond, "message")) { [18:03:19.013] muffled <- grepl(pattern, "muffleMessage") [18:03:19.013] if (muffled) [18:03:19.013] invokeRestart("muffleMessage") [18:03:19.013] } [18:03:19.013] else if (inherits(cond, "warning")) { [18:03:19.013] muffled <- grepl(pattern, "muffleWarning") [18:03:19.013] if (muffled) [18:03:19.013] invokeRestart("muffleWarning") [18:03:19.013] } [18:03:19.013] else if (inherits(cond, "condition")) { [18:03:19.013] if (!is.null(pattern)) { [18:03:19.013] computeRestarts <- base::computeRestarts [18:03:19.013] grepl <- base::grepl [18:03:19.013] restarts <- computeRestarts(cond) [18:03:19.013] for (restart in restarts) { [18:03:19.013] name <- restart$name [18:03:19.013] if (is.null(name)) [18:03:19.013] next [18:03:19.013] if (!grepl(pattern, name)) [18:03:19.013] next [18:03:19.013] invokeRestart(restart) [18:03:19.013] muffled <- TRUE [18:03:19.013] break [18:03:19.013] } [18:03:19.013] } [18:03:19.013] } [18:03:19.013] invisible(muffled) [18:03:19.013] } [18:03:19.013] muffleCondition(cond, pattern = "^muffle") [18:03:19.013] } [18:03:19.013] } [18:03:19.013] } [18:03:19.013] })) [18:03:19.013] }, error = function(ex) { [18:03:19.013] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.013] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.013] ...future.rng), started = ...future.startTime, [18:03:19.013] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.013] version = "1.8"), class = "FutureResult") [18:03:19.013] }, finally = { [18:03:19.013] if (!identical(...future.workdir, getwd())) [18:03:19.013] setwd(...future.workdir) [18:03:19.013] { [18:03:19.013] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.013] ...future.oldOptions$nwarnings <- NULL [18:03:19.013] } [18:03:19.013] base::options(...future.oldOptions) [18:03:19.013] if (.Platform$OS.type == "windows") { [18:03:19.013] old_names <- names(...future.oldEnvVars) [18:03:19.013] envs <- base::Sys.getenv() [18:03:19.013] names <- names(envs) [18:03:19.013] common <- intersect(names, old_names) [18:03:19.013] added <- setdiff(names, old_names) [18:03:19.013] removed <- setdiff(old_names, names) [18:03:19.013] changed <- common[...future.oldEnvVars[common] != [18:03:19.013] envs[common]] [18:03:19.013] NAMES <- toupper(changed) [18:03:19.013] args <- list() [18:03:19.013] for (kk in seq_along(NAMES)) { [18:03:19.013] name <- changed[[kk]] [18:03:19.013] NAME <- NAMES[[kk]] [18:03:19.013] if (name != NAME && is.element(NAME, old_names)) [18:03:19.013] next [18:03:19.013] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.013] } [18:03:19.013] NAMES <- toupper(added) [18:03:19.013] for (kk in seq_along(NAMES)) { [18:03:19.013] name <- added[[kk]] [18:03:19.013] NAME <- NAMES[[kk]] [18:03:19.013] if (name != NAME && is.element(NAME, old_names)) [18:03:19.013] next [18:03:19.013] args[[name]] <- "" [18:03:19.013] } [18:03:19.013] NAMES <- toupper(removed) [18:03:19.013] for (kk in seq_along(NAMES)) { [18:03:19.013] name <- removed[[kk]] [18:03:19.013] NAME <- NAMES[[kk]] [18:03:19.013] if (name != NAME && is.element(NAME, old_names)) [18:03:19.013] next [18:03:19.013] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.013] } [18:03:19.013] if (length(args) > 0) [18:03:19.013] base::do.call(base::Sys.setenv, args = args) [18:03:19.013] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.013] } [18:03:19.013] else { [18:03:19.013] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.013] } [18:03:19.013] { [18:03:19.013] if (base::length(...future.futureOptionsAdded) > [18:03:19.013] 0L) { [18:03:19.013] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.013] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.013] base::options(opts) [18:03:19.013] } [18:03:19.013] { [18:03:19.013] { [18:03:19.013] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.013] NULL [18:03:19.013] } [18:03:19.013] options(future.plan = NULL) [18:03:19.013] if (is.na(NA_character_)) [18:03:19.013] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.013] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.013] future::plan(list(function (..., workers = availableCores(), [18:03:19.013] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.013] envir = parent.frame()) [18:03:19.013] { [18:03:19.013] if (is.function(workers)) [18:03:19.013] workers <- workers() [18:03:19.013] workers <- structure(as.integer(workers), [18:03:19.013] class = class(workers)) [18:03:19.013] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.013] workers >= 1) [18:03:19.013] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.013] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.013] } [18:03:19.013] future <- MultisessionFuture(..., workers = workers, [18:03:19.013] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.013] envir = envir) [18:03:19.013] if (!future$lazy) [18:03:19.013] future <- run(future) [18:03:19.013] invisible(future) [18:03:19.013] }), .cleanup = FALSE, .init = FALSE) [18:03:19.013] } [18:03:19.013] } [18:03:19.013] } [18:03:19.013] }) [18:03:19.013] if (TRUE) { [18:03:19.013] base::sink(type = "output", split = FALSE) [18:03:19.013] if (TRUE) { [18:03:19.013] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.013] } [18:03:19.013] else { [18:03:19.013] ...future.result["stdout"] <- base::list(NULL) [18:03:19.013] } [18:03:19.013] base::close(...future.stdout) [18:03:19.013] ...future.stdout <- NULL [18:03:19.013] } [18:03:19.013] ...future.result$conditions <- ...future.conditions [18:03:19.013] ...future.result$finished <- base::Sys.time() [18:03:19.013] ...future.result [18:03:19.013] } [18:03:19.018] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.018] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.019] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.019] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.020] MultisessionFuture started [18:03:19.020] - Launch lazy future ... done [18:03:19.020] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_3-260838' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5b0b990 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.036] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.036] - Validating connection of MultisessionFuture [18:03:19.036] - received message: FutureResult [18:03:19.037] - Received FutureResult [18:03:19.037] - Erased future from FutureRegistry [18:03:19.037] result() for ClusterFuture ... [18:03:19.037] - result already collected: FutureResult [18:03:19.037] result() for ClusterFuture ... done [18:03:19.038] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.038] getGlobalsAndPackages() ... [18:03:19.038] Searching for globals... [18:03:19.039] - globals found: [3] '{', 'sample', 'x' [18:03:19.039] Searching for globals ... DONE [18:03:19.040] Resolving globals: FALSE [18:03:19.040] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.040] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.041] - globals: [1] 'x' [18:03:19.041] [18:03:19.041] getGlobalsAndPackages() ... DONE [18:03:19.041] run() for 'Future' ... [18:03:19.042] - state: 'created' [18:03:19.042] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.057] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.058] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.058] - Field: 'node' [18:03:19.058] - Field: 'label' [18:03:19.058] - Field: 'local' [18:03:19.058] - Field: 'owner' [18:03:19.059] - Field: 'envir' [18:03:19.059] - Field: 'workers' [18:03:19.059] - Field: 'packages' [18:03:19.059] - Field: 'gc' [18:03:19.059] - Field: 'conditions' [18:03:19.060] - Field: 'persistent' [18:03:19.060] - Field: 'expr' [18:03:19.060] - Field: 'uuid' [18:03:19.060] - Field: 'seed' [18:03:19.060] - Field: 'version' [18:03:19.060] - Field: 'result' [18:03:19.061] - Field: 'asynchronous' [18:03:19.061] - Field: 'calls' [18:03:19.061] - Field: 'globals' [18:03:19.061] - Field: 'stdout' [18:03:19.061] - Field: 'earlySignal' [18:03:19.062] - Field: 'lazy' [18:03:19.062] - Field: 'state' [18:03:19.062] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.062] - Launch lazy future ... [18:03:19.062] Packages needed by the future expression (n = 0): [18:03:19.063] Packages needed by future strategies (n = 0): [18:03:19.063] { [18:03:19.063] { [18:03:19.063] { [18:03:19.063] ...future.startTime <- base::Sys.time() [18:03:19.063] { [18:03:19.063] { [18:03:19.063] { [18:03:19.063] { [18:03:19.063] base::local({ [18:03:19.063] has_future <- base::requireNamespace("future", [18:03:19.063] quietly = TRUE) [18:03:19.063] if (has_future) { [18:03:19.063] ns <- base::getNamespace("future") [18:03:19.063] version <- ns[[".package"]][["version"]] [18:03:19.063] if (is.null(version)) [18:03:19.063] version <- utils::packageVersion("future") [18:03:19.063] } [18:03:19.063] else { [18:03:19.063] version <- NULL [18:03:19.063] } [18:03:19.063] if (!has_future || version < "1.8.0") { [18:03:19.063] info <- base::c(r_version = base::gsub("R version ", [18:03:19.063] "", base::R.version$version.string), [18:03:19.063] platform = base::sprintf("%s (%s-bit)", [18:03:19.063] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.063] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.063] "release", "version")], collapse = " "), [18:03:19.063] hostname = base::Sys.info()[["nodename"]]) [18:03:19.063] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.063] info) [18:03:19.063] info <- base::paste(info, collapse = "; ") [18:03:19.063] if (!has_future) { [18:03:19.063] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.063] info) [18:03:19.063] } [18:03:19.063] else { [18:03:19.063] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.063] info, version) [18:03:19.063] } [18:03:19.063] base::stop(msg) [18:03:19.063] } [18:03:19.063] }) [18:03:19.063] } [18:03:19.063] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.063] base::options(mc.cores = 1L) [18:03:19.063] } [18:03:19.063] options(future.plan = NULL) [18:03:19.063] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.063] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.063] } [18:03:19.063] ...future.workdir <- getwd() [18:03:19.063] } [18:03:19.063] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.063] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.063] } [18:03:19.063] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.063] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.063] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.063] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.063] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:19.063] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.063] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.063] base::names(...future.oldOptions)) [18:03:19.063] } [18:03:19.063] if (FALSE) { [18:03:19.063] } [18:03:19.063] else { [18:03:19.063] if (TRUE) { [18:03:19.063] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.063] open = "w") [18:03:19.063] } [18:03:19.063] else { [18:03:19.063] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.063] windows = "NUL", "/dev/null"), open = "w") [18:03:19.063] } [18:03:19.063] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.063] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.063] base::sink(type = "output", split = FALSE) [18:03:19.063] base::close(...future.stdout) [18:03:19.063] }, add = TRUE) [18:03:19.063] } [18:03:19.063] ...future.frame <- base::sys.nframe() [18:03:19.063] ...future.conditions <- base::list() [18:03:19.063] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.063] if (FALSE) { [18:03:19.063] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.063] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.063] } [18:03:19.063] ...future.result <- base::tryCatch({ [18:03:19.063] base::withCallingHandlers({ [18:03:19.063] ...future.value <- base::withVisible(base::local({ [18:03:19.063] ...future.makeSendCondition <- local({ [18:03:19.063] sendCondition <- NULL [18:03:19.063] function(frame = 1L) { [18:03:19.063] if (is.function(sendCondition)) [18:03:19.063] return(sendCondition) [18:03:19.063] ns <- getNamespace("parallel") [18:03:19.063] if (exists("sendData", mode = "function", [18:03:19.063] envir = ns)) { [18:03:19.063] parallel_sendData <- get("sendData", mode = "function", [18:03:19.063] envir = ns) [18:03:19.063] envir <- sys.frame(frame) [18:03:19.063] master <- NULL [18:03:19.063] while (!identical(envir, .GlobalEnv) && [18:03:19.063] !identical(envir, emptyenv())) { [18:03:19.063] if (exists("master", mode = "list", envir = envir, [18:03:19.063] inherits = FALSE)) { [18:03:19.063] master <- get("master", mode = "list", [18:03:19.063] envir = envir, inherits = FALSE) [18:03:19.063] if (inherits(master, c("SOCKnode", [18:03:19.063] "SOCK0node"))) { [18:03:19.063] sendCondition <<- function(cond) { [18:03:19.063] data <- list(type = "VALUE", value = cond, [18:03:19.063] success = TRUE) [18:03:19.063] parallel_sendData(master, data) [18:03:19.063] } [18:03:19.063] return(sendCondition) [18:03:19.063] } [18:03:19.063] } [18:03:19.063] frame <- frame + 1L [18:03:19.063] envir <- sys.frame(frame) [18:03:19.063] } [18:03:19.063] } [18:03:19.063] sendCondition <<- function(cond) NULL [18:03:19.063] } [18:03:19.063] }) [18:03:19.063] withCallingHandlers({ [18:03:19.063] { [18:03:19.063] sample(x, size = 1L) [18:03:19.063] } [18:03:19.063] }, immediateCondition = function(cond) { [18:03:19.063] sendCondition <- ...future.makeSendCondition() [18:03:19.063] sendCondition(cond) [18:03:19.063] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.063] { [18:03:19.063] inherits <- base::inherits [18:03:19.063] invokeRestart <- base::invokeRestart [18:03:19.063] is.null <- base::is.null [18:03:19.063] muffled <- FALSE [18:03:19.063] if (inherits(cond, "message")) { [18:03:19.063] muffled <- grepl(pattern, "muffleMessage") [18:03:19.063] if (muffled) [18:03:19.063] invokeRestart("muffleMessage") [18:03:19.063] } [18:03:19.063] else if (inherits(cond, "warning")) { [18:03:19.063] muffled <- grepl(pattern, "muffleWarning") [18:03:19.063] if (muffled) [18:03:19.063] invokeRestart("muffleWarning") [18:03:19.063] } [18:03:19.063] else if (inherits(cond, "condition")) { [18:03:19.063] if (!is.null(pattern)) { [18:03:19.063] computeRestarts <- base::computeRestarts [18:03:19.063] grepl <- base::grepl [18:03:19.063] restarts <- computeRestarts(cond) [18:03:19.063] for (restart in restarts) { [18:03:19.063] name <- restart$name [18:03:19.063] if (is.null(name)) [18:03:19.063] next [18:03:19.063] if (!grepl(pattern, name)) [18:03:19.063] next [18:03:19.063] invokeRestart(restart) [18:03:19.063] muffled <- TRUE [18:03:19.063] break [18:03:19.063] } [18:03:19.063] } [18:03:19.063] } [18:03:19.063] invisible(muffled) [18:03:19.063] } [18:03:19.063] muffleCondition(cond) [18:03:19.063] }) [18:03:19.063] })) [18:03:19.063] future::FutureResult(value = ...future.value$value, [18:03:19.063] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.063] ...future.rng), globalenv = if (FALSE) [18:03:19.063] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.063] ...future.globalenv.names)) [18:03:19.063] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.063] }, condition = base::local({ [18:03:19.063] c <- base::c [18:03:19.063] inherits <- base::inherits [18:03:19.063] invokeRestart <- base::invokeRestart [18:03:19.063] length <- base::length [18:03:19.063] list <- base::list [18:03:19.063] seq.int <- base::seq.int [18:03:19.063] signalCondition <- base::signalCondition [18:03:19.063] sys.calls <- base::sys.calls [18:03:19.063] `[[` <- base::`[[` [18:03:19.063] `+` <- base::`+` [18:03:19.063] `<<-` <- base::`<<-` [18:03:19.063] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.063] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.063] 3L)] [18:03:19.063] } [18:03:19.063] function(cond) { [18:03:19.063] is_error <- inherits(cond, "error") [18:03:19.063] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.063] NULL) [18:03:19.063] if (is_error) { [18:03:19.063] sessionInformation <- function() { [18:03:19.063] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.063] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.063] search = base::search(), system = base::Sys.info()) [18:03:19.063] } [18:03:19.063] ...future.conditions[[length(...future.conditions) + [18:03:19.063] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.063] cond$call), session = sessionInformation(), [18:03:19.063] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.063] signalCondition(cond) [18:03:19.063] } [18:03:19.063] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.063] "immediateCondition"))) { [18:03:19.063] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.063] ...future.conditions[[length(...future.conditions) + [18:03:19.063] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.063] if (TRUE && !signal) { [18:03:19.063] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.063] { [18:03:19.063] inherits <- base::inherits [18:03:19.063] invokeRestart <- base::invokeRestart [18:03:19.063] is.null <- base::is.null [18:03:19.063] muffled <- FALSE [18:03:19.063] if (inherits(cond, "message")) { [18:03:19.063] muffled <- grepl(pattern, "muffleMessage") [18:03:19.063] if (muffled) [18:03:19.063] invokeRestart("muffleMessage") [18:03:19.063] } [18:03:19.063] else if (inherits(cond, "warning")) { [18:03:19.063] muffled <- grepl(pattern, "muffleWarning") [18:03:19.063] if (muffled) [18:03:19.063] invokeRestart("muffleWarning") [18:03:19.063] } [18:03:19.063] else if (inherits(cond, "condition")) { [18:03:19.063] if (!is.null(pattern)) { [18:03:19.063] computeRestarts <- base::computeRestarts [18:03:19.063] grepl <- base::grepl [18:03:19.063] restarts <- computeRestarts(cond) [18:03:19.063] for (restart in restarts) { [18:03:19.063] name <- restart$name [18:03:19.063] if (is.null(name)) [18:03:19.063] next [18:03:19.063] if (!grepl(pattern, name)) [18:03:19.063] next [18:03:19.063] invokeRestart(restart) [18:03:19.063] muffled <- TRUE [18:03:19.063] break [18:03:19.063] } [18:03:19.063] } [18:03:19.063] } [18:03:19.063] invisible(muffled) [18:03:19.063] } [18:03:19.063] muffleCondition(cond, pattern = "^muffle") [18:03:19.063] } [18:03:19.063] } [18:03:19.063] else { [18:03:19.063] if (TRUE) { [18:03:19.063] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.063] { [18:03:19.063] inherits <- base::inherits [18:03:19.063] invokeRestart <- base::invokeRestart [18:03:19.063] is.null <- base::is.null [18:03:19.063] muffled <- FALSE [18:03:19.063] if (inherits(cond, "message")) { [18:03:19.063] muffled <- grepl(pattern, "muffleMessage") [18:03:19.063] if (muffled) [18:03:19.063] invokeRestart("muffleMessage") [18:03:19.063] } [18:03:19.063] else if (inherits(cond, "warning")) { [18:03:19.063] muffled <- grepl(pattern, "muffleWarning") [18:03:19.063] if (muffled) [18:03:19.063] invokeRestart("muffleWarning") [18:03:19.063] } [18:03:19.063] else if (inherits(cond, "condition")) { [18:03:19.063] if (!is.null(pattern)) { [18:03:19.063] computeRestarts <- base::computeRestarts [18:03:19.063] grepl <- base::grepl [18:03:19.063] restarts <- computeRestarts(cond) [18:03:19.063] for (restart in restarts) { [18:03:19.063] name <- restart$name [18:03:19.063] if (is.null(name)) [18:03:19.063] next [18:03:19.063] if (!grepl(pattern, name)) [18:03:19.063] next [18:03:19.063] invokeRestart(restart) [18:03:19.063] muffled <- TRUE [18:03:19.063] break [18:03:19.063] } [18:03:19.063] } [18:03:19.063] } [18:03:19.063] invisible(muffled) [18:03:19.063] } [18:03:19.063] muffleCondition(cond, pattern = "^muffle") [18:03:19.063] } [18:03:19.063] } [18:03:19.063] } [18:03:19.063] })) [18:03:19.063] }, error = function(ex) { [18:03:19.063] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.063] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.063] ...future.rng), started = ...future.startTime, [18:03:19.063] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.063] version = "1.8"), class = "FutureResult") [18:03:19.063] }, finally = { [18:03:19.063] if (!identical(...future.workdir, getwd())) [18:03:19.063] setwd(...future.workdir) [18:03:19.063] { [18:03:19.063] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.063] ...future.oldOptions$nwarnings <- NULL [18:03:19.063] } [18:03:19.063] base::options(...future.oldOptions) [18:03:19.063] if (.Platform$OS.type == "windows") { [18:03:19.063] old_names <- names(...future.oldEnvVars) [18:03:19.063] envs <- base::Sys.getenv() [18:03:19.063] names <- names(envs) [18:03:19.063] common <- intersect(names, old_names) [18:03:19.063] added <- setdiff(names, old_names) [18:03:19.063] removed <- setdiff(old_names, names) [18:03:19.063] changed <- common[...future.oldEnvVars[common] != [18:03:19.063] envs[common]] [18:03:19.063] NAMES <- toupper(changed) [18:03:19.063] args <- list() [18:03:19.063] for (kk in seq_along(NAMES)) { [18:03:19.063] name <- changed[[kk]] [18:03:19.063] NAME <- NAMES[[kk]] [18:03:19.063] if (name != NAME && is.element(NAME, old_names)) [18:03:19.063] next [18:03:19.063] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.063] } [18:03:19.063] NAMES <- toupper(added) [18:03:19.063] for (kk in seq_along(NAMES)) { [18:03:19.063] name <- added[[kk]] [18:03:19.063] NAME <- NAMES[[kk]] [18:03:19.063] if (name != NAME && is.element(NAME, old_names)) [18:03:19.063] next [18:03:19.063] args[[name]] <- "" [18:03:19.063] } [18:03:19.063] NAMES <- toupper(removed) [18:03:19.063] for (kk in seq_along(NAMES)) { [18:03:19.063] name <- removed[[kk]] [18:03:19.063] NAME <- NAMES[[kk]] [18:03:19.063] if (name != NAME && is.element(NAME, old_names)) [18:03:19.063] next [18:03:19.063] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.063] } [18:03:19.063] if (length(args) > 0) [18:03:19.063] base::do.call(base::Sys.setenv, args = args) [18:03:19.063] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.063] } [18:03:19.063] else { [18:03:19.063] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.063] } [18:03:19.063] { [18:03:19.063] if (base::length(...future.futureOptionsAdded) > [18:03:19.063] 0L) { [18:03:19.063] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.063] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.063] base::options(opts) [18:03:19.063] } [18:03:19.063] { [18:03:19.063] { [18:03:19.063] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.063] NULL [18:03:19.063] } [18:03:19.063] options(future.plan = NULL) [18:03:19.063] if (is.na(NA_character_)) [18:03:19.063] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.063] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.063] future::plan(list(function (..., workers = availableCores(), [18:03:19.063] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.063] envir = parent.frame()) [18:03:19.063] { [18:03:19.063] if (is.function(workers)) [18:03:19.063] workers <- workers() [18:03:19.063] workers <- structure(as.integer(workers), [18:03:19.063] class = class(workers)) [18:03:19.063] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.063] workers >= 1) [18:03:19.063] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.063] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.063] } [18:03:19.063] future <- MultisessionFuture(..., workers = workers, [18:03:19.063] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.063] envir = envir) [18:03:19.063] if (!future$lazy) [18:03:19.063] future <- run(future) [18:03:19.063] invisible(future) [18:03:19.063] }), .cleanup = FALSE, .init = FALSE) [18:03:19.063] } [18:03:19.063] } [18:03:19.063] } [18:03:19.063] }) [18:03:19.063] if (TRUE) { [18:03:19.063] base::sink(type = "output", split = FALSE) [18:03:19.063] if (TRUE) { [18:03:19.063] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.063] } [18:03:19.063] else { [18:03:19.063] ...future.result["stdout"] <- base::list(NULL) [18:03:19.063] } [18:03:19.063] base::close(...future.stdout) [18:03:19.063] ...future.stdout <- NULL [18:03:19.063] } [18:03:19.063] ...future.result$conditions <- ...future.conditions [18:03:19.063] ...future.result$finished <- base::Sys.time() [18:03:19.063] ...future.result [18:03:19.063] } [18:03:19.069] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.069] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.069] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.069] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.070] MultisessionFuture started [18:03:19.070] - Launch lazy future ... done [18:03:19.070] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_4-656136' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5b0b990 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.086] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.086] - Validating connection of MultisessionFuture [18:03:19.086] - received message: FutureResult [18:03:19.086] - Received FutureResult [18:03:19.086] - Erased future from FutureRegistry [18:03:19.087] result() for ClusterFuture ... [18:03:19.087] - result already collected: FutureResult [18:03:19.087] result() for ClusterFuture ... done [18:03:19.087] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.087] resolve() on list ... [18:03:19.088] recursive: 0 [18:03:19.088] length: 4 [18:03:19.088] [18:03:19.088] Future #1 [18:03:19.088] result() for ClusterFuture ... [18:03:19.088] - result already collected: FutureResult [18:03:19.088] result() for ClusterFuture ... done [18:03:19.089] result() for ClusterFuture ... [18:03:19.089] - result already collected: FutureResult [18:03:19.089] result() for ClusterFuture ... done [18:03:19.089] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:19.089] - nx: 4 [18:03:19.089] - relay: TRUE [18:03:19.090] - stdout: TRUE [18:03:19.090] - signal: TRUE [18:03:19.090] - resignal: FALSE [18:03:19.090] - force: TRUE [18:03:19.090] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.090] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.091] - until=1 [18:03:19.091] - relaying element #1 [18:03:19.091] result() for ClusterFuture ... [18:03:19.091] - result already collected: FutureResult [18:03:19.091] result() for ClusterFuture ... done [18:03:19.091] result() for ClusterFuture ... [18:03:19.091] - result already collected: FutureResult [18:03:19.092] result() for ClusterFuture ... done [18:03:19.092] result() for ClusterFuture ... [18:03:19.092] - result already collected: FutureResult [18:03:19.092] result() for ClusterFuture ... done [18:03:19.092] result() for ClusterFuture ... [18:03:19.092] - result already collected: FutureResult [18:03:19.093] result() for ClusterFuture ... done [18:03:19.093] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.093] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.093] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:03:19.093] length: 3 (resolved future 1) [18:03:19.093] Future #2 [18:03:19.094] result() for ClusterFuture ... [18:03:19.094] - result already collected: FutureResult [18:03:19.094] result() for ClusterFuture ... done [18:03:19.094] result() for ClusterFuture ... [18:03:19.094] - result already collected: FutureResult [18:03:19.094] result() for ClusterFuture ... done [18:03:19.095] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:03:19.095] - nx: 4 [18:03:19.095] - relay: TRUE [18:03:19.095] - stdout: TRUE [18:03:19.095] - signal: TRUE [18:03:19.095] - resignal: FALSE [18:03:19.095] - force: TRUE [18:03:19.096] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.096] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.096] - until=2 [18:03:19.096] - relaying element #2 [18:03:19.096] result() for ClusterFuture ... [18:03:19.096] - result already collected: FutureResult [18:03:19.097] result() for ClusterFuture ... done [18:03:19.097] result() for ClusterFuture ... [18:03:19.097] - result already collected: FutureResult [18:03:19.097] result() for ClusterFuture ... done [18:03:19.097] result() for ClusterFuture ... [18:03:19.097] - result already collected: FutureResult [18:03:19.098] result() for ClusterFuture ... done [18:03:19.098] result() for ClusterFuture ... [18:03:19.098] - result already collected: FutureResult [18:03:19.098] result() for ClusterFuture ... done [18:03:19.098] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.098] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.099] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:03:19.099] length: 2 (resolved future 2) [18:03:19.099] Future #3 [18:03:19.099] result() for ClusterFuture ... [18:03:19.099] - result already collected: FutureResult [18:03:19.099] result() for ClusterFuture ... done [18:03:19.100] result() for ClusterFuture ... [18:03:19.100] - result already collected: FutureResult [18:03:19.100] result() for ClusterFuture ... done [18:03:19.100] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:03:19.100] - nx: 4 [18:03:19.100] - relay: TRUE [18:03:19.100] - stdout: TRUE [18:03:19.101] - signal: TRUE [18:03:19.101] - resignal: FALSE [18:03:19.101] - force: TRUE [18:03:19.101] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.101] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.101] - until=3 [18:03:19.102] - relaying element #3 [18:03:19.102] result() for ClusterFuture ... [18:03:19.102] - result already collected: FutureResult [18:03:19.102] result() for ClusterFuture ... done [18:03:19.102] result() for ClusterFuture ... [18:03:19.102] - result already collected: FutureResult [18:03:19.102] result() for ClusterFuture ... done [18:03:19.103] result() for ClusterFuture ... [18:03:19.103] - result already collected: FutureResult [18:03:19.103] result() for ClusterFuture ... done [18:03:19.103] result() for ClusterFuture ... [18:03:19.103] - result already collected: FutureResult [18:03:19.103] result() for ClusterFuture ... done [18:03:19.104] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.104] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.104] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:03:19.104] length: 1 (resolved future 3) [18:03:19.104] Future #4 [18:03:19.105] result() for ClusterFuture ... [18:03:19.105] - result already collected: FutureResult [18:03:19.105] result() for ClusterFuture ... done [18:03:19.105] result() for ClusterFuture ... [18:03:19.105] - result already collected: FutureResult [18:03:19.105] result() for ClusterFuture ... done [18:03:19.105] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:03:19.106] - nx: 4 [18:03:19.106] - relay: TRUE [18:03:19.106] - stdout: TRUE [18:03:19.106] - signal: TRUE [18:03:19.106] - resignal: FALSE [18:03:19.106] - force: TRUE [18:03:19.107] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.107] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.107] - until=4 [18:03:19.107] - relaying element #4 [18:03:19.107] result() for ClusterFuture ... [18:03:19.107] - result already collected: FutureResult [18:03:19.107] result() for ClusterFuture ... done [18:03:19.108] result() for ClusterFuture ... [18:03:19.108] - result already collected: FutureResult [18:03:19.108] result() for ClusterFuture ... done [18:03:19.108] result() for ClusterFuture ... [18:03:19.108] - result already collected: FutureResult [18:03:19.108] result() for ClusterFuture ... done [18:03:19.109] result() for ClusterFuture ... [18:03:19.109] - result already collected: FutureResult [18:03:19.109] result() for ClusterFuture ... done [18:03:19.109] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.109] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.109] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:03:19.110] length: 0 (resolved future 4) [18:03:19.110] Relaying remaining futures [18:03:19.110] signalConditionsASAP(NULL, pos=0) ... [18:03:19.110] - nx: 4 [18:03:19.110] - relay: TRUE [18:03:19.110] - stdout: TRUE [18:03:19.111] - signal: TRUE [18:03:19.111] - resignal: FALSE [18:03:19.111] - force: TRUE [18:03:19.111] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.111] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:19.111] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.112] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.112] signalConditionsASAP(NULL, pos=0) ... done [18:03:19.112] resolve() on list ... DONE [18:03:19.112] result() for ClusterFuture ... [18:03:19.112] - result already collected: FutureResult [18:03:19.112] result() for ClusterFuture ... done [18:03:19.113] result() for ClusterFuture ... [18:03:19.113] - result already collected: FutureResult [18:03:19.113] result() for ClusterFuture ... done [18:03:19.113] result() for ClusterFuture ... [18:03:19.113] - result already collected: FutureResult [18:03:19.113] result() for ClusterFuture ... done [18:03:19.113] result() for ClusterFuture ... [18:03:19.114] - result already collected: FutureResult [18:03:19.114] result() for ClusterFuture ... done [18:03:19.114] result() for ClusterFuture ... [18:03:19.114] - result already collected: FutureResult [18:03:19.114] result() for ClusterFuture ... done [18:03:19.114] result() for ClusterFuture ... [18:03:19.115] - result already collected: FutureResult [18:03:19.115] result() for ClusterFuture ... done [18:03:19.115] result() for ClusterFuture ... [18:03:19.115] - result already collected: FutureResult [18:03:19.115] result() for ClusterFuture ... done [18:03:19.115] result() for ClusterFuture ... [18:03:19.116] - result already collected: FutureResult [18:03:19.116] result() for ClusterFuture ... done [[1]] [1] 1 [[2]] [1] 1 [[3]] [1] 1 [[4]] [1] 2 [18:03:19.116] getGlobalsAndPackages() ... [18:03:19.116] Searching for globals... [18:03:19.117] - globals found: [3] '{', 'sample', 'x' [18:03:19.118] Searching for globals ... DONE [18:03:19.118] Resolving globals: FALSE [18:03:19.118] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.119] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.119] - globals: [1] 'x' [18:03:19.119] [18:03:19.119] getGlobalsAndPackages() ... DONE [18:03:19.120] run() for 'Future' ... [18:03:19.120] - state: 'created' [18:03:19.120] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.134] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.134] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.134] - Field: 'node' [18:03:19.134] - Field: 'label' [18:03:19.134] - Field: 'local' [18:03:19.135] - Field: 'owner' [18:03:19.135] - Field: 'envir' [18:03:19.135] - Field: 'workers' [18:03:19.135] - Field: 'packages' [18:03:19.135] - Field: 'gc' [18:03:19.135] - Field: 'conditions' [18:03:19.136] - Field: 'persistent' [18:03:19.136] - Field: 'expr' [18:03:19.136] - Field: 'uuid' [18:03:19.136] - Field: 'seed' [18:03:19.136] - Field: 'version' [18:03:19.136] - Field: 'result' [18:03:19.137] - Field: 'asynchronous' [18:03:19.137] - Field: 'calls' [18:03:19.137] - Field: 'globals' [18:03:19.137] - Field: 'stdout' [18:03:19.137] - Field: 'earlySignal' [18:03:19.138] - Field: 'lazy' [18:03:19.138] - Field: 'state' [18:03:19.138] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.138] - Launch lazy future ... [18:03:19.138] Packages needed by the future expression (n = 0): [18:03:19.139] Packages needed by future strategies (n = 0): [18:03:19.139] { [18:03:19.139] { [18:03:19.139] { [18:03:19.139] ...future.startTime <- base::Sys.time() [18:03:19.139] { [18:03:19.139] { [18:03:19.139] { [18:03:19.139] { [18:03:19.139] base::local({ [18:03:19.139] has_future <- base::requireNamespace("future", [18:03:19.139] quietly = TRUE) [18:03:19.139] if (has_future) { [18:03:19.139] ns <- base::getNamespace("future") [18:03:19.139] version <- ns[[".package"]][["version"]] [18:03:19.139] if (is.null(version)) [18:03:19.139] version <- utils::packageVersion("future") [18:03:19.139] } [18:03:19.139] else { [18:03:19.139] version <- NULL [18:03:19.139] } [18:03:19.139] if (!has_future || version < "1.8.0") { [18:03:19.139] info <- base::c(r_version = base::gsub("R version ", [18:03:19.139] "", base::R.version$version.string), [18:03:19.139] platform = base::sprintf("%s (%s-bit)", [18:03:19.139] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.139] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.139] "release", "version")], collapse = " "), [18:03:19.139] hostname = base::Sys.info()[["nodename"]]) [18:03:19.139] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.139] info) [18:03:19.139] info <- base::paste(info, collapse = "; ") [18:03:19.139] if (!has_future) { [18:03:19.139] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.139] info) [18:03:19.139] } [18:03:19.139] else { [18:03:19.139] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.139] info, version) [18:03:19.139] } [18:03:19.139] base::stop(msg) [18:03:19.139] } [18:03:19.139] }) [18:03:19.139] } [18:03:19.139] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.139] base::options(mc.cores = 1L) [18:03:19.139] } [18:03:19.139] options(future.plan = NULL) [18:03:19.139] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.139] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.139] } [18:03:19.139] ...future.workdir <- getwd() [18:03:19.139] } [18:03:19.139] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.139] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.139] } [18:03:19.139] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.139] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.139] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.139] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.139] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.139] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.139] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.139] base::names(...future.oldOptions)) [18:03:19.139] } [18:03:19.139] if (FALSE) { [18:03:19.139] } [18:03:19.139] else { [18:03:19.139] if (TRUE) { [18:03:19.139] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.139] open = "w") [18:03:19.139] } [18:03:19.139] else { [18:03:19.139] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.139] windows = "NUL", "/dev/null"), open = "w") [18:03:19.139] } [18:03:19.139] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.139] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.139] base::sink(type = "output", split = FALSE) [18:03:19.139] base::close(...future.stdout) [18:03:19.139] }, add = TRUE) [18:03:19.139] } [18:03:19.139] ...future.frame <- base::sys.nframe() [18:03:19.139] ...future.conditions <- base::list() [18:03:19.139] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.139] if (FALSE) { [18:03:19.139] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.139] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.139] } [18:03:19.139] ...future.result <- base::tryCatch({ [18:03:19.139] base::withCallingHandlers({ [18:03:19.139] ...future.value <- base::withVisible(base::local({ [18:03:19.139] ...future.makeSendCondition <- local({ [18:03:19.139] sendCondition <- NULL [18:03:19.139] function(frame = 1L) { [18:03:19.139] if (is.function(sendCondition)) [18:03:19.139] return(sendCondition) [18:03:19.139] ns <- getNamespace("parallel") [18:03:19.139] if (exists("sendData", mode = "function", [18:03:19.139] envir = ns)) { [18:03:19.139] parallel_sendData <- get("sendData", mode = "function", [18:03:19.139] envir = ns) [18:03:19.139] envir <- sys.frame(frame) [18:03:19.139] master <- NULL [18:03:19.139] while (!identical(envir, .GlobalEnv) && [18:03:19.139] !identical(envir, emptyenv())) { [18:03:19.139] if (exists("master", mode = "list", envir = envir, [18:03:19.139] inherits = FALSE)) { [18:03:19.139] master <- get("master", mode = "list", [18:03:19.139] envir = envir, inherits = FALSE) [18:03:19.139] if (inherits(master, c("SOCKnode", [18:03:19.139] "SOCK0node"))) { [18:03:19.139] sendCondition <<- function(cond) { [18:03:19.139] data <- list(type = "VALUE", value = cond, [18:03:19.139] success = TRUE) [18:03:19.139] parallel_sendData(master, data) [18:03:19.139] } [18:03:19.139] return(sendCondition) [18:03:19.139] } [18:03:19.139] } [18:03:19.139] frame <- frame + 1L [18:03:19.139] envir <- sys.frame(frame) [18:03:19.139] } [18:03:19.139] } [18:03:19.139] sendCondition <<- function(cond) NULL [18:03:19.139] } [18:03:19.139] }) [18:03:19.139] withCallingHandlers({ [18:03:19.139] { [18:03:19.139] sample(x, size = 1L) [18:03:19.139] } [18:03:19.139] }, immediateCondition = function(cond) { [18:03:19.139] sendCondition <- ...future.makeSendCondition() [18:03:19.139] sendCondition(cond) [18:03:19.139] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.139] { [18:03:19.139] inherits <- base::inherits [18:03:19.139] invokeRestart <- base::invokeRestart [18:03:19.139] is.null <- base::is.null [18:03:19.139] muffled <- FALSE [18:03:19.139] if (inherits(cond, "message")) { [18:03:19.139] muffled <- grepl(pattern, "muffleMessage") [18:03:19.139] if (muffled) [18:03:19.139] invokeRestart("muffleMessage") [18:03:19.139] } [18:03:19.139] else if (inherits(cond, "warning")) { [18:03:19.139] muffled <- grepl(pattern, "muffleWarning") [18:03:19.139] if (muffled) [18:03:19.139] invokeRestart("muffleWarning") [18:03:19.139] } [18:03:19.139] else if (inherits(cond, "condition")) { [18:03:19.139] if (!is.null(pattern)) { [18:03:19.139] computeRestarts <- base::computeRestarts [18:03:19.139] grepl <- base::grepl [18:03:19.139] restarts <- computeRestarts(cond) [18:03:19.139] for (restart in restarts) { [18:03:19.139] name <- restart$name [18:03:19.139] if (is.null(name)) [18:03:19.139] next [18:03:19.139] if (!grepl(pattern, name)) [18:03:19.139] next [18:03:19.139] invokeRestart(restart) [18:03:19.139] muffled <- TRUE [18:03:19.139] break [18:03:19.139] } [18:03:19.139] } [18:03:19.139] } [18:03:19.139] invisible(muffled) [18:03:19.139] } [18:03:19.139] muffleCondition(cond) [18:03:19.139] }) [18:03:19.139] })) [18:03:19.139] future::FutureResult(value = ...future.value$value, [18:03:19.139] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.139] ...future.rng), globalenv = if (FALSE) [18:03:19.139] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.139] ...future.globalenv.names)) [18:03:19.139] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.139] }, condition = base::local({ [18:03:19.139] c <- base::c [18:03:19.139] inherits <- base::inherits [18:03:19.139] invokeRestart <- base::invokeRestart [18:03:19.139] length <- base::length [18:03:19.139] list <- base::list [18:03:19.139] seq.int <- base::seq.int [18:03:19.139] signalCondition <- base::signalCondition [18:03:19.139] sys.calls <- base::sys.calls [18:03:19.139] `[[` <- base::`[[` [18:03:19.139] `+` <- base::`+` [18:03:19.139] `<<-` <- base::`<<-` [18:03:19.139] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.139] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.139] 3L)] [18:03:19.139] } [18:03:19.139] function(cond) { [18:03:19.139] is_error <- inherits(cond, "error") [18:03:19.139] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.139] NULL) [18:03:19.139] if (is_error) { [18:03:19.139] sessionInformation <- function() { [18:03:19.139] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.139] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.139] search = base::search(), system = base::Sys.info()) [18:03:19.139] } [18:03:19.139] ...future.conditions[[length(...future.conditions) + [18:03:19.139] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.139] cond$call), session = sessionInformation(), [18:03:19.139] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.139] signalCondition(cond) [18:03:19.139] } [18:03:19.139] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.139] "immediateCondition"))) { [18:03:19.139] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.139] ...future.conditions[[length(...future.conditions) + [18:03:19.139] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.139] if (TRUE && !signal) { [18:03:19.139] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.139] { [18:03:19.139] inherits <- base::inherits [18:03:19.139] invokeRestart <- base::invokeRestart [18:03:19.139] is.null <- base::is.null [18:03:19.139] muffled <- FALSE [18:03:19.139] if (inherits(cond, "message")) { [18:03:19.139] muffled <- grepl(pattern, "muffleMessage") [18:03:19.139] if (muffled) [18:03:19.139] invokeRestart("muffleMessage") [18:03:19.139] } [18:03:19.139] else if (inherits(cond, "warning")) { [18:03:19.139] muffled <- grepl(pattern, "muffleWarning") [18:03:19.139] if (muffled) [18:03:19.139] invokeRestart("muffleWarning") [18:03:19.139] } [18:03:19.139] else if (inherits(cond, "condition")) { [18:03:19.139] if (!is.null(pattern)) { [18:03:19.139] computeRestarts <- base::computeRestarts [18:03:19.139] grepl <- base::grepl [18:03:19.139] restarts <- computeRestarts(cond) [18:03:19.139] for (restart in restarts) { [18:03:19.139] name <- restart$name [18:03:19.139] if (is.null(name)) [18:03:19.139] next [18:03:19.139] if (!grepl(pattern, name)) [18:03:19.139] next [18:03:19.139] invokeRestart(restart) [18:03:19.139] muffled <- TRUE [18:03:19.139] break [18:03:19.139] } [18:03:19.139] } [18:03:19.139] } [18:03:19.139] invisible(muffled) [18:03:19.139] } [18:03:19.139] muffleCondition(cond, pattern = "^muffle") [18:03:19.139] } [18:03:19.139] } [18:03:19.139] else { [18:03:19.139] if (TRUE) { [18:03:19.139] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.139] { [18:03:19.139] inherits <- base::inherits [18:03:19.139] invokeRestart <- base::invokeRestart [18:03:19.139] is.null <- base::is.null [18:03:19.139] muffled <- FALSE [18:03:19.139] if (inherits(cond, "message")) { [18:03:19.139] muffled <- grepl(pattern, "muffleMessage") [18:03:19.139] if (muffled) [18:03:19.139] invokeRestart("muffleMessage") [18:03:19.139] } [18:03:19.139] else if (inherits(cond, "warning")) { [18:03:19.139] muffled <- grepl(pattern, "muffleWarning") [18:03:19.139] if (muffled) [18:03:19.139] invokeRestart("muffleWarning") [18:03:19.139] } [18:03:19.139] else if (inherits(cond, "condition")) { [18:03:19.139] if (!is.null(pattern)) { [18:03:19.139] computeRestarts <- base::computeRestarts [18:03:19.139] grepl <- base::grepl [18:03:19.139] restarts <- computeRestarts(cond) [18:03:19.139] for (restart in restarts) { [18:03:19.139] name <- restart$name [18:03:19.139] if (is.null(name)) [18:03:19.139] next [18:03:19.139] if (!grepl(pattern, name)) [18:03:19.139] next [18:03:19.139] invokeRestart(restart) [18:03:19.139] muffled <- TRUE [18:03:19.139] break [18:03:19.139] } [18:03:19.139] } [18:03:19.139] } [18:03:19.139] invisible(muffled) [18:03:19.139] } [18:03:19.139] muffleCondition(cond, pattern = "^muffle") [18:03:19.139] } [18:03:19.139] } [18:03:19.139] } [18:03:19.139] })) [18:03:19.139] }, error = function(ex) { [18:03:19.139] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.139] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.139] ...future.rng), started = ...future.startTime, [18:03:19.139] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.139] version = "1.8"), class = "FutureResult") [18:03:19.139] }, finally = { [18:03:19.139] if (!identical(...future.workdir, getwd())) [18:03:19.139] setwd(...future.workdir) [18:03:19.139] { [18:03:19.139] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.139] ...future.oldOptions$nwarnings <- NULL [18:03:19.139] } [18:03:19.139] base::options(...future.oldOptions) [18:03:19.139] if (.Platform$OS.type == "windows") { [18:03:19.139] old_names <- names(...future.oldEnvVars) [18:03:19.139] envs <- base::Sys.getenv() [18:03:19.139] names <- names(envs) [18:03:19.139] common <- intersect(names, old_names) [18:03:19.139] added <- setdiff(names, old_names) [18:03:19.139] removed <- setdiff(old_names, names) [18:03:19.139] changed <- common[...future.oldEnvVars[common] != [18:03:19.139] envs[common]] [18:03:19.139] NAMES <- toupper(changed) [18:03:19.139] args <- list() [18:03:19.139] for (kk in seq_along(NAMES)) { [18:03:19.139] name <- changed[[kk]] [18:03:19.139] NAME <- NAMES[[kk]] [18:03:19.139] if (name != NAME && is.element(NAME, old_names)) [18:03:19.139] next [18:03:19.139] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.139] } [18:03:19.139] NAMES <- toupper(added) [18:03:19.139] for (kk in seq_along(NAMES)) { [18:03:19.139] name <- added[[kk]] [18:03:19.139] NAME <- NAMES[[kk]] [18:03:19.139] if (name != NAME && is.element(NAME, old_names)) [18:03:19.139] next [18:03:19.139] args[[name]] <- "" [18:03:19.139] } [18:03:19.139] NAMES <- toupper(removed) [18:03:19.139] for (kk in seq_along(NAMES)) { [18:03:19.139] name <- removed[[kk]] [18:03:19.139] NAME <- NAMES[[kk]] [18:03:19.139] if (name != NAME && is.element(NAME, old_names)) [18:03:19.139] next [18:03:19.139] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.139] } [18:03:19.139] if (length(args) > 0) [18:03:19.139] base::do.call(base::Sys.setenv, args = args) [18:03:19.139] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.139] } [18:03:19.139] else { [18:03:19.139] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.139] } [18:03:19.139] { [18:03:19.139] if (base::length(...future.futureOptionsAdded) > [18:03:19.139] 0L) { [18:03:19.139] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.139] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.139] base::options(opts) [18:03:19.139] } [18:03:19.139] { [18:03:19.139] { [18:03:19.139] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.139] NULL [18:03:19.139] } [18:03:19.139] options(future.plan = NULL) [18:03:19.139] if (is.na(NA_character_)) [18:03:19.139] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.139] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.139] future::plan(list(function (..., workers = availableCores(), [18:03:19.139] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.139] envir = parent.frame()) [18:03:19.139] { [18:03:19.139] if (is.function(workers)) [18:03:19.139] workers <- workers() [18:03:19.139] workers <- structure(as.integer(workers), [18:03:19.139] class = class(workers)) [18:03:19.139] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.139] workers >= 1) [18:03:19.139] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.139] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.139] } [18:03:19.139] future <- MultisessionFuture(..., workers = workers, [18:03:19.139] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.139] envir = envir) [18:03:19.139] if (!future$lazy) [18:03:19.139] future <- run(future) [18:03:19.139] invisible(future) [18:03:19.139] }), .cleanup = FALSE, .init = FALSE) [18:03:19.139] } [18:03:19.139] } [18:03:19.139] } [18:03:19.139] }) [18:03:19.139] if (TRUE) { [18:03:19.139] base::sink(type = "output", split = FALSE) [18:03:19.139] if (TRUE) { [18:03:19.139] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.139] } [18:03:19.139] else { [18:03:19.139] ...future.result["stdout"] <- base::list(NULL) [18:03:19.139] } [18:03:19.139] base::close(...future.stdout) [18:03:19.139] ...future.stdout <- NULL [18:03:19.139] } [18:03:19.139] ...future.result$conditions <- ...future.conditions [18:03:19.139] ...future.result$finished <- base::Sys.time() [18:03:19.139] ...future.result [18:03:19.139] } [18:03:19.144] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.145] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.145] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.145] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.146] MultisessionFuture started [18:03:19.146] - Launch lazy future ... done [18:03:19.146] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_1-337766' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f579bed0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.163] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.163] - Validating connection of MultisessionFuture [18:03:19.163] - received message: FutureResult [18:03:19.163] - Received FutureResult [18:03:19.164] - Erased future from FutureRegistry [18:03:19.164] result() for ClusterFuture ... [18:03:19.164] - result already collected: FutureResult [18:03:19.164] result() for ClusterFuture ... done [18:03:19.164] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.165] getGlobalsAndPackages() ... [18:03:19.165] Searching for globals... [18:03:19.166] - globals found: [3] '{', 'sample', 'x' [18:03:19.166] Searching for globals ... DONE [18:03:19.166] Resolving globals: FALSE [18:03:19.167] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.167] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.167] - globals: [1] 'x' [18:03:19.168] [18:03:19.168] getGlobalsAndPackages() ... DONE [18:03:19.168] run() for 'Future' ... [18:03:19.168] - state: 'created' [18:03:19.168] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.182] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.182] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.182] - Field: 'node' [18:03:19.182] - Field: 'label' [18:03:19.183] - Field: 'local' [18:03:19.183] - Field: 'owner' [18:03:19.183] - Field: 'envir' [18:03:19.183] - Field: 'workers' [18:03:19.183] - Field: 'packages' [18:03:19.183] - Field: 'gc' [18:03:19.184] - Field: 'conditions' [18:03:19.184] - Field: 'persistent' [18:03:19.184] - Field: 'expr' [18:03:19.184] - Field: 'uuid' [18:03:19.184] - Field: 'seed' [18:03:19.185] - Field: 'version' [18:03:19.185] - Field: 'result' [18:03:19.185] - Field: 'asynchronous' [18:03:19.185] - Field: 'calls' [18:03:19.185] - Field: 'globals' [18:03:19.185] - Field: 'stdout' [18:03:19.186] - Field: 'earlySignal' [18:03:19.186] - Field: 'lazy' [18:03:19.186] - Field: 'state' [18:03:19.186] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.186] - Launch lazy future ... [18:03:19.187] Packages needed by the future expression (n = 0): [18:03:19.187] Packages needed by future strategies (n = 0): [18:03:19.187] { [18:03:19.187] { [18:03:19.187] { [18:03:19.187] ...future.startTime <- base::Sys.time() [18:03:19.187] { [18:03:19.187] { [18:03:19.187] { [18:03:19.187] { [18:03:19.187] base::local({ [18:03:19.187] has_future <- base::requireNamespace("future", [18:03:19.187] quietly = TRUE) [18:03:19.187] if (has_future) { [18:03:19.187] ns <- base::getNamespace("future") [18:03:19.187] version <- ns[[".package"]][["version"]] [18:03:19.187] if (is.null(version)) [18:03:19.187] version <- utils::packageVersion("future") [18:03:19.187] } [18:03:19.187] else { [18:03:19.187] version <- NULL [18:03:19.187] } [18:03:19.187] if (!has_future || version < "1.8.0") { [18:03:19.187] info <- base::c(r_version = base::gsub("R version ", [18:03:19.187] "", base::R.version$version.string), [18:03:19.187] platform = base::sprintf("%s (%s-bit)", [18:03:19.187] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.187] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.187] "release", "version")], collapse = " "), [18:03:19.187] hostname = base::Sys.info()[["nodename"]]) [18:03:19.187] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.187] info) [18:03:19.187] info <- base::paste(info, collapse = "; ") [18:03:19.187] if (!has_future) { [18:03:19.187] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.187] info) [18:03:19.187] } [18:03:19.187] else { [18:03:19.187] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.187] info, version) [18:03:19.187] } [18:03:19.187] base::stop(msg) [18:03:19.187] } [18:03:19.187] }) [18:03:19.187] } [18:03:19.187] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.187] base::options(mc.cores = 1L) [18:03:19.187] } [18:03:19.187] options(future.plan = NULL) [18:03:19.187] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.187] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.187] } [18:03:19.187] ...future.workdir <- getwd() [18:03:19.187] } [18:03:19.187] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.187] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.187] } [18:03:19.187] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.187] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.187] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.187] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.187] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.187] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.187] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.187] base::names(...future.oldOptions)) [18:03:19.187] } [18:03:19.187] if (FALSE) { [18:03:19.187] } [18:03:19.187] else { [18:03:19.187] if (TRUE) { [18:03:19.187] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.187] open = "w") [18:03:19.187] } [18:03:19.187] else { [18:03:19.187] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.187] windows = "NUL", "/dev/null"), open = "w") [18:03:19.187] } [18:03:19.187] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.187] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.187] base::sink(type = "output", split = FALSE) [18:03:19.187] base::close(...future.stdout) [18:03:19.187] }, add = TRUE) [18:03:19.187] } [18:03:19.187] ...future.frame <- base::sys.nframe() [18:03:19.187] ...future.conditions <- base::list() [18:03:19.187] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.187] if (FALSE) { [18:03:19.187] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.187] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.187] } [18:03:19.187] ...future.result <- base::tryCatch({ [18:03:19.187] base::withCallingHandlers({ [18:03:19.187] ...future.value <- base::withVisible(base::local({ [18:03:19.187] ...future.makeSendCondition <- local({ [18:03:19.187] sendCondition <- NULL [18:03:19.187] function(frame = 1L) { [18:03:19.187] if (is.function(sendCondition)) [18:03:19.187] return(sendCondition) [18:03:19.187] ns <- getNamespace("parallel") [18:03:19.187] if (exists("sendData", mode = "function", [18:03:19.187] envir = ns)) { [18:03:19.187] parallel_sendData <- get("sendData", mode = "function", [18:03:19.187] envir = ns) [18:03:19.187] envir <- sys.frame(frame) [18:03:19.187] master <- NULL [18:03:19.187] while (!identical(envir, .GlobalEnv) && [18:03:19.187] !identical(envir, emptyenv())) { [18:03:19.187] if (exists("master", mode = "list", envir = envir, [18:03:19.187] inherits = FALSE)) { [18:03:19.187] master <- get("master", mode = "list", [18:03:19.187] envir = envir, inherits = FALSE) [18:03:19.187] if (inherits(master, c("SOCKnode", [18:03:19.187] "SOCK0node"))) { [18:03:19.187] sendCondition <<- function(cond) { [18:03:19.187] data <- list(type = "VALUE", value = cond, [18:03:19.187] success = TRUE) [18:03:19.187] parallel_sendData(master, data) [18:03:19.187] } [18:03:19.187] return(sendCondition) [18:03:19.187] } [18:03:19.187] } [18:03:19.187] frame <- frame + 1L [18:03:19.187] envir <- sys.frame(frame) [18:03:19.187] } [18:03:19.187] } [18:03:19.187] sendCondition <<- function(cond) NULL [18:03:19.187] } [18:03:19.187] }) [18:03:19.187] withCallingHandlers({ [18:03:19.187] { [18:03:19.187] sample(x, size = 1L) [18:03:19.187] } [18:03:19.187] }, immediateCondition = function(cond) { [18:03:19.187] sendCondition <- ...future.makeSendCondition() [18:03:19.187] sendCondition(cond) [18:03:19.187] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.187] { [18:03:19.187] inherits <- base::inherits [18:03:19.187] invokeRestart <- base::invokeRestart [18:03:19.187] is.null <- base::is.null [18:03:19.187] muffled <- FALSE [18:03:19.187] if (inherits(cond, "message")) { [18:03:19.187] muffled <- grepl(pattern, "muffleMessage") [18:03:19.187] if (muffled) [18:03:19.187] invokeRestart("muffleMessage") [18:03:19.187] } [18:03:19.187] else if (inherits(cond, "warning")) { [18:03:19.187] muffled <- grepl(pattern, "muffleWarning") [18:03:19.187] if (muffled) [18:03:19.187] invokeRestart("muffleWarning") [18:03:19.187] } [18:03:19.187] else if (inherits(cond, "condition")) { [18:03:19.187] if (!is.null(pattern)) { [18:03:19.187] computeRestarts <- base::computeRestarts [18:03:19.187] grepl <- base::grepl [18:03:19.187] restarts <- computeRestarts(cond) [18:03:19.187] for (restart in restarts) { [18:03:19.187] name <- restart$name [18:03:19.187] if (is.null(name)) [18:03:19.187] next [18:03:19.187] if (!grepl(pattern, name)) [18:03:19.187] next [18:03:19.187] invokeRestart(restart) [18:03:19.187] muffled <- TRUE [18:03:19.187] break [18:03:19.187] } [18:03:19.187] } [18:03:19.187] } [18:03:19.187] invisible(muffled) [18:03:19.187] } [18:03:19.187] muffleCondition(cond) [18:03:19.187] }) [18:03:19.187] })) [18:03:19.187] future::FutureResult(value = ...future.value$value, [18:03:19.187] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.187] ...future.rng), globalenv = if (FALSE) [18:03:19.187] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.187] ...future.globalenv.names)) [18:03:19.187] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.187] }, condition = base::local({ [18:03:19.187] c <- base::c [18:03:19.187] inherits <- base::inherits [18:03:19.187] invokeRestart <- base::invokeRestart [18:03:19.187] length <- base::length [18:03:19.187] list <- base::list [18:03:19.187] seq.int <- base::seq.int [18:03:19.187] signalCondition <- base::signalCondition [18:03:19.187] sys.calls <- base::sys.calls [18:03:19.187] `[[` <- base::`[[` [18:03:19.187] `+` <- base::`+` [18:03:19.187] `<<-` <- base::`<<-` [18:03:19.187] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.187] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.187] 3L)] [18:03:19.187] } [18:03:19.187] function(cond) { [18:03:19.187] is_error <- inherits(cond, "error") [18:03:19.187] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.187] NULL) [18:03:19.187] if (is_error) { [18:03:19.187] sessionInformation <- function() { [18:03:19.187] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.187] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.187] search = base::search(), system = base::Sys.info()) [18:03:19.187] } [18:03:19.187] ...future.conditions[[length(...future.conditions) + [18:03:19.187] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.187] cond$call), session = sessionInformation(), [18:03:19.187] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.187] signalCondition(cond) [18:03:19.187] } [18:03:19.187] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.187] "immediateCondition"))) { [18:03:19.187] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.187] ...future.conditions[[length(...future.conditions) + [18:03:19.187] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.187] if (TRUE && !signal) { [18:03:19.187] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.187] { [18:03:19.187] inherits <- base::inherits [18:03:19.187] invokeRestart <- base::invokeRestart [18:03:19.187] is.null <- base::is.null [18:03:19.187] muffled <- FALSE [18:03:19.187] if (inherits(cond, "message")) { [18:03:19.187] muffled <- grepl(pattern, "muffleMessage") [18:03:19.187] if (muffled) [18:03:19.187] invokeRestart("muffleMessage") [18:03:19.187] } [18:03:19.187] else if (inherits(cond, "warning")) { [18:03:19.187] muffled <- grepl(pattern, "muffleWarning") [18:03:19.187] if (muffled) [18:03:19.187] invokeRestart("muffleWarning") [18:03:19.187] } [18:03:19.187] else if (inherits(cond, "condition")) { [18:03:19.187] if (!is.null(pattern)) { [18:03:19.187] computeRestarts <- base::computeRestarts [18:03:19.187] grepl <- base::grepl [18:03:19.187] restarts <- computeRestarts(cond) [18:03:19.187] for (restart in restarts) { [18:03:19.187] name <- restart$name [18:03:19.187] if (is.null(name)) [18:03:19.187] next [18:03:19.187] if (!grepl(pattern, name)) [18:03:19.187] next [18:03:19.187] invokeRestart(restart) [18:03:19.187] muffled <- TRUE [18:03:19.187] break [18:03:19.187] } [18:03:19.187] } [18:03:19.187] } [18:03:19.187] invisible(muffled) [18:03:19.187] } [18:03:19.187] muffleCondition(cond, pattern = "^muffle") [18:03:19.187] } [18:03:19.187] } [18:03:19.187] else { [18:03:19.187] if (TRUE) { [18:03:19.187] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.187] { [18:03:19.187] inherits <- base::inherits [18:03:19.187] invokeRestart <- base::invokeRestart [18:03:19.187] is.null <- base::is.null [18:03:19.187] muffled <- FALSE [18:03:19.187] if (inherits(cond, "message")) { [18:03:19.187] muffled <- grepl(pattern, "muffleMessage") [18:03:19.187] if (muffled) [18:03:19.187] invokeRestart("muffleMessage") [18:03:19.187] } [18:03:19.187] else if (inherits(cond, "warning")) { [18:03:19.187] muffled <- grepl(pattern, "muffleWarning") [18:03:19.187] if (muffled) [18:03:19.187] invokeRestart("muffleWarning") [18:03:19.187] } [18:03:19.187] else if (inherits(cond, "condition")) { [18:03:19.187] if (!is.null(pattern)) { [18:03:19.187] computeRestarts <- base::computeRestarts [18:03:19.187] grepl <- base::grepl [18:03:19.187] restarts <- computeRestarts(cond) [18:03:19.187] for (restart in restarts) { [18:03:19.187] name <- restart$name [18:03:19.187] if (is.null(name)) [18:03:19.187] next [18:03:19.187] if (!grepl(pattern, name)) [18:03:19.187] next [18:03:19.187] invokeRestart(restart) [18:03:19.187] muffled <- TRUE [18:03:19.187] break [18:03:19.187] } [18:03:19.187] } [18:03:19.187] } [18:03:19.187] invisible(muffled) [18:03:19.187] } [18:03:19.187] muffleCondition(cond, pattern = "^muffle") [18:03:19.187] } [18:03:19.187] } [18:03:19.187] } [18:03:19.187] })) [18:03:19.187] }, error = function(ex) { [18:03:19.187] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.187] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.187] ...future.rng), started = ...future.startTime, [18:03:19.187] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.187] version = "1.8"), class = "FutureResult") [18:03:19.187] }, finally = { [18:03:19.187] if (!identical(...future.workdir, getwd())) [18:03:19.187] setwd(...future.workdir) [18:03:19.187] { [18:03:19.187] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.187] ...future.oldOptions$nwarnings <- NULL [18:03:19.187] } [18:03:19.187] base::options(...future.oldOptions) [18:03:19.187] if (.Platform$OS.type == "windows") { [18:03:19.187] old_names <- names(...future.oldEnvVars) [18:03:19.187] envs <- base::Sys.getenv() [18:03:19.187] names <- names(envs) [18:03:19.187] common <- intersect(names, old_names) [18:03:19.187] added <- setdiff(names, old_names) [18:03:19.187] removed <- setdiff(old_names, names) [18:03:19.187] changed <- common[...future.oldEnvVars[common] != [18:03:19.187] envs[common]] [18:03:19.187] NAMES <- toupper(changed) [18:03:19.187] args <- list() [18:03:19.187] for (kk in seq_along(NAMES)) { [18:03:19.187] name <- changed[[kk]] [18:03:19.187] NAME <- NAMES[[kk]] [18:03:19.187] if (name != NAME && is.element(NAME, old_names)) [18:03:19.187] next [18:03:19.187] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.187] } [18:03:19.187] NAMES <- toupper(added) [18:03:19.187] for (kk in seq_along(NAMES)) { [18:03:19.187] name <- added[[kk]] [18:03:19.187] NAME <- NAMES[[kk]] [18:03:19.187] if (name != NAME && is.element(NAME, old_names)) [18:03:19.187] next [18:03:19.187] args[[name]] <- "" [18:03:19.187] } [18:03:19.187] NAMES <- toupper(removed) [18:03:19.187] for (kk in seq_along(NAMES)) { [18:03:19.187] name <- removed[[kk]] [18:03:19.187] NAME <- NAMES[[kk]] [18:03:19.187] if (name != NAME && is.element(NAME, old_names)) [18:03:19.187] next [18:03:19.187] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.187] } [18:03:19.187] if (length(args) > 0) [18:03:19.187] base::do.call(base::Sys.setenv, args = args) [18:03:19.187] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.187] } [18:03:19.187] else { [18:03:19.187] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.187] } [18:03:19.187] { [18:03:19.187] if (base::length(...future.futureOptionsAdded) > [18:03:19.187] 0L) { [18:03:19.187] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.187] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.187] base::options(opts) [18:03:19.187] } [18:03:19.187] { [18:03:19.187] { [18:03:19.187] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.187] NULL [18:03:19.187] } [18:03:19.187] options(future.plan = NULL) [18:03:19.187] if (is.na(NA_character_)) [18:03:19.187] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.187] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.187] future::plan(list(function (..., workers = availableCores(), [18:03:19.187] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.187] envir = parent.frame()) [18:03:19.187] { [18:03:19.187] if (is.function(workers)) [18:03:19.187] workers <- workers() [18:03:19.187] workers <- structure(as.integer(workers), [18:03:19.187] class = class(workers)) [18:03:19.187] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.187] workers >= 1) [18:03:19.187] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.187] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.187] } [18:03:19.187] future <- MultisessionFuture(..., workers = workers, [18:03:19.187] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.187] envir = envir) [18:03:19.187] if (!future$lazy) [18:03:19.187] future <- run(future) [18:03:19.187] invisible(future) [18:03:19.187] }), .cleanup = FALSE, .init = FALSE) [18:03:19.187] } [18:03:19.187] } [18:03:19.187] } [18:03:19.187] }) [18:03:19.187] if (TRUE) { [18:03:19.187] base::sink(type = "output", split = FALSE) [18:03:19.187] if (TRUE) { [18:03:19.187] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.187] } [18:03:19.187] else { [18:03:19.187] ...future.result["stdout"] <- base::list(NULL) [18:03:19.187] } [18:03:19.187] base::close(...future.stdout) [18:03:19.187] ...future.stdout <- NULL [18:03:19.187] } [18:03:19.187] ...future.result$conditions <- ...future.conditions [18:03:19.187] ...future.result$finished <- base::Sys.time() [18:03:19.187] ...future.result [18:03:19.187] } [18:03:19.193] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.193] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.193] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.194] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.194] MultisessionFuture started [18:03:19.194] - Launch lazy future ... done [18:03:19.195] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_2-282781' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f579bed0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.210] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.210] - Validating connection of MultisessionFuture [18:03:19.210] - received message: FutureResult [18:03:19.210] - Received FutureResult [18:03:19.211] - Erased future from FutureRegistry [18:03:19.211] result() for ClusterFuture ... [18:03:19.211] - result already collected: FutureResult [18:03:19.211] result() for ClusterFuture ... done [18:03:19.211] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.212] getGlobalsAndPackages() ... [18:03:19.212] Searching for globals... [18:03:19.213] - globals found: [3] '{', 'sample', 'x' [18:03:19.213] Searching for globals ... DONE [18:03:19.213] Resolving globals: FALSE [18:03:19.214] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.214] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.214] - globals: [1] 'x' [18:03:19.214] [18:03:19.215] getGlobalsAndPackages() ... DONE [18:03:19.215] run() for 'Future' ... [18:03:19.215] - state: 'created' [18:03:19.215] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.229] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.229] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.229] - Field: 'node' [18:03:19.229] - Field: 'label' [18:03:19.230] - Field: 'local' [18:03:19.230] - Field: 'owner' [18:03:19.230] - Field: 'envir' [18:03:19.230] - Field: 'workers' [18:03:19.230] - Field: 'packages' [18:03:19.231] - Field: 'gc' [18:03:19.231] - Field: 'conditions' [18:03:19.231] - Field: 'persistent' [18:03:19.231] - Field: 'expr' [18:03:19.231] - Field: 'uuid' [18:03:19.231] - Field: 'seed' [18:03:19.232] - Field: 'version' [18:03:19.232] - Field: 'result' [18:03:19.232] - Field: 'asynchronous' [18:03:19.232] - Field: 'calls' [18:03:19.232] - Field: 'globals' [18:03:19.232] - Field: 'stdout' [18:03:19.233] - Field: 'earlySignal' [18:03:19.233] - Field: 'lazy' [18:03:19.233] - Field: 'state' [18:03:19.233] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.233] - Launch lazy future ... [18:03:19.234] Packages needed by the future expression (n = 0): [18:03:19.234] Packages needed by future strategies (n = 0): [18:03:19.234] { [18:03:19.234] { [18:03:19.234] { [18:03:19.234] ...future.startTime <- base::Sys.time() [18:03:19.234] { [18:03:19.234] { [18:03:19.234] { [18:03:19.234] { [18:03:19.234] base::local({ [18:03:19.234] has_future <- base::requireNamespace("future", [18:03:19.234] quietly = TRUE) [18:03:19.234] if (has_future) { [18:03:19.234] ns <- base::getNamespace("future") [18:03:19.234] version <- ns[[".package"]][["version"]] [18:03:19.234] if (is.null(version)) [18:03:19.234] version <- utils::packageVersion("future") [18:03:19.234] } [18:03:19.234] else { [18:03:19.234] version <- NULL [18:03:19.234] } [18:03:19.234] if (!has_future || version < "1.8.0") { [18:03:19.234] info <- base::c(r_version = base::gsub("R version ", [18:03:19.234] "", base::R.version$version.string), [18:03:19.234] platform = base::sprintf("%s (%s-bit)", [18:03:19.234] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.234] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.234] "release", "version")], collapse = " "), [18:03:19.234] hostname = base::Sys.info()[["nodename"]]) [18:03:19.234] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.234] info) [18:03:19.234] info <- base::paste(info, collapse = "; ") [18:03:19.234] if (!has_future) { [18:03:19.234] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.234] info) [18:03:19.234] } [18:03:19.234] else { [18:03:19.234] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.234] info, version) [18:03:19.234] } [18:03:19.234] base::stop(msg) [18:03:19.234] } [18:03:19.234] }) [18:03:19.234] } [18:03:19.234] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.234] base::options(mc.cores = 1L) [18:03:19.234] } [18:03:19.234] options(future.plan = NULL) [18:03:19.234] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.234] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.234] } [18:03:19.234] ...future.workdir <- getwd() [18:03:19.234] } [18:03:19.234] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.234] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.234] } [18:03:19.234] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.234] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.234] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.234] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.234] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.234] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.234] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.234] base::names(...future.oldOptions)) [18:03:19.234] } [18:03:19.234] if (FALSE) { [18:03:19.234] } [18:03:19.234] else { [18:03:19.234] if (TRUE) { [18:03:19.234] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.234] open = "w") [18:03:19.234] } [18:03:19.234] else { [18:03:19.234] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.234] windows = "NUL", "/dev/null"), open = "w") [18:03:19.234] } [18:03:19.234] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.234] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.234] base::sink(type = "output", split = FALSE) [18:03:19.234] base::close(...future.stdout) [18:03:19.234] }, add = TRUE) [18:03:19.234] } [18:03:19.234] ...future.frame <- base::sys.nframe() [18:03:19.234] ...future.conditions <- base::list() [18:03:19.234] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.234] if (FALSE) { [18:03:19.234] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.234] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.234] } [18:03:19.234] ...future.result <- base::tryCatch({ [18:03:19.234] base::withCallingHandlers({ [18:03:19.234] ...future.value <- base::withVisible(base::local({ [18:03:19.234] ...future.makeSendCondition <- local({ [18:03:19.234] sendCondition <- NULL [18:03:19.234] function(frame = 1L) { [18:03:19.234] if (is.function(sendCondition)) [18:03:19.234] return(sendCondition) [18:03:19.234] ns <- getNamespace("parallel") [18:03:19.234] if (exists("sendData", mode = "function", [18:03:19.234] envir = ns)) { [18:03:19.234] parallel_sendData <- get("sendData", mode = "function", [18:03:19.234] envir = ns) [18:03:19.234] envir <- sys.frame(frame) [18:03:19.234] master <- NULL [18:03:19.234] while (!identical(envir, .GlobalEnv) && [18:03:19.234] !identical(envir, emptyenv())) { [18:03:19.234] if (exists("master", mode = "list", envir = envir, [18:03:19.234] inherits = FALSE)) { [18:03:19.234] master <- get("master", mode = "list", [18:03:19.234] envir = envir, inherits = FALSE) [18:03:19.234] if (inherits(master, c("SOCKnode", [18:03:19.234] "SOCK0node"))) { [18:03:19.234] sendCondition <<- function(cond) { [18:03:19.234] data <- list(type = "VALUE", value = cond, [18:03:19.234] success = TRUE) [18:03:19.234] parallel_sendData(master, data) [18:03:19.234] } [18:03:19.234] return(sendCondition) [18:03:19.234] } [18:03:19.234] } [18:03:19.234] frame <- frame + 1L [18:03:19.234] envir <- sys.frame(frame) [18:03:19.234] } [18:03:19.234] } [18:03:19.234] sendCondition <<- function(cond) NULL [18:03:19.234] } [18:03:19.234] }) [18:03:19.234] withCallingHandlers({ [18:03:19.234] { [18:03:19.234] sample(x, size = 1L) [18:03:19.234] } [18:03:19.234] }, immediateCondition = function(cond) { [18:03:19.234] sendCondition <- ...future.makeSendCondition() [18:03:19.234] sendCondition(cond) [18:03:19.234] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.234] { [18:03:19.234] inherits <- base::inherits [18:03:19.234] invokeRestart <- base::invokeRestart [18:03:19.234] is.null <- base::is.null [18:03:19.234] muffled <- FALSE [18:03:19.234] if (inherits(cond, "message")) { [18:03:19.234] muffled <- grepl(pattern, "muffleMessage") [18:03:19.234] if (muffled) [18:03:19.234] invokeRestart("muffleMessage") [18:03:19.234] } [18:03:19.234] else if (inherits(cond, "warning")) { [18:03:19.234] muffled <- grepl(pattern, "muffleWarning") [18:03:19.234] if (muffled) [18:03:19.234] invokeRestart("muffleWarning") [18:03:19.234] } [18:03:19.234] else if (inherits(cond, "condition")) { [18:03:19.234] if (!is.null(pattern)) { [18:03:19.234] computeRestarts <- base::computeRestarts [18:03:19.234] grepl <- base::grepl [18:03:19.234] restarts <- computeRestarts(cond) [18:03:19.234] for (restart in restarts) { [18:03:19.234] name <- restart$name [18:03:19.234] if (is.null(name)) [18:03:19.234] next [18:03:19.234] if (!grepl(pattern, name)) [18:03:19.234] next [18:03:19.234] invokeRestart(restart) [18:03:19.234] muffled <- TRUE [18:03:19.234] break [18:03:19.234] } [18:03:19.234] } [18:03:19.234] } [18:03:19.234] invisible(muffled) [18:03:19.234] } [18:03:19.234] muffleCondition(cond) [18:03:19.234] }) [18:03:19.234] })) [18:03:19.234] future::FutureResult(value = ...future.value$value, [18:03:19.234] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.234] ...future.rng), globalenv = if (FALSE) [18:03:19.234] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.234] ...future.globalenv.names)) [18:03:19.234] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.234] }, condition = base::local({ [18:03:19.234] c <- base::c [18:03:19.234] inherits <- base::inherits [18:03:19.234] invokeRestart <- base::invokeRestart [18:03:19.234] length <- base::length [18:03:19.234] list <- base::list [18:03:19.234] seq.int <- base::seq.int [18:03:19.234] signalCondition <- base::signalCondition [18:03:19.234] sys.calls <- base::sys.calls [18:03:19.234] `[[` <- base::`[[` [18:03:19.234] `+` <- base::`+` [18:03:19.234] `<<-` <- base::`<<-` [18:03:19.234] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.234] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.234] 3L)] [18:03:19.234] } [18:03:19.234] function(cond) { [18:03:19.234] is_error <- inherits(cond, "error") [18:03:19.234] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.234] NULL) [18:03:19.234] if (is_error) { [18:03:19.234] sessionInformation <- function() { [18:03:19.234] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.234] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.234] search = base::search(), system = base::Sys.info()) [18:03:19.234] } [18:03:19.234] ...future.conditions[[length(...future.conditions) + [18:03:19.234] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.234] cond$call), session = sessionInformation(), [18:03:19.234] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.234] signalCondition(cond) [18:03:19.234] } [18:03:19.234] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.234] "immediateCondition"))) { [18:03:19.234] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.234] ...future.conditions[[length(...future.conditions) + [18:03:19.234] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.234] if (TRUE && !signal) { [18:03:19.234] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.234] { [18:03:19.234] inherits <- base::inherits [18:03:19.234] invokeRestart <- base::invokeRestart [18:03:19.234] is.null <- base::is.null [18:03:19.234] muffled <- FALSE [18:03:19.234] if (inherits(cond, "message")) { [18:03:19.234] muffled <- grepl(pattern, "muffleMessage") [18:03:19.234] if (muffled) [18:03:19.234] invokeRestart("muffleMessage") [18:03:19.234] } [18:03:19.234] else if (inherits(cond, "warning")) { [18:03:19.234] muffled <- grepl(pattern, "muffleWarning") [18:03:19.234] if (muffled) [18:03:19.234] invokeRestart("muffleWarning") [18:03:19.234] } [18:03:19.234] else if (inherits(cond, "condition")) { [18:03:19.234] if (!is.null(pattern)) { [18:03:19.234] computeRestarts <- base::computeRestarts [18:03:19.234] grepl <- base::grepl [18:03:19.234] restarts <- computeRestarts(cond) [18:03:19.234] for (restart in restarts) { [18:03:19.234] name <- restart$name [18:03:19.234] if (is.null(name)) [18:03:19.234] next [18:03:19.234] if (!grepl(pattern, name)) [18:03:19.234] next [18:03:19.234] invokeRestart(restart) [18:03:19.234] muffled <- TRUE [18:03:19.234] break [18:03:19.234] } [18:03:19.234] } [18:03:19.234] } [18:03:19.234] invisible(muffled) [18:03:19.234] } [18:03:19.234] muffleCondition(cond, pattern = "^muffle") [18:03:19.234] } [18:03:19.234] } [18:03:19.234] else { [18:03:19.234] if (TRUE) { [18:03:19.234] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.234] { [18:03:19.234] inherits <- base::inherits [18:03:19.234] invokeRestart <- base::invokeRestart [18:03:19.234] is.null <- base::is.null [18:03:19.234] muffled <- FALSE [18:03:19.234] if (inherits(cond, "message")) { [18:03:19.234] muffled <- grepl(pattern, "muffleMessage") [18:03:19.234] if (muffled) [18:03:19.234] invokeRestart("muffleMessage") [18:03:19.234] } [18:03:19.234] else if (inherits(cond, "warning")) { [18:03:19.234] muffled <- grepl(pattern, "muffleWarning") [18:03:19.234] if (muffled) [18:03:19.234] invokeRestart("muffleWarning") [18:03:19.234] } [18:03:19.234] else if (inherits(cond, "condition")) { [18:03:19.234] if (!is.null(pattern)) { [18:03:19.234] computeRestarts <- base::computeRestarts [18:03:19.234] grepl <- base::grepl [18:03:19.234] restarts <- computeRestarts(cond) [18:03:19.234] for (restart in restarts) { [18:03:19.234] name <- restart$name [18:03:19.234] if (is.null(name)) [18:03:19.234] next [18:03:19.234] if (!grepl(pattern, name)) [18:03:19.234] next [18:03:19.234] invokeRestart(restart) [18:03:19.234] muffled <- TRUE [18:03:19.234] break [18:03:19.234] } [18:03:19.234] } [18:03:19.234] } [18:03:19.234] invisible(muffled) [18:03:19.234] } [18:03:19.234] muffleCondition(cond, pattern = "^muffle") [18:03:19.234] } [18:03:19.234] } [18:03:19.234] } [18:03:19.234] })) [18:03:19.234] }, error = function(ex) { [18:03:19.234] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.234] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.234] ...future.rng), started = ...future.startTime, [18:03:19.234] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.234] version = "1.8"), class = "FutureResult") [18:03:19.234] }, finally = { [18:03:19.234] if (!identical(...future.workdir, getwd())) [18:03:19.234] setwd(...future.workdir) [18:03:19.234] { [18:03:19.234] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.234] ...future.oldOptions$nwarnings <- NULL [18:03:19.234] } [18:03:19.234] base::options(...future.oldOptions) [18:03:19.234] if (.Platform$OS.type == "windows") { [18:03:19.234] old_names <- names(...future.oldEnvVars) [18:03:19.234] envs <- base::Sys.getenv() [18:03:19.234] names <- names(envs) [18:03:19.234] common <- intersect(names, old_names) [18:03:19.234] added <- setdiff(names, old_names) [18:03:19.234] removed <- setdiff(old_names, names) [18:03:19.234] changed <- common[...future.oldEnvVars[common] != [18:03:19.234] envs[common]] [18:03:19.234] NAMES <- toupper(changed) [18:03:19.234] args <- list() [18:03:19.234] for (kk in seq_along(NAMES)) { [18:03:19.234] name <- changed[[kk]] [18:03:19.234] NAME <- NAMES[[kk]] [18:03:19.234] if (name != NAME && is.element(NAME, old_names)) [18:03:19.234] next [18:03:19.234] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.234] } [18:03:19.234] NAMES <- toupper(added) [18:03:19.234] for (kk in seq_along(NAMES)) { [18:03:19.234] name <- added[[kk]] [18:03:19.234] NAME <- NAMES[[kk]] [18:03:19.234] if (name != NAME && is.element(NAME, old_names)) [18:03:19.234] next [18:03:19.234] args[[name]] <- "" [18:03:19.234] } [18:03:19.234] NAMES <- toupper(removed) [18:03:19.234] for (kk in seq_along(NAMES)) { [18:03:19.234] name <- removed[[kk]] [18:03:19.234] NAME <- NAMES[[kk]] [18:03:19.234] if (name != NAME && is.element(NAME, old_names)) [18:03:19.234] next [18:03:19.234] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.234] } [18:03:19.234] if (length(args) > 0) [18:03:19.234] base::do.call(base::Sys.setenv, args = args) [18:03:19.234] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.234] } [18:03:19.234] else { [18:03:19.234] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.234] } [18:03:19.234] { [18:03:19.234] if (base::length(...future.futureOptionsAdded) > [18:03:19.234] 0L) { [18:03:19.234] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.234] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.234] base::options(opts) [18:03:19.234] } [18:03:19.234] { [18:03:19.234] { [18:03:19.234] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.234] NULL [18:03:19.234] } [18:03:19.234] options(future.plan = NULL) [18:03:19.234] if (is.na(NA_character_)) [18:03:19.234] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.234] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.234] future::plan(list(function (..., workers = availableCores(), [18:03:19.234] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.234] envir = parent.frame()) [18:03:19.234] { [18:03:19.234] if (is.function(workers)) [18:03:19.234] workers <- workers() [18:03:19.234] workers <- structure(as.integer(workers), [18:03:19.234] class = class(workers)) [18:03:19.234] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.234] workers >= 1) [18:03:19.234] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.234] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.234] } [18:03:19.234] future <- MultisessionFuture(..., workers = workers, [18:03:19.234] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.234] envir = envir) [18:03:19.234] if (!future$lazy) [18:03:19.234] future <- run(future) [18:03:19.234] invisible(future) [18:03:19.234] }), .cleanup = FALSE, .init = FALSE) [18:03:19.234] } [18:03:19.234] } [18:03:19.234] } [18:03:19.234] }) [18:03:19.234] if (TRUE) { [18:03:19.234] base::sink(type = "output", split = FALSE) [18:03:19.234] if (TRUE) { [18:03:19.234] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.234] } [18:03:19.234] else { [18:03:19.234] ...future.result["stdout"] <- base::list(NULL) [18:03:19.234] } [18:03:19.234] base::close(...future.stdout) [18:03:19.234] ...future.stdout <- NULL [18:03:19.234] } [18:03:19.234] ...future.result$conditions <- ...future.conditions [18:03:19.234] ...future.result$finished <- base::Sys.time() [18:03:19.234] ...future.result [18:03:19.234] } [18:03:19.240] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.240] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.240] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.241] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.241] MultisessionFuture started [18:03:19.241] - Launch lazy future ... done [18:03:19.242] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_3-969461' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f579bed0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.258] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.258] - Validating connection of MultisessionFuture [18:03:19.258] - received message: FutureResult [18:03:19.258] - Received FutureResult [18:03:19.259] - Erased future from FutureRegistry [18:03:19.259] result() for ClusterFuture ... [18:03:19.259] - result already collected: FutureResult [18:03:19.259] result() for ClusterFuture ... done [18:03:19.259] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.260] getGlobalsAndPackages() ... [18:03:19.260] Searching for globals... [18:03:19.261] - globals found: [3] '{', 'sample', 'x' [18:03:19.261] Searching for globals ... DONE [18:03:19.261] Resolving globals: FALSE [18:03:19.262] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.262] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.262] - globals: [1] 'x' [18:03:19.263] [18:03:19.263] getGlobalsAndPackages() ... DONE [18:03:19.263] run() for 'Future' ... [18:03:19.263] - state: 'created' [18:03:19.263] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.277] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.277] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.277] - Field: 'node' [18:03:19.278] - Field: 'label' [18:03:19.278] - Field: 'local' [18:03:19.278] - Field: 'owner' [18:03:19.278] - Field: 'envir' [18:03:19.278] - Field: 'workers' [18:03:19.278] - Field: 'packages' [18:03:19.279] - Field: 'gc' [18:03:19.279] - Field: 'conditions' [18:03:19.279] - Field: 'persistent' [18:03:19.279] - Field: 'expr' [18:03:19.282] - Field: 'uuid' [18:03:19.282] - Field: 'seed' [18:03:19.282] - Field: 'version' [18:03:19.282] - Field: 'result' [18:03:19.282] - Field: 'asynchronous' [18:03:19.283] - Field: 'calls' [18:03:19.283] - Field: 'globals' [18:03:19.283] - Field: 'stdout' [18:03:19.283] - Field: 'earlySignal' [18:03:19.283] - Field: 'lazy' [18:03:19.283] - Field: 'state' [18:03:19.284] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.284] - Launch lazy future ... [18:03:19.284] Packages needed by the future expression (n = 0): [18:03:19.284] Packages needed by future strategies (n = 0): [18:03:19.285] { [18:03:19.285] { [18:03:19.285] { [18:03:19.285] ...future.startTime <- base::Sys.time() [18:03:19.285] { [18:03:19.285] { [18:03:19.285] { [18:03:19.285] { [18:03:19.285] base::local({ [18:03:19.285] has_future <- base::requireNamespace("future", [18:03:19.285] quietly = TRUE) [18:03:19.285] if (has_future) { [18:03:19.285] ns <- base::getNamespace("future") [18:03:19.285] version <- ns[[".package"]][["version"]] [18:03:19.285] if (is.null(version)) [18:03:19.285] version <- utils::packageVersion("future") [18:03:19.285] } [18:03:19.285] else { [18:03:19.285] version <- NULL [18:03:19.285] } [18:03:19.285] if (!has_future || version < "1.8.0") { [18:03:19.285] info <- base::c(r_version = base::gsub("R version ", [18:03:19.285] "", base::R.version$version.string), [18:03:19.285] platform = base::sprintf("%s (%s-bit)", [18:03:19.285] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.285] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.285] "release", "version")], collapse = " "), [18:03:19.285] hostname = base::Sys.info()[["nodename"]]) [18:03:19.285] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.285] info) [18:03:19.285] info <- base::paste(info, collapse = "; ") [18:03:19.285] if (!has_future) { [18:03:19.285] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.285] info) [18:03:19.285] } [18:03:19.285] else { [18:03:19.285] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.285] info, version) [18:03:19.285] } [18:03:19.285] base::stop(msg) [18:03:19.285] } [18:03:19.285] }) [18:03:19.285] } [18:03:19.285] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.285] base::options(mc.cores = 1L) [18:03:19.285] } [18:03:19.285] options(future.plan = NULL) [18:03:19.285] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.285] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.285] } [18:03:19.285] ...future.workdir <- getwd() [18:03:19.285] } [18:03:19.285] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.285] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.285] } [18:03:19.285] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.285] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.285] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.285] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.285] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.285] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.285] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.285] base::names(...future.oldOptions)) [18:03:19.285] } [18:03:19.285] if (FALSE) { [18:03:19.285] } [18:03:19.285] else { [18:03:19.285] if (TRUE) { [18:03:19.285] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.285] open = "w") [18:03:19.285] } [18:03:19.285] else { [18:03:19.285] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.285] windows = "NUL", "/dev/null"), open = "w") [18:03:19.285] } [18:03:19.285] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.285] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.285] base::sink(type = "output", split = FALSE) [18:03:19.285] base::close(...future.stdout) [18:03:19.285] }, add = TRUE) [18:03:19.285] } [18:03:19.285] ...future.frame <- base::sys.nframe() [18:03:19.285] ...future.conditions <- base::list() [18:03:19.285] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.285] if (FALSE) { [18:03:19.285] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.285] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.285] } [18:03:19.285] ...future.result <- base::tryCatch({ [18:03:19.285] base::withCallingHandlers({ [18:03:19.285] ...future.value <- base::withVisible(base::local({ [18:03:19.285] ...future.makeSendCondition <- local({ [18:03:19.285] sendCondition <- NULL [18:03:19.285] function(frame = 1L) { [18:03:19.285] if (is.function(sendCondition)) [18:03:19.285] return(sendCondition) [18:03:19.285] ns <- getNamespace("parallel") [18:03:19.285] if (exists("sendData", mode = "function", [18:03:19.285] envir = ns)) { [18:03:19.285] parallel_sendData <- get("sendData", mode = "function", [18:03:19.285] envir = ns) [18:03:19.285] envir <- sys.frame(frame) [18:03:19.285] master <- NULL [18:03:19.285] while (!identical(envir, .GlobalEnv) && [18:03:19.285] !identical(envir, emptyenv())) { [18:03:19.285] if (exists("master", mode = "list", envir = envir, [18:03:19.285] inherits = FALSE)) { [18:03:19.285] master <- get("master", mode = "list", [18:03:19.285] envir = envir, inherits = FALSE) [18:03:19.285] if (inherits(master, c("SOCKnode", [18:03:19.285] "SOCK0node"))) { [18:03:19.285] sendCondition <<- function(cond) { [18:03:19.285] data <- list(type = "VALUE", value = cond, [18:03:19.285] success = TRUE) [18:03:19.285] parallel_sendData(master, data) [18:03:19.285] } [18:03:19.285] return(sendCondition) [18:03:19.285] } [18:03:19.285] } [18:03:19.285] frame <- frame + 1L [18:03:19.285] envir <- sys.frame(frame) [18:03:19.285] } [18:03:19.285] } [18:03:19.285] sendCondition <<- function(cond) NULL [18:03:19.285] } [18:03:19.285] }) [18:03:19.285] withCallingHandlers({ [18:03:19.285] { [18:03:19.285] sample(x, size = 1L) [18:03:19.285] } [18:03:19.285] }, immediateCondition = function(cond) { [18:03:19.285] sendCondition <- ...future.makeSendCondition() [18:03:19.285] sendCondition(cond) [18:03:19.285] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.285] { [18:03:19.285] inherits <- base::inherits [18:03:19.285] invokeRestart <- base::invokeRestart [18:03:19.285] is.null <- base::is.null [18:03:19.285] muffled <- FALSE [18:03:19.285] if (inherits(cond, "message")) { [18:03:19.285] muffled <- grepl(pattern, "muffleMessage") [18:03:19.285] if (muffled) [18:03:19.285] invokeRestart("muffleMessage") [18:03:19.285] } [18:03:19.285] else if (inherits(cond, "warning")) { [18:03:19.285] muffled <- grepl(pattern, "muffleWarning") [18:03:19.285] if (muffled) [18:03:19.285] invokeRestart("muffleWarning") [18:03:19.285] } [18:03:19.285] else if (inherits(cond, "condition")) { [18:03:19.285] if (!is.null(pattern)) { [18:03:19.285] computeRestarts <- base::computeRestarts [18:03:19.285] grepl <- base::grepl [18:03:19.285] restarts <- computeRestarts(cond) [18:03:19.285] for (restart in restarts) { [18:03:19.285] name <- restart$name [18:03:19.285] if (is.null(name)) [18:03:19.285] next [18:03:19.285] if (!grepl(pattern, name)) [18:03:19.285] next [18:03:19.285] invokeRestart(restart) [18:03:19.285] muffled <- TRUE [18:03:19.285] break [18:03:19.285] } [18:03:19.285] } [18:03:19.285] } [18:03:19.285] invisible(muffled) [18:03:19.285] } [18:03:19.285] muffleCondition(cond) [18:03:19.285] }) [18:03:19.285] })) [18:03:19.285] future::FutureResult(value = ...future.value$value, [18:03:19.285] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.285] ...future.rng), globalenv = if (FALSE) [18:03:19.285] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.285] ...future.globalenv.names)) [18:03:19.285] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.285] }, condition = base::local({ [18:03:19.285] c <- base::c [18:03:19.285] inherits <- base::inherits [18:03:19.285] invokeRestart <- base::invokeRestart [18:03:19.285] length <- base::length [18:03:19.285] list <- base::list [18:03:19.285] seq.int <- base::seq.int [18:03:19.285] signalCondition <- base::signalCondition [18:03:19.285] sys.calls <- base::sys.calls [18:03:19.285] `[[` <- base::`[[` [18:03:19.285] `+` <- base::`+` [18:03:19.285] `<<-` <- base::`<<-` [18:03:19.285] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.285] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.285] 3L)] [18:03:19.285] } [18:03:19.285] function(cond) { [18:03:19.285] is_error <- inherits(cond, "error") [18:03:19.285] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.285] NULL) [18:03:19.285] if (is_error) { [18:03:19.285] sessionInformation <- function() { [18:03:19.285] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.285] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.285] search = base::search(), system = base::Sys.info()) [18:03:19.285] } [18:03:19.285] ...future.conditions[[length(...future.conditions) + [18:03:19.285] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.285] cond$call), session = sessionInformation(), [18:03:19.285] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.285] signalCondition(cond) [18:03:19.285] } [18:03:19.285] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.285] "immediateCondition"))) { [18:03:19.285] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.285] ...future.conditions[[length(...future.conditions) + [18:03:19.285] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.285] if (TRUE && !signal) { [18:03:19.285] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.285] { [18:03:19.285] inherits <- base::inherits [18:03:19.285] invokeRestart <- base::invokeRestart [18:03:19.285] is.null <- base::is.null [18:03:19.285] muffled <- FALSE [18:03:19.285] if (inherits(cond, "message")) { [18:03:19.285] muffled <- grepl(pattern, "muffleMessage") [18:03:19.285] if (muffled) [18:03:19.285] invokeRestart("muffleMessage") [18:03:19.285] } [18:03:19.285] else if (inherits(cond, "warning")) { [18:03:19.285] muffled <- grepl(pattern, "muffleWarning") [18:03:19.285] if (muffled) [18:03:19.285] invokeRestart("muffleWarning") [18:03:19.285] } [18:03:19.285] else if (inherits(cond, "condition")) { [18:03:19.285] if (!is.null(pattern)) { [18:03:19.285] computeRestarts <- base::computeRestarts [18:03:19.285] grepl <- base::grepl [18:03:19.285] restarts <- computeRestarts(cond) [18:03:19.285] for (restart in restarts) { [18:03:19.285] name <- restart$name [18:03:19.285] if (is.null(name)) [18:03:19.285] next [18:03:19.285] if (!grepl(pattern, name)) [18:03:19.285] next [18:03:19.285] invokeRestart(restart) [18:03:19.285] muffled <- TRUE [18:03:19.285] break [18:03:19.285] } [18:03:19.285] } [18:03:19.285] } [18:03:19.285] invisible(muffled) [18:03:19.285] } [18:03:19.285] muffleCondition(cond, pattern = "^muffle") [18:03:19.285] } [18:03:19.285] } [18:03:19.285] else { [18:03:19.285] if (TRUE) { [18:03:19.285] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.285] { [18:03:19.285] inherits <- base::inherits [18:03:19.285] invokeRestart <- base::invokeRestart [18:03:19.285] is.null <- base::is.null [18:03:19.285] muffled <- FALSE [18:03:19.285] if (inherits(cond, "message")) { [18:03:19.285] muffled <- grepl(pattern, "muffleMessage") [18:03:19.285] if (muffled) [18:03:19.285] invokeRestart("muffleMessage") [18:03:19.285] } [18:03:19.285] else if (inherits(cond, "warning")) { [18:03:19.285] muffled <- grepl(pattern, "muffleWarning") [18:03:19.285] if (muffled) [18:03:19.285] invokeRestart("muffleWarning") [18:03:19.285] } [18:03:19.285] else if (inherits(cond, "condition")) { [18:03:19.285] if (!is.null(pattern)) { [18:03:19.285] computeRestarts <- base::computeRestarts [18:03:19.285] grepl <- base::grepl [18:03:19.285] restarts <- computeRestarts(cond) [18:03:19.285] for (restart in restarts) { [18:03:19.285] name <- restart$name [18:03:19.285] if (is.null(name)) [18:03:19.285] next [18:03:19.285] if (!grepl(pattern, name)) [18:03:19.285] next [18:03:19.285] invokeRestart(restart) [18:03:19.285] muffled <- TRUE [18:03:19.285] break [18:03:19.285] } [18:03:19.285] } [18:03:19.285] } [18:03:19.285] invisible(muffled) [18:03:19.285] } [18:03:19.285] muffleCondition(cond, pattern = "^muffle") [18:03:19.285] } [18:03:19.285] } [18:03:19.285] } [18:03:19.285] })) [18:03:19.285] }, error = function(ex) { [18:03:19.285] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.285] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.285] ...future.rng), started = ...future.startTime, [18:03:19.285] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.285] version = "1.8"), class = "FutureResult") [18:03:19.285] }, finally = { [18:03:19.285] if (!identical(...future.workdir, getwd())) [18:03:19.285] setwd(...future.workdir) [18:03:19.285] { [18:03:19.285] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.285] ...future.oldOptions$nwarnings <- NULL [18:03:19.285] } [18:03:19.285] base::options(...future.oldOptions) [18:03:19.285] if (.Platform$OS.type == "windows") { [18:03:19.285] old_names <- names(...future.oldEnvVars) [18:03:19.285] envs <- base::Sys.getenv() [18:03:19.285] names <- names(envs) [18:03:19.285] common <- intersect(names, old_names) [18:03:19.285] added <- setdiff(names, old_names) [18:03:19.285] removed <- setdiff(old_names, names) [18:03:19.285] changed <- common[...future.oldEnvVars[common] != [18:03:19.285] envs[common]] [18:03:19.285] NAMES <- toupper(changed) [18:03:19.285] args <- list() [18:03:19.285] for (kk in seq_along(NAMES)) { [18:03:19.285] name <- changed[[kk]] [18:03:19.285] NAME <- NAMES[[kk]] [18:03:19.285] if (name != NAME && is.element(NAME, old_names)) [18:03:19.285] next [18:03:19.285] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.285] } [18:03:19.285] NAMES <- toupper(added) [18:03:19.285] for (kk in seq_along(NAMES)) { [18:03:19.285] name <- added[[kk]] [18:03:19.285] NAME <- NAMES[[kk]] [18:03:19.285] if (name != NAME && is.element(NAME, old_names)) [18:03:19.285] next [18:03:19.285] args[[name]] <- "" [18:03:19.285] } [18:03:19.285] NAMES <- toupper(removed) [18:03:19.285] for (kk in seq_along(NAMES)) { [18:03:19.285] name <- removed[[kk]] [18:03:19.285] NAME <- NAMES[[kk]] [18:03:19.285] if (name != NAME && is.element(NAME, old_names)) [18:03:19.285] next [18:03:19.285] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.285] } [18:03:19.285] if (length(args) > 0) [18:03:19.285] base::do.call(base::Sys.setenv, args = args) [18:03:19.285] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.285] } [18:03:19.285] else { [18:03:19.285] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.285] } [18:03:19.285] { [18:03:19.285] if (base::length(...future.futureOptionsAdded) > [18:03:19.285] 0L) { [18:03:19.285] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.285] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.285] base::options(opts) [18:03:19.285] } [18:03:19.285] { [18:03:19.285] { [18:03:19.285] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.285] NULL [18:03:19.285] } [18:03:19.285] options(future.plan = NULL) [18:03:19.285] if (is.na(NA_character_)) [18:03:19.285] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.285] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.285] future::plan(list(function (..., workers = availableCores(), [18:03:19.285] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.285] envir = parent.frame()) [18:03:19.285] { [18:03:19.285] if (is.function(workers)) [18:03:19.285] workers <- workers() [18:03:19.285] workers <- structure(as.integer(workers), [18:03:19.285] class = class(workers)) [18:03:19.285] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.285] workers >= 1) [18:03:19.285] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.285] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.285] } [18:03:19.285] future <- MultisessionFuture(..., workers = workers, [18:03:19.285] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.285] envir = envir) [18:03:19.285] if (!future$lazy) [18:03:19.285] future <- run(future) [18:03:19.285] invisible(future) [18:03:19.285] }), .cleanup = FALSE, .init = FALSE) [18:03:19.285] } [18:03:19.285] } [18:03:19.285] } [18:03:19.285] }) [18:03:19.285] if (TRUE) { [18:03:19.285] base::sink(type = "output", split = FALSE) [18:03:19.285] if (TRUE) { [18:03:19.285] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.285] } [18:03:19.285] else { [18:03:19.285] ...future.result["stdout"] <- base::list(NULL) [18:03:19.285] } [18:03:19.285] base::close(...future.stdout) [18:03:19.285] ...future.stdout <- NULL [18:03:19.285] } [18:03:19.285] ...future.result$conditions <- ...future.conditions [18:03:19.285] ...future.result$finished <- base::Sys.time() [18:03:19.285] ...future.result [18:03:19.285] } [18:03:19.290] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.290] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.291] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.291] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.292] MultisessionFuture started [18:03:19.292] - Launch lazy future ... done [18:03:19.292] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_4-155996' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f579bed0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.308] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.308] - Validating connection of MultisessionFuture [18:03:19.309] - received message: FutureResult [18:03:19.309] - Received FutureResult [18:03:19.309] - Erased future from FutureRegistry [18:03:19.309] result() for ClusterFuture ... [18:03:19.309] - result already collected: FutureResult [18:03:19.310] result() for ClusterFuture ... done [18:03:19.310] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.310] resolve() on list ... [18:03:19.310] recursive: 0 [18:03:19.310] length: 4 [18:03:19.310] [18:03:19.311] Future #1 [18:03:19.311] result() for ClusterFuture ... [18:03:19.311] - result already collected: FutureResult [18:03:19.311] result() for ClusterFuture ... done [18:03:19.311] result() for ClusterFuture ... [18:03:19.311] - result already collected: FutureResult [18:03:19.312] result() for ClusterFuture ... done [18:03:19.312] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:19.312] - nx: 4 [18:03:19.312] - relay: TRUE [18:03:19.312] - stdout: TRUE [18:03:19.313] - signal: TRUE [18:03:19.313] - resignal: FALSE [18:03:19.313] - force: TRUE [18:03:19.313] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.313] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.313] - until=1 [18:03:19.313] - relaying element #1 [18:03:19.314] result() for ClusterFuture ... [18:03:19.314] - result already collected: FutureResult [18:03:19.314] result() for ClusterFuture ... done [18:03:19.314] result() for ClusterFuture ... [18:03:19.314] - result already collected: FutureResult [18:03:19.314] result() for ClusterFuture ... done [18:03:19.315] signalConditions() ... [18:03:19.315] - include = 'immediateCondition' [18:03:19.315] - exclude = [18:03:19.315] - resignal = FALSE [18:03:19.315] - Number of conditions: 1 [18:03:19.315] signalConditions() ... done [18:03:19.316] result() for ClusterFuture ... [18:03:19.316] - result already collected: FutureResult [18:03:19.316] result() for ClusterFuture ... done [18:03:19.316] signalConditions() ... [18:03:19.316] - include = 'immediateCondition' [18:03:19.316] - exclude = [18:03:19.317] - resignal = FALSE [18:03:19.317] - Number of conditions: 1 [18:03:19.317] signalConditions() ... done [18:03:19.317] result() for ClusterFuture ... [18:03:19.317] - result already collected: FutureResult [18:03:19.317] result() for ClusterFuture ... done [18:03:19.317] signalConditions() ... [18:03:19.318] - include = 'condition' [18:03:19.318] - exclude = 'immediateCondition' [18:03:19.318] - resignal = TRUE [18:03:19.318] - Number of conditions: 1 [18:03:19.318] - Condition #1: 'RngFutureWarning', 'FutureWarning', 'warning', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:19.319] signalConditions() ... done [18:03:19.319] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.319] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.319] signalConditionsASAP(MultisessionFuture, pos=1) ... done Future UUID: c98efbac-c773-78d4-7772-32bb8ae978b6 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: MultisessionFuture: Label: 'fsample_1-337766' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f579bed0 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureWarning' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:19.320] getGlobalsAndPackages() ... [18:03:19.320] Searching for globals... [18:03:19.322] - globals found: [3] '{', 'sample', 'x' [18:03:19.322] Searching for globals ... DONE [18:03:19.322] Resolving globals: FALSE [18:03:19.322] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.323] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.323] - globals: [1] 'x' [18:03:19.323] [18:03:19.323] getGlobalsAndPackages() ... DONE [18:03:19.324] run() for 'Future' ... [18:03:19.324] - state: 'created' [18:03:19.324] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.338] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.338] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.338] - Field: 'node' [18:03:19.339] - Field: 'label' [18:03:19.339] - Field: 'local' [18:03:19.339] - Field: 'owner' [18:03:19.339] - Field: 'envir' [18:03:19.339] - Field: 'workers' [18:03:19.339] - Field: 'packages' [18:03:19.340] - Field: 'gc' [18:03:19.340] - Field: 'conditions' [18:03:19.340] - Field: 'persistent' [18:03:19.340] - Field: 'expr' [18:03:19.340] - Field: 'uuid' [18:03:19.341] - Field: 'seed' [18:03:19.341] - Field: 'version' [18:03:19.341] - Field: 'result' [18:03:19.341] - Field: 'asynchronous' [18:03:19.341] - Field: 'calls' [18:03:19.341] - Field: 'globals' [18:03:19.342] - Field: 'stdout' [18:03:19.342] - Field: 'earlySignal' [18:03:19.342] - Field: 'lazy' [18:03:19.342] - Field: 'state' [18:03:19.342] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.343] - Launch lazy future ... [18:03:19.343] Packages needed by the future expression (n = 0): [18:03:19.343] Packages needed by future strategies (n = 0): [18:03:19.344] { [18:03:19.344] { [18:03:19.344] { [18:03:19.344] ...future.startTime <- base::Sys.time() [18:03:19.344] { [18:03:19.344] { [18:03:19.344] { [18:03:19.344] { [18:03:19.344] base::local({ [18:03:19.344] has_future <- base::requireNamespace("future", [18:03:19.344] quietly = TRUE) [18:03:19.344] if (has_future) { [18:03:19.344] ns <- base::getNamespace("future") [18:03:19.344] version <- ns[[".package"]][["version"]] [18:03:19.344] if (is.null(version)) [18:03:19.344] version <- utils::packageVersion("future") [18:03:19.344] } [18:03:19.344] else { [18:03:19.344] version <- NULL [18:03:19.344] } [18:03:19.344] if (!has_future || version < "1.8.0") { [18:03:19.344] info <- base::c(r_version = base::gsub("R version ", [18:03:19.344] "", base::R.version$version.string), [18:03:19.344] platform = base::sprintf("%s (%s-bit)", [18:03:19.344] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.344] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.344] "release", "version")], collapse = " "), [18:03:19.344] hostname = base::Sys.info()[["nodename"]]) [18:03:19.344] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.344] info) [18:03:19.344] info <- base::paste(info, collapse = "; ") [18:03:19.344] if (!has_future) { [18:03:19.344] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.344] info) [18:03:19.344] } [18:03:19.344] else { [18:03:19.344] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.344] info, version) [18:03:19.344] } [18:03:19.344] base::stop(msg) [18:03:19.344] } [18:03:19.344] }) [18:03:19.344] } [18:03:19.344] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.344] base::options(mc.cores = 1L) [18:03:19.344] } [18:03:19.344] options(future.plan = NULL) [18:03:19.344] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.344] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.344] } [18:03:19.344] ...future.workdir <- getwd() [18:03:19.344] } [18:03:19.344] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.344] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.344] } [18:03:19.344] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.344] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.344] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.344] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.344] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.344] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.344] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.344] base::names(...future.oldOptions)) [18:03:19.344] } [18:03:19.344] if (FALSE) { [18:03:19.344] } [18:03:19.344] else { [18:03:19.344] if (TRUE) { [18:03:19.344] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.344] open = "w") [18:03:19.344] } [18:03:19.344] else { [18:03:19.344] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.344] windows = "NUL", "/dev/null"), open = "w") [18:03:19.344] } [18:03:19.344] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.344] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.344] base::sink(type = "output", split = FALSE) [18:03:19.344] base::close(...future.stdout) [18:03:19.344] }, add = TRUE) [18:03:19.344] } [18:03:19.344] ...future.frame <- base::sys.nframe() [18:03:19.344] ...future.conditions <- base::list() [18:03:19.344] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.344] if (FALSE) { [18:03:19.344] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.344] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.344] } [18:03:19.344] ...future.result <- base::tryCatch({ [18:03:19.344] base::withCallingHandlers({ [18:03:19.344] ...future.value <- base::withVisible(base::local({ [18:03:19.344] ...future.makeSendCondition <- local({ [18:03:19.344] sendCondition <- NULL [18:03:19.344] function(frame = 1L) { [18:03:19.344] if (is.function(sendCondition)) [18:03:19.344] return(sendCondition) [18:03:19.344] ns <- getNamespace("parallel") [18:03:19.344] if (exists("sendData", mode = "function", [18:03:19.344] envir = ns)) { [18:03:19.344] parallel_sendData <- get("sendData", mode = "function", [18:03:19.344] envir = ns) [18:03:19.344] envir <- sys.frame(frame) [18:03:19.344] master <- NULL [18:03:19.344] while (!identical(envir, .GlobalEnv) && [18:03:19.344] !identical(envir, emptyenv())) { [18:03:19.344] if (exists("master", mode = "list", envir = envir, [18:03:19.344] inherits = FALSE)) { [18:03:19.344] master <- get("master", mode = "list", [18:03:19.344] envir = envir, inherits = FALSE) [18:03:19.344] if (inherits(master, c("SOCKnode", [18:03:19.344] "SOCK0node"))) { [18:03:19.344] sendCondition <<- function(cond) { [18:03:19.344] data <- list(type = "VALUE", value = cond, [18:03:19.344] success = TRUE) [18:03:19.344] parallel_sendData(master, data) [18:03:19.344] } [18:03:19.344] return(sendCondition) [18:03:19.344] } [18:03:19.344] } [18:03:19.344] frame <- frame + 1L [18:03:19.344] envir <- sys.frame(frame) [18:03:19.344] } [18:03:19.344] } [18:03:19.344] sendCondition <<- function(cond) NULL [18:03:19.344] } [18:03:19.344] }) [18:03:19.344] withCallingHandlers({ [18:03:19.344] { [18:03:19.344] sample(x, size = 1L) [18:03:19.344] } [18:03:19.344] }, immediateCondition = function(cond) { [18:03:19.344] sendCondition <- ...future.makeSendCondition() [18:03:19.344] sendCondition(cond) [18:03:19.344] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.344] { [18:03:19.344] inherits <- base::inherits [18:03:19.344] invokeRestart <- base::invokeRestart [18:03:19.344] is.null <- base::is.null [18:03:19.344] muffled <- FALSE [18:03:19.344] if (inherits(cond, "message")) { [18:03:19.344] muffled <- grepl(pattern, "muffleMessage") [18:03:19.344] if (muffled) [18:03:19.344] invokeRestart("muffleMessage") [18:03:19.344] } [18:03:19.344] else if (inherits(cond, "warning")) { [18:03:19.344] muffled <- grepl(pattern, "muffleWarning") [18:03:19.344] if (muffled) [18:03:19.344] invokeRestart("muffleWarning") [18:03:19.344] } [18:03:19.344] else if (inherits(cond, "condition")) { [18:03:19.344] if (!is.null(pattern)) { [18:03:19.344] computeRestarts <- base::computeRestarts [18:03:19.344] grepl <- base::grepl [18:03:19.344] restarts <- computeRestarts(cond) [18:03:19.344] for (restart in restarts) { [18:03:19.344] name <- restart$name [18:03:19.344] if (is.null(name)) [18:03:19.344] next [18:03:19.344] if (!grepl(pattern, name)) [18:03:19.344] next [18:03:19.344] invokeRestart(restart) [18:03:19.344] muffled <- TRUE [18:03:19.344] break [18:03:19.344] } [18:03:19.344] } [18:03:19.344] } [18:03:19.344] invisible(muffled) [18:03:19.344] } [18:03:19.344] muffleCondition(cond) [18:03:19.344] }) [18:03:19.344] })) [18:03:19.344] future::FutureResult(value = ...future.value$value, [18:03:19.344] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.344] ...future.rng), globalenv = if (FALSE) [18:03:19.344] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.344] ...future.globalenv.names)) [18:03:19.344] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.344] }, condition = base::local({ [18:03:19.344] c <- base::c [18:03:19.344] inherits <- base::inherits [18:03:19.344] invokeRestart <- base::invokeRestart [18:03:19.344] length <- base::length [18:03:19.344] list <- base::list [18:03:19.344] seq.int <- base::seq.int [18:03:19.344] signalCondition <- base::signalCondition [18:03:19.344] sys.calls <- base::sys.calls [18:03:19.344] `[[` <- base::`[[` [18:03:19.344] `+` <- base::`+` [18:03:19.344] `<<-` <- base::`<<-` [18:03:19.344] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.344] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.344] 3L)] [18:03:19.344] } [18:03:19.344] function(cond) { [18:03:19.344] is_error <- inherits(cond, "error") [18:03:19.344] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.344] NULL) [18:03:19.344] if (is_error) { [18:03:19.344] sessionInformation <- function() { [18:03:19.344] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.344] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.344] search = base::search(), system = base::Sys.info()) [18:03:19.344] } [18:03:19.344] ...future.conditions[[length(...future.conditions) + [18:03:19.344] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.344] cond$call), session = sessionInformation(), [18:03:19.344] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.344] signalCondition(cond) [18:03:19.344] } [18:03:19.344] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.344] "immediateCondition"))) { [18:03:19.344] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.344] ...future.conditions[[length(...future.conditions) + [18:03:19.344] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.344] if (TRUE && !signal) { [18:03:19.344] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.344] { [18:03:19.344] inherits <- base::inherits [18:03:19.344] invokeRestart <- base::invokeRestart [18:03:19.344] is.null <- base::is.null [18:03:19.344] muffled <- FALSE [18:03:19.344] if (inherits(cond, "message")) { [18:03:19.344] muffled <- grepl(pattern, "muffleMessage") [18:03:19.344] if (muffled) [18:03:19.344] invokeRestart("muffleMessage") [18:03:19.344] } [18:03:19.344] else if (inherits(cond, "warning")) { [18:03:19.344] muffled <- grepl(pattern, "muffleWarning") [18:03:19.344] if (muffled) [18:03:19.344] invokeRestart("muffleWarning") [18:03:19.344] } [18:03:19.344] else if (inherits(cond, "condition")) { [18:03:19.344] if (!is.null(pattern)) { [18:03:19.344] computeRestarts <- base::computeRestarts [18:03:19.344] grepl <- base::grepl [18:03:19.344] restarts <- computeRestarts(cond) [18:03:19.344] for (restart in restarts) { [18:03:19.344] name <- restart$name [18:03:19.344] if (is.null(name)) [18:03:19.344] next [18:03:19.344] if (!grepl(pattern, name)) [18:03:19.344] next [18:03:19.344] invokeRestart(restart) [18:03:19.344] muffled <- TRUE [18:03:19.344] break [18:03:19.344] } [18:03:19.344] } [18:03:19.344] } [18:03:19.344] invisible(muffled) [18:03:19.344] } [18:03:19.344] muffleCondition(cond, pattern = "^muffle") [18:03:19.344] } [18:03:19.344] } [18:03:19.344] else { [18:03:19.344] if (TRUE) { [18:03:19.344] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.344] { [18:03:19.344] inherits <- base::inherits [18:03:19.344] invokeRestart <- base::invokeRestart [18:03:19.344] is.null <- base::is.null [18:03:19.344] muffled <- FALSE [18:03:19.344] if (inherits(cond, "message")) { [18:03:19.344] muffled <- grepl(pattern, "muffleMessage") [18:03:19.344] if (muffled) [18:03:19.344] invokeRestart("muffleMessage") [18:03:19.344] } [18:03:19.344] else if (inherits(cond, "warning")) { [18:03:19.344] muffled <- grepl(pattern, "muffleWarning") [18:03:19.344] if (muffled) [18:03:19.344] invokeRestart("muffleWarning") [18:03:19.344] } [18:03:19.344] else if (inherits(cond, "condition")) { [18:03:19.344] if (!is.null(pattern)) { [18:03:19.344] computeRestarts <- base::computeRestarts [18:03:19.344] grepl <- base::grepl [18:03:19.344] restarts <- computeRestarts(cond) [18:03:19.344] for (restart in restarts) { [18:03:19.344] name <- restart$name [18:03:19.344] if (is.null(name)) [18:03:19.344] next [18:03:19.344] if (!grepl(pattern, name)) [18:03:19.344] next [18:03:19.344] invokeRestart(restart) [18:03:19.344] muffled <- TRUE [18:03:19.344] break [18:03:19.344] } [18:03:19.344] } [18:03:19.344] } [18:03:19.344] invisible(muffled) [18:03:19.344] } [18:03:19.344] muffleCondition(cond, pattern = "^muffle") [18:03:19.344] } [18:03:19.344] } [18:03:19.344] } [18:03:19.344] })) [18:03:19.344] }, error = function(ex) { [18:03:19.344] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.344] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.344] ...future.rng), started = ...future.startTime, [18:03:19.344] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.344] version = "1.8"), class = "FutureResult") [18:03:19.344] }, finally = { [18:03:19.344] if (!identical(...future.workdir, getwd())) [18:03:19.344] setwd(...future.workdir) [18:03:19.344] { [18:03:19.344] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.344] ...future.oldOptions$nwarnings <- NULL [18:03:19.344] } [18:03:19.344] base::options(...future.oldOptions) [18:03:19.344] if (.Platform$OS.type == "windows") { [18:03:19.344] old_names <- names(...future.oldEnvVars) [18:03:19.344] envs <- base::Sys.getenv() [18:03:19.344] names <- names(envs) [18:03:19.344] common <- intersect(names, old_names) [18:03:19.344] added <- setdiff(names, old_names) [18:03:19.344] removed <- setdiff(old_names, names) [18:03:19.344] changed <- common[...future.oldEnvVars[common] != [18:03:19.344] envs[common]] [18:03:19.344] NAMES <- toupper(changed) [18:03:19.344] args <- list() [18:03:19.344] for (kk in seq_along(NAMES)) { [18:03:19.344] name <- changed[[kk]] [18:03:19.344] NAME <- NAMES[[kk]] [18:03:19.344] if (name != NAME && is.element(NAME, old_names)) [18:03:19.344] next [18:03:19.344] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.344] } [18:03:19.344] NAMES <- toupper(added) [18:03:19.344] for (kk in seq_along(NAMES)) { [18:03:19.344] name <- added[[kk]] [18:03:19.344] NAME <- NAMES[[kk]] [18:03:19.344] if (name != NAME && is.element(NAME, old_names)) [18:03:19.344] next [18:03:19.344] args[[name]] <- "" [18:03:19.344] } [18:03:19.344] NAMES <- toupper(removed) [18:03:19.344] for (kk in seq_along(NAMES)) { [18:03:19.344] name <- removed[[kk]] [18:03:19.344] NAME <- NAMES[[kk]] [18:03:19.344] if (name != NAME && is.element(NAME, old_names)) [18:03:19.344] next [18:03:19.344] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.344] } [18:03:19.344] if (length(args) > 0) [18:03:19.344] base::do.call(base::Sys.setenv, args = args) [18:03:19.344] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.344] } [18:03:19.344] else { [18:03:19.344] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.344] } [18:03:19.344] { [18:03:19.344] if (base::length(...future.futureOptionsAdded) > [18:03:19.344] 0L) { [18:03:19.344] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.344] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.344] base::options(opts) [18:03:19.344] } [18:03:19.344] { [18:03:19.344] { [18:03:19.344] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.344] NULL [18:03:19.344] } [18:03:19.344] options(future.plan = NULL) [18:03:19.344] if (is.na(NA_character_)) [18:03:19.344] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.344] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.344] future::plan(list(function (..., workers = availableCores(), [18:03:19.344] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.344] envir = parent.frame()) [18:03:19.344] { [18:03:19.344] if (is.function(workers)) [18:03:19.344] workers <- workers() [18:03:19.344] workers <- structure(as.integer(workers), [18:03:19.344] class = class(workers)) [18:03:19.344] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.344] workers >= 1) [18:03:19.344] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.344] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.344] } [18:03:19.344] future <- MultisessionFuture(..., workers = workers, [18:03:19.344] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.344] envir = envir) [18:03:19.344] if (!future$lazy) [18:03:19.344] future <- run(future) [18:03:19.344] invisible(future) [18:03:19.344] }), .cleanup = FALSE, .init = FALSE) [18:03:19.344] } [18:03:19.344] } [18:03:19.344] } [18:03:19.344] }) [18:03:19.344] if (TRUE) { [18:03:19.344] base::sink(type = "output", split = FALSE) [18:03:19.344] if (TRUE) { [18:03:19.344] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.344] } [18:03:19.344] else { [18:03:19.344] ...future.result["stdout"] <- base::list(NULL) [18:03:19.344] } [18:03:19.344] base::close(...future.stdout) [18:03:19.344] ...future.stdout <- NULL [18:03:19.344] } [18:03:19.344] ...future.result$conditions <- ...future.conditions [18:03:19.344] ...future.result$finished <- base::Sys.time() [18:03:19.344] ...future.result [18:03:19.344] } [18:03:19.349] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.349] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.349] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.350] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.350] MultisessionFuture started [18:03:19.351] - Launch lazy future ... done [18:03:19.351] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_1-529358' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f4487808 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.366] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.366] - Validating connection of MultisessionFuture [18:03:19.367] - received message: FutureResult [18:03:19.367] - Received FutureResult [18:03:19.367] - Erased future from FutureRegistry [18:03:19.367] result() for ClusterFuture ... [18:03:19.367] - result already collected: FutureResult [18:03:19.367] result() for ClusterFuture ... done [18:03:19.368] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.368] getGlobalsAndPackages() ... [18:03:19.368] Searching for globals... [18:03:19.369] - globals found: [3] '{', 'sample', 'x' [18:03:19.369] Searching for globals ... DONE [18:03:19.370] Resolving globals: FALSE [18:03:19.370] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.370] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.371] - globals: [1] 'x' [18:03:19.371] [18:03:19.371] getGlobalsAndPackages() ... DONE [18:03:19.371] run() for 'Future' ... [18:03:19.372] - state: 'created' [18:03:19.372] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.386] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.386] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.386] - Field: 'node' [18:03:19.386] - Field: 'label' [18:03:19.386] - Field: 'local' [18:03:19.387] - Field: 'owner' [18:03:19.387] - Field: 'envir' [18:03:19.387] - Field: 'workers' [18:03:19.387] - Field: 'packages' [18:03:19.387] - Field: 'gc' [18:03:19.387] - Field: 'conditions' [18:03:19.388] - Field: 'persistent' [18:03:19.388] - Field: 'expr' [18:03:19.388] - Field: 'uuid' [18:03:19.388] - Field: 'seed' [18:03:19.388] - Field: 'version' [18:03:19.388] - Field: 'result' [18:03:19.389] - Field: 'asynchronous' [18:03:19.389] - Field: 'calls' [18:03:19.389] - Field: 'globals' [18:03:19.389] - Field: 'stdout' [18:03:19.389] - Field: 'earlySignal' [18:03:19.390] - Field: 'lazy' [18:03:19.390] - Field: 'state' [18:03:19.390] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.390] - Launch lazy future ... [18:03:19.390] Packages needed by the future expression (n = 0): [18:03:19.391] Packages needed by future strategies (n = 0): [18:03:19.391] { [18:03:19.391] { [18:03:19.391] { [18:03:19.391] ...future.startTime <- base::Sys.time() [18:03:19.391] { [18:03:19.391] { [18:03:19.391] { [18:03:19.391] { [18:03:19.391] base::local({ [18:03:19.391] has_future <- base::requireNamespace("future", [18:03:19.391] quietly = TRUE) [18:03:19.391] if (has_future) { [18:03:19.391] ns <- base::getNamespace("future") [18:03:19.391] version <- ns[[".package"]][["version"]] [18:03:19.391] if (is.null(version)) [18:03:19.391] version <- utils::packageVersion("future") [18:03:19.391] } [18:03:19.391] else { [18:03:19.391] version <- NULL [18:03:19.391] } [18:03:19.391] if (!has_future || version < "1.8.0") { [18:03:19.391] info <- base::c(r_version = base::gsub("R version ", [18:03:19.391] "", base::R.version$version.string), [18:03:19.391] platform = base::sprintf("%s (%s-bit)", [18:03:19.391] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.391] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.391] "release", "version")], collapse = " "), [18:03:19.391] hostname = base::Sys.info()[["nodename"]]) [18:03:19.391] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.391] info) [18:03:19.391] info <- base::paste(info, collapse = "; ") [18:03:19.391] if (!has_future) { [18:03:19.391] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.391] info) [18:03:19.391] } [18:03:19.391] else { [18:03:19.391] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.391] info, version) [18:03:19.391] } [18:03:19.391] base::stop(msg) [18:03:19.391] } [18:03:19.391] }) [18:03:19.391] } [18:03:19.391] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.391] base::options(mc.cores = 1L) [18:03:19.391] } [18:03:19.391] options(future.plan = NULL) [18:03:19.391] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.391] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.391] } [18:03:19.391] ...future.workdir <- getwd() [18:03:19.391] } [18:03:19.391] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.391] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.391] } [18:03:19.391] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.391] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.391] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.391] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.391] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.391] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.391] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.391] base::names(...future.oldOptions)) [18:03:19.391] } [18:03:19.391] if (FALSE) { [18:03:19.391] } [18:03:19.391] else { [18:03:19.391] if (TRUE) { [18:03:19.391] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.391] open = "w") [18:03:19.391] } [18:03:19.391] else { [18:03:19.391] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.391] windows = "NUL", "/dev/null"), open = "w") [18:03:19.391] } [18:03:19.391] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.391] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.391] base::sink(type = "output", split = FALSE) [18:03:19.391] base::close(...future.stdout) [18:03:19.391] }, add = TRUE) [18:03:19.391] } [18:03:19.391] ...future.frame <- base::sys.nframe() [18:03:19.391] ...future.conditions <- base::list() [18:03:19.391] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.391] if (FALSE) { [18:03:19.391] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.391] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.391] } [18:03:19.391] ...future.result <- base::tryCatch({ [18:03:19.391] base::withCallingHandlers({ [18:03:19.391] ...future.value <- base::withVisible(base::local({ [18:03:19.391] ...future.makeSendCondition <- local({ [18:03:19.391] sendCondition <- NULL [18:03:19.391] function(frame = 1L) { [18:03:19.391] if (is.function(sendCondition)) [18:03:19.391] return(sendCondition) [18:03:19.391] ns <- getNamespace("parallel") [18:03:19.391] if (exists("sendData", mode = "function", [18:03:19.391] envir = ns)) { [18:03:19.391] parallel_sendData <- get("sendData", mode = "function", [18:03:19.391] envir = ns) [18:03:19.391] envir <- sys.frame(frame) [18:03:19.391] master <- NULL [18:03:19.391] while (!identical(envir, .GlobalEnv) && [18:03:19.391] !identical(envir, emptyenv())) { [18:03:19.391] if (exists("master", mode = "list", envir = envir, [18:03:19.391] inherits = FALSE)) { [18:03:19.391] master <- get("master", mode = "list", [18:03:19.391] envir = envir, inherits = FALSE) [18:03:19.391] if (inherits(master, c("SOCKnode", [18:03:19.391] "SOCK0node"))) { [18:03:19.391] sendCondition <<- function(cond) { [18:03:19.391] data <- list(type = "VALUE", value = cond, [18:03:19.391] success = TRUE) [18:03:19.391] parallel_sendData(master, data) [18:03:19.391] } [18:03:19.391] return(sendCondition) [18:03:19.391] } [18:03:19.391] } [18:03:19.391] frame <- frame + 1L [18:03:19.391] envir <- sys.frame(frame) [18:03:19.391] } [18:03:19.391] } [18:03:19.391] sendCondition <<- function(cond) NULL [18:03:19.391] } [18:03:19.391] }) [18:03:19.391] withCallingHandlers({ [18:03:19.391] { [18:03:19.391] sample(x, size = 1L) [18:03:19.391] } [18:03:19.391] }, immediateCondition = function(cond) { [18:03:19.391] sendCondition <- ...future.makeSendCondition() [18:03:19.391] sendCondition(cond) [18:03:19.391] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.391] { [18:03:19.391] inherits <- base::inherits [18:03:19.391] invokeRestart <- base::invokeRestart [18:03:19.391] is.null <- base::is.null [18:03:19.391] muffled <- FALSE [18:03:19.391] if (inherits(cond, "message")) { [18:03:19.391] muffled <- grepl(pattern, "muffleMessage") [18:03:19.391] if (muffled) [18:03:19.391] invokeRestart("muffleMessage") [18:03:19.391] } [18:03:19.391] else if (inherits(cond, "warning")) { [18:03:19.391] muffled <- grepl(pattern, "muffleWarning") [18:03:19.391] if (muffled) [18:03:19.391] invokeRestart("muffleWarning") [18:03:19.391] } [18:03:19.391] else if (inherits(cond, "condition")) { [18:03:19.391] if (!is.null(pattern)) { [18:03:19.391] computeRestarts <- base::computeRestarts [18:03:19.391] grepl <- base::grepl [18:03:19.391] restarts <- computeRestarts(cond) [18:03:19.391] for (restart in restarts) { [18:03:19.391] name <- restart$name [18:03:19.391] if (is.null(name)) [18:03:19.391] next [18:03:19.391] if (!grepl(pattern, name)) [18:03:19.391] next [18:03:19.391] invokeRestart(restart) [18:03:19.391] muffled <- TRUE [18:03:19.391] break [18:03:19.391] } [18:03:19.391] } [18:03:19.391] } [18:03:19.391] invisible(muffled) [18:03:19.391] } [18:03:19.391] muffleCondition(cond) [18:03:19.391] }) [18:03:19.391] })) [18:03:19.391] future::FutureResult(value = ...future.value$value, [18:03:19.391] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.391] ...future.rng), globalenv = if (FALSE) [18:03:19.391] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.391] ...future.globalenv.names)) [18:03:19.391] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.391] }, condition = base::local({ [18:03:19.391] c <- base::c [18:03:19.391] inherits <- base::inherits [18:03:19.391] invokeRestart <- base::invokeRestart [18:03:19.391] length <- base::length [18:03:19.391] list <- base::list [18:03:19.391] seq.int <- base::seq.int [18:03:19.391] signalCondition <- base::signalCondition [18:03:19.391] sys.calls <- base::sys.calls [18:03:19.391] `[[` <- base::`[[` [18:03:19.391] `+` <- base::`+` [18:03:19.391] `<<-` <- base::`<<-` [18:03:19.391] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.391] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.391] 3L)] [18:03:19.391] } [18:03:19.391] function(cond) { [18:03:19.391] is_error <- inherits(cond, "error") [18:03:19.391] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.391] NULL) [18:03:19.391] if (is_error) { [18:03:19.391] sessionInformation <- function() { [18:03:19.391] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.391] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.391] search = base::search(), system = base::Sys.info()) [18:03:19.391] } [18:03:19.391] ...future.conditions[[length(...future.conditions) + [18:03:19.391] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.391] cond$call), session = sessionInformation(), [18:03:19.391] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.391] signalCondition(cond) [18:03:19.391] } [18:03:19.391] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.391] "immediateCondition"))) { [18:03:19.391] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.391] ...future.conditions[[length(...future.conditions) + [18:03:19.391] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.391] if (TRUE && !signal) { [18:03:19.391] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.391] { [18:03:19.391] inherits <- base::inherits [18:03:19.391] invokeRestart <- base::invokeRestart [18:03:19.391] is.null <- base::is.null [18:03:19.391] muffled <- FALSE [18:03:19.391] if (inherits(cond, "message")) { [18:03:19.391] muffled <- grepl(pattern, "muffleMessage") [18:03:19.391] if (muffled) [18:03:19.391] invokeRestart("muffleMessage") [18:03:19.391] } [18:03:19.391] else if (inherits(cond, "warning")) { [18:03:19.391] muffled <- grepl(pattern, "muffleWarning") [18:03:19.391] if (muffled) [18:03:19.391] invokeRestart("muffleWarning") [18:03:19.391] } [18:03:19.391] else if (inherits(cond, "condition")) { [18:03:19.391] if (!is.null(pattern)) { [18:03:19.391] computeRestarts <- base::computeRestarts [18:03:19.391] grepl <- base::grepl [18:03:19.391] restarts <- computeRestarts(cond) [18:03:19.391] for (restart in restarts) { [18:03:19.391] name <- restart$name [18:03:19.391] if (is.null(name)) [18:03:19.391] next [18:03:19.391] if (!grepl(pattern, name)) [18:03:19.391] next [18:03:19.391] invokeRestart(restart) [18:03:19.391] muffled <- TRUE [18:03:19.391] break [18:03:19.391] } [18:03:19.391] } [18:03:19.391] } [18:03:19.391] invisible(muffled) [18:03:19.391] } [18:03:19.391] muffleCondition(cond, pattern = "^muffle") [18:03:19.391] } [18:03:19.391] } [18:03:19.391] else { [18:03:19.391] if (TRUE) { [18:03:19.391] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.391] { [18:03:19.391] inherits <- base::inherits [18:03:19.391] invokeRestart <- base::invokeRestart [18:03:19.391] is.null <- base::is.null [18:03:19.391] muffled <- FALSE [18:03:19.391] if (inherits(cond, "message")) { [18:03:19.391] muffled <- grepl(pattern, "muffleMessage") [18:03:19.391] if (muffled) [18:03:19.391] invokeRestart("muffleMessage") [18:03:19.391] } [18:03:19.391] else if (inherits(cond, "warning")) { [18:03:19.391] muffled <- grepl(pattern, "muffleWarning") [18:03:19.391] if (muffled) [18:03:19.391] invokeRestart("muffleWarning") [18:03:19.391] } [18:03:19.391] else if (inherits(cond, "condition")) { [18:03:19.391] if (!is.null(pattern)) { [18:03:19.391] computeRestarts <- base::computeRestarts [18:03:19.391] grepl <- base::grepl [18:03:19.391] restarts <- computeRestarts(cond) [18:03:19.391] for (restart in restarts) { [18:03:19.391] name <- restart$name [18:03:19.391] if (is.null(name)) [18:03:19.391] next [18:03:19.391] if (!grepl(pattern, name)) [18:03:19.391] next [18:03:19.391] invokeRestart(restart) [18:03:19.391] muffled <- TRUE [18:03:19.391] break [18:03:19.391] } [18:03:19.391] } [18:03:19.391] } [18:03:19.391] invisible(muffled) [18:03:19.391] } [18:03:19.391] muffleCondition(cond, pattern = "^muffle") [18:03:19.391] } [18:03:19.391] } [18:03:19.391] } [18:03:19.391] })) [18:03:19.391] }, error = function(ex) { [18:03:19.391] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.391] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.391] ...future.rng), started = ...future.startTime, [18:03:19.391] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.391] version = "1.8"), class = "FutureResult") [18:03:19.391] }, finally = { [18:03:19.391] if (!identical(...future.workdir, getwd())) [18:03:19.391] setwd(...future.workdir) [18:03:19.391] { [18:03:19.391] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.391] ...future.oldOptions$nwarnings <- NULL [18:03:19.391] } [18:03:19.391] base::options(...future.oldOptions) [18:03:19.391] if (.Platform$OS.type == "windows") { [18:03:19.391] old_names <- names(...future.oldEnvVars) [18:03:19.391] envs <- base::Sys.getenv() [18:03:19.391] names <- names(envs) [18:03:19.391] common <- intersect(names, old_names) [18:03:19.391] added <- setdiff(names, old_names) [18:03:19.391] removed <- setdiff(old_names, names) [18:03:19.391] changed <- common[...future.oldEnvVars[common] != [18:03:19.391] envs[common]] [18:03:19.391] NAMES <- toupper(changed) [18:03:19.391] args <- list() [18:03:19.391] for (kk in seq_along(NAMES)) { [18:03:19.391] name <- changed[[kk]] [18:03:19.391] NAME <- NAMES[[kk]] [18:03:19.391] if (name != NAME && is.element(NAME, old_names)) [18:03:19.391] next [18:03:19.391] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.391] } [18:03:19.391] NAMES <- toupper(added) [18:03:19.391] for (kk in seq_along(NAMES)) { [18:03:19.391] name <- added[[kk]] [18:03:19.391] NAME <- NAMES[[kk]] [18:03:19.391] if (name != NAME && is.element(NAME, old_names)) [18:03:19.391] next [18:03:19.391] args[[name]] <- "" [18:03:19.391] } [18:03:19.391] NAMES <- toupper(removed) [18:03:19.391] for (kk in seq_along(NAMES)) { [18:03:19.391] name <- removed[[kk]] [18:03:19.391] NAME <- NAMES[[kk]] [18:03:19.391] if (name != NAME && is.element(NAME, old_names)) [18:03:19.391] next [18:03:19.391] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.391] } [18:03:19.391] if (length(args) > 0) [18:03:19.391] base::do.call(base::Sys.setenv, args = args) [18:03:19.391] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.391] } [18:03:19.391] else { [18:03:19.391] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.391] } [18:03:19.391] { [18:03:19.391] if (base::length(...future.futureOptionsAdded) > [18:03:19.391] 0L) { [18:03:19.391] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.391] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.391] base::options(opts) [18:03:19.391] } [18:03:19.391] { [18:03:19.391] { [18:03:19.391] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.391] NULL [18:03:19.391] } [18:03:19.391] options(future.plan = NULL) [18:03:19.391] if (is.na(NA_character_)) [18:03:19.391] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.391] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.391] future::plan(list(function (..., workers = availableCores(), [18:03:19.391] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.391] envir = parent.frame()) [18:03:19.391] { [18:03:19.391] if (is.function(workers)) [18:03:19.391] workers <- workers() [18:03:19.391] workers <- structure(as.integer(workers), [18:03:19.391] class = class(workers)) [18:03:19.391] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.391] workers >= 1) [18:03:19.391] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.391] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.391] } [18:03:19.391] future <- MultisessionFuture(..., workers = workers, [18:03:19.391] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.391] envir = envir) [18:03:19.391] if (!future$lazy) [18:03:19.391] future <- run(future) [18:03:19.391] invisible(future) [18:03:19.391] }), .cleanup = FALSE, .init = FALSE) [18:03:19.391] } [18:03:19.391] } [18:03:19.391] } [18:03:19.391] }) [18:03:19.391] if (TRUE) { [18:03:19.391] base::sink(type = "output", split = FALSE) [18:03:19.391] if (TRUE) { [18:03:19.391] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.391] } [18:03:19.391] else { [18:03:19.391] ...future.result["stdout"] <- base::list(NULL) [18:03:19.391] } [18:03:19.391] base::close(...future.stdout) [18:03:19.391] ...future.stdout <- NULL [18:03:19.391] } [18:03:19.391] ...future.result$conditions <- ...future.conditions [18:03:19.391] ...future.result$finished <- base::Sys.time() [18:03:19.391] ...future.result [18:03:19.391] } [18:03:19.396] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.397] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.397] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.397] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.398] MultisessionFuture started [18:03:19.398] - Launch lazy future ... done [18:03:19.398] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_2-522214' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f4487808 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.415] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.415] - Validating connection of MultisessionFuture [18:03:19.415] - received message: FutureResult [18:03:19.415] - Received FutureResult [18:03:19.416] - Erased future from FutureRegistry [18:03:19.416] result() for ClusterFuture ... [18:03:19.416] - result already collected: FutureResult [18:03:19.416] result() for ClusterFuture ... done [18:03:19.416] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.417] getGlobalsAndPackages() ... [18:03:19.417] Searching for globals... [18:03:19.418] - globals found: [3] '{', 'sample', 'x' [18:03:19.418] Searching for globals ... DONE [18:03:19.418] Resolving globals: FALSE [18:03:19.419] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.419] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.419] - globals: [1] 'x' [18:03:19.420] [18:03:19.420] getGlobalsAndPackages() ... DONE [18:03:19.420] run() for 'Future' ... [18:03:19.420] - state: 'created' [18:03:19.420] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.434] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.434] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.434] - Field: 'node' [18:03:19.434] - Field: 'label' [18:03:19.435] - Field: 'local' [18:03:19.435] - Field: 'owner' [18:03:19.435] - Field: 'envir' [18:03:19.435] - Field: 'workers' [18:03:19.435] - Field: 'packages' [18:03:19.436] - Field: 'gc' [18:03:19.436] - Field: 'conditions' [18:03:19.436] - Field: 'persistent' [18:03:19.436] - Field: 'expr' [18:03:19.436] - Field: 'uuid' [18:03:19.436] - Field: 'seed' [18:03:19.437] - Field: 'version' [18:03:19.437] - Field: 'result' [18:03:19.437] - Field: 'asynchronous' [18:03:19.437] - Field: 'calls' [18:03:19.437] - Field: 'globals' [18:03:19.437] - Field: 'stdout' [18:03:19.438] - Field: 'earlySignal' [18:03:19.438] - Field: 'lazy' [18:03:19.438] - Field: 'state' [18:03:19.438] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.438] - Launch lazy future ... [18:03:19.439] Packages needed by the future expression (n = 0): [18:03:19.439] Packages needed by future strategies (n = 0): [18:03:19.439] { [18:03:19.439] { [18:03:19.439] { [18:03:19.439] ...future.startTime <- base::Sys.time() [18:03:19.439] { [18:03:19.439] { [18:03:19.439] { [18:03:19.439] { [18:03:19.439] base::local({ [18:03:19.439] has_future <- base::requireNamespace("future", [18:03:19.439] quietly = TRUE) [18:03:19.439] if (has_future) { [18:03:19.439] ns <- base::getNamespace("future") [18:03:19.439] version <- ns[[".package"]][["version"]] [18:03:19.439] if (is.null(version)) [18:03:19.439] version <- utils::packageVersion("future") [18:03:19.439] } [18:03:19.439] else { [18:03:19.439] version <- NULL [18:03:19.439] } [18:03:19.439] if (!has_future || version < "1.8.0") { [18:03:19.439] info <- base::c(r_version = base::gsub("R version ", [18:03:19.439] "", base::R.version$version.string), [18:03:19.439] platform = base::sprintf("%s (%s-bit)", [18:03:19.439] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.439] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.439] "release", "version")], collapse = " "), [18:03:19.439] hostname = base::Sys.info()[["nodename"]]) [18:03:19.439] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.439] info) [18:03:19.439] info <- base::paste(info, collapse = "; ") [18:03:19.439] if (!has_future) { [18:03:19.439] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.439] info) [18:03:19.439] } [18:03:19.439] else { [18:03:19.439] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.439] info, version) [18:03:19.439] } [18:03:19.439] base::stop(msg) [18:03:19.439] } [18:03:19.439] }) [18:03:19.439] } [18:03:19.439] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.439] base::options(mc.cores = 1L) [18:03:19.439] } [18:03:19.439] options(future.plan = NULL) [18:03:19.439] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.439] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.439] } [18:03:19.439] ...future.workdir <- getwd() [18:03:19.439] } [18:03:19.439] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.439] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.439] } [18:03:19.439] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.439] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.439] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.439] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.439] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.439] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.439] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.439] base::names(...future.oldOptions)) [18:03:19.439] } [18:03:19.439] if (FALSE) { [18:03:19.439] } [18:03:19.439] else { [18:03:19.439] if (TRUE) { [18:03:19.439] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.439] open = "w") [18:03:19.439] } [18:03:19.439] else { [18:03:19.439] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.439] windows = "NUL", "/dev/null"), open = "w") [18:03:19.439] } [18:03:19.439] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.439] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.439] base::sink(type = "output", split = FALSE) [18:03:19.439] base::close(...future.stdout) [18:03:19.439] }, add = TRUE) [18:03:19.439] } [18:03:19.439] ...future.frame <- base::sys.nframe() [18:03:19.439] ...future.conditions <- base::list() [18:03:19.439] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.439] if (FALSE) { [18:03:19.439] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.439] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.439] } [18:03:19.439] ...future.result <- base::tryCatch({ [18:03:19.439] base::withCallingHandlers({ [18:03:19.439] ...future.value <- base::withVisible(base::local({ [18:03:19.439] ...future.makeSendCondition <- local({ [18:03:19.439] sendCondition <- NULL [18:03:19.439] function(frame = 1L) { [18:03:19.439] if (is.function(sendCondition)) [18:03:19.439] return(sendCondition) [18:03:19.439] ns <- getNamespace("parallel") [18:03:19.439] if (exists("sendData", mode = "function", [18:03:19.439] envir = ns)) { [18:03:19.439] parallel_sendData <- get("sendData", mode = "function", [18:03:19.439] envir = ns) [18:03:19.439] envir <- sys.frame(frame) [18:03:19.439] master <- NULL [18:03:19.439] while (!identical(envir, .GlobalEnv) && [18:03:19.439] !identical(envir, emptyenv())) { [18:03:19.439] if (exists("master", mode = "list", envir = envir, [18:03:19.439] inherits = FALSE)) { [18:03:19.439] master <- get("master", mode = "list", [18:03:19.439] envir = envir, inherits = FALSE) [18:03:19.439] if (inherits(master, c("SOCKnode", [18:03:19.439] "SOCK0node"))) { [18:03:19.439] sendCondition <<- function(cond) { [18:03:19.439] data <- list(type = "VALUE", value = cond, [18:03:19.439] success = TRUE) [18:03:19.439] parallel_sendData(master, data) [18:03:19.439] } [18:03:19.439] return(sendCondition) [18:03:19.439] } [18:03:19.439] } [18:03:19.439] frame <- frame + 1L [18:03:19.439] envir <- sys.frame(frame) [18:03:19.439] } [18:03:19.439] } [18:03:19.439] sendCondition <<- function(cond) NULL [18:03:19.439] } [18:03:19.439] }) [18:03:19.439] withCallingHandlers({ [18:03:19.439] { [18:03:19.439] sample(x, size = 1L) [18:03:19.439] } [18:03:19.439] }, immediateCondition = function(cond) { [18:03:19.439] sendCondition <- ...future.makeSendCondition() [18:03:19.439] sendCondition(cond) [18:03:19.439] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.439] { [18:03:19.439] inherits <- base::inherits [18:03:19.439] invokeRestart <- base::invokeRestart [18:03:19.439] is.null <- base::is.null [18:03:19.439] muffled <- FALSE [18:03:19.439] if (inherits(cond, "message")) { [18:03:19.439] muffled <- grepl(pattern, "muffleMessage") [18:03:19.439] if (muffled) [18:03:19.439] invokeRestart("muffleMessage") [18:03:19.439] } [18:03:19.439] else if (inherits(cond, "warning")) { [18:03:19.439] muffled <- grepl(pattern, "muffleWarning") [18:03:19.439] if (muffled) [18:03:19.439] invokeRestart("muffleWarning") [18:03:19.439] } [18:03:19.439] else if (inherits(cond, "condition")) { [18:03:19.439] if (!is.null(pattern)) { [18:03:19.439] computeRestarts <- base::computeRestarts [18:03:19.439] grepl <- base::grepl [18:03:19.439] restarts <- computeRestarts(cond) [18:03:19.439] for (restart in restarts) { [18:03:19.439] name <- restart$name [18:03:19.439] if (is.null(name)) [18:03:19.439] next [18:03:19.439] if (!grepl(pattern, name)) [18:03:19.439] next [18:03:19.439] invokeRestart(restart) [18:03:19.439] muffled <- TRUE [18:03:19.439] break [18:03:19.439] } [18:03:19.439] } [18:03:19.439] } [18:03:19.439] invisible(muffled) [18:03:19.439] } [18:03:19.439] muffleCondition(cond) [18:03:19.439] }) [18:03:19.439] })) [18:03:19.439] future::FutureResult(value = ...future.value$value, [18:03:19.439] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.439] ...future.rng), globalenv = if (FALSE) [18:03:19.439] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.439] ...future.globalenv.names)) [18:03:19.439] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.439] }, condition = base::local({ [18:03:19.439] c <- base::c [18:03:19.439] inherits <- base::inherits [18:03:19.439] invokeRestart <- base::invokeRestart [18:03:19.439] length <- base::length [18:03:19.439] list <- base::list [18:03:19.439] seq.int <- base::seq.int [18:03:19.439] signalCondition <- base::signalCondition [18:03:19.439] sys.calls <- base::sys.calls [18:03:19.439] `[[` <- base::`[[` [18:03:19.439] `+` <- base::`+` [18:03:19.439] `<<-` <- base::`<<-` [18:03:19.439] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.439] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.439] 3L)] [18:03:19.439] } [18:03:19.439] function(cond) { [18:03:19.439] is_error <- inherits(cond, "error") [18:03:19.439] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.439] NULL) [18:03:19.439] if (is_error) { [18:03:19.439] sessionInformation <- function() { [18:03:19.439] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.439] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.439] search = base::search(), system = base::Sys.info()) [18:03:19.439] } [18:03:19.439] ...future.conditions[[length(...future.conditions) + [18:03:19.439] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.439] cond$call), session = sessionInformation(), [18:03:19.439] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.439] signalCondition(cond) [18:03:19.439] } [18:03:19.439] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.439] "immediateCondition"))) { [18:03:19.439] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.439] ...future.conditions[[length(...future.conditions) + [18:03:19.439] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.439] if (TRUE && !signal) { [18:03:19.439] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.439] { [18:03:19.439] inherits <- base::inherits [18:03:19.439] invokeRestart <- base::invokeRestart [18:03:19.439] is.null <- base::is.null [18:03:19.439] muffled <- FALSE [18:03:19.439] if (inherits(cond, "message")) { [18:03:19.439] muffled <- grepl(pattern, "muffleMessage") [18:03:19.439] if (muffled) [18:03:19.439] invokeRestart("muffleMessage") [18:03:19.439] } [18:03:19.439] else if (inherits(cond, "warning")) { [18:03:19.439] muffled <- grepl(pattern, "muffleWarning") [18:03:19.439] if (muffled) [18:03:19.439] invokeRestart("muffleWarning") [18:03:19.439] } [18:03:19.439] else if (inherits(cond, "condition")) { [18:03:19.439] if (!is.null(pattern)) { [18:03:19.439] computeRestarts <- base::computeRestarts [18:03:19.439] grepl <- base::grepl [18:03:19.439] restarts <- computeRestarts(cond) [18:03:19.439] for (restart in restarts) { [18:03:19.439] name <- restart$name [18:03:19.439] if (is.null(name)) [18:03:19.439] next [18:03:19.439] if (!grepl(pattern, name)) [18:03:19.439] next [18:03:19.439] invokeRestart(restart) [18:03:19.439] muffled <- TRUE [18:03:19.439] break [18:03:19.439] } [18:03:19.439] } [18:03:19.439] } [18:03:19.439] invisible(muffled) [18:03:19.439] } [18:03:19.439] muffleCondition(cond, pattern = "^muffle") [18:03:19.439] } [18:03:19.439] } [18:03:19.439] else { [18:03:19.439] if (TRUE) { [18:03:19.439] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.439] { [18:03:19.439] inherits <- base::inherits [18:03:19.439] invokeRestart <- base::invokeRestart [18:03:19.439] is.null <- base::is.null [18:03:19.439] muffled <- FALSE [18:03:19.439] if (inherits(cond, "message")) { [18:03:19.439] muffled <- grepl(pattern, "muffleMessage") [18:03:19.439] if (muffled) [18:03:19.439] invokeRestart("muffleMessage") [18:03:19.439] } [18:03:19.439] else if (inherits(cond, "warning")) { [18:03:19.439] muffled <- grepl(pattern, "muffleWarning") [18:03:19.439] if (muffled) [18:03:19.439] invokeRestart("muffleWarning") [18:03:19.439] } [18:03:19.439] else if (inherits(cond, "condition")) { [18:03:19.439] if (!is.null(pattern)) { [18:03:19.439] computeRestarts <- base::computeRestarts [18:03:19.439] grepl <- base::grepl [18:03:19.439] restarts <- computeRestarts(cond) [18:03:19.439] for (restart in restarts) { [18:03:19.439] name <- restart$name [18:03:19.439] if (is.null(name)) [18:03:19.439] next [18:03:19.439] if (!grepl(pattern, name)) [18:03:19.439] next [18:03:19.439] invokeRestart(restart) [18:03:19.439] muffled <- TRUE [18:03:19.439] break [18:03:19.439] } [18:03:19.439] } [18:03:19.439] } [18:03:19.439] invisible(muffled) [18:03:19.439] } [18:03:19.439] muffleCondition(cond, pattern = "^muffle") [18:03:19.439] } [18:03:19.439] } [18:03:19.439] } [18:03:19.439] })) [18:03:19.439] }, error = function(ex) { [18:03:19.439] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.439] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.439] ...future.rng), started = ...future.startTime, [18:03:19.439] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.439] version = "1.8"), class = "FutureResult") [18:03:19.439] }, finally = { [18:03:19.439] if (!identical(...future.workdir, getwd())) [18:03:19.439] setwd(...future.workdir) [18:03:19.439] { [18:03:19.439] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.439] ...future.oldOptions$nwarnings <- NULL [18:03:19.439] } [18:03:19.439] base::options(...future.oldOptions) [18:03:19.439] if (.Platform$OS.type == "windows") { [18:03:19.439] old_names <- names(...future.oldEnvVars) [18:03:19.439] envs <- base::Sys.getenv() [18:03:19.439] names <- names(envs) [18:03:19.439] common <- intersect(names, old_names) [18:03:19.439] added <- setdiff(names, old_names) [18:03:19.439] removed <- setdiff(old_names, names) [18:03:19.439] changed <- common[...future.oldEnvVars[common] != [18:03:19.439] envs[common]] [18:03:19.439] NAMES <- toupper(changed) [18:03:19.439] args <- list() [18:03:19.439] for (kk in seq_along(NAMES)) { [18:03:19.439] name <- changed[[kk]] [18:03:19.439] NAME <- NAMES[[kk]] [18:03:19.439] if (name != NAME && is.element(NAME, old_names)) [18:03:19.439] next [18:03:19.439] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.439] } [18:03:19.439] NAMES <- toupper(added) [18:03:19.439] for (kk in seq_along(NAMES)) { [18:03:19.439] name <- added[[kk]] [18:03:19.439] NAME <- NAMES[[kk]] [18:03:19.439] if (name != NAME && is.element(NAME, old_names)) [18:03:19.439] next [18:03:19.439] args[[name]] <- "" [18:03:19.439] } [18:03:19.439] NAMES <- toupper(removed) [18:03:19.439] for (kk in seq_along(NAMES)) { [18:03:19.439] name <- removed[[kk]] [18:03:19.439] NAME <- NAMES[[kk]] [18:03:19.439] if (name != NAME && is.element(NAME, old_names)) [18:03:19.439] next [18:03:19.439] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.439] } [18:03:19.439] if (length(args) > 0) [18:03:19.439] base::do.call(base::Sys.setenv, args = args) [18:03:19.439] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.439] } [18:03:19.439] else { [18:03:19.439] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.439] } [18:03:19.439] { [18:03:19.439] if (base::length(...future.futureOptionsAdded) > [18:03:19.439] 0L) { [18:03:19.439] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.439] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.439] base::options(opts) [18:03:19.439] } [18:03:19.439] { [18:03:19.439] { [18:03:19.439] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.439] NULL [18:03:19.439] } [18:03:19.439] options(future.plan = NULL) [18:03:19.439] if (is.na(NA_character_)) [18:03:19.439] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.439] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.439] future::plan(list(function (..., workers = availableCores(), [18:03:19.439] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.439] envir = parent.frame()) [18:03:19.439] { [18:03:19.439] if (is.function(workers)) [18:03:19.439] workers <- workers() [18:03:19.439] workers <- structure(as.integer(workers), [18:03:19.439] class = class(workers)) [18:03:19.439] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.439] workers >= 1) [18:03:19.439] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.439] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.439] } [18:03:19.439] future <- MultisessionFuture(..., workers = workers, [18:03:19.439] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.439] envir = envir) [18:03:19.439] if (!future$lazy) [18:03:19.439] future <- run(future) [18:03:19.439] invisible(future) [18:03:19.439] }), .cleanup = FALSE, .init = FALSE) [18:03:19.439] } [18:03:19.439] } [18:03:19.439] } [18:03:19.439] }) [18:03:19.439] if (TRUE) { [18:03:19.439] base::sink(type = "output", split = FALSE) [18:03:19.439] if (TRUE) { [18:03:19.439] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.439] } [18:03:19.439] else { [18:03:19.439] ...future.result["stdout"] <- base::list(NULL) [18:03:19.439] } [18:03:19.439] base::close(...future.stdout) [18:03:19.439] ...future.stdout <- NULL [18:03:19.439] } [18:03:19.439] ...future.result$conditions <- ...future.conditions [18:03:19.439] ...future.result$finished <- base::Sys.time() [18:03:19.439] ...future.result [18:03:19.439] } [18:03:19.445] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.445] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.445] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.445] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.446] MultisessionFuture started [18:03:19.446] - Launch lazy future ... done [18:03:19.446] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_3-552098' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f4487808 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.463] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.463] - Validating connection of MultisessionFuture [18:03:19.463] - received message: FutureResult [18:03:19.463] - Received FutureResult [18:03:19.463] - Erased future from FutureRegistry [18:03:19.464] result() for ClusterFuture ... [18:03:19.464] - result already collected: FutureResult [18:03:19.464] result() for ClusterFuture ... done [18:03:19.464] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.464] getGlobalsAndPackages() ... [18:03:19.465] Searching for globals... [18:03:19.466] - globals found: [3] '{', 'sample', 'x' [18:03:19.466] Searching for globals ... DONE [18:03:19.466] Resolving globals: FALSE [18:03:19.467] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.467] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.467] - globals: [1] 'x' [18:03:19.467] [18:03:19.468] getGlobalsAndPackages() ... DONE [18:03:19.468] run() for 'Future' ... [18:03:19.468] - state: 'created' [18:03:19.468] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.481] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.482] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.482] - Field: 'node' [18:03:19.482] - Field: 'label' [18:03:19.482] - Field: 'local' [18:03:19.482] - Field: 'owner' [18:03:19.483] - Field: 'envir' [18:03:19.483] - Field: 'workers' [18:03:19.483] - Field: 'packages' [18:03:19.483] - Field: 'gc' [18:03:19.483] - Field: 'conditions' [18:03:19.484] - Field: 'persistent' [18:03:19.484] - Field: 'expr' [18:03:19.484] - Field: 'uuid' [18:03:19.484] - Field: 'seed' [18:03:19.484] - Field: 'version' [18:03:19.484] - Field: 'result' [18:03:19.485] - Field: 'asynchronous' [18:03:19.485] - Field: 'calls' [18:03:19.485] - Field: 'globals' [18:03:19.485] - Field: 'stdout' [18:03:19.485] - Field: 'earlySignal' [18:03:19.485] - Field: 'lazy' [18:03:19.486] - Field: 'state' [18:03:19.486] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.486] - Launch lazy future ... [18:03:19.486] Packages needed by the future expression (n = 0): [18:03:19.487] Packages needed by future strategies (n = 0): [18:03:19.487] { [18:03:19.487] { [18:03:19.487] { [18:03:19.487] ...future.startTime <- base::Sys.time() [18:03:19.487] { [18:03:19.487] { [18:03:19.487] { [18:03:19.487] { [18:03:19.487] base::local({ [18:03:19.487] has_future <- base::requireNamespace("future", [18:03:19.487] quietly = TRUE) [18:03:19.487] if (has_future) { [18:03:19.487] ns <- base::getNamespace("future") [18:03:19.487] version <- ns[[".package"]][["version"]] [18:03:19.487] if (is.null(version)) [18:03:19.487] version <- utils::packageVersion("future") [18:03:19.487] } [18:03:19.487] else { [18:03:19.487] version <- NULL [18:03:19.487] } [18:03:19.487] if (!has_future || version < "1.8.0") { [18:03:19.487] info <- base::c(r_version = base::gsub("R version ", [18:03:19.487] "", base::R.version$version.string), [18:03:19.487] platform = base::sprintf("%s (%s-bit)", [18:03:19.487] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.487] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.487] "release", "version")], collapse = " "), [18:03:19.487] hostname = base::Sys.info()[["nodename"]]) [18:03:19.487] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.487] info) [18:03:19.487] info <- base::paste(info, collapse = "; ") [18:03:19.487] if (!has_future) { [18:03:19.487] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.487] info) [18:03:19.487] } [18:03:19.487] else { [18:03:19.487] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.487] info, version) [18:03:19.487] } [18:03:19.487] base::stop(msg) [18:03:19.487] } [18:03:19.487] }) [18:03:19.487] } [18:03:19.487] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.487] base::options(mc.cores = 1L) [18:03:19.487] } [18:03:19.487] options(future.plan = NULL) [18:03:19.487] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.487] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.487] } [18:03:19.487] ...future.workdir <- getwd() [18:03:19.487] } [18:03:19.487] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.487] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.487] } [18:03:19.487] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.487] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.487] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.487] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.487] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:19.487] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.487] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.487] base::names(...future.oldOptions)) [18:03:19.487] } [18:03:19.487] if (FALSE) { [18:03:19.487] } [18:03:19.487] else { [18:03:19.487] if (TRUE) { [18:03:19.487] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.487] open = "w") [18:03:19.487] } [18:03:19.487] else { [18:03:19.487] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.487] windows = "NUL", "/dev/null"), open = "w") [18:03:19.487] } [18:03:19.487] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.487] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.487] base::sink(type = "output", split = FALSE) [18:03:19.487] base::close(...future.stdout) [18:03:19.487] }, add = TRUE) [18:03:19.487] } [18:03:19.487] ...future.frame <- base::sys.nframe() [18:03:19.487] ...future.conditions <- base::list() [18:03:19.487] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.487] if (FALSE) { [18:03:19.487] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.487] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.487] } [18:03:19.487] ...future.result <- base::tryCatch({ [18:03:19.487] base::withCallingHandlers({ [18:03:19.487] ...future.value <- base::withVisible(base::local({ [18:03:19.487] ...future.makeSendCondition <- local({ [18:03:19.487] sendCondition <- NULL [18:03:19.487] function(frame = 1L) { [18:03:19.487] if (is.function(sendCondition)) [18:03:19.487] return(sendCondition) [18:03:19.487] ns <- getNamespace("parallel") [18:03:19.487] if (exists("sendData", mode = "function", [18:03:19.487] envir = ns)) { [18:03:19.487] parallel_sendData <- get("sendData", mode = "function", [18:03:19.487] envir = ns) [18:03:19.487] envir <- sys.frame(frame) [18:03:19.487] master <- NULL [18:03:19.487] while (!identical(envir, .GlobalEnv) && [18:03:19.487] !identical(envir, emptyenv())) { [18:03:19.487] if (exists("master", mode = "list", envir = envir, [18:03:19.487] inherits = FALSE)) { [18:03:19.487] master <- get("master", mode = "list", [18:03:19.487] envir = envir, inherits = FALSE) [18:03:19.487] if (inherits(master, c("SOCKnode", [18:03:19.487] "SOCK0node"))) { [18:03:19.487] sendCondition <<- function(cond) { [18:03:19.487] data <- list(type = "VALUE", value = cond, [18:03:19.487] success = TRUE) [18:03:19.487] parallel_sendData(master, data) [18:03:19.487] } [18:03:19.487] return(sendCondition) [18:03:19.487] } [18:03:19.487] } [18:03:19.487] frame <- frame + 1L [18:03:19.487] envir <- sys.frame(frame) [18:03:19.487] } [18:03:19.487] } [18:03:19.487] sendCondition <<- function(cond) NULL [18:03:19.487] } [18:03:19.487] }) [18:03:19.487] withCallingHandlers({ [18:03:19.487] { [18:03:19.487] sample(x, size = 1L) [18:03:19.487] } [18:03:19.487] }, immediateCondition = function(cond) { [18:03:19.487] sendCondition <- ...future.makeSendCondition() [18:03:19.487] sendCondition(cond) [18:03:19.487] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.487] { [18:03:19.487] inherits <- base::inherits [18:03:19.487] invokeRestart <- base::invokeRestart [18:03:19.487] is.null <- base::is.null [18:03:19.487] muffled <- FALSE [18:03:19.487] if (inherits(cond, "message")) { [18:03:19.487] muffled <- grepl(pattern, "muffleMessage") [18:03:19.487] if (muffled) [18:03:19.487] invokeRestart("muffleMessage") [18:03:19.487] } [18:03:19.487] else if (inherits(cond, "warning")) { [18:03:19.487] muffled <- grepl(pattern, "muffleWarning") [18:03:19.487] if (muffled) [18:03:19.487] invokeRestart("muffleWarning") [18:03:19.487] } [18:03:19.487] else if (inherits(cond, "condition")) { [18:03:19.487] if (!is.null(pattern)) { [18:03:19.487] computeRestarts <- base::computeRestarts [18:03:19.487] grepl <- base::grepl [18:03:19.487] restarts <- computeRestarts(cond) [18:03:19.487] for (restart in restarts) { [18:03:19.487] name <- restart$name [18:03:19.487] if (is.null(name)) [18:03:19.487] next [18:03:19.487] if (!grepl(pattern, name)) [18:03:19.487] next [18:03:19.487] invokeRestart(restart) [18:03:19.487] muffled <- TRUE [18:03:19.487] break [18:03:19.487] } [18:03:19.487] } [18:03:19.487] } [18:03:19.487] invisible(muffled) [18:03:19.487] } [18:03:19.487] muffleCondition(cond) [18:03:19.487] }) [18:03:19.487] })) [18:03:19.487] future::FutureResult(value = ...future.value$value, [18:03:19.487] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.487] ...future.rng), globalenv = if (FALSE) [18:03:19.487] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.487] ...future.globalenv.names)) [18:03:19.487] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.487] }, condition = base::local({ [18:03:19.487] c <- base::c [18:03:19.487] inherits <- base::inherits [18:03:19.487] invokeRestart <- base::invokeRestart [18:03:19.487] length <- base::length [18:03:19.487] list <- base::list [18:03:19.487] seq.int <- base::seq.int [18:03:19.487] signalCondition <- base::signalCondition [18:03:19.487] sys.calls <- base::sys.calls [18:03:19.487] `[[` <- base::`[[` [18:03:19.487] `+` <- base::`+` [18:03:19.487] `<<-` <- base::`<<-` [18:03:19.487] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.487] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.487] 3L)] [18:03:19.487] } [18:03:19.487] function(cond) { [18:03:19.487] is_error <- inherits(cond, "error") [18:03:19.487] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.487] NULL) [18:03:19.487] if (is_error) { [18:03:19.487] sessionInformation <- function() { [18:03:19.487] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.487] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.487] search = base::search(), system = base::Sys.info()) [18:03:19.487] } [18:03:19.487] ...future.conditions[[length(...future.conditions) + [18:03:19.487] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.487] cond$call), session = sessionInformation(), [18:03:19.487] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.487] signalCondition(cond) [18:03:19.487] } [18:03:19.487] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.487] "immediateCondition"))) { [18:03:19.487] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.487] ...future.conditions[[length(...future.conditions) + [18:03:19.487] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.487] if (TRUE && !signal) { [18:03:19.487] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.487] { [18:03:19.487] inherits <- base::inherits [18:03:19.487] invokeRestart <- base::invokeRestart [18:03:19.487] is.null <- base::is.null [18:03:19.487] muffled <- FALSE [18:03:19.487] if (inherits(cond, "message")) { [18:03:19.487] muffled <- grepl(pattern, "muffleMessage") [18:03:19.487] if (muffled) [18:03:19.487] invokeRestart("muffleMessage") [18:03:19.487] } [18:03:19.487] else if (inherits(cond, "warning")) { [18:03:19.487] muffled <- grepl(pattern, "muffleWarning") [18:03:19.487] if (muffled) [18:03:19.487] invokeRestart("muffleWarning") [18:03:19.487] } [18:03:19.487] else if (inherits(cond, "condition")) { [18:03:19.487] if (!is.null(pattern)) { [18:03:19.487] computeRestarts <- base::computeRestarts [18:03:19.487] grepl <- base::grepl [18:03:19.487] restarts <- computeRestarts(cond) [18:03:19.487] for (restart in restarts) { [18:03:19.487] name <- restart$name [18:03:19.487] if (is.null(name)) [18:03:19.487] next [18:03:19.487] if (!grepl(pattern, name)) [18:03:19.487] next [18:03:19.487] invokeRestart(restart) [18:03:19.487] muffled <- TRUE [18:03:19.487] break [18:03:19.487] } [18:03:19.487] } [18:03:19.487] } [18:03:19.487] invisible(muffled) [18:03:19.487] } [18:03:19.487] muffleCondition(cond, pattern = "^muffle") [18:03:19.487] } [18:03:19.487] } [18:03:19.487] else { [18:03:19.487] if (TRUE) { [18:03:19.487] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.487] { [18:03:19.487] inherits <- base::inherits [18:03:19.487] invokeRestart <- base::invokeRestart [18:03:19.487] is.null <- base::is.null [18:03:19.487] muffled <- FALSE [18:03:19.487] if (inherits(cond, "message")) { [18:03:19.487] muffled <- grepl(pattern, "muffleMessage") [18:03:19.487] if (muffled) [18:03:19.487] invokeRestart("muffleMessage") [18:03:19.487] } [18:03:19.487] else if (inherits(cond, "warning")) { [18:03:19.487] muffled <- grepl(pattern, "muffleWarning") [18:03:19.487] if (muffled) [18:03:19.487] invokeRestart("muffleWarning") [18:03:19.487] } [18:03:19.487] else if (inherits(cond, "condition")) { [18:03:19.487] if (!is.null(pattern)) { [18:03:19.487] computeRestarts <- base::computeRestarts [18:03:19.487] grepl <- base::grepl [18:03:19.487] restarts <- computeRestarts(cond) [18:03:19.487] for (restart in restarts) { [18:03:19.487] name <- restart$name [18:03:19.487] if (is.null(name)) [18:03:19.487] next [18:03:19.487] if (!grepl(pattern, name)) [18:03:19.487] next [18:03:19.487] invokeRestart(restart) [18:03:19.487] muffled <- TRUE [18:03:19.487] break [18:03:19.487] } [18:03:19.487] } [18:03:19.487] } [18:03:19.487] invisible(muffled) [18:03:19.487] } [18:03:19.487] muffleCondition(cond, pattern = "^muffle") [18:03:19.487] } [18:03:19.487] } [18:03:19.487] } [18:03:19.487] })) [18:03:19.487] }, error = function(ex) { [18:03:19.487] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.487] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.487] ...future.rng), started = ...future.startTime, [18:03:19.487] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.487] version = "1.8"), class = "FutureResult") [18:03:19.487] }, finally = { [18:03:19.487] if (!identical(...future.workdir, getwd())) [18:03:19.487] setwd(...future.workdir) [18:03:19.487] { [18:03:19.487] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.487] ...future.oldOptions$nwarnings <- NULL [18:03:19.487] } [18:03:19.487] base::options(...future.oldOptions) [18:03:19.487] if (.Platform$OS.type == "windows") { [18:03:19.487] old_names <- names(...future.oldEnvVars) [18:03:19.487] envs <- base::Sys.getenv() [18:03:19.487] names <- names(envs) [18:03:19.487] common <- intersect(names, old_names) [18:03:19.487] added <- setdiff(names, old_names) [18:03:19.487] removed <- setdiff(old_names, names) [18:03:19.487] changed <- common[...future.oldEnvVars[common] != [18:03:19.487] envs[common]] [18:03:19.487] NAMES <- toupper(changed) [18:03:19.487] args <- list() [18:03:19.487] for (kk in seq_along(NAMES)) { [18:03:19.487] name <- changed[[kk]] [18:03:19.487] NAME <- NAMES[[kk]] [18:03:19.487] if (name != NAME && is.element(NAME, old_names)) [18:03:19.487] next [18:03:19.487] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.487] } [18:03:19.487] NAMES <- toupper(added) [18:03:19.487] for (kk in seq_along(NAMES)) { [18:03:19.487] name <- added[[kk]] [18:03:19.487] NAME <- NAMES[[kk]] [18:03:19.487] if (name != NAME && is.element(NAME, old_names)) [18:03:19.487] next [18:03:19.487] args[[name]] <- "" [18:03:19.487] } [18:03:19.487] NAMES <- toupper(removed) [18:03:19.487] for (kk in seq_along(NAMES)) { [18:03:19.487] name <- removed[[kk]] [18:03:19.487] NAME <- NAMES[[kk]] [18:03:19.487] if (name != NAME && is.element(NAME, old_names)) [18:03:19.487] next [18:03:19.487] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.487] } [18:03:19.487] if (length(args) > 0) [18:03:19.487] base::do.call(base::Sys.setenv, args = args) [18:03:19.487] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.487] } [18:03:19.487] else { [18:03:19.487] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.487] } [18:03:19.487] { [18:03:19.487] if (base::length(...future.futureOptionsAdded) > [18:03:19.487] 0L) { [18:03:19.487] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.487] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.487] base::options(opts) [18:03:19.487] } [18:03:19.487] { [18:03:19.487] { [18:03:19.487] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.487] NULL [18:03:19.487] } [18:03:19.487] options(future.plan = NULL) [18:03:19.487] if (is.na(NA_character_)) [18:03:19.487] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.487] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.487] future::plan(list(function (..., workers = availableCores(), [18:03:19.487] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.487] envir = parent.frame()) [18:03:19.487] { [18:03:19.487] if (is.function(workers)) [18:03:19.487] workers <- workers() [18:03:19.487] workers <- structure(as.integer(workers), [18:03:19.487] class = class(workers)) [18:03:19.487] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.487] workers >= 1) [18:03:19.487] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.487] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.487] } [18:03:19.487] future <- MultisessionFuture(..., workers = workers, [18:03:19.487] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.487] envir = envir) [18:03:19.487] if (!future$lazy) [18:03:19.487] future <- run(future) [18:03:19.487] invisible(future) [18:03:19.487] }), .cleanup = FALSE, .init = FALSE) [18:03:19.487] } [18:03:19.487] } [18:03:19.487] } [18:03:19.487] }) [18:03:19.487] if (TRUE) { [18:03:19.487] base::sink(type = "output", split = FALSE) [18:03:19.487] if (TRUE) { [18:03:19.487] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.487] } [18:03:19.487] else { [18:03:19.487] ...future.result["stdout"] <- base::list(NULL) [18:03:19.487] } [18:03:19.487] base::close(...future.stdout) [18:03:19.487] ...future.stdout <- NULL [18:03:19.487] } [18:03:19.487] ...future.result$conditions <- ...future.conditions [18:03:19.487] ...future.result$finished <- base::Sys.time() [18:03:19.487] ...future.result [18:03:19.487] } [18:03:19.492] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.493] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.493] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.493] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.494] MultisessionFuture started [18:03:19.494] - Launch lazy future ... done [18:03:19.494] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_4-94589' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f4487808 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.509] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.510] - Validating connection of MultisessionFuture [18:03:19.510] - received message: FutureResult [18:03:19.510] - Received FutureResult [18:03:19.510] - Erased future from FutureRegistry [18:03:19.511] result() for ClusterFuture ... [18:03:19.511] - result already collected: FutureResult [18:03:19.511] result() for ClusterFuture ... done [18:03:19.511] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.511] resolve() on list ... [18:03:19.511] recursive: 0 [18:03:19.512] length: 4 [18:03:19.512] [18:03:19.512] Future #1 [18:03:19.512] result() for ClusterFuture ... [18:03:19.512] - result already collected: FutureResult [18:03:19.512] result() for ClusterFuture ... done [18:03:19.513] result() for ClusterFuture ... [18:03:19.513] - result already collected: FutureResult [18:03:19.513] result() for ClusterFuture ... done [18:03:19.513] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:19.513] - nx: 4 [18:03:19.513] - relay: TRUE [18:03:19.514] - stdout: TRUE [18:03:19.514] - signal: TRUE [18:03:19.514] - resignal: FALSE [18:03:19.514] - force: TRUE [18:03:19.514] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.514] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.514] - until=1 [18:03:19.515] - relaying element #1 [18:03:19.515] result() for ClusterFuture ... [18:03:19.515] - result already collected: FutureResult [18:03:19.515] result() for ClusterFuture ... done [18:03:19.515] result() for ClusterFuture ... [18:03:19.515] - result already collected: FutureResult [18:03:19.516] result() for ClusterFuture ... done [18:03:19.516] result() for ClusterFuture ... [18:03:19.516] - result already collected: FutureResult [18:03:19.516] result() for ClusterFuture ... done [18:03:19.516] result() for ClusterFuture ... [18:03:19.516] - result already collected: FutureResult [18:03:19.517] result() for ClusterFuture ... done [18:03:19.517] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.517] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.517] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:03:19.517] length: 3 (resolved future 1) [18:03:19.517] Future #2 [18:03:19.518] result() for ClusterFuture ... [18:03:19.518] - result already collected: FutureResult [18:03:19.518] result() for ClusterFuture ... done [18:03:19.518] result() for ClusterFuture ... [18:03:19.518] - result already collected: FutureResult [18:03:19.518] result() for ClusterFuture ... done [18:03:19.519] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:03:19.519] - nx: 4 [18:03:19.519] - relay: TRUE [18:03:19.519] - stdout: TRUE [18:03:19.519] - signal: TRUE [18:03:19.519] - resignal: FALSE [18:03:19.519] - force: TRUE [18:03:19.520] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.520] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.520] - until=2 [18:03:19.520] - relaying element #2 [18:03:19.520] result() for ClusterFuture ... [18:03:19.520] - result already collected: FutureResult [18:03:19.521] result() for ClusterFuture ... done [18:03:19.521] result() for ClusterFuture ... [18:03:19.521] - result already collected: FutureResult [18:03:19.521] result() for ClusterFuture ... done [18:03:19.521] result() for ClusterFuture ... [18:03:19.522] - result already collected: FutureResult [18:03:19.522] result() for ClusterFuture ... done [18:03:19.522] result() for ClusterFuture ... [18:03:19.522] - result already collected: FutureResult [18:03:19.522] result() for ClusterFuture ... done [18:03:19.522] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.523] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.523] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:03:19.523] length: 2 (resolved future 2) [18:03:19.523] Future #3 [18:03:19.523] result() for ClusterFuture ... [18:03:19.523] - result already collected: FutureResult [18:03:19.524] result() for ClusterFuture ... done [18:03:19.524] result() for ClusterFuture ... [18:03:19.524] - result already collected: FutureResult [18:03:19.524] result() for ClusterFuture ... done [18:03:19.524] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:03:19.524] - nx: 4 [18:03:19.525] - relay: TRUE [18:03:19.525] - stdout: TRUE [18:03:19.525] - signal: TRUE [18:03:19.525] - resignal: FALSE [18:03:19.525] - force: TRUE [18:03:19.525] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.525] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.526] - until=3 [18:03:19.526] - relaying element #3 [18:03:19.526] result() for ClusterFuture ... [18:03:19.526] - result already collected: FutureResult [18:03:19.526] result() for ClusterFuture ... done [18:03:19.526] result() for ClusterFuture ... [18:03:19.527] - result already collected: FutureResult [18:03:19.527] result() for ClusterFuture ... done [18:03:19.527] result() for ClusterFuture ... [18:03:19.527] - result already collected: FutureResult [18:03:19.527] result() for ClusterFuture ... done [18:03:19.530] result() for ClusterFuture ... [18:03:19.530] - result already collected: FutureResult [18:03:19.530] result() for ClusterFuture ... done [18:03:19.530] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.530] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.530] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:03:19.531] length: 1 (resolved future 3) [18:03:19.531] Future #4 [18:03:19.531] result() for ClusterFuture ... [18:03:19.531] - result already collected: FutureResult [18:03:19.531] result() for ClusterFuture ... done [18:03:19.531] result() for ClusterFuture ... [18:03:19.532] - result already collected: FutureResult [18:03:19.532] result() for ClusterFuture ... done [18:03:19.532] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:03:19.532] - nx: 4 [18:03:19.532] - relay: TRUE [18:03:19.532] - stdout: TRUE [18:03:19.532] - signal: TRUE [18:03:19.533] - resignal: FALSE [18:03:19.533] - force: TRUE [18:03:19.533] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.533] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.533] - until=4 [18:03:19.533] - relaying element #4 [18:03:19.534] result() for ClusterFuture ... [18:03:19.534] - result already collected: FutureResult [18:03:19.534] result() for ClusterFuture ... done [18:03:19.534] result() for ClusterFuture ... [18:03:19.534] - result already collected: FutureResult [18:03:19.534] result() for ClusterFuture ... done [18:03:19.535] result() for ClusterFuture ... [18:03:19.535] - result already collected: FutureResult [18:03:19.535] result() for ClusterFuture ... done [18:03:19.535] result() for ClusterFuture ... [18:03:19.535] - result already collected: FutureResult [18:03:19.535] result() for ClusterFuture ... done [18:03:19.535] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.536] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.536] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:03:19.536] length: 0 (resolved future 4) [18:03:19.536] Relaying remaining futures [18:03:19.536] signalConditionsASAP(NULL, pos=0) ... [18:03:19.536] - nx: 4 [18:03:19.537] - relay: TRUE [18:03:19.537] - stdout: TRUE [18:03:19.537] - signal: TRUE [18:03:19.537] - resignal: FALSE [18:03:19.537] - force: TRUE [18:03:19.537] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.537] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:19.538] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.538] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.538] signalConditionsASAP(NULL, pos=0) ... done [18:03:19.538] resolve() on list ... DONE [18:03:19.538] result() for ClusterFuture ... [18:03:19.539] - result already collected: FutureResult [18:03:19.539] result() for ClusterFuture ... done [18:03:19.539] result() for ClusterFuture ... [18:03:19.539] - result already collected: FutureResult [18:03:19.539] result() for ClusterFuture ... done [18:03:19.539] result() for ClusterFuture ... [18:03:19.540] - result already collected: FutureResult [18:03:19.540] result() for ClusterFuture ... done [18:03:19.540] result() for ClusterFuture ... [18:03:19.540] - result already collected: FutureResult [18:03:19.540] result() for ClusterFuture ... done [18:03:19.540] result() for ClusterFuture ... [18:03:19.540] - result already collected: FutureResult [18:03:19.541] result() for ClusterFuture ... done [18:03:19.541] result() for ClusterFuture ... [18:03:19.541] - result already collected: FutureResult [18:03:19.541] result() for ClusterFuture ... done [18:03:19.541] result() for ClusterFuture ... [18:03:19.541] - result already collected: FutureResult [18:03:19.542] result() for ClusterFuture ... done [18:03:19.542] result() for ClusterFuture ... [18:03:19.542] - result already collected: FutureResult [18:03:19.542] result() for ClusterFuture ... done [[1]] [1] 1 [[2]] [1] 3 [[3]] [1] 1 [[4]] [1] 1 [18:03:19.542] getGlobalsAndPackages() ... [18:03:19.543] Searching for globals... [18:03:19.544] - globals found: [3] '{', 'sample', 'x' [18:03:19.544] Searching for globals ... DONE [18:03:19.544] Resolving globals: FALSE [18:03:19.545] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.545] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.545] - globals: [1] 'x' [18:03:19.545] [18:03:19.546] getGlobalsAndPackages() ... DONE [18:03:19.546] run() for 'Future' ... [18:03:19.546] - state: 'created' [18:03:19.546] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.560] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.560] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.560] - Field: 'node' [18:03:19.561] - Field: 'label' [18:03:19.561] - Field: 'local' [18:03:19.561] - Field: 'owner' [18:03:19.561] - Field: 'envir' [18:03:19.561] - Field: 'workers' [18:03:19.562] - Field: 'packages' [18:03:19.562] - Field: 'gc' [18:03:19.562] - Field: 'conditions' [18:03:19.562] - Field: 'persistent' [18:03:19.562] - Field: 'expr' [18:03:19.562] - Field: 'uuid' [18:03:19.563] - Field: 'seed' [18:03:19.563] - Field: 'version' [18:03:19.563] - Field: 'result' [18:03:19.563] - Field: 'asynchronous' [18:03:19.563] - Field: 'calls' [18:03:19.563] - Field: 'globals' [18:03:19.564] - Field: 'stdout' [18:03:19.564] - Field: 'earlySignal' [18:03:19.564] - Field: 'lazy' [18:03:19.564] - Field: 'state' [18:03:19.564] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.565] - Launch lazy future ... [18:03:19.565] Packages needed by the future expression (n = 0): [18:03:19.565] Packages needed by future strategies (n = 0): [18:03:19.566] { [18:03:19.566] { [18:03:19.566] { [18:03:19.566] ...future.startTime <- base::Sys.time() [18:03:19.566] { [18:03:19.566] { [18:03:19.566] { [18:03:19.566] { [18:03:19.566] base::local({ [18:03:19.566] has_future <- base::requireNamespace("future", [18:03:19.566] quietly = TRUE) [18:03:19.566] if (has_future) { [18:03:19.566] ns <- base::getNamespace("future") [18:03:19.566] version <- ns[[".package"]][["version"]] [18:03:19.566] if (is.null(version)) [18:03:19.566] version <- utils::packageVersion("future") [18:03:19.566] } [18:03:19.566] else { [18:03:19.566] version <- NULL [18:03:19.566] } [18:03:19.566] if (!has_future || version < "1.8.0") { [18:03:19.566] info <- base::c(r_version = base::gsub("R version ", [18:03:19.566] "", base::R.version$version.string), [18:03:19.566] platform = base::sprintf("%s (%s-bit)", [18:03:19.566] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.566] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.566] "release", "version")], collapse = " "), [18:03:19.566] hostname = base::Sys.info()[["nodename"]]) [18:03:19.566] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.566] info) [18:03:19.566] info <- base::paste(info, collapse = "; ") [18:03:19.566] if (!has_future) { [18:03:19.566] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.566] info) [18:03:19.566] } [18:03:19.566] else { [18:03:19.566] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.566] info, version) [18:03:19.566] } [18:03:19.566] base::stop(msg) [18:03:19.566] } [18:03:19.566] }) [18:03:19.566] } [18:03:19.566] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.566] base::options(mc.cores = 1L) [18:03:19.566] } [18:03:19.566] options(future.plan = NULL) [18:03:19.566] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.566] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.566] } [18:03:19.566] ...future.workdir <- getwd() [18:03:19.566] } [18:03:19.566] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.566] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.566] } [18:03:19.566] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.566] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.566] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.566] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.566] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.566] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.566] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.566] base::names(...future.oldOptions)) [18:03:19.566] } [18:03:19.566] if (FALSE) { [18:03:19.566] } [18:03:19.566] else { [18:03:19.566] if (TRUE) { [18:03:19.566] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.566] open = "w") [18:03:19.566] } [18:03:19.566] else { [18:03:19.566] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.566] windows = "NUL", "/dev/null"), open = "w") [18:03:19.566] } [18:03:19.566] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.566] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.566] base::sink(type = "output", split = FALSE) [18:03:19.566] base::close(...future.stdout) [18:03:19.566] }, add = TRUE) [18:03:19.566] } [18:03:19.566] ...future.frame <- base::sys.nframe() [18:03:19.566] ...future.conditions <- base::list() [18:03:19.566] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.566] if (FALSE) { [18:03:19.566] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.566] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.566] } [18:03:19.566] ...future.result <- base::tryCatch({ [18:03:19.566] base::withCallingHandlers({ [18:03:19.566] ...future.value <- base::withVisible(base::local({ [18:03:19.566] ...future.makeSendCondition <- local({ [18:03:19.566] sendCondition <- NULL [18:03:19.566] function(frame = 1L) { [18:03:19.566] if (is.function(sendCondition)) [18:03:19.566] return(sendCondition) [18:03:19.566] ns <- getNamespace("parallel") [18:03:19.566] if (exists("sendData", mode = "function", [18:03:19.566] envir = ns)) { [18:03:19.566] parallel_sendData <- get("sendData", mode = "function", [18:03:19.566] envir = ns) [18:03:19.566] envir <- sys.frame(frame) [18:03:19.566] master <- NULL [18:03:19.566] while (!identical(envir, .GlobalEnv) && [18:03:19.566] !identical(envir, emptyenv())) { [18:03:19.566] if (exists("master", mode = "list", envir = envir, [18:03:19.566] inherits = FALSE)) { [18:03:19.566] master <- get("master", mode = "list", [18:03:19.566] envir = envir, inherits = FALSE) [18:03:19.566] if (inherits(master, c("SOCKnode", [18:03:19.566] "SOCK0node"))) { [18:03:19.566] sendCondition <<- function(cond) { [18:03:19.566] data <- list(type = "VALUE", value = cond, [18:03:19.566] success = TRUE) [18:03:19.566] parallel_sendData(master, data) [18:03:19.566] } [18:03:19.566] return(sendCondition) [18:03:19.566] } [18:03:19.566] } [18:03:19.566] frame <- frame + 1L [18:03:19.566] envir <- sys.frame(frame) [18:03:19.566] } [18:03:19.566] } [18:03:19.566] sendCondition <<- function(cond) NULL [18:03:19.566] } [18:03:19.566] }) [18:03:19.566] withCallingHandlers({ [18:03:19.566] { [18:03:19.566] sample(x, size = 1L) [18:03:19.566] } [18:03:19.566] }, immediateCondition = function(cond) { [18:03:19.566] sendCondition <- ...future.makeSendCondition() [18:03:19.566] sendCondition(cond) [18:03:19.566] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.566] { [18:03:19.566] inherits <- base::inherits [18:03:19.566] invokeRestart <- base::invokeRestart [18:03:19.566] is.null <- base::is.null [18:03:19.566] muffled <- FALSE [18:03:19.566] if (inherits(cond, "message")) { [18:03:19.566] muffled <- grepl(pattern, "muffleMessage") [18:03:19.566] if (muffled) [18:03:19.566] invokeRestart("muffleMessage") [18:03:19.566] } [18:03:19.566] else if (inherits(cond, "warning")) { [18:03:19.566] muffled <- grepl(pattern, "muffleWarning") [18:03:19.566] if (muffled) [18:03:19.566] invokeRestart("muffleWarning") [18:03:19.566] } [18:03:19.566] else if (inherits(cond, "condition")) { [18:03:19.566] if (!is.null(pattern)) { [18:03:19.566] computeRestarts <- base::computeRestarts [18:03:19.566] grepl <- base::grepl [18:03:19.566] restarts <- computeRestarts(cond) [18:03:19.566] for (restart in restarts) { [18:03:19.566] name <- restart$name [18:03:19.566] if (is.null(name)) [18:03:19.566] next [18:03:19.566] if (!grepl(pattern, name)) [18:03:19.566] next [18:03:19.566] invokeRestart(restart) [18:03:19.566] muffled <- TRUE [18:03:19.566] break [18:03:19.566] } [18:03:19.566] } [18:03:19.566] } [18:03:19.566] invisible(muffled) [18:03:19.566] } [18:03:19.566] muffleCondition(cond) [18:03:19.566] }) [18:03:19.566] })) [18:03:19.566] future::FutureResult(value = ...future.value$value, [18:03:19.566] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.566] ...future.rng), globalenv = if (FALSE) [18:03:19.566] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.566] ...future.globalenv.names)) [18:03:19.566] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.566] }, condition = base::local({ [18:03:19.566] c <- base::c [18:03:19.566] inherits <- base::inherits [18:03:19.566] invokeRestart <- base::invokeRestart [18:03:19.566] length <- base::length [18:03:19.566] list <- base::list [18:03:19.566] seq.int <- base::seq.int [18:03:19.566] signalCondition <- base::signalCondition [18:03:19.566] sys.calls <- base::sys.calls [18:03:19.566] `[[` <- base::`[[` [18:03:19.566] `+` <- base::`+` [18:03:19.566] `<<-` <- base::`<<-` [18:03:19.566] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.566] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.566] 3L)] [18:03:19.566] } [18:03:19.566] function(cond) { [18:03:19.566] is_error <- inherits(cond, "error") [18:03:19.566] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.566] NULL) [18:03:19.566] if (is_error) { [18:03:19.566] sessionInformation <- function() { [18:03:19.566] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.566] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.566] search = base::search(), system = base::Sys.info()) [18:03:19.566] } [18:03:19.566] ...future.conditions[[length(...future.conditions) + [18:03:19.566] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.566] cond$call), session = sessionInformation(), [18:03:19.566] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.566] signalCondition(cond) [18:03:19.566] } [18:03:19.566] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.566] "immediateCondition"))) { [18:03:19.566] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.566] ...future.conditions[[length(...future.conditions) + [18:03:19.566] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.566] if (TRUE && !signal) { [18:03:19.566] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.566] { [18:03:19.566] inherits <- base::inherits [18:03:19.566] invokeRestart <- base::invokeRestart [18:03:19.566] is.null <- base::is.null [18:03:19.566] muffled <- FALSE [18:03:19.566] if (inherits(cond, "message")) { [18:03:19.566] muffled <- grepl(pattern, "muffleMessage") [18:03:19.566] if (muffled) [18:03:19.566] invokeRestart("muffleMessage") [18:03:19.566] } [18:03:19.566] else if (inherits(cond, "warning")) { [18:03:19.566] muffled <- grepl(pattern, "muffleWarning") [18:03:19.566] if (muffled) [18:03:19.566] invokeRestart("muffleWarning") [18:03:19.566] } [18:03:19.566] else if (inherits(cond, "condition")) { [18:03:19.566] if (!is.null(pattern)) { [18:03:19.566] computeRestarts <- base::computeRestarts [18:03:19.566] grepl <- base::grepl [18:03:19.566] restarts <- computeRestarts(cond) [18:03:19.566] for (restart in restarts) { [18:03:19.566] name <- restart$name [18:03:19.566] if (is.null(name)) [18:03:19.566] next [18:03:19.566] if (!grepl(pattern, name)) [18:03:19.566] next [18:03:19.566] invokeRestart(restart) [18:03:19.566] muffled <- TRUE [18:03:19.566] break [18:03:19.566] } [18:03:19.566] } [18:03:19.566] } [18:03:19.566] invisible(muffled) [18:03:19.566] } [18:03:19.566] muffleCondition(cond, pattern = "^muffle") [18:03:19.566] } [18:03:19.566] } [18:03:19.566] else { [18:03:19.566] if (TRUE) { [18:03:19.566] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.566] { [18:03:19.566] inherits <- base::inherits [18:03:19.566] invokeRestart <- base::invokeRestart [18:03:19.566] is.null <- base::is.null [18:03:19.566] muffled <- FALSE [18:03:19.566] if (inherits(cond, "message")) { [18:03:19.566] muffled <- grepl(pattern, "muffleMessage") [18:03:19.566] if (muffled) [18:03:19.566] invokeRestart("muffleMessage") [18:03:19.566] } [18:03:19.566] else if (inherits(cond, "warning")) { [18:03:19.566] muffled <- grepl(pattern, "muffleWarning") [18:03:19.566] if (muffled) [18:03:19.566] invokeRestart("muffleWarning") [18:03:19.566] } [18:03:19.566] else if (inherits(cond, "condition")) { [18:03:19.566] if (!is.null(pattern)) { [18:03:19.566] computeRestarts <- base::computeRestarts [18:03:19.566] grepl <- base::grepl [18:03:19.566] restarts <- computeRestarts(cond) [18:03:19.566] for (restart in restarts) { [18:03:19.566] name <- restart$name [18:03:19.566] if (is.null(name)) [18:03:19.566] next [18:03:19.566] if (!grepl(pattern, name)) [18:03:19.566] next [18:03:19.566] invokeRestart(restart) [18:03:19.566] muffled <- TRUE [18:03:19.566] break [18:03:19.566] } [18:03:19.566] } [18:03:19.566] } [18:03:19.566] invisible(muffled) [18:03:19.566] } [18:03:19.566] muffleCondition(cond, pattern = "^muffle") [18:03:19.566] } [18:03:19.566] } [18:03:19.566] } [18:03:19.566] })) [18:03:19.566] }, error = function(ex) { [18:03:19.566] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.566] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.566] ...future.rng), started = ...future.startTime, [18:03:19.566] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.566] version = "1.8"), class = "FutureResult") [18:03:19.566] }, finally = { [18:03:19.566] if (!identical(...future.workdir, getwd())) [18:03:19.566] setwd(...future.workdir) [18:03:19.566] { [18:03:19.566] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.566] ...future.oldOptions$nwarnings <- NULL [18:03:19.566] } [18:03:19.566] base::options(...future.oldOptions) [18:03:19.566] if (.Platform$OS.type == "windows") { [18:03:19.566] old_names <- names(...future.oldEnvVars) [18:03:19.566] envs <- base::Sys.getenv() [18:03:19.566] names <- names(envs) [18:03:19.566] common <- intersect(names, old_names) [18:03:19.566] added <- setdiff(names, old_names) [18:03:19.566] removed <- setdiff(old_names, names) [18:03:19.566] changed <- common[...future.oldEnvVars[common] != [18:03:19.566] envs[common]] [18:03:19.566] NAMES <- toupper(changed) [18:03:19.566] args <- list() [18:03:19.566] for (kk in seq_along(NAMES)) { [18:03:19.566] name <- changed[[kk]] [18:03:19.566] NAME <- NAMES[[kk]] [18:03:19.566] if (name != NAME && is.element(NAME, old_names)) [18:03:19.566] next [18:03:19.566] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.566] } [18:03:19.566] NAMES <- toupper(added) [18:03:19.566] for (kk in seq_along(NAMES)) { [18:03:19.566] name <- added[[kk]] [18:03:19.566] NAME <- NAMES[[kk]] [18:03:19.566] if (name != NAME && is.element(NAME, old_names)) [18:03:19.566] next [18:03:19.566] args[[name]] <- "" [18:03:19.566] } [18:03:19.566] NAMES <- toupper(removed) [18:03:19.566] for (kk in seq_along(NAMES)) { [18:03:19.566] name <- removed[[kk]] [18:03:19.566] NAME <- NAMES[[kk]] [18:03:19.566] if (name != NAME && is.element(NAME, old_names)) [18:03:19.566] next [18:03:19.566] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.566] } [18:03:19.566] if (length(args) > 0) [18:03:19.566] base::do.call(base::Sys.setenv, args = args) [18:03:19.566] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.566] } [18:03:19.566] else { [18:03:19.566] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.566] } [18:03:19.566] { [18:03:19.566] if (base::length(...future.futureOptionsAdded) > [18:03:19.566] 0L) { [18:03:19.566] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.566] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.566] base::options(opts) [18:03:19.566] } [18:03:19.566] { [18:03:19.566] { [18:03:19.566] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.566] NULL [18:03:19.566] } [18:03:19.566] options(future.plan = NULL) [18:03:19.566] if (is.na(NA_character_)) [18:03:19.566] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.566] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.566] future::plan(list(function (..., workers = availableCores(), [18:03:19.566] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.566] envir = parent.frame()) [18:03:19.566] { [18:03:19.566] if (is.function(workers)) [18:03:19.566] workers <- workers() [18:03:19.566] workers <- structure(as.integer(workers), [18:03:19.566] class = class(workers)) [18:03:19.566] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.566] workers >= 1) [18:03:19.566] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.566] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.566] } [18:03:19.566] future <- MultisessionFuture(..., workers = workers, [18:03:19.566] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.566] envir = envir) [18:03:19.566] if (!future$lazy) [18:03:19.566] future <- run(future) [18:03:19.566] invisible(future) [18:03:19.566] }), .cleanup = FALSE, .init = FALSE) [18:03:19.566] } [18:03:19.566] } [18:03:19.566] } [18:03:19.566] }) [18:03:19.566] if (TRUE) { [18:03:19.566] base::sink(type = "output", split = FALSE) [18:03:19.566] if (TRUE) { [18:03:19.566] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.566] } [18:03:19.566] else { [18:03:19.566] ...future.result["stdout"] <- base::list(NULL) [18:03:19.566] } [18:03:19.566] base::close(...future.stdout) [18:03:19.566] ...future.stdout <- NULL [18:03:19.566] } [18:03:19.566] ...future.result$conditions <- ...future.conditions [18:03:19.566] ...future.result$finished <- base::Sys.time() [18:03:19.566] ...future.result [18:03:19.566] } [18:03:19.571] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.571] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.571] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.572] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.572] MultisessionFuture started [18:03:19.573] - Launch lazy future ... done [18:03:19.573] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_1-460976' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f46ba928 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.589] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.589] - Validating connection of MultisessionFuture [18:03:19.589] - received message: FutureResult [18:03:19.589] - Received FutureResult [18:03:19.590] - Erased future from FutureRegistry [18:03:19.590] result() for ClusterFuture ... [18:03:19.590] - result already collected: FutureResult [18:03:19.590] result() for ClusterFuture ... done [18:03:19.590] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.591] getGlobalsAndPackages() ... [18:03:19.591] Searching for globals... [18:03:19.592] - globals found: [3] '{', 'sample', 'x' [18:03:19.592] Searching for globals ... DONE [18:03:19.592] Resolving globals: FALSE [18:03:19.593] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.593] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.593] - globals: [1] 'x' [18:03:19.594] [18:03:19.594] getGlobalsAndPackages() ... DONE [18:03:19.594] run() for 'Future' ... [18:03:19.594] - state: 'created' [18:03:19.594] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.608] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.608] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.608] - Field: 'node' [18:03:19.609] - Field: 'label' [18:03:19.609] - Field: 'local' [18:03:19.609] - Field: 'owner' [18:03:19.609] - Field: 'envir' [18:03:19.609] - Field: 'workers' [18:03:19.609] - Field: 'packages' [18:03:19.610] - Field: 'gc' [18:03:19.610] - Field: 'conditions' [18:03:19.610] - Field: 'persistent' [18:03:19.610] - Field: 'expr' [18:03:19.610] - Field: 'uuid' [18:03:19.611] - Field: 'seed' [18:03:19.611] - Field: 'version' [18:03:19.611] - Field: 'result' [18:03:19.611] - Field: 'asynchronous' [18:03:19.611] - Field: 'calls' [18:03:19.612] - Field: 'globals' [18:03:19.612] - Field: 'stdout' [18:03:19.612] - Field: 'earlySignal' [18:03:19.612] - Field: 'lazy' [18:03:19.612] - Field: 'state' [18:03:19.612] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.613] - Launch lazy future ... [18:03:19.613] Packages needed by the future expression (n = 0): [18:03:19.613] Packages needed by future strategies (n = 0): [18:03:19.614] { [18:03:19.614] { [18:03:19.614] { [18:03:19.614] ...future.startTime <- base::Sys.time() [18:03:19.614] { [18:03:19.614] { [18:03:19.614] { [18:03:19.614] { [18:03:19.614] base::local({ [18:03:19.614] has_future <- base::requireNamespace("future", [18:03:19.614] quietly = TRUE) [18:03:19.614] if (has_future) { [18:03:19.614] ns <- base::getNamespace("future") [18:03:19.614] version <- ns[[".package"]][["version"]] [18:03:19.614] if (is.null(version)) [18:03:19.614] version <- utils::packageVersion("future") [18:03:19.614] } [18:03:19.614] else { [18:03:19.614] version <- NULL [18:03:19.614] } [18:03:19.614] if (!has_future || version < "1.8.0") { [18:03:19.614] info <- base::c(r_version = base::gsub("R version ", [18:03:19.614] "", base::R.version$version.string), [18:03:19.614] platform = base::sprintf("%s (%s-bit)", [18:03:19.614] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.614] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.614] "release", "version")], collapse = " "), [18:03:19.614] hostname = base::Sys.info()[["nodename"]]) [18:03:19.614] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.614] info) [18:03:19.614] info <- base::paste(info, collapse = "; ") [18:03:19.614] if (!has_future) { [18:03:19.614] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.614] info) [18:03:19.614] } [18:03:19.614] else { [18:03:19.614] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.614] info, version) [18:03:19.614] } [18:03:19.614] base::stop(msg) [18:03:19.614] } [18:03:19.614] }) [18:03:19.614] } [18:03:19.614] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.614] base::options(mc.cores = 1L) [18:03:19.614] } [18:03:19.614] options(future.plan = NULL) [18:03:19.614] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.614] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.614] } [18:03:19.614] ...future.workdir <- getwd() [18:03:19.614] } [18:03:19.614] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.614] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.614] } [18:03:19.614] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.614] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.614] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.614] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.614] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.614] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.614] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.614] base::names(...future.oldOptions)) [18:03:19.614] } [18:03:19.614] if (FALSE) { [18:03:19.614] } [18:03:19.614] else { [18:03:19.614] if (TRUE) { [18:03:19.614] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.614] open = "w") [18:03:19.614] } [18:03:19.614] else { [18:03:19.614] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.614] windows = "NUL", "/dev/null"), open = "w") [18:03:19.614] } [18:03:19.614] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.614] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.614] base::sink(type = "output", split = FALSE) [18:03:19.614] base::close(...future.stdout) [18:03:19.614] }, add = TRUE) [18:03:19.614] } [18:03:19.614] ...future.frame <- base::sys.nframe() [18:03:19.614] ...future.conditions <- base::list() [18:03:19.614] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.614] if (FALSE) { [18:03:19.614] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.614] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.614] } [18:03:19.614] ...future.result <- base::tryCatch({ [18:03:19.614] base::withCallingHandlers({ [18:03:19.614] ...future.value <- base::withVisible(base::local({ [18:03:19.614] ...future.makeSendCondition <- local({ [18:03:19.614] sendCondition <- NULL [18:03:19.614] function(frame = 1L) { [18:03:19.614] if (is.function(sendCondition)) [18:03:19.614] return(sendCondition) [18:03:19.614] ns <- getNamespace("parallel") [18:03:19.614] if (exists("sendData", mode = "function", [18:03:19.614] envir = ns)) { [18:03:19.614] parallel_sendData <- get("sendData", mode = "function", [18:03:19.614] envir = ns) [18:03:19.614] envir <- sys.frame(frame) [18:03:19.614] master <- NULL [18:03:19.614] while (!identical(envir, .GlobalEnv) && [18:03:19.614] !identical(envir, emptyenv())) { [18:03:19.614] if (exists("master", mode = "list", envir = envir, [18:03:19.614] inherits = FALSE)) { [18:03:19.614] master <- get("master", mode = "list", [18:03:19.614] envir = envir, inherits = FALSE) [18:03:19.614] if (inherits(master, c("SOCKnode", [18:03:19.614] "SOCK0node"))) { [18:03:19.614] sendCondition <<- function(cond) { [18:03:19.614] data <- list(type = "VALUE", value = cond, [18:03:19.614] success = TRUE) [18:03:19.614] parallel_sendData(master, data) [18:03:19.614] } [18:03:19.614] return(sendCondition) [18:03:19.614] } [18:03:19.614] } [18:03:19.614] frame <- frame + 1L [18:03:19.614] envir <- sys.frame(frame) [18:03:19.614] } [18:03:19.614] } [18:03:19.614] sendCondition <<- function(cond) NULL [18:03:19.614] } [18:03:19.614] }) [18:03:19.614] withCallingHandlers({ [18:03:19.614] { [18:03:19.614] sample(x, size = 1L) [18:03:19.614] } [18:03:19.614] }, immediateCondition = function(cond) { [18:03:19.614] sendCondition <- ...future.makeSendCondition() [18:03:19.614] sendCondition(cond) [18:03:19.614] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.614] { [18:03:19.614] inherits <- base::inherits [18:03:19.614] invokeRestart <- base::invokeRestart [18:03:19.614] is.null <- base::is.null [18:03:19.614] muffled <- FALSE [18:03:19.614] if (inherits(cond, "message")) { [18:03:19.614] muffled <- grepl(pattern, "muffleMessage") [18:03:19.614] if (muffled) [18:03:19.614] invokeRestart("muffleMessage") [18:03:19.614] } [18:03:19.614] else if (inherits(cond, "warning")) { [18:03:19.614] muffled <- grepl(pattern, "muffleWarning") [18:03:19.614] if (muffled) [18:03:19.614] invokeRestart("muffleWarning") [18:03:19.614] } [18:03:19.614] else if (inherits(cond, "condition")) { [18:03:19.614] if (!is.null(pattern)) { [18:03:19.614] computeRestarts <- base::computeRestarts [18:03:19.614] grepl <- base::grepl [18:03:19.614] restarts <- computeRestarts(cond) [18:03:19.614] for (restart in restarts) { [18:03:19.614] name <- restart$name [18:03:19.614] if (is.null(name)) [18:03:19.614] next [18:03:19.614] if (!grepl(pattern, name)) [18:03:19.614] next [18:03:19.614] invokeRestart(restart) [18:03:19.614] muffled <- TRUE [18:03:19.614] break [18:03:19.614] } [18:03:19.614] } [18:03:19.614] } [18:03:19.614] invisible(muffled) [18:03:19.614] } [18:03:19.614] muffleCondition(cond) [18:03:19.614] }) [18:03:19.614] })) [18:03:19.614] future::FutureResult(value = ...future.value$value, [18:03:19.614] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.614] ...future.rng), globalenv = if (FALSE) [18:03:19.614] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.614] ...future.globalenv.names)) [18:03:19.614] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.614] }, condition = base::local({ [18:03:19.614] c <- base::c [18:03:19.614] inherits <- base::inherits [18:03:19.614] invokeRestart <- base::invokeRestart [18:03:19.614] length <- base::length [18:03:19.614] list <- base::list [18:03:19.614] seq.int <- base::seq.int [18:03:19.614] signalCondition <- base::signalCondition [18:03:19.614] sys.calls <- base::sys.calls [18:03:19.614] `[[` <- base::`[[` [18:03:19.614] `+` <- base::`+` [18:03:19.614] `<<-` <- base::`<<-` [18:03:19.614] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.614] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.614] 3L)] [18:03:19.614] } [18:03:19.614] function(cond) { [18:03:19.614] is_error <- inherits(cond, "error") [18:03:19.614] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.614] NULL) [18:03:19.614] if (is_error) { [18:03:19.614] sessionInformation <- function() { [18:03:19.614] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.614] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.614] search = base::search(), system = base::Sys.info()) [18:03:19.614] } [18:03:19.614] ...future.conditions[[length(...future.conditions) + [18:03:19.614] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.614] cond$call), session = sessionInformation(), [18:03:19.614] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.614] signalCondition(cond) [18:03:19.614] } [18:03:19.614] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.614] "immediateCondition"))) { [18:03:19.614] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.614] ...future.conditions[[length(...future.conditions) + [18:03:19.614] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.614] if (TRUE && !signal) { [18:03:19.614] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.614] { [18:03:19.614] inherits <- base::inherits [18:03:19.614] invokeRestart <- base::invokeRestart [18:03:19.614] is.null <- base::is.null [18:03:19.614] muffled <- FALSE [18:03:19.614] if (inherits(cond, "message")) { [18:03:19.614] muffled <- grepl(pattern, "muffleMessage") [18:03:19.614] if (muffled) [18:03:19.614] invokeRestart("muffleMessage") [18:03:19.614] } [18:03:19.614] else if (inherits(cond, "warning")) { [18:03:19.614] muffled <- grepl(pattern, "muffleWarning") [18:03:19.614] if (muffled) [18:03:19.614] invokeRestart("muffleWarning") [18:03:19.614] } [18:03:19.614] else if (inherits(cond, "condition")) { [18:03:19.614] if (!is.null(pattern)) { [18:03:19.614] computeRestarts <- base::computeRestarts [18:03:19.614] grepl <- base::grepl [18:03:19.614] restarts <- computeRestarts(cond) [18:03:19.614] for (restart in restarts) { [18:03:19.614] name <- restart$name [18:03:19.614] if (is.null(name)) [18:03:19.614] next [18:03:19.614] if (!grepl(pattern, name)) [18:03:19.614] next [18:03:19.614] invokeRestart(restart) [18:03:19.614] muffled <- TRUE [18:03:19.614] break [18:03:19.614] } [18:03:19.614] } [18:03:19.614] } [18:03:19.614] invisible(muffled) [18:03:19.614] } [18:03:19.614] muffleCondition(cond, pattern = "^muffle") [18:03:19.614] } [18:03:19.614] } [18:03:19.614] else { [18:03:19.614] if (TRUE) { [18:03:19.614] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.614] { [18:03:19.614] inherits <- base::inherits [18:03:19.614] invokeRestart <- base::invokeRestart [18:03:19.614] is.null <- base::is.null [18:03:19.614] muffled <- FALSE [18:03:19.614] if (inherits(cond, "message")) { [18:03:19.614] muffled <- grepl(pattern, "muffleMessage") [18:03:19.614] if (muffled) [18:03:19.614] invokeRestart("muffleMessage") [18:03:19.614] } [18:03:19.614] else if (inherits(cond, "warning")) { [18:03:19.614] muffled <- grepl(pattern, "muffleWarning") [18:03:19.614] if (muffled) [18:03:19.614] invokeRestart("muffleWarning") [18:03:19.614] } [18:03:19.614] else if (inherits(cond, "condition")) { [18:03:19.614] if (!is.null(pattern)) { [18:03:19.614] computeRestarts <- base::computeRestarts [18:03:19.614] grepl <- base::grepl [18:03:19.614] restarts <- computeRestarts(cond) [18:03:19.614] for (restart in restarts) { [18:03:19.614] name <- restart$name [18:03:19.614] if (is.null(name)) [18:03:19.614] next [18:03:19.614] if (!grepl(pattern, name)) [18:03:19.614] next [18:03:19.614] invokeRestart(restart) [18:03:19.614] muffled <- TRUE [18:03:19.614] break [18:03:19.614] } [18:03:19.614] } [18:03:19.614] } [18:03:19.614] invisible(muffled) [18:03:19.614] } [18:03:19.614] muffleCondition(cond, pattern = "^muffle") [18:03:19.614] } [18:03:19.614] } [18:03:19.614] } [18:03:19.614] })) [18:03:19.614] }, error = function(ex) { [18:03:19.614] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.614] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.614] ...future.rng), started = ...future.startTime, [18:03:19.614] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.614] version = "1.8"), class = "FutureResult") [18:03:19.614] }, finally = { [18:03:19.614] if (!identical(...future.workdir, getwd())) [18:03:19.614] setwd(...future.workdir) [18:03:19.614] { [18:03:19.614] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.614] ...future.oldOptions$nwarnings <- NULL [18:03:19.614] } [18:03:19.614] base::options(...future.oldOptions) [18:03:19.614] if (.Platform$OS.type == "windows") { [18:03:19.614] old_names <- names(...future.oldEnvVars) [18:03:19.614] envs <- base::Sys.getenv() [18:03:19.614] names <- names(envs) [18:03:19.614] common <- intersect(names, old_names) [18:03:19.614] added <- setdiff(names, old_names) [18:03:19.614] removed <- setdiff(old_names, names) [18:03:19.614] changed <- common[...future.oldEnvVars[common] != [18:03:19.614] envs[common]] [18:03:19.614] NAMES <- toupper(changed) [18:03:19.614] args <- list() [18:03:19.614] for (kk in seq_along(NAMES)) { [18:03:19.614] name <- changed[[kk]] [18:03:19.614] NAME <- NAMES[[kk]] [18:03:19.614] if (name != NAME && is.element(NAME, old_names)) [18:03:19.614] next [18:03:19.614] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.614] } [18:03:19.614] NAMES <- toupper(added) [18:03:19.614] for (kk in seq_along(NAMES)) { [18:03:19.614] name <- added[[kk]] [18:03:19.614] NAME <- NAMES[[kk]] [18:03:19.614] if (name != NAME && is.element(NAME, old_names)) [18:03:19.614] next [18:03:19.614] args[[name]] <- "" [18:03:19.614] } [18:03:19.614] NAMES <- toupper(removed) [18:03:19.614] for (kk in seq_along(NAMES)) { [18:03:19.614] name <- removed[[kk]] [18:03:19.614] NAME <- NAMES[[kk]] [18:03:19.614] if (name != NAME && is.element(NAME, old_names)) [18:03:19.614] next [18:03:19.614] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.614] } [18:03:19.614] if (length(args) > 0) [18:03:19.614] base::do.call(base::Sys.setenv, args = args) [18:03:19.614] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.614] } [18:03:19.614] else { [18:03:19.614] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.614] } [18:03:19.614] { [18:03:19.614] if (base::length(...future.futureOptionsAdded) > [18:03:19.614] 0L) { [18:03:19.614] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.614] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.614] base::options(opts) [18:03:19.614] } [18:03:19.614] { [18:03:19.614] { [18:03:19.614] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.614] NULL [18:03:19.614] } [18:03:19.614] options(future.plan = NULL) [18:03:19.614] if (is.na(NA_character_)) [18:03:19.614] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.614] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.614] future::plan(list(function (..., workers = availableCores(), [18:03:19.614] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.614] envir = parent.frame()) [18:03:19.614] { [18:03:19.614] if (is.function(workers)) [18:03:19.614] workers <- workers() [18:03:19.614] workers <- structure(as.integer(workers), [18:03:19.614] class = class(workers)) [18:03:19.614] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.614] workers >= 1) [18:03:19.614] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.614] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.614] } [18:03:19.614] future <- MultisessionFuture(..., workers = workers, [18:03:19.614] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.614] envir = envir) [18:03:19.614] if (!future$lazy) [18:03:19.614] future <- run(future) [18:03:19.614] invisible(future) [18:03:19.614] }), .cleanup = FALSE, .init = FALSE) [18:03:19.614] } [18:03:19.614] } [18:03:19.614] } [18:03:19.614] }) [18:03:19.614] if (TRUE) { [18:03:19.614] base::sink(type = "output", split = FALSE) [18:03:19.614] if (TRUE) { [18:03:19.614] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.614] } [18:03:19.614] else { [18:03:19.614] ...future.result["stdout"] <- base::list(NULL) [18:03:19.614] } [18:03:19.614] base::close(...future.stdout) [18:03:19.614] ...future.stdout <- NULL [18:03:19.614] } [18:03:19.614] ...future.result$conditions <- ...future.conditions [18:03:19.614] ...future.result$finished <- base::Sys.time() [18:03:19.614] ...future.result [18:03:19.614] } [18:03:19.619] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.619] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.620] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.620] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.620] MultisessionFuture started [18:03:19.621] - Launch lazy future ... done [18:03:19.621] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_2-214897' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f46ba928 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.637] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.637] - Validating connection of MultisessionFuture [18:03:19.637] - received message: FutureResult [18:03:19.637] - Received FutureResult [18:03:19.637] - Erased future from FutureRegistry [18:03:19.638] result() for ClusterFuture ... [18:03:19.638] - result already collected: FutureResult [18:03:19.638] result() for ClusterFuture ... done [18:03:19.638] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.638] getGlobalsAndPackages() ... [18:03:19.639] Searching for globals... [18:03:19.640] - globals found: [3] '{', 'sample', 'x' [18:03:19.640] Searching for globals ... DONE [18:03:19.640] Resolving globals: FALSE [18:03:19.641] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.641] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.641] - globals: [1] 'x' [18:03:19.641] [18:03:19.642] getGlobalsAndPackages() ... DONE [18:03:19.642] run() for 'Future' ... [18:03:19.642] - state: 'created' [18:03:19.642] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.656] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.656] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.656] - Field: 'node' [18:03:19.656] - Field: 'label' [18:03:19.656] - Field: 'local' [18:03:19.657] - Field: 'owner' [18:03:19.657] - Field: 'envir' [18:03:19.657] - Field: 'workers' [18:03:19.657] - Field: 'packages' [18:03:19.657] - Field: 'gc' [18:03:19.657] - Field: 'conditions' [18:03:19.658] - Field: 'persistent' [18:03:19.658] - Field: 'expr' [18:03:19.658] - Field: 'uuid' [18:03:19.658] - Field: 'seed' [18:03:19.658] - Field: 'version' [18:03:19.659] - Field: 'result' [18:03:19.659] - Field: 'asynchronous' [18:03:19.659] - Field: 'calls' [18:03:19.659] - Field: 'globals' [18:03:19.659] - Field: 'stdout' [18:03:19.659] - Field: 'earlySignal' [18:03:19.660] - Field: 'lazy' [18:03:19.660] - Field: 'state' [18:03:19.660] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.660] - Launch lazy future ... [18:03:19.661] Packages needed by the future expression (n = 0): [18:03:19.661] Packages needed by future strategies (n = 0): [18:03:19.661] { [18:03:19.661] { [18:03:19.661] { [18:03:19.661] ...future.startTime <- base::Sys.time() [18:03:19.661] { [18:03:19.661] { [18:03:19.661] { [18:03:19.661] { [18:03:19.661] base::local({ [18:03:19.661] has_future <- base::requireNamespace("future", [18:03:19.661] quietly = TRUE) [18:03:19.661] if (has_future) { [18:03:19.661] ns <- base::getNamespace("future") [18:03:19.661] version <- ns[[".package"]][["version"]] [18:03:19.661] if (is.null(version)) [18:03:19.661] version <- utils::packageVersion("future") [18:03:19.661] } [18:03:19.661] else { [18:03:19.661] version <- NULL [18:03:19.661] } [18:03:19.661] if (!has_future || version < "1.8.0") { [18:03:19.661] info <- base::c(r_version = base::gsub("R version ", [18:03:19.661] "", base::R.version$version.string), [18:03:19.661] platform = base::sprintf("%s (%s-bit)", [18:03:19.661] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.661] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.661] "release", "version")], collapse = " "), [18:03:19.661] hostname = base::Sys.info()[["nodename"]]) [18:03:19.661] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.661] info) [18:03:19.661] info <- base::paste(info, collapse = "; ") [18:03:19.661] if (!has_future) { [18:03:19.661] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.661] info) [18:03:19.661] } [18:03:19.661] else { [18:03:19.661] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.661] info, version) [18:03:19.661] } [18:03:19.661] base::stop(msg) [18:03:19.661] } [18:03:19.661] }) [18:03:19.661] } [18:03:19.661] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.661] base::options(mc.cores = 1L) [18:03:19.661] } [18:03:19.661] options(future.plan = NULL) [18:03:19.661] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.661] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.661] } [18:03:19.661] ...future.workdir <- getwd() [18:03:19.661] } [18:03:19.661] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.661] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.661] } [18:03:19.661] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.661] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.661] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.661] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.661] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.661] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.661] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.661] base::names(...future.oldOptions)) [18:03:19.661] } [18:03:19.661] if (FALSE) { [18:03:19.661] } [18:03:19.661] else { [18:03:19.661] if (TRUE) { [18:03:19.661] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.661] open = "w") [18:03:19.661] } [18:03:19.661] else { [18:03:19.661] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.661] windows = "NUL", "/dev/null"), open = "w") [18:03:19.661] } [18:03:19.661] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.661] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.661] base::sink(type = "output", split = FALSE) [18:03:19.661] base::close(...future.stdout) [18:03:19.661] }, add = TRUE) [18:03:19.661] } [18:03:19.661] ...future.frame <- base::sys.nframe() [18:03:19.661] ...future.conditions <- base::list() [18:03:19.661] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.661] if (FALSE) { [18:03:19.661] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.661] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.661] } [18:03:19.661] ...future.result <- base::tryCatch({ [18:03:19.661] base::withCallingHandlers({ [18:03:19.661] ...future.value <- base::withVisible(base::local({ [18:03:19.661] ...future.makeSendCondition <- local({ [18:03:19.661] sendCondition <- NULL [18:03:19.661] function(frame = 1L) { [18:03:19.661] if (is.function(sendCondition)) [18:03:19.661] return(sendCondition) [18:03:19.661] ns <- getNamespace("parallel") [18:03:19.661] if (exists("sendData", mode = "function", [18:03:19.661] envir = ns)) { [18:03:19.661] parallel_sendData <- get("sendData", mode = "function", [18:03:19.661] envir = ns) [18:03:19.661] envir <- sys.frame(frame) [18:03:19.661] master <- NULL [18:03:19.661] while (!identical(envir, .GlobalEnv) && [18:03:19.661] !identical(envir, emptyenv())) { [18:03:19.661] if (exists("master", mode = "list", envir = envir, [18:03:19.661] inherits = FALSE)) { [18:03:19.661] master <- get("master", mode = "list", [18:03:19.661] envir = envir, inherits = FALSE) [18:03:19.661] if (inherits(master, c("SOCKnode", [18:03:19.661] "SOCK0node"))) { [18:03:19.661] sendCondition <<- function(cond) { [18:03:19.661] data <- list(type = "VALUE", value = cond, [18:03:19.661] success = TRUE) [18:03:19.661] parallel_sendData(master, data) [18:03:19.661] } [18:03:19.661] return(sendCondition) [18:03:19.661] } [18:03:19.661] } [18:03:19.661] frame <- frame + 1L [18:03:19.661] envir <- sys.frame(frame) [18:03:19.661] } [18:03:19.661] } [18:03:19.661] sendCondition <<- function(cond) NULL [18:03:19.661] } [18:03:19.661] }) [18:03:19.661] withCallingHandlers({ [18:03:19.661] { [18:03:19.661] sample(x, size = 1L) [18:03:19.661] } [18:03:19.661] }, immediateCondition = function(cond) { [18:03:19.661] sendCondition <- ...future.makeSendCondition() [18:03:19.661] sendCondition(cond) [18:03:19.661] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.661] { [18:03:19.661] inherits <- base::inherits [18:03:19.661] invokeRestart <- base::invokeRestart [18:03:19.661] is.null <- base::is.null [18:03:19.661] muffled <- FALSE [18:03:19.661] if (inherits(cond, "message")) { [18:03:19.661] muffled <- grepl(pattern, "muffleMessage") [18:03:19.661] if (muffled) [18:03:19.661] invokeRestart("muffleMessage") [18:03:19.661] } [18:03:19.661] else if (inherits(cond, "warning")) { [18:03:19.661] muffled <- grepl(pattern, "muffleWarning") [18:03:19.661] if (muffled) [18:03:19.661] invokeRestart("muffleWarning") [18:03:19.661] } [18:03:19.661] else if (inherits(cond, "condition")) { [18:03:19.661] if (!is.null(pattern)) { [18:03:19.661] computeRestarts <- base::computeRestarts [18:03:19.661] grepl <- base::grepl [18:03:19.661] restarts <- computeRestarts(cond) [18:03:19.661] for (restart in restarts) { [18:03:19.661] name <- restart$name [18:03:19.661] if (is.null(name)) [18:03:19.661] next [18:03:19.661] if (!grepl(pattern, name)) [18:03:19.661] next [18:03:19.661] invokeRestart(restart) [18:03:19.661] muffled <- TRUE [18:03:19.661] break [18:03:19.661] } [18:03:19.661] } [18:03:19.661] } [18:03:19.661] invisible(muffled) [18:03:19.661] } [18:03:19.661] muffleCondition(cond) [18:03:19.661] }) [18:03:19.661] })) [18:03:19.661] future::FutureResult(value = ...future.value$value, [18:03:19.661] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.661] ...future.rng), globalenv = if (FALSE) [18:03:19.661] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.661] ...future.globalenv.names)) [18:03:19.661] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.661] }, condition = base::local({ [18:03:19.661] c <- base::c [18:03:19.661] inherits <- base::inherits [18:03:19.661] invokeRestart <- base::invokeRestart [18:03:19.661] length <- base::length [18:03:19.661] list <- base::list [18:03:19.661] seq.int <- base::seq.int [18:03:19.661] signalCondition <- base::signalCondition [18:03:19.661] sys.calls <- base::sys.calls [18:03:19.661] `[[` <- base::`[[` [18:03:19.661] `+` <- base::`+` [18:03:19.661] `<<-` <- base::`<<-` [18:03:19.661] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.661] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.661] 3L)] [18:03:19.661] } [18:03:19.661] function(cond) { [18:03:19.661] is_error <- inherits(cond, "error") [18:03:19.661] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.661] NULL) [18:03:19.661] if (is_error) { [18:03:19.661] sessionInformation <- function() { [18:03:19.661] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.661] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.661] search = base::search(), system = base::Sys.info()) [18:03:19.661] } [18:03:19.661] ...future.conditions[[length(...future.conditions) + [18:03:19.661] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.661] cond$call), session = sessionInformation(), [18:03:19.661] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.661] signalCondition(cond) [18:03:19.661] } [18:03:19.661] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.661] "immediateCondition"))) { [18:03:19.661] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.661] ...future.conditions[[length(...future.conditions) + [18:03:19.661] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.661] if (TRUE && !signal) { [18:03:19.661] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.661] { [18:03:19.661] inherits <- base::inherits [18:03:19.661] invokeRestart <- base::invokeRestart [18:03:19.661] is.null <- base::is.null [18:03:19.661] muffled <- FALSE [18:03:19.661] if (inherits(cond, "message")) { [18:03:19.661] muffled <- grepl(pattern, "muffleMessage") [18:03:19.661] if (muffled) [18:03:19.661] invokeRestart("muffleMessage") [18:03:19.661] } [18:03:19.661] else if (inherits(cond, "warning")) { [18:03:19.661] muffled <- grepl(pattern, "muffleWarning") [18:03:19.661] if (muffled) [18:03:19.661] invokeRestart("muffleWarning") [18:03:19.661] } [18:03:19.661] else if (inherits(cond, "condition")) { [18:03:19.661] if (!is.null(pattern)) { [18:03:19.661] computeRestarts <- base::computeRestarts [18:03:19.661] grepl <- base::grepl [18:03:19.661] restarts <- computeRestarts(cond) [18:03:19.661] for (restart in restarts) { [18:03:19.661] name <- restart$name [18:03:19.661] if (is.null(name)) [18:03:19.661] next [18:03:19.661] if (!grepl(pattern, name)) [18:03:19.661] next [18:03:19.661] invokeRestart(restart) [18:03:19.661] muffled <- TRUE [18:03:19.661] break [18:03:19.661] } [18:03:19.661] } [18:03:19.661] } [18:03:19.661] invisible(muffled) [18:03:19.661] } [18:03:19.661] muffleCondition(cond, pattern = "^muffle") [18:03:19.661] } [18:03:19.661] } [18:03:19.661] else { [18:03:19.661] if (TRUE) { [18:03:19.661] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.661] { [18:03:19.661] inherits <- base::inherits [18:03:19.661] invokeRestart <- base::invokeRestart [18:03:19.661] is.null <- base::is.null [18:03:19.661] muffled <- FALSE [18:03:19.661] if (inherits(cond, "message")) { [18:03:19.661] muffled <- grepl(pattern, "muffleMessage") [18:03:19.661] if (muffled) [18:03:19.661] invokeRestart("muffleMessage") [18:03:19.661] } [18:03:19.661] else if (inherits(cond, "warning")) { [18:03:19.661] muffled <- grepl(pattern, "muffleWarning") [18:03:19.661] if (muffled) [18:03:19.661] invokeRestart("muffleWarning") [18:03:19.661] } [18:03:19.661] else if (inherits(cond, "condition")) { [18:03:19.661] if (!is.null(pattern)) { [18:03:19.661] computeRestarts <- base::computeRestarts [18:03:19.661] grepl <- base::grepl [18:03:19.661] restarts <- computeRestarts(cond) [18:03:19.661] for (restart in restarts) { [18:03:19.661] name <- restart$name [18:03:19.661] if (is.null(name)) [18:03:19.661] next [18:03:19.661] if (!grepl(pattern, name)) [18:03:19.661] next [18:03:19.661] invokeRestart(restart) [18:03:19.661] muffled <- TRUE [18:03:19.661] break [18:03:19.661] } [18:03:19.661] } [18:03:19.661] } [18:03:19.661] invisible(muffled) [18:03:19.661] } [18:03:19.661] muffleCondition(cond, pattern = "^muffle") [18:03:19.661] } [18:03:19.661] } [18:03:19.661] } [18:03:19.661] })) [18:03:19.661] }, error = function(ex) { [18:03:19.661] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.661] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.661] ...future.rng), started = ...future.startTime, [18:03:19.661] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.661] version = "1.8"), class = "FutureResult") [18:03:19.661] }, finally = { [18:03:19.661] if (!identical(...future.workdir, getwd())) [18:03:19.661] setwd(...future.workdir) [18:03:19.661] { [18:03:19.661] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.661] ...future.oldOptions$nwarnings <- NULL [18:03:19.661] } [18:03:19.661] base::options(...future.oldOptions) [18:03:19.661] if (.Platform$OS.type == "windows") { [18:03:19.661] old_names <- names(...future.oldEnvVars) [18:03:19.661] envs <- base::Sys.getenv() [18:03:19.661] names <- names(envs) [18:03:19.661] common <- intersect(names, old_names) [18:03:19.661] added <- setdiff(names, old_names) [18:03:19.661] removed <- setdiff(old_names, names) [18:03:19.661] changed <- common[...future.oldEnvVars[common] != [18:03:19.661] envs[common]] [18:03:19.661] NAMES <- toupper(changed) [18:03:19.661] args <- list() [18:03:19.661] for (kk in seq_along(NAMES)) { [18:03:19.661] name <- changed[[kk]] [18:03:19.661] NAME <- NAMES[[kk]] [18:03:19.661] if (name != NAME && is.element(NAME, old_names)) [18:03:19.661] next [18:03:19.661] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.661] } [18:03:19.661] NAMES <- toupper(added) [18:03:19.661] for (kk in seq_along(NAMES)) { [18:03:19.661] name <- added[[kk]] [18:03:19.661] NAME <- NAMES[[kk]] [18:03:19.661] if (name != NAME && is.element(NAME, old_names)) [18:03:19.661] next [18:03:19.661] args[[name]] <- "" [18:03:19.661] } [18:03:19.661] NAMES <- toupper(removed) [18:03:19.661] for (kk in seq_along(NAMES)) { [18:03:19.661] name <- removed[[kk]] [18:03:19.661] NAME <- NAMES[[kk]] [18:03:19.661] if (name != NAME && is.element(NAME, old_names)) [18:03:19.661] next [18:03:19.661] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.661] } [18:03:19.661] if (length(args) > 0) [18:03:19.661] base::do.call(base::Sys.setenv, args = args) [18:03:19.661] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.661] } [18:03:19.661] else { [18:03:19.661] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.661] } [18:03:19.661] { [18:03:19.661] if (base::length(...future.futureOptionsAdded) > [18:03:19.661] 0L) { [18:03:19.661] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.661] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.661] base::options(opts) [18:03:19.661] } [18:03:19.661] { [18:03:19.661] { [18:03:19.661] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.661] NULL [18:03:19.661] } [18:03:19.661] options(future.plan = NULL) [18:03:19.661] if (is.na(NA_character_)) [18:03:19.661] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.661] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.661] future::plan(list(function (..., workers = availableCores(), [18:03:19.661] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.661] envir = parent.frame()) [18:03:19.661] { [18:03:19.661] if (is.function(workers)) [18:03:19.661] workers <- workers() [18:03:19.661] workers <- structure(as.integer(workers), [18:03:19.661] class = class(workers)) [18:03:19.661] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.661] workers >= 1) [18:03:19.661] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.661] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.661] } [18:03:19.661] future <- MultisessionFuture(..., workers = workers, [18:03:19.661] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.661] envir = envir) [18:03:19.661] if (!future$lazy) [18:03:19.661] future <- run(future) [18:03:19.661] invisible(future) [18:03:19.661] }), .cleanup = FALSE, .init = FALSE) [18:03:19.661] } [18:03:19.661] } [18:03:19.661] } [18:03:19.661] }) [18:03:19.661] if (TRUE) { [18:03:19.661] base::sink(type = "output", split = FALSE) [18:03:19.661] if (TRUE) { [18:03:19.661] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.661] } [18:03:19.661] else { [18:03:19.661] ...future.result["stdout"] <- base::list(NULL) [18:03:19.661] } [18:03:19.661] base::close(...future.stdout) [18:03:19.661] ...future.stdout <- NULL [18:03:19.661] } [18:03:19.661] ...future.result$conditions <- ...future.conditions [18:03:19.661] ...future.result$finished <- base::Sys.time() [18:03:19.661] ...future.result [18:03:19.661] } [18:03:19.667] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.667] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.667] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.667] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.668] MultisessionFuture started [18:03:19.668] - Launch lazy future ... done [18:03:19.668] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_3-663550' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f46ba928 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.683] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.684] - Validating connection of MultisessionFuture [18:03:19.684] - received message: FutureResult [18:03:19.684] - Received FutureResult [18:03:19.684] - Erased future from FutureRegistry [18:03:19.685] result() for ClusterFuture ... [18:03:19.685] - result already collected: FutureResult [18:03:19.685] result() for ClusterFuture ... done [18:03:19.685] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.685] getGlobalsAndPackages() ... [18:03:19.685] Searching for globals... [18:03:19.687] - globals found: [3] '{', 'sample', 'x' [18:03:19.687] Searching for globals ... DONE [18:03:19.687] Resolving globals: FALSE [18:03:19.687] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.688] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.688] - globals: [1] 'x' [18:03:19.688] [18:03:19.688] getGlobalsAndPackages() ... DONE [18:03:19.689] run() for 'Future' ... [18:03:19.689] - state: 'created' [18:03:19.689] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.702] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.703] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.703] - Field: 'node' [18:03:19.703] - Field: 'label' [18:03:19.703] - Field: 'local' [18:03:19.703] - Field: 'owner' [18:03:19.704] - Field: 'envir' [18:03:19.704] - Field: 'workers' [18:03:19.704] - Field: 'packages' [18:03:19.704] - Field: 'gc' [18:03:19.704] - Field: 'conditions' [18:03:19.705] - Field: 'persistent' [18:03:19.705] - Field: 'expr' [18:03:19.705] - Field: 'uuid' [18:03:19.705] - Field: 'seed' [18:03:19.705] - Field: 'version' [18:03:19.706] - Field: 'result' [18:03:19.706] - Field: 'asynchronous' [18:03:19.706] - Field: 'calls' [18:03:19.706] - Field: 'globals' [18:03:19.706] - Field: 'stdout' [18:03:19.706] - Field: 'earlySignal' [18:03:19.707] - Field: 'lazy' [18:03:19.707] - Field: 'state' [18:03:19.707] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.707] - Launch lazy future ... [18:03:19.707] Packages needed by the future expression (n = 0): [18:03:19.708] Packages needed by future strategies (n = 0): [18:03:19.708] { [18:03:19.708] { [18:03:19.708] { [18:03:19.708] ...future.startTime <- base::Sys.time() [18:03:19.708] { [18:03:19.708] { [18:03:19.708] { [18:03:19.708] { [18:03:19.708] base::local({ [18:03:19.708] has_future <- base::requireNamespace("future", [18:03:19.708] quietly = TRUE) [18:03:19.708] if (has_future) { [18:03:19.708] ns <- base::getNamespace("future") [18:03:19.708] version <- ns[[".package"]][["version"]] [18:03:19.708] if (is.null(version)) [18:03:19.708] version <- utils::packageVersion("future") [18:03:19.708] } [18:03:19.708] else { [18:03:19.708] version <- NULL [18:03:19.708] } [18:03:19.708] if (!has_future || version < "1.8.0") { [18:03:19.708] info <- base::c(r_version = base::gsub("R version ", [18:03:19.708] "", base::R.version$version.string), [18:03:19.708] platform = base::sprintf("%s (%s-bit)", [18:03:19.708] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.708] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.708] "release", "version")], collapse = " "), [18:03:19.708] hostname = base::Sys.info()[["nodename"]]) [18:03:19.708] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.708] info) [18:03:19.708] info <- base::paste(info, collapse = "; ") [18:03:19.708] if (!has_future) { [18:03:19.708] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.708] info) [18:03:19.708] } [18:03:19.708] else { [18:03:19.708] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.708] info, version) [18:03:19.708] } [18:03:19.708] base::stop(msg) [18:03:19.708] } [18:03:19.708] }) [18:03:19.708] } [18:03:19.708] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.708] base::options(mc.cores = 1L) [18:03:19.708] } [18:03:19.708] options(future.plan = NULL) [18:03:19.708] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.708] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.708] } [18:03:19.708] ...future.workdir <- getwd() [18:03:19.708] } [18:03:19.708] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.708] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.708] } [18:03:19.708] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.708] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.708] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.708] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.708] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.708] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.708] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.708] base::names(...future.oldOptions)) [18:03:19.708] } [18:03:19.708] if (FALSE) { [18:03:19.708] } [18:03:19.708] else { [18:03:19.708] if (TRUE) { [18:03:19.708] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.708] open = "w") [18:03:19.708] } [18:03:19.708] else { [18:03:19.708] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.708] windows = "NUL", "/dev/null"), open = "w") [18:03:19.708] } [18:03:19.708] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.708] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.708] base::sink(type = "output", split = FALSE) [18:03:19.708] base::close(...future.stdout) [18:03:19.708] }, add = TRUE) [18:03:19.708] } [18:03:19.708] ...future.frame <- base::sys.nframe() [18:03:19.708] ...future.conditions <- base::list() [18:03:19.708] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.708] if (FALSE) { [18:03:19.708] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.708] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.708] } [18:03:19.708] ...future.result <- base::tryCatch({ [18:03:19.708] base::withCallingHandlers({ [18:03:19.708] ...future.value <- base::withVisible(base::local({ [18:03:19.708] ...future.makeSendCondition <- local({ [18:03:19.708] sendCondition <- NULL [18:03:19.708] function(frame = 1L) { [18:03:19.708] if (is.function(sendCondition)) [18:03:19.708] return(sendCondition) [18:03:19.708] ns <- getNamespace("parallel") [18:03:19.708] if (exists("sendData", mode = "function", [18:03:19.708] envir = ns)) { [18:03:19.708] parallel_sendData <- get("sendData", mode = "function", [18:03:19.708] envir = ns) [18:03:19.708] envir <- sys.frame(frame) [18:03:19.708] master <- NULL [18:03:19.708] while (!identical(envir, .GlobalEnv) && [18:03:19.708] !identical(envir, emptyenv())) { [18:03:19.708] if (exists("master", mode = "list", envir = envir, [18:03:19.708] inherits = FALSE)) { [18:03:19.708] master <- get("master", mode = "list", [18:03:19.708] envir = envir, inherits = FALSE) [18:03:19.708] if (inherits(master, c("SOCKnode", [18:03:19.708] "SOCK0node"))) { [18:03:19.708] sendCondition <<- function(cond) { [18:03:19.708] data <- list(type = "VALUE", value = cond, [18:03:19.708] success = TRUE) [18:03:19.708] parallel_sendData(master, data) [18:03:19.708] } [18:03:19.708] return(sendCondition) [18:03:19.708] } [18:03:19.708] } [18:03:19.708] frame <- frame + 1L [18:03:19.708] envir <- sys.frame(frame) [18:03:19.708] } [18:03:19.708] } [18:03:19.708] sendCondition <<- function(cond) NULL [18:03:19.708] } [18:03:19.708] }) [18:03:19.708] withCallingHandlers({ [18:03:19.708] { [18:03:19.708] sample(x, size = 1L) [18:03:19.708] } [18:03:19.708] }, immediateCondition = function(cond) { [18:03:19.708] sendCondition <- ...future.makeSendCondition() [18:03:19.708] sendCondition(cond) [18:03:19.708] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.708] { [18:03:19.708] inherits <- base::inherits [18:03:19.708] invokeRestart <- base::invokeRestart [18:03:19.708] is.null <- base::is.null [18:03:19.708] muffled <- FALSE [18:03:19.708] if (inherits(cond, "message")) { [18:03:19.708] muffled <- grepl(pattern, "muffleMessage") [18:03:19.708] if (muffled) [18:03:19.708] invokeRestart("muffleMessage") [18:03:19.708] } [18:03:19.708] else if (inherits(cond, "warning")) { [18:03:19.708] muffled <- grepl(pattern, "muffleWarning") [18:03:19.708] if (muffled) [18:03:19.708] invokeRestart("muffleWarning") [18:03:19.708] } [18:03:19.708] else if (inherits(cond, "condition")) { [18:03:19.708] if (!is.null(pattern)) { [18:03:19.708] computeRestarts <- base::computeRestarts [18:03:19.708] grepl <- base::grepl [18:03:19.708] restarts <- computeRestarts(cond) [18:03:19.708] for (restart in restarts) { [18:03:19.708] name <- restart$name [18:03:19.708] if (is.null(name)) [18:03:19.708] next [18:03:19.708] if (!grepl(pattern, name)) [18:03:19.708] next [18:03:19.708] invokeRestart(restart) [18:03:19.708] muffled <- TRUE [18:03:19.708] break [18:03:19.708] } [18:03:19.708] } [18:03:19.708] } [18:03:19.708] invisible(muffled) [18:03:19.708] } [18:03:19.708] muffleCondition(cond) [18:03:19.708] }) [18:03:19.708] })) [18:03:19.708] future::FutureResult(value = ...future.value$value, [18:03:19.708] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.708] ...future.rng), globalenv = if (FALSE) [18:03:19.708] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.708] ...future.globalenv.names)) [18:03:19.708] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.708] }, condition = base::local({ [18:03:19.708] c <- base::c [18:03:19.708] inherits <- base::inherits [18:03:19.708] invokeRestart <- base::invokeRestart [18:03:19.708] length <- base::length [18:03:19.708] list <- base::list [18:03:19.708] seq.int <- base::seq.int [18:03:19.708] signalCondition <- base::signalCondition [18:03:19.708] sys.calls <- base::sys.calls [18:03:19.708] `[[` <- base::`[[` [18:03:19.708] `+` <- base::`+` [18:03:19.708] `<<-` <- base::`<<-` [18:03:19.708] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.708] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.708] 3L)] [18:03:19.708] } [18:03:19.708] function(cond) { [18:03:19.708] is_error <- inherits(cond, "error") [18:03:19.708] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.708] NULL) [18:03:19.708] if (is_error) { [18:03:19.708] sessionInformation <- function() { [18:03:19.708] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.708] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.708] search = base::search(), system = base::Sys.info()) [18:03:19.708] } [18:03:19.708] ...future.conditions[[length(...future.conditions) + [18:03:19.708] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.708] cond$call), session = sessionInformation(), [18:03:19.708] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.708] signalCondition(cond) [18:03:19.708] } [18:03:19.708] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.708] "immediateCondition"))) { [18:03:19.708] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.708] ...future.conditions[[length(...future.conditions) + [18:03:19.708] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.708] if (TRUE && !signal) { [18:03:19.708] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.708] { [18:03:19.708] inherits <- base::inherits [18:03:19.708] invokeRestart <- base::invokeRestart [18:03:19.708] is.null <- base::is.null [18:03:19.708] muffled <- FALSE [18:03:19.708] if (inherits(cond, "message")) { [18:03:19.708] muffled <- grepl(pattern, "muffleMessage") [18:03:19.708] if (muffled) [18:03:19.708] invokeRestart("muffleMessage") [18:03:19.708] } [18:03:19.708] else if (inherits(cond, "warning")) { [18:03:19.708] muffled <- grepl(pattern, "muffleWarning") [18:03:19.708] if (muffled) [18:03:19.708] invokeRestart("muffleWarning") [18:03:19.708] } [18:03:19.708] else if (inherits(cond, "condition")) { [18:03:19.708] if (!is.null(pattern)) { [18:03:19.708] computeRestarts <- base::computeRestarts [18:03:19.708] grepl <- base::grepl [18:03:19.708] restarts <- computeRestarts(cond) [18:03:19.708] for (restart in restarts) { [18:03:19.708] name <- restart$name [18:03:19.708] if (is.null(name)) [18:03:19.708] next [18:03:19.708] if (!grepl(pattern, name)) [18:03:19.708] next [18:03:19.708] invokeRestart(restart) [18:03:19.708] muffled <- TRUE [18:03:19.708] break [18:03:19.708] } [18:03:19.708] } [18:03:19.708] } [18:03:19.708] invisible(muffled) [18:03:19.708] } [18:03:19.708] muffleCondition(cond, pattern = "^muffle") [18:03:19.708] } [18:03:19.708] } [18:03:19.708] else { [18:03:19.708] if (TRUE) { [18:03:19.708] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.708] { [18:03:19.708] inherits <- base::inherits [18:03:19.708] invokeRestart <- base::invokeRestart [18:03:19.708] is.null <- base::is.null [18:03:19.708] muffled <- FALSE [18:03:19.708] if (inherits(cond, "message")) { [18:03:19.708] muffled <- grepl(pattern, "muffleMessage") [18:03:19.708] if (muffled) [18:03:19.708] invokeRestart("muffleMessage") [18:03:19.708] } [18:03:19.708] else if (inherits(cond, "warning")) { [18:03:19.708] muffled <- grepl(pattern, "muffleWarning") [18:03:19.708] if (muffled) [18:03:19.708] invokeRestart("muffleWarning") [18:03:19.708] } [18:03:19.708] else if (inherits(cond, "condition")) { [18:03:19.708] if (!is.null(pattern)) { [18:03:19.708] computeRestarts <- base::computeRestarts [18:03:19.708] grepl <- base::grepl [18:03:19.708] restarts <- computeRestarts(cond) [18:03:19.708] for (restart in restarts) { [18:03:19.708] name <- restart$name [18:03:19.708] if (is.null(name)) [18:03:19.708] next [18:03:19.708] if (!grepl(pattern, name)) [18:03:19.708] next [18:03:19.708] invokeRestart(restart) [18:03:19.708] muffled <- TRUE [18:03:19.708] break [18:03:19.708] } [18:03:19.708] } [18:03:19.708] } [18:03:19.708] invisible(muffled) [18:03:19.708] } [18:03:19.708] muffleCondition(cond, pattern = "^muffle") [18:03:19.708] } [18:03:19.708] } [18:03:19.708] } [18:03:19.708] })) [18:03:19.708] }, error = function(ex) { [18:03:19.708] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.708] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.708] ...future.rng), started = ...future.startTime, [18:03:19.708] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.708] version = "1.8"), class = "FutureResult") [18:03:19.708] }, finally = { [18:03:19.708] if (!identical(...future.workdir, getwd())) [18:03:19.708] setwd(...future.workdir) [18:03:19.708] { [18:03:19.708] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.708] ...future.oldOptions$nwarnings <- NULL [18:03:19.708] } [18:03:19.708] base::options(...future.oldOptions) [18:03:19.708] if (.Platform$OS.type == "windows") { [18:03:19.708] old_names <- names(...future.oldEnvVars) [18:03:19.708] envs <- base::Sys.getenv() [18:03:19.708] names <- names(envs) [18:03:19.708] common <- intersect(names, old_names) [18:03:19.708] added <- setdiff(names, old_names) [18:03:19.708] removed <- setdiff(old_names, names) [18:03:19.708] changed <- common[...future.oldEnvVars[common] != [18:03:19.708] envs[common]] [18:03:19.708] NAMES <- toupper(changed) [18:03:19.708] args <- list() [18:03:19.708] for (kk in seq_along(NAMES)) { [18:03:19.708] name <- changed[[kk]] [18:03:19.708] NAME <- NAMES[[kk]] [18:03:19.708] if (name != NAME && is.element(NAME, old_names)) [18:03:19.708] next [18:03:19.708] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.708] } [18:03:19.708] NAMES <- toupper(added) [18:03:19.708] for (kk in seq_along(NAMES)) { [18:03:19.708] name <- added[[kk]] [18:03:19.708] NAME <- NAMES[[kk]] [18:03:19.708] if (name != NAME && is.element(NAME, old_names)) [18:03:19.708] next [18:03:19.708] args[[name]] <- "" [18:03:19.708] } [18:03:19.708] NAMES <- toupper(removed) [18:03:19.708] for (kk in seq_along(NAMES)) { [18:03:19.708] name <- removed[[kk]] [18:03:19.708] NAME <- NAMES[[kk]] [18:03:19.708] if (name != NAME && is.element(NAME, old_names)) [18:03:19.708] next [18:03:19.708] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.708] } [18:03:19.708] if (length(args) > 0) [18:03:19.708] base::do.call(base::Sys.setenv, args = args) [18:03:19.708] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.708] } [18:03:19.708] else { [18:03:19.708] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.708] } [18:03:19.708] { [18:03:19.708] if (base::length(...future.futureOptionsAdded) > [18:03:19.708] 0L) { [18:03:19.708] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.708] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.708] base::options(opts) [18:03:19.708] } [18:03:19.708] { [18:03:19.708] { [18:03:19.708] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.708] NULL [18:03:19.708] } [18:03:19.708] options(future.plan = NULL) [18:03:19.708] if (is.na(NA_character_)) [18:03:19.708] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.708] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.708] future::plan(list(function (..., workers = availableCores(), [18:03:19.708] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.708] envir = parent.frame()) [18:03:19.708] { [18:03:19.708] if (is.function(workers)) [18:03:19.708] workers <- workers() [18:03:19.708] workers <- structure(as.integer(workers), [18:03:19.708] class = class(workers)) [18:03:19.708] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.708] workers >= 1) [18:03:19.708] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.708] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.708] } [18:03:19.708] future <- MultisessionFuture(..., workers = workers, [18:03:19.708] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.708] envir = envir) [18:03:19.708] if (!future$lazy) [18:03:19.708] future <- run(future) [18:03:19.708] invisible(future) [18:03:19.708] }), .cleanup = FALSE, .init = FALSE) [18:03:19.708] } [18:03:19.708] } [18:03:19.708] } [18:03:19.708] }) [18:03:19.708] if (TRUE) { [18:03:19.708] base::sink(type = "output", split = FALSE) [18:03:19.708] if (TRUE) { [18:03:19.708] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.708] } [18:03:19.708] else { [18:03:19.708] ...future.result["stdout"] <- base::list(NULL) [18:03:19.708] } [18:03:19.708] base::close(...future.stdout) [18:03:19.708] ...future.stdout <- NULL [18:03:19.708] } [18:03:19.708] ...future.result$conditions <- ...future.conditions [18:03:19.708] ...future.result$finished <- base::Sys.time() [18:03:19.708] ...future.result [18:03:19.708] } [18:03:19.713] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.714] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.714] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.714] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.715] MultisessionFuture started [18:03:19.715] - Launch lazy future ... done [18:03:19.715] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_4-360597' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f46ba928 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:03:19.731] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.731] - Validating connection of MultisessionFuture [18:03:19.732] - received message: FutureResult [18:03:19.732] - Received FutureResult [18:03:19.732] - Erased future from FutureRegistry [18:03:19.732] result() for ClusterFuture ... [18:03:19.732] - result already collected: FutureResult [18:03:19.732] result() for ClusterFuture ... done [18:03:19.733] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.733] resolve() on list ... [18:03:19.733] recursive: 0 [18:03:19.733] length: 4 [18:03:19.733] [18:03:19.734] Future #1 [18:03:19.734] result() for ClusterFuture ... [18:03:19.734] - result already collected: FutureResult [18:03:19.734] result() for ClusterFuture ... done [18:03:19.734] result() for ClusterFuture ... [18:03:19.734] - result already collected: FutureResult [18:03:19.734] result() for ClusterFuture ... done [18:03:19.735] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:19.735] - nx: 4 [18:03:19.735] - relay: TRUE [18:03:19.735] - stdout: TRUE [18:03:19.735] - signal: TRUE [18:03:19.736] - resignal: FALSE [18:03:19.736] - force: TRUE [18:03:19.736] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.736] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.736] - until=1 [18:03:19.736] - relaying element #1 [18:03:19.737] result() for ClusterFuture ... [18:03:19.737] - result already collected: FutureResult [18:03:19.737] result() for ClusterFuture ... done [18:03:19.737] result() for ClusterFuture ... [18:03:19.737] - result already collected: FutureResult [18:03:19.737] result() for ClusterFuture ... done [18:03:19.737] signalConditions() ... [18:03:19.738] - include = 'immediateCondition' [18:03:19.738] - exclude = [18:03:19.738] - resignal = FALSE [18:03:19.738] - Number of conditions: 1 [18:03:19.738] signalConditions() ... done [18:03:19.739] result() for ClusterFuture ... [18:03:19.739] - result already collected: FutureResult [18:03:19.739] result() for ClusterFuture ... done [18:03:19.739] signalConditions() ... [18:03:19.739] - include = 'immediateCondition' [18:03:19.739] - exclude = [18:03:19.739] - resignal = FALSE [18:03:19.740] - Number of conditions: 1 [18:03:19.740] signalConditions() ... done [18:03:19.740] result() for ClusterFuture ... [18:03:19.740] - result already collected: FutureResult [18:03:19.740] result() for ClusterFuture ... done [18:03:19.740] signalConditions() ... [18:03:19.741] - include = 'condition' [18:03:19.741] - exclude = 'immediateCondition' [18:03:19.741] - resignal = TRUE [18:03:19.741] - Number of conditions: 1 [18:03:19.741] - Condition #1: 'RngFutureError', 'FutureError', 'error', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:19.742] signalConditions() ... done [18:03:19.742] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.742] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.742] signalConditionsASAP(MultisessionFuture, pos=1) ... done Future UUID: e281942d-77da-a91d-f0f0-265786889865 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: MultisessionFuture: Label: 'fsample_1-460976' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f46ba928 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureError' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:19.743] getGlobalsAndPackages() ... [18:03:19.743] Searching for globals... [18:03:19.745] - globals found: [3] '{', 'sample', 'x' [18:03:19.745] Searching for globals ... DONE [18:03:19.745] Resolving globals: FALSE [18:03:19.745] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.746] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.746] - globals: [1] 'x' [18:03:19.746] [18:03:19.746] getGlobalsAndPackages() ... DONE [18:03:19.747] run() for 'Future' ... [18:03:19.747] - state: 'created' [18:03:19.747] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.761] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.762] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.762] - Field: 'node' [18:03:19.762] - Field: 'label' [18:03:19.762] - Field: 'local' [18:03:19.762] - Field: 'owner' [18:03:19.762] - Field: 'envir' [18:03:19.763] - Field: 'workers' [18:03:19.763] - Field: 'packages' [18:03:19.763] - Field: 'gc' [18:03:19.763] - Field: 'conditions' [18:03:19.766] - Field: 'persistent' [18:03:19.766] - Field: 'expr' [18:03:19.766] - Field: 'uuid' [18:03:19.766] - Field: 'seed' [18:03:19.766] - Field: 'version' [18:03:19.767] - Field: 'result' [18:03:19.767] - Field: 'asynchronous' [18:03:19.767] - Field: 'calls' [18:03:19.767] - Field: 'globals' [18:03:19.767] - Field: 'stdout' [18:03:19.767] - Field: 'earlySignal' [18:03:19.768] - Field: 'lazy' [18:03:19.768] - Field: 'state' [18:03:19.768] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.768] - Launch lazy future ... [18:03:19.768] Packages needed by the future expression (n = 0): [18:03:19.769] Packages needed by future strategies (n = 0): [18:03:19.769] { [18:03:19.769] { [18:03:19.769] { [18:03:19.769] ...future.startTime <- base::Sys.time() [18:03:19.769] { [18:03:19.769] { [18:03:19.769] { [18:03:19.769] { [18:03:19.769] base::local({ [18:03:19.769] has_future <- base::requireNamespace("future", [18:03:19.769] quietly = TRUE) [18:03:19.769] if (has_future) { [18:03:19.769] ns <- base::getNamespace("future") [18:03:19.769] version <- ns[[".package"]][["version"]] [18:03:19.769] if (is.null(version)) [18:03:19.769] version <- utils::packageVersion("future") [18:03:19.769] } [18:03:19.769] else { [18:03:19.769] version <- NULL [18:03:19.769] } [18:03:19.769] if (!has_future || version < "1.8.0") { [18:03:19.769] info <- base::c(r_version = base::gsub("R version ", [18:03:19.769] "", base::R.version$version.string), [18:03:19.769] platform = base::sprintf("%s (%s-bit)", [18:03:19.769] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.769] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.769] "release", "version")], collapse = " "), [18:03:19.769] hostname = base::Sys.info()[["nodename"]]) [18:03:19.769] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.769] info) [18:03:19.769] info <- base::paste(info, collapse = "; ") [18:03:19.769] if (!has_future) { [18:03:19.769] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.769] info) [18:03:19.769] } [18:03:19.769] else { [18:03:19.769] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.769] info, version) [18:03:19.769] } [18:03:19.769] base::stop(msg) [18:03:19.769] } [18:03:19.769] }) [18:03:19.769] } [18:03:19.769] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.769] base::options(mc.cores = 1L) [18:03:19.769] } [18:03:19.769] options(future.plan = NULL) [18:03:19.769] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.769] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.769] } [18:03:19.769] ...future.workdir <- getwd() [18:03:19.769] } [18:03:19.769] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.769] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.769] } [18:03:19.769] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.769] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.769] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.769] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.769] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.769] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.769] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.769] base::names(...future.oldOptions)) [18:03:19.769] } [18:03:19.769] if (FALSE) { [18:03:19.769] } [18:03:19.769] else { [18:03:19.769] if (TRUE) { [18:03:19.769] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.769] open = "w") [18:03:19.769] } [18:03:19.769] else { [18:03:19.769] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.769] windows = "NUL", "/dev/null"), open = "w") [18:03:19.769] } [18:03:19.769] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.769] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.769] base::sink(type = "output", split = FALSE) [18:03:19.769] base::close(...future.stdout) [18:03:19.769] }, add = TRUE) [18:03:19.769] } [18:03:19.769] ...future.frame <- base::sys.nframe() [18:03:19.769] ...future.conditions <- base::list() [18:03:19.769] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.769] if (FALSE) { [18:03:19.769] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.769] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.769] } [18:03:19.769] ...future.result <- base::tryCatch({ [18:03:19.769] base::withCallingHandlers({ [18:03:19.769] ...future.value <- base::withVisible(base::local({ [18:03:19.769] ...future.makeSendCondition <- local({ [18:03:19.769] sendCondition <- NULL [18:03:19.769] function(frame = 1L) { [18:03:19.769] if (is.function(sendCondition)) [18:03:19.769] return(sendCondition) [18:03:19.769] ns <- getNamespace("parallel") [18:03:19.769] if (exists("sendData", mode = "function", [18:03:19.769] envir = ns)) { [18:03:19.769] parallel_sendData <- get("sendData", mode = "function", [18:03:19.769] envir = ns) [18:03:19.769] envir <- sys.frame(frame) [18:03:19.769] master <- NULL [18:03:19.769] while (!identical(envir, .GlobalEnv) && [18:03:19.769] !identical(envir, emptyenv())) { [18:03:19.769] if (exists("master", mode = "list", envir = envir, [18:03:19.769] inherits = FALSE)) { [18:03:19.769] master <- get("master", mode = "list", [18:03:19.769] envir = envir, inherits = FALSE) [18:03:19.769] if (inherits(master, c("SOCKnode", [18:03:19.769] "SOCK0node"))) { [18:03:19.769] sendCondition <<- function(cond) { [18:03:19.769] data <- list(type = "VALUE", value = cond, [18:03:19.769] success = TRUE) [18:03:19.769] parallel_sendData(master, data) [18:03:19.769] } [18:03:19.769] return(sendCondition) [18:03:19.769] } [18:03:19.769] } [18:03:19.769] frame <- frame + 1L [18:03:19.769] envir <- sys.frame(frame) [18:03:19.769] } [18:03:19.769] } [18:03:19.769] sendCondition <<- function(cond) NULL [18:03:19.769] } [18:03:19.769] }) [18:03:19.769] withCallingHandlers({ [18:03:19.769] { [18:03:19.769] sample(x, size = 1L) [18:03:19.769] } [18:03:19.769] }, immediateCondition = function(cond) { [18:03:19.769] sendCondition <- ...future.makeSendCondition() [18:03:19.769] sendCondition(cond) [18:03:19.769] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.769] { [18:03:19.769] inherits <- base::inherits [18:03:19.769] invokeRestart <- base::invokeRestart [18:03:19.769] is.null <- base::is.null [18:03:19.769] muffled <- FALSE [18:03:19.769] if (inherits(cond, "message")) { [18:03:19.769] muffled <- grepl(pattern, "muffleMessage") [18:03:19.769] if (muffled) [18:03:19.769] invokeRestart("muffleMessage") [18:03:19.769] } [18:03:19.769] else if (inherits(cond, "warning")) { [18:03:19.769] muffled <- grepl(pattern, "muffleWarning") [18:03:19.769] if (muffled) [18:03:19.769] invokeRestart("muffleWarning") [18:03:19.769] } [18:03:19.769] else if (inherits(cond, "condition")) { [18:03:19.769] if (!is.null(pattern)) { [18:03:19.769] computeRestarts <- base::computeRestarts [18:03:19.769] grepl <- base::grepl [18:03:19.769] restarts <- computeRestarts(cond) [18:03:19.769] for (restart in restarts) { [18:03:19.769] name <- restart$name [18:03:19.769] if (is.null(name)) [18:03:19.769] next [18:03:19.769] if (!grepl(pattern, name)) [18:03:19.769] next [18:03:19.769] invokeRestart(restart) [18:03:19.769] muffled <- TRUE [18:03:19.769] break [18:03:19.769] } [18:03:19.769] } [18:03:19.769] } [18:03:19.769] invisible(muffled) [18:03:19.769] } [18:03:19.769] muffleCondition(cond) [18:03:19.769] }) [18:03:19.769] })) [18:03:19.769] future::FutureResult(value = ...future.value$value, [18:03:19.769] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.769] ...future.rng), globalenv = if (FALSE) [18:03:19.769] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.769] ...future.globalenv.names)) [18:03:19.769] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.769] }, condition = base::local({ [18:03:19.769] c <- base::c [18:03:19.769] inherits <- base::inherits [18:03:19.769] invokeRestart <- base::invokeRestart [18:03:19.769] length <- base::length [18:03:19.769] list <- base::list [18:03:19.769] seq.int <- base::seq.int [18:03:19.769] signalCondition <- base::signalCondition [18:03:19.769] sys.calls <- base::sys.calls [18:03:19.769] `[[` <- base::`[[` [18:03:19.769] `+` <- base::`+` [18:03:19.769] `<<-` <- base::`<<-` [18:03:19.769] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.769] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.769] 3L)] [18:03:19.769] } [18:03:19.769] function(cond) { [18:03:19.769] is_error <- inherits(cond, "error") [18:03:19.769] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.769] NULL) [18:03:19.769] if (is_error) { [18:03:19.769] sessionInformation <- function() { [18:03:19.769] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.769] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.769] search = base::search(), system = base::Sys.info()) [18:03:19.769] } [18:03:19.769] ...future.conditions[[length(...future.conditions) + [18:03:19.769] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.769] cond$call), session = sessionInformation(), [18:03:19.769] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.769] signalCondition(cond) [18:03:19.769] } [18:03:19.769] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.769] "immediateCondition"))) { [18:03:19.769] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.769] ...future.conditions[[length(...future.conditions) + [18:03:19.769] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.769] if (TRUE && !signal) { [18:03:19.769] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.769] { [18:03:19.769] inherits <- base::inherits [18:03:19.769] invokeRestart <- base::invokeRestart [18:03:19.769] is.null <- base::is.null [18:03:19.769] muffled <- FALSE [18:03:19.769] if (inherits(cond, "message")) { [18:03:19.769] muffled <- grepl(pattern, "muffleMessage") [18:03:19.769] if (muffled) [18:03:19.769] invokeRestart("muffleMessage") [18:03:19.769] } [18:03:19.769] else if (inherits(cond, "warning")) { [18:03:19.769] muffled <- grepl(pattern, "muffleWarning") [18:03:19.769] if (muffled) [18:03:19.769] invokeRestart("muffleWarning") [18:03:19.769] } [18:03:19.769] else if (inherits(cond, "condition")) { [18:03:19.769] if (!is.null(pattern)) { [18:03:19.769] computeRestarts <- base::computeRestarts [18:03:19.769] grepl <- base::grepl [18:03:19.769] restarts <- computeRestarts(cond) [18:03:19.769] for (restart in restarts) { [18:03:19.769] name <- restart$name [18:03:19.769] if (is.null(name)) [18:03:19.769] next [18:03:19.769] if (!grepl(pattern, name)) [18:03:19.769] next [18:03:19.769] invokeRestart(restart) [18:03:19.769] muffled <- TRUE [18:03:19.769] break [18:03:19.769] } [18:03:19.769] } [18:03:19.769] } [18:03:19.769] invisible(muffled) [18:03:19.769] } [18:03:19.769] muffleCondition(cond, pattern = "^muffle") [18:03:19.769] } [18:03:19.769] } [18:03:19.769] else { [18:03:19.769] if (TRUE) { [18:03:19.769] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.769] { [18:03:19.769] inherits <- base::inherits [18:03:19.769] invokeRestart <- base::invokeRestart [18:03:19.769] is.null <- base::is.null [18:03:19.769] muffled <- FALSE [18:03:19.769] if (inherits(cond, "message")) { [18:03:19.769] muffled <- grepl(pattern, "muffleMessage") [18:03:19.769] if (muffled) [18:03:19.769] invokeRestart("muffleMessage") [18:03:19.769] } [18:03:19.769] else if (inherits(cond, "warning")) { [18:03:19.769] muffled <- grepl(pattern, "muffleWarning") [18:03:19.769] if (muffled) [18:03:19.769] invokeRestart("muffleWarning") [18:03:19.769] } [18:03:19.769] else if (inherits(cond, "condition")) { [18:03:19.769] if (!is.null(pattern)) { [18:03:19.769] computeRestarts <- base::computeRestarts [18:03:19.769] grepl <- base::grepl [18:03:19.769] restarts <- computeRestarts(cond) [18:03:19.769] for (restart in restarts) { [18:03:19.769] name <- restart$name [18:03:19.769] if (is.null(name)) [18:03:19.769] next [18:03:19.769] if (!grepl(pattern, name)) [18:03:19.769] next [18:03:19.769] invokeRestart(restart) [18:03:19.769] muffled <- TRUE [18:03:19.769] break [18:03:19.769] } [18:03:19.769] } [18:03:19.769] } [18:03:19.769] invisible(muffled) [18:03:19.769] } [18:03:19.769] muffleCondition(cond, pattern = "^muffle") [18:03:19.769] } [18:03:19.769] } [18:03:19.769] } [18:03:19.769] })) [18:03:19.769] }, error = function(ex) { [18:03:19.769] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.769] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.769] ...future.rng), started = ...future.startTime, [18:03:19.769] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.769] version = "1.8"), class = "FutureResult") [18:03:19.769] }, finally = { [18:03:19.769] if (!identical(...future.workdir, getwd())) [18:03:19.769] setwd(...future.workdir) [18:03:19.769] { [18:03:19.769] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.769] ...future.oldOptions$nwarnings <- NULL [18:03:19.769] } [18:03:19.769] base::options(...future.oldOptions) [18:03:19.769] if (.Platform$OS.type == "windows") { [18:03:19.769] old_names <- names(...future.oldEnvVars) [18:03:19.769] envs <- base::Sys.getenv() [18:03:19.769] names <- names(envs) [18:03:19.769] common <- intersect(names, old_names) [18:03:19.769] added <- setdiff(names, old_names) [18:03:19.769] removed <- setdiff(old_names, names) [18:03:19.769] changed <- common[...future.oldEnvVars[common] != [18:03:19.769] envs[common]] [18:03:19.769] NAMES <- toupper(changed) [18:03:19.769] args <- list() [18:03:19.769] for (kk in seq_along(NAMES)) { [18:03:19.769] name <- changed[[kk]] [18:03:19.769] NAME <- NAMES[[kk]] [18:03:19.769] if (name != NAME && is.element(NAME, old_names)) [18:03:19.769] next [18:03:19.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.769] } [18:03:19.769] NAMES <- toupper(added) [18:03:19.769] for (kk in seq_along(NAMES)) { [18:03:19.769] name <- added[[kk]] [18:03:19.769] NAME <- NAMES[[kk]] [18:03:19.769] if (name != NAME && is.element(NAME, old_names)) [18:03:19.769] next [18:03:19.769] args[[name]] <- "" [18:03:19.769] } [18:03:19.769] NAMES <- toupper(removed) [18:03:19.769] for (kk in seq_along(NAMES)) { [18:03:19.769] name <- removed[[kk]] [18:03:19.769] NAME <- NAMES[[kk]] [18:03:19.769] if (name != NAME && is.element(NAME, old_names)) [18:03:19.769] next [18:03:19.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.769] } [18:03:19.769] if (length(args) > 0) [18:03:19.769] base::do.call(base::Sys.setenv, args = args) [18:03:19.769] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.769] } [18:03:19.769] else { [18:03:19.769] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.769] } [18:03:19.769] { [18:03:19.769] if (base::length(...future.futureOptionsAdded) > [18:03:19.769] 0L) { [18:03:19.769] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.769] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.769] base::options(opts) [18:03:19.769] } [18:03:19.769] { [18:03:19.769] { [18:03:19.769] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.769] NULL [18:03:19.769] } [18:03:19.769] options(future.plan = NULL) [18:03:19.769] if (is.na(NA_character_)) [18:03:19.769] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.769] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.769] future::plan(list(function (..., workers = availableCores(), [18:03:19.769] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.769] envir = parent.frame()) [18:03:19.769] { [18:03:19.769] if (is.function(workers)) [18:03:19.769] workers <- workers() [18:03:19.769] workers <- structure(as.integer(workers), [18:03:19.769] class = class(workers)) [18:03:19.769] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.769] workers >= 1) [18:03:19.769] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.769] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.769] } [18:03:19.769] future <- MultisessionFuture(..., workers = workers, [18:03:19.769] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.769] envir = envir) [18:03:19.769] if (!future$lazy) [18:03:19.769] future <- run(future) [18:03:19.769] invisible(future) [18:03:19.769] }), .cleanup = FALSE, .init = FALSE) [18:03:19.769] } [18:03:19.769] } [18:03:19.769] } [18:03:19.769] }) [18:03:19.769] if (TRUE) { [18:03:19.769] base::sink(type = "output", split = FALSE) [18:03:19.769] if (TRUE) { [18:03:19.769] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.769] } [18:03:19.769] else { [18:03:19.769] ...future.result["stdout"] <- base::list(NULL) [18:03:19.769] } [18:03:19.769] base::close(...future.stdout) [18:03:19.769] ...future.stdout <- NULL [18:03:19.769] } [18:03:19.769] ...future.result$conditions <- ...future.conditions [18:03:19.769] ...future.result$finished <- base::Sys.time() [18:03:19.769] ...future.result [18:03:19.769] } [18:03:19.775] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.775] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.775] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.775] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.776] MultisessionFuture started [18:03:19.776] - Launch lazy future ... done [18:03:19.776] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_1-266552' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f6f5bf48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.792] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.793] - Validating connection of MultisessionFuture [18:03:19.793] - received message: FutureResult [18:03:19.793] - Received FutureResult [18:03:19.793] - Erased future from FutureRegistry [18:03:19.793] result() for ClusterFuture ... [18:03:19.793] - result already collected: FutureResult [18:03:19.794] result() for ClusterFuture ... done [18:03:19.794] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.794] getGlobalsAndPackages() ... [18:03:19.794] Searching for globals... [18:03:19.795] - globals found: [3] '{', 'sample', 'x' [18:03:19.796] Searching for globals ... DONE [18:03:19.796] Resolving globals: FALSE [18:03:19.796] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.797] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.797] - globals: [1] 'x' [18:03:19.797] [18:03:19.797] getGlobalsAndPackages() ... DONE [18:03:19.797] run() for 'Future' ... [18:03:19.798] - state: 'created' [18:03:19.798] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.811] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.812] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.812] - Field: 'node' [18:03:19.812] - Field: 'label' [18:03:19.812] - Field: 'local' [18:03:19.812] - Field: 'owner' [18:03:19.813] - Field: 'envir' [18:03:19.813] - Field: 'workers' [18:03:19.813] - Field: 'packages' [18:03:19.813] - Field: 'gc' [18:03:19.813] - Field: 'conditions' [18:03:19.813] - Field: 'persistent' [18:03:19.814] - Field: 'expr' [18:03:19.814] - Field: 'uuid' [18:03:19.814] - Field: 'seed' [18:03:19.814] - Field: 'version' [18:03:19.814] - Field: 'result' [18:03:19.815] - Field: 'asynchronous' [18:03:19.815] - Field: 'calls' [18:03:19.815] - Field: 'globals' [18:03:19.815] - Field: 'stdout' [18:03:19.815] - Field: 'earlySignal' [18:03:19.815] - Field: 'lazy' [18:03:19.816] - Field: 'state' [18:03:19.816] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.816] - Launch lazy future ... [18:03:19.816] Packages needed by the future expression (n = 0): [18:03:19.816] Packages needed by future strategies (n = 0): [18:03:19.817] { [18:03:19.817] { [18:03:19.817] { [18:03:19.817] ...future.startTime <- base::Sys.time() [18:03:19.817] { [18:03:19.817] { [18:03:19.817] { [18:03:19.817] { [18:03:19.817] base::local({ [18:03:19.817] has_future <- base::requireNamespace("future", [18:03:19.817] quietly = TRUE) [18:03:19.817] if (has_future) { [18:03:19.817] ns <- base::getNamespace("future") [18:03:19.817] version <- ns[[".package"]][["version"]] [18:03:19.817] if (is.null(version)) [18:03:19.817] version <- utils::packageVersion("future") [18:03:19.817] } [18:03:19.817] else { [18:03:19.817] version <- NULL [18:03:19.817] } [18:03:19.817] if (!has_future || version < "1.8.0") { [18:03:19.817] info <- base::c(r_version = base::gsub("R version ", [18:03:19.817] "", base::R.version$version.string), [18:03:19.817] platform = base::sprintf("%s (%s-bit)", [18:03:19.817] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.817] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.817] "release", "version")], collapse = " "), [18:03:19.817] hostname = base::Sys.info()[["nodename"]]) [18:03:19.817] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.817] info) [18:03:19.817] info <- base::paste(info, collapse = "; ") [18:03:19.817] if (!has_future) { [18:03:19.817] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.817] info) [18:03:19.817] } [18:03:19.817] else { [18:03:19.817] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.817] info, version) [18:03:19.817] } [18:03:19.817] base::stop(msg) [18:03:19.817] } [18:03:19.817] }) [18:03:19.817] } [18:03:19.817] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.817] base::options(mc.cores = 1L) [18:03:19.817] } [18:03:19.817] options(future.plan = NULL) [18:03:19.817] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.817] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.817] } [18:03:19.817] ...future.workdir <- getwd() [18:03:19.817] } [18:03:19.817] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.817] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.817] } [18:03:19.817] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.817] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.817] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.817] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.817] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.817] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.817] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.817] base::names(...future.oldOptions)) [18:03:19.817] } [18:03:19.817] if (FALSE) { [18:03:19.817] } [18:03:19.817] else { [18:03:19.817] if (TRUE) { [18:03:19.817] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.817] open = "w") [18:03:19.817] } [18:03:19.817] else { [18:03:19.817] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.817] windows = "NUL", "/dev/null"), open = "w") [18:03:19.817] } [18:03:19.817] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.817] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.817] base::sink(type = "output", split = FALSE) [18:03:19.817] base::close(...future.stdout) [18:03:19.817] }, add = TRUE) [18:03:19.817] } [18:03:19.817] ...future.frame <- base::sys.nframe() [18:03:19.817] ...future.conditions <- base::list() [18:03:19.817] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.817] if (FALSE) { [18:03:19.817] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.817] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.817] } [18:03:19.817] ...future.result <- base::tryCatch({ [18:03:19.817] base::withCallingHandlers({ [18:03:19.817] ...future.value <- base::withVisible(base::local({ [18:03:19.817] ...future.makeSendCondition <- local({ [18:03:19.817] sendCondition <- NULL [18:03:19.817] function(frame = 1L) { [18:03:19.817] if (is.function(sendCondition)) [18:03:19.817] return(sendCondition) [18:03:19.817] ns <- getNamespace("parallel") [18:03:19.817] if (exists("sendData", mode = "function", [18:03:19.817] envir = ns)) { [18:03:19.817] parallel_sendData <- get("sendData", mode = "function", [18:03:19.817] envir = ns) [18:03:19.817] envir <- sys.frame(frame) [18:03:19.817] master <- NULL [18:03:19.817] while (!identical(envir, .GlobalEnv) && [18:03:19.817] !identical(envir, emptyenv())) { [18:03:19.817] if (exists("master", mode = "list", envir = envir, [18:03:19.817] inherits = FALSE)) { [18:03:19.817] master <- get("master", mode = "list", [18:03:19.817] envir = envir, inherits = FALSE) [18:03:19.817] if (inherits(master, c("SOCKnode", [18:03:19.817] "SOCK0node"))) { [18:03:19.817] sendCondition <<- function(cond) { [18:03:19.817] data <- list(type = "VALUE", value = cond, [18:03:19.817] success = TRUE) [18:03:19.817] parallel_sendData(master, data) [18:03:19.817] } [18:03:19.817] return(sendCondition) [18:03:19.817] } [18:03:19.817] } [18:03:19.817] frame <- frame + 1L [18:03:19.817] envir <- sys.frame(frame) [18:03:19.817] } [18:03:19.817] } [18:03:19.817] sendCondition <<- function(cond) NULL [18:03:19.817] } [18:03:19.817] }) [18:03:19.817] withCallingHandlers({ [18:03:19.817] { [18:03:19.817] sample(x, size = 1L) [18:03:19.817] } [18:03:19.817] }, immediateCondition = function(cond) { [18:03:19.817] sendCondition <- ...future.makeSendCondition() [18:03:19.817] sendCondition(cond) [18:03:19.817] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.817] { [18:03:19.817] inherits <- base::inherits [18:03:19.817] invokeRestart <- base::invokeRestart [18:03:19.817] is.null <- base::is.null [18:03:19.817] muffled <- FALSE [18:03:19.817] if (inherits(cond, "message")) { [18:03:19.817] muffled <- grepl(pattern, "muffleMessage") [18:03:19.817] if (muffled) [18:03:19.817] invokeRestart("muffleMessage") [18:03:19.817] } [18:03:19.817] else if (inherits(cond, "warning")) { [18:03:19.817] muffled <- grepl(pattern, "muffleWarning") [18:03:19.817] if (muffled) [18:03:19.817] invokeRestart("muffleWarning") [18:03:19.817] } [18:03:19.817] else if (inherits(cond, "condition")) { [18:03:19.817] if (!is.null(pattern)) { [18:03:19.817] computeRestarts <- base::computeRestarts [18:03:19.817] grepl <- base::grepl [18:03:19.817] restarts <- computeRestarts(cond) [18:03:19.817] for (restart in restarts) { [18:03:19.817] name <- restart$name [18:03:19.817] if (is.null(name)) [18:03:19.817] next [18:03:19.817] if (!grepl(pattern, name)) [18:03:19.817] next [18:03:19.817] invokeRestart(restart) [18:03:19.817] muffled <- TRUE [18:03:19.817] break [18:03:19.817] } [18:03:19.817] } [18:03:19.817] } [18:03:19.817] invisible(muffled) [18:03:19.817] } [18:03:19.817] muffleCondition(cond) [18:03:19.817] }) [18:03:19.817] })) [18:03:19.817] future::FutureResult(value = ...future.value$value, [18:03:19.817] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.817] ...future.rng), globalenv = if (FALSE) [18:03:19.817] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.817] ...future.globalenv.names)) [18:03:19.817] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.817] }, condition = base::local({ [18:03:19.817] c <- base::c [18:03:19.817] inherits <- base::inherits [18:03:19.817] invokeRestart <- base::invokeRestart [18:03:19.817] length <- base::length [18:03:19.817] list <- base::list [18:03:19.817] seq.int <- base::seq.int [18:03:19.817] signalCondition <- base::signalCondition [18:03:19.817] sys.calls <- base::sys.calls [18:03:19.817] `[[` <- base::`[[` [18:03:19.817] `+` <- base::`+` [18:03:19.817] `<<-` <- base::`<<-` [18:03:19.817] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.817] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.817] 3L)] [18:03:19.817] } [18:03:19.817] function(cond) { [18:03:19.817] is_error <- inherits(cond, "error") [18:03:19.817] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.817] NULL) [18:03:19.817] if (is_error) { [18:03:19.817] sessionInformation <- function() { [18:03:19.817] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.817] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.817] search = base::search(), system = base::Sys.info()) [18:03:19.817] } [18:03:19.817] ...future.conditions[[length(...future.conditions) + [18:03:19.817] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.817] cond$call), session = sessionInformation(), [18:03:19.817] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.817] signalCondition(cond) [18:03:19.817] } [18:03:19.817] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.817] "immediateCondition"))) { [18:03:19.817] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.817] ...future.conditions[[length(...future.conditions) + [18:03:19.817] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.817] if (TRUE && !signal) { [18:03:19.817] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.817] { [18:03:19.817] inherits <- base::inherits [18:03:19.817] invokeRestart <- base::invokeRestart [18:03:19.817] is.null <- base::is.null [18:03:19.817] muffled <- FALSE [18:03:19.817] if (inherits(cond, "message")) { [18:03:19.817] muffled <- grepl(pattern, "muffleMessage") [18:03:19.817] if (muffled) [18:03:19.817] invokeRestart("muffleMessage") [18:03:19.817] } [18:03:19.817] else if (inherits(cond, "warning")) { [18:03:19.817] muffled <- grepl(pattern, "muffleWarning") [18:03:19.817] if (muffled) [18:03:19.817] invokeRestart("muffleWarning") [18:03:19.817] } [18:03:19.817] else if (inherits(cond, "condition")) { [18:03:19.817] if (!is.null(pattern)) { [18:03:19.817] computeRestarts <- base::computeRestarts [18:03:19.817] grepl <- base::grepl [18:03:19.817] restarts <- computeRestarts(cond) [18:03:19.817] for (restart in restarts) { [18:03:19.817] name <- restart$name [18:03:19.817] if (is.null(name)) [18:03:19.817] next [18:03:19.817] if (!grepl(pattern, name)) [18:03:19.817] next [18:03:19.817] invokeRestart(restart) [18:03:19.817] muffled <- TRUE [18:03:19.817] break [18:03:19.817] } [18:03:19.817] } [18:03:19.817] } [18:03:19.817] invisible(muffled) [18:03:19.817] } [18:03:19.817] muffleCondition(cond, pattern = "^muffle") [18:03:19.817] } [18:03:19.817] } [18:03:19.817] else { [18:03:19.817] if (TRUE) { [18:03:19.817] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.817] { [18:03:19.817] inherits <- base::inherits [18:03:19.817] invokeRestart <- base::invokeRestart [18:03:19.817] is.null <- base::is.null [18:03:19.817] muffled <- FALSE [18:03:19.817] if (inherits(cond, "message")) { [18:03:19.817] muffled <- grepl(pattern, "muffleMessage") [18:03:19.817] if (muffled) [18:03:19.817] invokeRestart("muffleMessage") [18:03:19.817] } [18:03:19.817] else if (inherits(cond, "warning")) { [18:03:19.817] muffled <- grepl(pattern, "muffleWarning") [18:03:19.817] if (muffled) [18:03:19.817] invokeRestart("muffleWarning") [18:03:19.817] } [18:03:19.817] else if (inherits(cond, "condition")) { [18:03:19.817] if (!is.null(pattern)) { [18:03:19.817] computeRestarts <- base::computeRestarts [18:03:19.817] grepl <- base::grepl [18:03:19.817] restarts <- computeRestarts(cond) [18:03:19.817] for (restart in restarts) { [18:03:19.817] name <- restart$name [18:03:19.817] if (is.null(name)) [18:03:19.817] next [18:03:19.817] if (!grepl(pattern, name)) [18:03:19.817] next [18:03:19.817] invokeRestart(restart) [18:03:19.817] muffled <- TRUE [18:03:19.817] break [18:03:19.817] } [18:03:19.817] } [18:03:19.817] } [18:03:19.817] invisible(muffled) [18:03:19.817] } [18:03:19.817] muffleCondition(cond, pattern = "^muffle") [18:03:19.817] } [18:03:19.817] } [18:03:19.817] } [18:03:19.817] })) [18:03:19.817] }, error = function(ex) { [18:03:19.817] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.817] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.817] ...future.rng), started = ...future.startTime, [18:03:19.817] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.817] version = "1.8"), class = "FutureResult") [18:03:19.817] }, finally = { [18:03:19.817] if (!identical(...future.workdir, getwd())) [18:03:19.817] setwd(...future.workdir) [18:03:19.817] { [18:03:19.817] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.817] ...future.oldOptions$nwarnings <- NULL [18:03:19.817] } [18:03:19.817] base::options(...future.oldOptions) [18:03:19.817] if (.Platform$OS.type == "windows") { [18:03:19.817] old_names <- names(...future.oldEnvVars) [18:03:19.817] envs <- base::Sys.getenv() [18:03:19.817] names <- names(envs) [18:03:19.817] common <- intersect(names, old_names) [18:03:19.817] added <- setdiff(names, old_names) [18:03:19.817] removed <- setdiff(old_names, names) [18:03:19.817] changed <- common[...future.oldEnvVars[common] != [18:03:19.817] envs[common]] [18:03:19.817] NAMES <- toupper(changed) [18:03:19.817] args <- list() [18:03:19.817] for (kk in seq_along(NAMES)) { [18:03:19.817] name <- changed[[kk]] [18:03:19.817] NAME <- NAMES[[kk]] [18:03:19.817] if (name != NAME && is.element(NAME, old_names)) [18:03:19.817] next [18:03:19.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.817] } [18:03:19.817] NAMES <- toupper(added) [18:03:19.817] for (kk in seq_along(NAMES)) { [18:03:19.817] name <- added[[kk]] [18:03:19.817] NAME <- NAMES[[kk]] [18:03:19.817] if (name != NAME && is.element(NAME, old_names)) [18:03:19.817] next [18:03:19.817] args[[name]] <- "" [18:03:19.817] } [18:03:19.817] NAMES <- toupper(removed) [18:03:19.817] for (kk in seq_along(NAMES)) { [18:03:19.817] name <- removed[[kk]] [18:03:19.817] NAME <- NAMES[[kk]] [18:03:19.817] if (name != NAME && is.element(NAME, old_names)) [18:03:19.817] next [18:03:19.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.817] } [18:03:19.817] if (length(args) > 0) [18:03:19.817] base::do.call(base::Sys.setenv, args = args) [18:03:19.817] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.817] } [18:03:19.817] else { [18:03:19.817] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.817] } [18:03:19.817] { [18:03:19.817] if (base::length(...future.futureOptionsAdded) > [18:03:19.817] 0L) { [18:03:19.817] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.817] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.817] base::options(opts) [18:03:19.817] } [18:03:19.817] { [18:03:19.817] { [18:03:19.817] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.817] NULL [18:03:19.817] } [18:03:19.817] options(future.plan = NULL) [18:03:19.817] if (is.na(NA_character_)) [18:03:19.817] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.817] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.817] future::plan(list(function (..., workers = availableCores(), [18:03:19.817] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.817] envir = parent.frame()) [18:03:19.817] { [18:03:19.817] if (is.function(workers)) [18:03:19.817] workers <- workers() [18:03:19.817] workers <- structure(as.integer(workers), [18:03:19.817] class = class(workers)) [18:03:19.817] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.817] workers >= 1) [18:03:19.817] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.817] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.817] } [18:03:19.817] future <- MultisessionFuture(..., workers = workers, [18:03:19.817] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.817] envir = envir) [18:03:19.817] if (!future$lazy) [18:03:19.817] future <- run(future) [18:03:19.817] invisible(future) [18:03:19.817] }), .cleanup = FALSE, .init = FALSE) [18:03:19.817] } [18:03:19.817] } [18:03:19.817] } [18:03:19.817] }) [18:03:19.817] if (TRUE) { [18:03:19.817] base::sink(type = "output", split = FALSE) [18:03:19.817] if (TRUE) { [18:03:19.817] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.817] } [18:03:19.817] else { [18:03:19.817] ...future.result["stdout"] <- base::list(NULL) [18:03:19.817] } [18:03:19.817] base::close(...future.stdout) [18:03:19.817] ...future.stdout <- NULL [18:03:19.817] } [18:03:19.817] ...future.result$conditions <- ...future.conditions [18:03:19.817] ...future.result$finished <- base::Sys.time() [18:03:19.817] ...future.result [18:03:19.817] } [18:03:19.822] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.822] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.823] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.823] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.824] MultisessionFuture started [18:03:19.824] - Launch lazy future ... done [18:03:19.824] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_2-149387' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f6f5bf48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.840] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.840] - Validating connection of MultisessionFuture [18:03:19.840] - received message: FutureResult [18:03:19.841] - Received FutureResult [18:03:19.841] - Erased future from FutureRegistry [18:03:19.841] result() for ClusterFuture ... [18:03:19.841] - result already collected: FutureResult [18:03:19.841] result() for ClusterFuture ... done [18:03:19.842] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.842] getGlobalsAndPackages() ... [18:03:19.842] Searching for globals... [18:03:19.843] - globals found: [3] '{', 'sample', 'x' [18:03:19.843] Searching for globals ... DONE [18:03:19.843] Resolving globals: FALSE [18:03:19.844] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.844] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.845] - globals: [1] 'x' [18:03:19.845] [18:03:19.845] getGlobalsAndPackages() ... DONE [18:03:19.845] run() for 'Future' ... [18:03:19.845] - state: 'created' [18:03:19.846] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.861] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.861] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.861] - Field: 'node' [18:03:19.861] - Field: 'label' [18:03:19.862] - Field: 'local' [18:03:19.862] - Field: 'owner' [18:03:19.862] - Field: 'envir' [18:03:19.863] - Field: 'workers' [18:03:19.863] - Field: 'packages' [18:03:19.863] - Field: 'gc' [18:03:19.863] - Field: 'conditions' [18:03:19.864] - Field: 'persistent' [18:03:19.864] - Field: 'expr' [18:03:19.864] - Field: 'uuid' [18:03:19.864] - Field: 'seed' [18:03:19.865] - Field: 'version' [18:03:19.865] - Field: 'result' [18:03:19.865] - Field: 'asynchronous' [18:03:19.865] - Field: 'calls' [18:03:19.866] - Field: 'globals' [18:03:19.866] - Field: 'stdout' [18:03:19.866] - Field: 'earlySignal' [18:03:19.866] - Field: 'lazy' [18:03:19.867] - Field: 'state' [18:03:19.867] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.867] - Launch lazy future ... [18:03:19.868] Packages needed by the future expression (n = 0): [18:03:19.868] Packages needed by future strategies (n = 0): [18:03:19.869] { [18:03:19.869] { [18:03:19.869] { [18:03:19.869] ...future.startTime <- base::Sys.time() [18:03:19.869] { [18:03:19.869] { [18:03:19.869] { [18:03:19.869] { [18:03:19.869] base::local({ [18:03:19.869] has_future <- base::requireNamespace("future", [18:03:19.869] quietly = TRUE) [18:03:19.869] if (has_future) { [18:03:19.869] ns <- base::getNamespace("future") [18:03:19.869] version <- ns[[".package"]][["version"]] [18:03:19.869] if (is.null(version)) [18:03:19.869] version <- utils::packageVersion("future") [18:03:19.869] } [18:03:19.869] else { [18:03:19.869] version <- NULL [18:03:19.869] } [18:03:19.869] if (!has_future || version < "1.8.0") { [18:03:19.869] info <- base::c(r_version = base::gsub("R version ", [18:03:19.869] "", base::R.version$version.string), [18:03:19.869] platform = base::sprintf("%s (%s-bit)", [18:03:19.869] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.869] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.869] "release", "version")], collapse = " "), [18:03:19.869] hostname = base::Sys.info()[["nodename"]]) [18:03:19.869] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.869] info) [18:03:19.869] info <- base::paste(info, collapse = "; ") [18:03:19.869] if (!has_future) { [18:03:19.869] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.869] info) [18:03:19.869] } [18:03:19.869] else { [18:03:19.869] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.869] info, version) [18:03:19.869] } [18:03:19.869] base::stop(msg) [18:03:19.869] } [18:03:19.869] }) [18:03:19.869] } [18:03:19.869] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.869] base::options(mc.cores = 1L) [18:03:19.869] } [18:03:19.869] options(future.plan = NULL) [18:03:19.869] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.869] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.869] } [18:03:19.869] ...future.workdir <- getwd() [18:03:19.869] } [18:03:19.869] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.869] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.869] } [18:03:19.869] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.869] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.869] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.869] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.869] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.869] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.869] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.869] base::names(...future.oldOptions)) [18:03:19.869] } [18:03:19.869] if (FALSE) { [18:03:19.869] } [18:03:19.869] else { [18:03:19.869] if (TRUE) { [18:03:19.869] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.869] open = "w") [18:03:19.869] } [18:03:19.869] else { [18:03:19.869] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.869] windows = "NUL", "/dev/null"), open = "w") [18:03:19.869] } [18:03:19.869] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.869] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.869] base::sink(type = "output", split = FALSE) [18:03:19.869] base::close(...future.stdout) [18:03:19.869] }, add = TRUE) [18:03:19.869] } [18:03:19.869] ...future.frame <- base::sys.nframe() [18:03:19.869] ...future.conditions <- base::list() [18:03:19.869] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.869] if (FALSE) { [18:03:19.869] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.869] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.869] } [18:03:19.869] ...future.result <- base::tryCatch({ [18:03:19.869] base::withCallingHandlers({ [18:03:19.869] ...future.value <- base::withVisible(base::local({ [18:03:19.869] ...future.makeSendCondition <- local({ [18:03:19.869] sendCondition <- NULL [18:03:19.869] function(frame = 1L) { [18:03:19.869] if (is.function(sendCondition)) [18:03:19.869] return(sendCondition) [18:03:19.869] ns <- getNamespace("parallel") [18:03:19.869] if (exists("sendData", mode = "function", [18:03:19.869] envir = ns)) { [18:03:19.869] parallel_sendData <- get("sendData", mode = "function", [18:03:19.869] envir = ns) [18:03:19.869] envir <- sys.frame(frame) [18:03:19.869] master <- NULL [18:03:19.869] while (!identical(envir, .GlobalEnv) && [18:03:19.869] !identical(envir, emptyenv())) { [18:03:19.869] if (exists("master", mode = "list", envir = envir, [18:03:19.869] inherits = FALSE)) { [18:03:19.869] master <- get("master", mode = "list", [18:03:19.869] envir = envir, inherits = FALSE) [18:03:19.869] if (inherits(master, c("SOCKnode", [18:03:19.869] "SOCK0node"))) { [18:03:19.869] sendCondition <<- function(cond) { [18:03:19.869] data <- list(type = "VALUE", value = cond, [18:03:19.869] success = TRUE) [18:03:19.869] parallel_sendData(master, data) [18:03:19.869] } [18:03:19.869] return(sendCondition) [18:03:19.869] } [18:03:19.869] } [18:03:19.869] frame <- frame + 1L [18:03:19.869] envir <- sys.frame(frame) [18:03:19.869] } [18:03:19.869] } [18:03:19.869] sendCondition <<- function(cond) NULL [18:03:19.869] } [18:03:19.869] }) [18:03:19.869] withCallingHandlers({ [18:03:19.869] { [18:03:19.869] sample(x, size = 1L) [18:03:19.869] } [18:03:19.869] }, immediateCondition = function(cond) { [18:03:19.869] sendCondition <- ...future.makeSendCondition() [18:03:19.869] sendCondition(cond) [18:03:19.869] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.869] { [18:03:19.869] inherits <- base::inherits [18:03:19.869] invokeRestart <- base::invokeRestart [18:03:19.869] is.null <- base::is.null [18:03:19.869] muffled <- FALSE [18:03:19.869] if (inherits(cond, "message")) { [18:03:19.869] muffled <- grepl(pattern, "muffleMessage") [18:03:19.869] if (muffled) [18:03:19.869] invokeRestart("muffleMessage") [18:03:19.869] } [18:03:19.869] else if (inherits(cond, "warning")) { [18:03:19.869] muffled <- grepl(pattern, "muffleWarning") [18:03:19.869] if (muffled) [18:03:19.869] invokeRestart("muffleWarning") [18:03:19.869] } [18:03:19.869] else if (inherits(cond, "condition")) { [18:03:19.869] if (!is.null(pattern)) { [18:03:19.869] computeRestarts <- base::computeRestarts [18:03:19.869] grepl <- base::grepl [18:03:19.869] restarts <- computeRestarts(cond) [18:03:19.869] for (restart in restarts) { [18:03:19.869] name <- restart$name [18:03:19.869] if (is.null(name)) [18:03:19.869] next [18:03:19.869] if (!grepl(pattern, name)) [18:03:19.869] next [18:03:19.869] invokeRestart(restart) [18:03:19.869] muffled <- TRUE [18:03:19.869] break [18:03:19.869] } [18:03:19.869] } [18:03:19.869] } [18:03:19.869] invisible(muffled) [18:03:19.869] } [18:03:19.869] muffleCondition(cond) [18:03:19.869] }) [18:03:19.869] })) [18:03:19.869] future::FutureResult(value = ...future.value$value, [18:03:19.869] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.869] ...future.rng), globalenv = if (FALSE) [18:03:19.869] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.869] ...future.globalenv.names)) [18:03:19.869] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.869] }, condition = base::local({ [18:03:19.869] c <- base::c [18:03:19.869] inherits <- base::inherits [18:03:19.869] invokeRestart <- base::invokeRestart [18:03:19.869] length <- base::length [18:03:19.869] list <- base::list [18:03:19.869] seq.int <- base::seq.int [18:03:19.869] signalCondition <- base::signalCondition [18:03:19.869] sys.calls <- base::sys.calls [18:03:19.869] `[[` <- base::`[[` [18:03:19.869] `+` <- base::`+` [18:03:19.869] `<<-` <- base::`<<-` [18:03:19.869] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.869] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.869] 3L)] [18:03:19.869] } [18:03:19.869] function(cond) { [18:03:19.869] is_error <- inherits(cond, "error") [18:03:19.869] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.869] NULL) [18:03:19.869] if (is_error) { [18:03:19.869] sessionInformation <- function() { [18:03:19.869] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.869] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.869] search = base::search(), system = base::Sys.info()) [18:03:19.869] } [18:03:19.869] ...future.conditions[[length(...future.conditions) + [18:03:19.869] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.869] cond$call), session = sessionInformation(), [18:03:19.869] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.869] signalCondition(cond) [18:03:19.869] } [18:03:19.869] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.869] "immediateCondition"))) { [18:03:19.869] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.869] ...future.conditions[[length(...future.conditions) + [18:03:19.869] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.869] if (TRUE && !signal) { [18:03:19.869] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.869] { [18:03:19.869] inherits <- base::inherits [18:03:19.869] invokeRestart <- base::invokeRestart [18:03:19.869] is.null <- base::is.null [18:03:19.869] muffled <- FALSE [18:03:19.869] if (inherits(cond, "message")) { [18:03:19.869] muffled <- grepl(pattern, "muffleMessage") [18:03:19.869] if (muffled) [18:03:19.869] invokeRestart("muffleMessage") [18:03:19.869] } [18:03:19.869] else if (inherits(cond, "warning")) { [18:03:19.869] muffled <- grepl(pattern, "muffleWarning") [18:03:19.869] if (muffled) [18:03:19.869] invokeRestart("muffleWarning") [18:03:19.869] } [18:03:19.869] else if (inherits(cond, "condition")) { [18:03:19.869] if (!is.null(pattern)) { [18:03:19.869] computeRestarts <- base::computeRestarts [18:03:19.869] grepl <- base::grepl [18:03:19.869] restarts <- computeRestarts(cond) [18:03:19.869] for (restart in restarts) { [18:03:19.869] name <- restart$name [18:03:19.869] if (is.null(name)) [18:03:19.869] next [18:03:19.869] if (!grepl(pattern, name)) [18:03:19.869] next [18:03:19.869] invokeRestart(restart) [18:03:19.869] muffled <- TRUE [18:03:19.869] break [18:03:19.869] } [18:03:19.869] } [18:03:19.869] } [18:03:19.869] invisible(muffled) [18:03:19.869] } [18:03:19.869] muffleCondition(cond, pattern = "^muffle") [18:03:19.869] } [18:03:19.869] } [18:03:19.869] else { [18:03:19.869] if (TRUE) { [18:03:19.869] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.869] { [18:03:19.869] inherits <- base::inherits [18:03:19.869] invokeRestart <- base::invokeRestart [18:03:19.869] is.null <- base::is.null [18:03:19.869] muffled <- FALSE [18:03:19.869] if (inherits(cond, "message")) { [18:03:19.869] muffled <- grepl(pattern, "muffleMessage") [18:03:19.869] if (muffled) [18:03:19.869] invokeRestart("muffleMessage") [18:03:19.869] } [18:03:19.869] else if (inherits(cond, "warning")) { [18:03:19.869] muffled <- grepl(pattern, "muffleWarning") [18:03:19.869] if (muffled) [18:03:19.869] invokeRestart("muffleWarning") [18:03:19.869] } [18:03:19.869] else if (inherits(cond, "condition")) { [18:03:19.869] if (!is.null(pattern)) { [18:03:19.869] computeRestarts <- base::computeRestarts [18:03:19.869] grepl <- base::grepl [18:03:19.869] restarts <- computeRestarts(cond) [18:03:19.869] for (restart in restarts) { [18:03:19.869] name <- restart$name [18:03:19.869] if (is.null(name)) [18:03:19.869] next [18:03:19.869] if (!grepl(pattern, name)) [18:03:19.869] next [18:03:19.869] invokeRestart(restart) [18:03:19.869] muffled <- TRUE [18:03:19.869] break [18:03:19.869] } [18:03:19.869] } [18:03:19.869] } [18:03:19.869] invisible(muffled) [18:03:19.869] } [18:03:19.869] muffleCondition(cond, pattern = "^muffle") [18:03:19.869] } [18:03:19.869] } [18:03:19.869] } [18:03:19.869] })) [18:03:19.869] }, error = function(ex) { [18:03:19.869] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.869] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.869] ...future.rng), started = ...future.startTime, [18:03:19.869] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.869] version = "1.8"), class = "FutureResult") [18:03:19.869] }, finally = { [18:03:19.869] if (!identical(...future.workdir, getwd())) [18:03:19.869] setwd(...future.workdir) [18:03:19.869] { [18:03:19.869] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.869] ...future.oldOptions$nwarnings <- NULL [18:03:19.869] } [18:03:19.869] base::options(...future.oldOptions) [18:03:19.869] if (.Platform$OS.type == "windows") { [18:03:19.869] old_names <- names(...future.oldEnvVars) [18:03:19.869] envs <- base::Sys.getenv() [18:03:19.869] names <- names(envs) [18:03:19.869] common <- intersect(names, old_names) [18:03:19.869] added <- setdiff(names, old_names) [18:03:19.869] removed <- setdiff(old_names, names) [18:03:19.869] changed <- common[...future.oldEnvVars[common] != [18:03:19.869] envs[common]] [18:03:19.869] NAMES <- toupper(changed) [18:03:19.869] args <- list() [18:03:19.869] for (kk in seq_along(NAMES)) { [18:03:19.869] name <- changed[[kk]] [18:03:19.869] NAME <- NAMES[[kk]] [18:03:19.869] if (name != NAME && is.element(NAME, old_names)) [18:03:19.869] next [18:03:19.869] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.869] } [18:03:19.869] NAMES <- toupper(added) [18:03:19.869] for (kk in seq_along(NAMES)) { [18:03:19.869] name <- added[[kk]] [18:03:19.869] NAME <- NAMES[[kk]] [18:03:19.869] if (name != NAME && is.element(NAME, old_names)) [18:03:19.869] next [18:03:19.869] args[[name]] <- "" [18:03:19.869] } [18:03:19.869] NAMES <- toupper(removed) [18:03:19.869] for (kk in seq_along(NAMES)) { [18:03:19.869] name <- removed[[kk]] [18:03:19.869] NAME <- NAMES[[kk]] [18:03:19.869] if (name != NAME && is.element(NAME, old_names)) [18:03:19.869] next [18:03:19.869] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.869] } [18:03:19.869] if (length(args) > 0) [18:03:19.869] base::do.call(base::Sys.setenv, args = args) [18:03:19.869] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.869] } [18:03:19.869] else { [18:03:19.869] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.869] } [18:03:19.869] { [18:03:19.869] if (base::length(...future.futureOptionsAdded) > [18:03:19.869] 0L) { [18:03:19.869] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.869] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.869] base::options(opts) [18:03:19.869] } [18:03:19.869] { [18:03:19.869] { [18:03:19.869] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.869] NULL [18:03:19.869] } [18:03:19.869] options(future.plan = NULL) [18:03:19.869] if (is.na(NA_character_)) [18:03:19.869] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.869] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.869] future::plan(list(function (..., workers = availableCores(), [18:03:19.869] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.869] envir = parent.frame()) [18:03:19.869] { [18:03:19.869] if (is.function(workers)) [18:03:19.869] workers <- workers() [18:03:19.869] workers <- structure(as.integer(workers), [18:03:19.869] class = class(workers)) [18:03:19.869] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.869] workers >= 1) [18:03:19.869] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.869] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.869] } [18:03:19.869] future <- MultisessionFuture(..., workers = workers, [18:03:19.869] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.869] envir = envir) [18:03:19.869] if (!future$lazy) [18:03:19.869] future <- run(future) [18:03:19.869] invisible(future) [18:03:19.869] }), .cleanup = FALSE, .init = FALSE) [18:03:19.869] } [18:03:19.869] } [18:03:19.869] } [18:03:19.869] }) [18:03:19.869] if (TRUE) { [18:03:19.869] base::sink(type = "output", split = FALSE) [18:03:19.869] if (TRUE) { [18:03:19.869] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.869] } [18:03:19.869] else { [18:03:19.869] ...future.result["stdout"] <- base::list(NULL) [18:03:19.869] } [18:03:19.869] base::close(...future.stdout) [18:03:19.869] ...future.stdout <- NULL [18:03:19.869] } [18:03:19.869] ...future.result$conditions <- ...future.conditions [18:03:19.869] ...future.result$finished <- base::Sys.time() [18:03:19.869] ...future.result [18:03:19.869] } [18:03:19.874] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.874] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.875] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.875] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.875] MultisessionFuture started [18:03:19.876] - Launch lazy future ... done [18:03:19.876] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_3-528714' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f6f5bf48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.891] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.891] - Validating connection of MultisessionFuture [18:03:19.892] - received message: FutureResult [18:03:19.892] - Received FutureResult [18:03:19.892] - Erased future from FutureRegistry [18:03:19.892] result() for ClusterFuture ... [18:03:19.892] - result already collected: FutureResult [18:03:19.893] result() for ClusterFuture ... done [18:03:19.893] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.893] getGlobalsAndPackages() ... [18:03:19.893] Searching for globals... [18:03:19.894] - globals found: [3] '{', 'sample', 'x' [18:03:19.895] Searching for globals ... DONE [18:03:19.895] Resolving globals: FALSE [18:03:19.895] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.896] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.896] - globals: [1] 'x' [18:03:19.896] [18:03:19.896] getGlobalsAndPackages() ... DONE [18:03:19.897] run() for 'Future' ... [18:03:19.897] - state: 'created' [18:03:19.897] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.911] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.911] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.911] - Field: 'node' [18:03:19.911] - Field: 'label' [18:03:19.911] - Field: 'local' [18:03:19.912] - Field: 'owner' [18:03:19.912] - Field: 'envir' [18:03:19.912] - Field: 'workers' [18:03:19.912] - Field: 'packages' [18:03:19.912] - Field: 'gc' [18:03:19.912] - Field: 'conditions' [18:03:19.913] - Field: 'persistent' [18:03:19.913] - Field: 'expr' [18:03:19.913] - Field: 'uuid' [18:03:19.913] - Field: 'seed' [18:03:19.913] - Field: 'version' [18:03:19.913] - Field: 'result' [18:03:19.914] - Field: 'asynchronous' [18:03:19.914] - Field: 'calls' [18:03:19.914] - Field: 'globals' [18:03:19.914] - Field: 'stdout' [18:03:19.914] - Field: 'earlySignal' [18:03:19.915] - Field: 'lazy' [18:03:19.915] - Field: 'state' [18:03:19.915] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.915] - Launch lazy future ... [18:03:19.915] Packages needed by the future expression (n = 0): [18:03:19.916] Packages needed by future strategies (n = 0): [18:03:19.916] { [18:03:19.916] { [18:03:19.916] { [18:03:19.916] ...future.startTime <- base::Sys.time() [18:03:19.916] { [18:03:19.916] { [18:03:19.916] { [18:03:19.916] { [18:03:19.916] base::local({ [18:03:19.916] has_future <- base::requireNamespace("future", [18:03:19.916] quietly = TRUE) [18:03:19.916] if (has_future) { [18:03:19.916] ns <- base::getNamespace("future") [18:03:19.916] version <- ns[[".package"]][["version"]] [18:03:19.916] if (is.null(version)) [18:03:19.916] version <- utils::packageVersion("future") [18:03:19.916] } [18:03:19.916] else { [18:03:19.916] version <- NULL [18:03:19.916] } [18:03:19.916] if (!has_future || version < "1.8.0") { [18:03:19.916] info <- base::c(r_version = base::gsub("R version ", [18:03:19.916] "", base::R.version$version.string), [18:03:19.916] platform = base::sprintf("%s (%s-bit)", [18:03:19.916] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:19.916] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.916] "release", "version")], collapse = " "), [18:03:19.916] hostname = base::Sys.info()[["nodename"]]) [18:03:19.916] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.916] info) [18:03:19.916] info <- base::paste(info, collapse = "; ") [18:03:19.916] if (!has_future) { [18:03:19.916] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.916] info) [18:03:19.916] } [18:03:19.916] else { [18:03:19.916] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.916] info, version) [18:03:19.916] } [18:03:19.916] base::stop(msg) [18:03:19.916] } [18:03:19.916] }) [18:03:19.916] } [18:03:19.916] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.916] base::options(mc.cores = 1L) [18:03:19.916] } [18:03:19.916] options(future.plan = NULL) [18:03:19.916] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.916] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:19.916] } [18:03:19.916] ...future.workdir <- getwd() [18:03:19.916] } [18:03:19.916] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.916] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.916] } [18:03:19.916] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.916] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.916] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.916] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.916] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:19.916] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.916] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.916] base::names(...future.oldOptions)) [18:03:19.916] } [18:03:19.916] if (FALSE) { [18:03:19.916] } [18:03:19.916] else { [18:03:19.916] if (TRUE) { [18:03:19.916] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.916] open = "w") [18:03:19.916] } [18:03:19.916] else { [18:03:19.916] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.916] windows = "NUL", "/dev/null"), open = "w") [18:03:19.916] } [18:03:19.916] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.916] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.916] base::sink(type = "output", split = FALSE) [18:03:19.916] base::close(...future.stdout) [18:03:19.916] }, add = TRUE) [18:03:19.916] } [18:03:19.916] ...future.frame <- base::sys.nframe() [18:03:19.916] ...future.conditions <- base::list() [18:03:19.916] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.916] if (FALSE) { [18:03:19.916] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.916] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.916] } [18:03:19.916] ...future.result <- base::tryCatch({ [18:03:19.916] base::withCallingHandlers({ [18:03:19.916] ...future.value <- base::withVisible(base::local({ [18:03:19.916] ...future.makeSendCondition <- local({ [18:03:19.916] sendCondition <- NULL [18:03:19.916] function(frame = 1L) { [18:03:19.916] if (is.function(sendCondition)) [18:03:19.916] return(sendCondition) [18:03:19.916] ns <- getNamespace("parallel") [18:03:19.916] if (exists("sendData", mode = "function", [18:03:19.916] envir = ns)) { [18:03:19.916] parallel_sendData <- get("sendData", mode = "function", [18:03:19.916] envir = ns) [18:03:19.916] envir <- sys.frame(frame) [18:03:19.916] master <- NULL [18:03:19.916] while (!identical(envir, .GlobalEnv) && [18:03:19.916] !identical(envir, emptyenv())) { [18:03:19.916] if (exists("master", mode = "list", envir = envir, [18:03:19.916] inherits = FALSE)) { [18:03:19.916] master <- get("master", mode = "list", [18:03:19.916] envir = envir, inherits = FALSE) [18:03:19.916] if (inherits(master, c("SOCKnode", [18:03:19.916] "SOCK0node"))) { [18:03:19.916] sendCondition <<- function(cond) { [18:03:19.916] data <- list(type = "VALUE", value = cond, [18:03:19.916] success = TRUE) [18:03:19.916] parallel_sendData(master, data) [18:03:19.916] } [18:03:19.916] return(sendCondition) [18:03:19.916] } [18:03:19.916] } [18:03:19.916] frame <- frame + 1L [18:03:19.916] envir <- sys.frame(frame) [18:03:19.916] } [18:03:19.916] } [18:03:19.916] sendCondition <<- function(cond) NULL [18:03:19.916] } [18:03:19.916] }) [18:03:19.916] withCallingHandlers({ [18:03:19.916] { [18:03:19.916] sample(x, size = 1L) [18:03:19.916] } [18:03:19.916] }, immediateCondition = function(cond) { [18:03:19.916] sendCondition <- ...future.makeSendCondition() [18:03:19.916] sendCondition(cond) [18:03:19.916] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.916] { [18:03:19.916] inherits <- base::inherits [18:03:19.916] invokeRestart <- base::invokeRestart [18:03:19.916] is.null <- base::is.null [18:03:19.916] muffled <- FALSE [18:03:19.916] if (inherits(cond, "message")) { [18:03:19.916] muffled <- grepl(pattern, "muffleMessage") [18:03:19.916] if (muffled) [18:03:19.916] invokeRestart("muffleMessage") [18:03:19.916] } [18:03:19.916] else if (inherits(cond, "warning")) { [18:03:19.916] muffled <- grepl(pattern, "muffleWarning") [18:03:19.916] if (muffled) [18:03:19.916] invokeRestart("muffleWarning") [18:03:19.916] } [18:03:19.916] else if (inherits(cond, "condition")) { [18:03:19.916] if (!is.null(pattern)) { [18:03:19.916] computeRestarts <- base::computeRestarts [18:03:19.916] grepl <- base::grepl [18:03:19.916] restarts <- computeRestarts(cond) [18:03:19.916] for (restart in restarts) { [18:03:19.916] name <- restart$name [18:03:19.916] if (is.null(name)) [18:03:19.916] next [18:03:19.916] if (!grepl(pattern, name)) [18:03:19.916] next [18:03:19.916] invokeRestart(restart) [18:03:19.916] muffled <- TRUE [18:03:19.916] break [18:03:19.916] } [18:03:19.916] } [18:03:19.916] } [18:03:19.916] invisible(muffled) [18:03:19.916] } [18:03:19.916] muffleCondition(cond) [18:03:19.916] }) [18:03:19.916] })) [18:03:19.916] future::FutureResult(value = ...future.value$value, [18:03:19.916] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.916] ...future.rng), globalenv = if (FALSE) [18:03:19.916] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.916] ...future.globalenv.names)) [18:03:19.916] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.916] }, condition = base::local({ [18:03:19.916] c <- base::c [18:03:19.916] inherits <- base::inherits [18:03:19.916] invokeRestart <- base::invokeRestart [18:03:19.916] length <- base::length [18:03:19.916] list <- base::list [18:03:19.916] seq.int <- base::seq.int [18:03:19.916] signalCondition <- base::signalCondition [18:03:19.916] sys.calls <- base::sys.calls [18:03:19.916] `[[` <- base::`[[` [18:03:19.916] `+` <- base::`+` [18:03:19.916] `<<-` <- base::`<<-` [18:03:19.916] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.916] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.916] 3L)] [18:03:19.916] } [18:03:19.916] function(cond) { [18:03:19.916] is_error <- inherits(cond, "error") [18:03:19.916] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.916] NULL) [18:03:19.916] if (is_error) { [18:03:19.916] sessionInformation <- function() { [18:03:19.916] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.916] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.916] search = base::search(), system = base::Sys.info()) [18:03:19.916] } [18:03:19.916] ...future.conditions[[length(...future.conditions) + [18:03:19.916] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.916] cond$call), session = sessionInformation(), [18:03:19.916] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.916] signalCondition(cond) [18:03:19.916] } [18:03:19.916] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.916] "immediateCondition"))) { [18:03:19.916] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.916] ...future.conditions[[length(...future.conditions) + [18:03:19.916] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.916] if (TRUE && !signal) { [18:03:19.916] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.916] { [18:03:19.916] inherits <- base::inherits [18:03:19.916] invokeRestart <- base::invokeRestart [18:03:19.916] is.null <- base::is.null [18:03:19.916] muffled <- FALSE [18:03:19.916] if (inherits(cond, "message")) { [18:03:19.916] muffled <- grepl(pattern, "muffleMessage") [18:03:19.916] if (muffled) [18:03:19.916] invokeRestart("muffleMessage") [18:03:19.916] } [18:03:19.916] else if (inherits(cond, "warning")) { [18:03:19.916] muffled <- grepl(pattern, "muffleWarning") [18:03:19.916] if (muffled) [18:03:19.916] invokeRestart("muffleWarning") [18:03:19.916] } [18:03:19.916] else if (inherits(cond, "condition")) { [18:03:19.916] if (!is.null(pattern)) { [18:03:19.916] computeRestarts <- base::computeRestarts [18:03:19.916] grepl <- base::grepl [18:03:19.916] restarts <- computeRestarts(cond) [18:03:19.916] for (restart in restarts) { [18:03:19.916] name <- restart$name [18:03:19.916] if (is.null(name)) [18:03:19.916] next [18:03:19.916] if (!grepl(pattern, name)) [18:03:19.916] next [18:03:19.916] invokeRestart(restart) [18:03:19.916] muffled <- TRUE [18:03:19.916] break [18:03:19.916] } [18:03:19.916] } [18:03:19.916] } [18:03:19.916] invisible(muffled) [18:03:19.916] } [18:03:19.916] muffleCondition(cond, pattern = "^muffle") [18:03:19.916] } [18:03:19.916] } [18:03:19.916] else { [18:03:19.916] if (TRUE) { [18:03:19.916] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.916] { [18:03:19.916] inherits <- base::inherits [18:03:19.916] invokeRestart <- base::invokeRestart [18:03:19.916] is.null <- base::is.null [18:03:19.916] muffled <- FALSE [18:03:19.916] if (inherits(cond, "message")) { [18:03:19.916] muffled <- grepl(pattern, "muffleMessage") [18:03:19.916] if (muffled) [18:03:19.916] invokeRestart("muffleMessage") [18:03:19.916] } [18:03:19.916] else if (inherits(cond, "warning")) { [18:03:19.916] muffled <- grepl(pattern, "muffleWarning") [18:03:19.916] if (muffled) [18:03:19.916] invokeRestart("muffleWarning") [18:03:19.916] } [18:03:19.916] else if (inherits(cond, "condition")) { [18:03:19.916] if (!is.null(pattern)) { [18:03:19.916] computeRestarts <- base::computeRestarts [18:03:19.916] grepl <- base::grepl [18:03:19.916] restarts <- computeRestarts(cond) [18:03:19.916] for (restart in restarts) { [18:03:19.916] name <- restart$name [18:03:19.916] if (is.null(name)) [18:03:19.916] next [18:03:19.916] if (!grepl(pattern, name)) [18:03:19.916] next [18:03:19.916] invokeRestart(restart) [18:03:19.916] muffled <- TRUE [18:03:19.916] break [18:03:19.916] } [18:03:19.916] } [18:03:19.916] } [18:03:19.916] invisible(muffled) [18:03:19.916] } [18:03:19.916] muffleCondition(cond, pattern = "^muffle") [18:03:19.916] } [18:03:19.916] } [18:03:19.916] } [18:03:19.916] })) [18:03:19.916] }, error = function(ex) { [18:03:19.916] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.916] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.916] ...future.rng), started = ...future.startTime, [18:03:19.916] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.916] version = "1.8"), class = "FutureResult") [18:03:19.916] }, finally = { [18:03:19.916] if (!identical(...future.workdir, getwd())) [18:03:19.916] setwd(...future.workdir) [18:03:19.916] { [18:03:19.916] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.916] ...future.oldOptions$nwarnings <- NULL [18:03:19.916] } [18:03:19.916] base::options(...future.oldOptions) [18:03:19.916] if (.Platform$OS.type == "windows") { [18:03:19.916] old_names <- names(...future.oldEnvVars) [18:03:19.916] envs <- base::Sys.getenv() [18:03:19.916] names <- names(envs) [18:03:19.916] common <- intersect(names, old_names) [18:03:19.916] added <- setdiff(names, old_names) [18:03:19.916] removed <- setdiff(old_names, names) [18:03:19.916] changed <- common[...future.oldEnvVars[common] != [18:03:19.916] envs[common]] [18:03:19.916] NAMES <- toupper(changed) [18:03:19.916] args <- list() [18:03:19.916] for (kk in seq_along(NAMES)) { [18:03:19.916] name <- changed[[kk]] [18:03:19.916] NAME <- NAMES[[kk]] [18:03:19.916] if (name != NAME && is.element(NAME, old_names)) [18:03:19.916] next [18:03:19.916] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.916] } [18:03:19.916] NAMES <- toupper(added) [18:03:19.916] for (kk in seq_along(NAMES)) { [18:03:19.916] name <- added[[kk]] [18:03:19.916] NAME <- NAMES[[kk]] [18:03:19.916] if (name != NAME && is.element(NAME, old_names)) [18:03:19.916] next [18:03:19.916] args[[name]] <- "" [18:03:19.916] } [18:03:19.916] NAMES <- toupper(removed) [18:03:19.916] for (kk in seq_along(NAMES)) { [18:03:19.916] name <- removed[[kk]] [18:03:19.916] NAME <- NAMES[[kk]] [18:03:19.916] if (name != NAME && is.element(NAME, old_names)) [18:03:19.916] next [18:03:19.916] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.916] } [18:03:19.916] if (length(args) > 0) [18:03:19.916] base::do.call(base::Sys.setenv, args = args) [18:03:19.916] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.916] } [18:03:19.916] else { [18:03:19.916] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.916] } [18:03:19.916] { [18:03:19.916] if (base::length(...future.futureOptionsAdded) > [18:03:19.916] 0L) { [18:03:19.916] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.916] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.916] base::options(opts) [18:03:19.916] } [18:03:19.916] { [18:03:19.916] { [18:03:19.916] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.916] NULL [18:03:19.916] } [18:03:19.916] options(future.plan = NULL) [18:03:19.916] if (is.na(NA_character_)) [18:03:19.916] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.916] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.916] future::plan(list(function (..., workers = availableCores(), [18:03:19.916] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.916] envir = parent.frame()) [18:03:19.916] { [18:03:19.916] if (is.function(workers)) [18:03:19.916] workers <- workers() [18:03:19.916] workers <- structure(as.integer(workers), [18:03:19.916] class = class(workers)) [18:03:19.916] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.916] workers >= 1) [18:03:19.916] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.916] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.916] } [18:03:19.916] future <- MultisessionFuture(..., workers = workers, [18:03:19.916] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.916] envir = envir) [18:03:19.916] if (!future$lazy) [18:03:19.916] future <- run(future) [18:03:19.916] invisible(future) [18:03:19.916] }), .cleanup = FALSE, .init = FALSE) [18:03:19.916] } [18:03:19.916] } [18:03:19.916] } [18:03:19.916] }) [18:03:19.916] if (TRUE) { [18:03:19.916] base::sink(type = "output", split = FALSE) [18:03:19.916] if (TRUE) { [18:03:19.916] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.916] } [18:03:19.916] else { [18:03:19.916] ...future.result["stdout"] <- base::list(NULL) [18:03:19.916] } [18:03:19.916] base::close(...future.stdout) [18:03:19.916] ...future.stdout <- NULL [18:03:19.916] } [18:03:19.916] ...future.result$conditions <- ...future.conditions [18:03:19.916] ...future.result$finished <- base::Sys.time() [18:03:19.916] ...future.result [18:03:19.916] } [18:03:19.921] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:19.922] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:19.922] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:19.922] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:19.923] MultisessionFuture started [18:03:19.923] - Launch lazy future ... done [18:03:19.923] run() for 'MultisessionFuture' ... done MultisessionFuture: Label: 'fsample_4-72142' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f6f5bf48 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:03:19.939] receiveMessageFromWorker() for ClusterFuture ... [18:03:19.939] - Validating connection of MultisessionFuture [18:03:19.940] - received message: FutureResult [18:03:19.940] - Received FutureResult [18:03:19.940] - Erased future from FutureRegistry [18:03:19.940] result() for ClusterFuture ... [18:03:19.940] - result already collected: FutureResult [18:03:19.940] result() for ClusterFuture ... done [18:03:19.941] receiveMessageFromWorker() for ClusterFuture ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.941] resolve() on list ... [18:03:19.941] recursive: 0 [18:03:19.941] length: 4 [18:03:19.941] [18:03:19.941] Future #1 [18:03:19.942] result() for ClusterFuture ... [18:03:19.942] - result already collected: FutureResult [18:03:19.942] result() for ClusterFuture ... done [18:03:19.942] result() for ClusterFuture ... [18:03:19.942] - result already collected: FutureResult [18:03:19.942] result() for ClusterFuture ... done [18:03:19.943] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:03:19.943] - nx: 4 [18:03:19.943] - relay: TRUE [18:03:19.943] - stdout: TRUE [18:03:19.943] - signal: TRUE [18:03:19.943] - resignal: FALSE [18:03:19.944] - force: TRUE [18:03:19.944] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.944] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:03:19.944] - until=1 [18:03:19.944] - relaying element #1 [18:03:19.944] result() for ClusterFuture ... [18:03:19.944] - result already collected: FutureResult [18:03:19.945] result() for ClusterFuture ... done [18:03:19.945] result() for ClusterFuture ... [18:03:19.945] - result already collected: FutureResult [18:03:19.945] result() for ClusterFuture ... done [18:03:19.945] result() for ClusterFuture ... [18:03:19.945] - result already collected: FutureResult [18:03:19.946] result() for ClusterFuture ... done [18:03:19.946] result() for ClusterFuture ... [18:03:19.946] - result already collected: FutureResult [18:03:19.946] result() for ClusterFuture ... done [18:03:19.946] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.946] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.947] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:03:19.947] length: 3 (resolved future 1) [18:03:19.947] Future #2 [18:03:19.947] result() for ClusterFuture ... [18:03:19.947] - result already collected: FutureResult [18:03:19.947] result() for ClusterFuture ... done [18:03:19.948] result() for ClusterFuture ... [18:03:19.948] - result already collected: FutureResult [18:03:19.948] result() for ClusterFuture ... done [18:03:19.948] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:03:19.948] - nx: 4 [18:03:19.948] - relay: TRUE [18:03:19.949] - stdout: TRUE [18:03:19.949] - signal: TRUE [18:03:19.949] - resignal: FALSE [18:03:19.949] - force: TRUE [18:03:19.949] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.949] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:03:19.949] - until=2 [18:03:19.950] - relaying element #2 [18:03:19.950] result() for ClusterFuture ... [18:03:19.950] - result already collected: FutureResult [18:03:19.950] result() for ClusterFuture ... done [18:03:19.950] result() for ClusterFuture ... [18:03:19.950] - result already collected: FutureResult [18:03:19.951] result() for ClusterFuture ... done [18:03:19.951] result() for ClusterFuture ... [18:03:19.951] - result already collected: FutureResult [18:03:19.951] result() for ClusterFuture ... done [18:03:19.951] result() for ClusterFuture ... [18:03:19.951] - result already collected: FutureResult [18:03:19.951] result() for ClusterFuture ... done [18:03:19.952] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.952] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.952] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:03:19.952] length: 2 (resolved future 2) [18:03:19.952] Future #3 [18:03:19.953] result() for ClusterFuture ... [18:03:19.953] - result already collected: FutureResult [18:03:19.953] result() for ClusterFuture ... done [18:03:19.953] result() for ClusterFuture ... [18:03:19.953] - result already collected: FutureResult [18:03:19.953] result() for ClusterFuture ... done [18:03:19.953] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:03:19.954] - nx: 4 [18:03:19.954] - relay: TRUE [18:03:19.954] - stdout: TRUE [18:03:19.954] - signal: TRUE [18:03:19.954] - resignal: FALSE [18:03:19.954] - force: TRUE [18:03:19.955] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.955] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:03:19.955] - until=3 [18:03:19.955] - relaying element #3 [18:03:19.955] result() for ClusterFuture ... [18:03:19.955] - result already collected: FutureResult [18:03:19.956] result() for ClusterFuture ... done [18:03:19.956] result() for ClusterFuture ... [18:03:19.956] - result already collected: FutureResult [18:03:19.956] result() for ClusterFuture ... done [18:03:19.956] result() for ClusterFuture ... [18:03:19.956] - result already collected: FutureResult [18:03:19.957] result() for ClusterFuture ... done [18:03:19.957] result() for ClusterFuture ... [18:03:19.957] - result already collected: FutureResult [18:03:19.957] result() for ClusterFuture ... done [18:03:19.957] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.957] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.958] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:03:19.958] length: 1 (resolved future 3) [18:03:19.958] Future #4 [18:03:19.958] result() for ClusterFuture ... [18:03:19.958] - result already collected: FutureResult [18:03:19.958] result() for ClusterFuture ... done [18:03:19.959] result() for ClusterFuture ... [18:03:19.959] - result already collected: FutureResult [18:03:19.959] result() for ClusterFuture ... done [18:03:19.959] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:03:19.959] - nx: 4 [18:03:19.959] - relay: TRUE [18:03:19.959] - stdout: TRUE [18:03:19.960] - signal: TRUE [18:03:19.960] - resignal: FALSE [18:03:19.960] - force: TRUE [18:03:19.960] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.960] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:03:19.960] - until=4 [18:03:19.961] - relaying element #4 [18:03:19.961] result() for ClusterFuture ... [18:03:19.961] - result already collected: FutureResult [18:03:19.961] result() for ClusterFuture ... done [18:03:19.961] result() for ClusterFuture ... [18:03:19.961] - result already collected: FutureResult [18:03:19.961] result() for ClusterFuture ... done [18:03:19.962] result() for ClusterFuture ... [18:03:19.962] - result already collected: FutureResult [18:03:19.962] result() for ClusterFuture ... done [18:03:19.962] result() for ClusterFuture ... [18:03:19.962] - result already collected: FutureResult [18:03:19.962] result() for ClusterFuture ... done [18:03:19.963] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.963] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.963] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:03:19.963] length: 0 (resolved future 4) [18:03:19.963] Relaying remaining futures [18:03:19.964] signalConditionsASAP(NULL, pos=0) ... [18:03:19.964] - nx: 4 [18:03:19.964] - relay: TRUE [18:03:19.964] - stdout: TRUE [18:03:19.964] - signal: TRUE [18:03:19.964] - resignal: FALSE [18:03:19.964] - force: TRUE [18:03:19.965] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.965] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:03:19.965] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.965] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:03:19.965] signalConditionsASAP(NULL, pos=0) ... done [18:03:19.966] resolve() on list ... DONE [18:03:19.966] result() for ClusterFuture ... [18:03:19.966] - result already collected: FutureResult [18:03:19.966] result() for ClusterFuture ... done [18:03:19.966] result() for ClusterFuture ... [18:03:19.966] - result already collected: FutureResult [18:03:19.966] result() for ClusterFuture ... done [18:03:19.967] result() for ClusterFuture ... [18:03:19.967] - result already collected: FutureResult [18:03:19.967] result() for ClusterFuture ... done [18:03:19.967] result() for ClusterFuture ... [18:03:19.967] - result already collected: FutureResult [18:03:19.967] result() for ClusterFuture ... done [18:03:19.968] result() for ClusterFuture ... [18:03:19.968] - result already collected: FutureResult [18:03:19.968] result() for ClusterFuture ... done [18:03:19.968] result() for ClusterFuture ... [18:03:19.968] - result already collected: FutureResult [18:03:19.968] result() for ClusterFuture ... done [18:03:19.969] result() for ClusterFuture ... [18:03:19.969] - result already collected: FutureResult [18:03:19.969] result() for ClusterFuture ... done [18:03:19.969] result() for ClusterFuture ... [18:03:19.969] - result already collected: FutureResult [18:03:19.969] result() for ClusterFuture ... done [[1]] [1] 1 [[2]] [1] 3 [[3]] [1] 0 [[4]] [1] 2 [18:03:19.970] getGlobalsAndPackages() ... [18:03:19.970] Searching for globals... [18:03:19.971] - globals found: [3] '{', 'sample', 'x' [18:03:19.972] Searching for globals ... DONE [18:03:19.972] Resolving globals: FALSE [18:03:19.972] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:19.973] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:19.973] - globals: [1] 'x' [18:03:19.973] [18:03:19.973] getGlobalsAndPackages() ... DONE [18:03:19.974] run() for 'Future' ... [18:03:19.974] - state: 'created' [18:03:19.974] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:19.987] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:19.988] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:19.988] - Field: 'node' [18:03:19.988] - Field: 'label' [18:03:19.988] - Field: 'local' [18:03:19.988] - Field: 'owner' [18:03:19.989] - Field: 'envir' [18:03:19.989] - Field: 'workers' [18:03:19.989] - Field: 'packages' [18:03:19.989] - Field: 'gc' [18:03:19.989] - Field: 'conditions' [18:03:19.990] - Field: 'persistent' [18:03:19.990] - Field: 'expr' [18:03:19.990] - Field: 'uuid' [18:03:19.990] - Field: 'seed' [18:03:19.990] - Field: 'version' [18:03:19.990] - Field: 'result' [18:03:19.991] - Field: 'asynchronous' [18:03:19.991] - Field: 'calls' [18:03:19.991] - Field: 'globals' [18:03:19.991] - Field: 'stdout' [18:03:19.991] - Field: 'earlySignal' [18:03:19.991] - Field: 'lazy' [18:03:19.992] - Field: 'state' [18:03:19.992] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:19.992] - Launch lazy future ... [18:03:19.992] Packages needed by the future expression (n = 0): [18:03:19.993] Packages needed by future strategies (n = 0): [18:03:19.993] { [18:03:19.993] { [18:03:19.993] { [18:03:19.993] ...future.startTime <- base::Sys.time() [18:03:19.993] { [18:03:19.993] { [18:03:19.993] { [18:03:19.993] { [18:03:19.993] { [18:03:19.993] base::local({ [18:03:19.993] has_future <- base::requireNamespace("future", [18:03:19.993] quietly = TRUE) [18:03:19.993] if (has_future) { [18:03:19.993] ns <- base::getNamespace("future") [18:03:19.993] version <- ns[[".package"]][["version"]] [18:03:19.993] if (is.null(version)) [18:03:19.993] version <- utils::packageVersion("future") [18:03:19.993] } [18:03:19.993] else { [18:03:19.993] version <- NULL [18:03:19.993] } [18:03:19.993] if (!has_future || version < "1.8.0") { [18:03:19.993] info <- base::c(r_version = base::gsub("R version ", [18:03:19.993] "", base::R.version$version.string), [18:03:19.993] platform = base::sprintf("%s (%s-bit)", [18:03:19.993] base::R.version$platform, 8 * [18:03:19.993] base::.Machine$sizeof.pointer), [18:03:19.993] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:19.993] "release", "version")], collapse = " "), [18:03:19.993] hostname = base::Sys.info()[["nodename"]]) [18:03:19.993] info <- base::sprintf("%s: %s", base::names(info), [18:03:19.993] info) [18:03:19.993] info <- base::paste(info, collapse = "; ") [18:03:19.993] if (!has_future) { [18:03:19.993] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:19.993] info) [18:03:19.993] } [18:03:19.993] else { [18:03:19.993] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:19.993] info, version) [18:03:19.993] } [18:03:19.993] base::stop(msg) [18:03:19.993] } [18:03:19.993] }) [18:03:19.993] } [18:03:19.993] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:19.993] base::options(mc.cores = 1L) [18:03:19.993] } [18:03:19.993] options(future.plan = NULL) [18:03:19.993] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.993] future::plan("default", .cleanup = FALSE, [18:03:19.993] .init = FALSE) [18:03:19.993] } [18:03:19.993] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:19.993] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:19.993] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:19.993] } [18:03:19.993] ...future.workdir <- getwd() [18:03:19.993] } [18:03:19.993] ...future.oldOptions <- base::as.list(base::.Options) [18:03:19.993] ...future.oldEnvVars <- base::Sys.getenv() [18:03:19.993] } [18:03:19.993] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:19.993] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:19.993] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:19.993] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:19.993] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:19.993] future.stdout.windows.reencode = NULL, width = 80L) [18:03:19.993] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:19.993] base::names(...future.oldOptions)) [18:03:19.993] } [18:03:19.993] if (FALSE) { [18:03:19.993] } [18:03:19.993] else { [18:03:19.993] if (TRUE) { [18:03:19.993] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:19.993] open = "w") [18:03:19.993] } [18:03:19.993] else { [18:03:19.993] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:19.993] windows = "NUL", "/dev/null"), open = "w") [18:03:19.993] } [18:03:19.993] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:19.993] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:19.993] base::sink(type = "output", split = FALSE) [18:03:19.993] base::close(...future.stdout) [18:03:19.993] }, add = TRUE) [18:03:19.993] } [18:03:19.993] ...future.frame <- base::sys.nframe() [18:03:19.993] ...future.conditions <- base::list() [18:03:19.993] ...future.rng <- base::globalenv()$.Random.seed [18:03:19.993] if (FALSE) { [18:03:19.993] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:19.993] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:19.993] } [18:03:19.993] ...future.result <- base::tryCatch({ [18:03:19.993] base::withCallingHandlers({ [18:03:19.993] ...future.value <- base::withVisible(base::local({ [18:03:19.993] ...future.makeSendCondition <- local({ [18:03:19.993] sendCondition <- NULL [18:03:19.993] function(frame = 1L) { [18:03:19.993] if (is.function(sendCondition)) [18:03:19.993] return(sendCondition) [18:03:19.993] ns <- getNamespace("parallel") [18:03:19.993] if (exists("sendData", mode = "function", [18:03:19.993] envir = ns)) { [18:03:19.993] parallel_sendData <- get("sendData", mode = "function", [18:03:19.993] envir = ns) [18:03:19.993] envir <- sys.frame(frame) [18:03:19.993] master <- NULL [18:03:19.993] while (!identical(envir, .GlobalEnv) && [18:03:19.993] !identical(envir, emptyenv())) { [18:03:19.993] if (exists("master", mode = "list", envir = envir, [18:03:19.993] inherits = FALSE)) { [18:03:19.993] master <- get("master", mode = "list", [18:03:19.993] envir = envir, inherits = FALSE) [18:03:19.993] if (inherits(master, c("SOCKnode", [18:03:19.993] "SOCK0node"))) { [18:03:19.993] sendCondition <<- function(cond) { [18:03:19.993] data <- list(type = "VALUE", value = cond, [18:03:19.993] success = TRUE) [18:03:19.993] parallel_sendData(master, data) [18:03:19.993] } [18:03:19.993] return(sendCondition) [18:03:19.993] } [18:03:19.993] } [18:03:19.993] frame <- frame + 1L [18:03:19.993] envir <- sys.frame(frame) [18:03:19.993] } [18:03:19.993] } [18:03:19.993] sendCondition <<- function(cond) NULL [18:03:19.993] } [18:03:19.993] }) [18:03:19.993] withCallingHandlers({ [18:03:19.993] { [18:03:19.993] sample(x, size = 1L) [18:03:19.993] } [18:03:19.993] }, immediateCondition = function(cond) { [18:03:19.993] sendCondition <- ...future.makeSendCondition() [18:03:19.993] sendCondition(cond) [18:03:19.993] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.993] { [18:03:19.993] inherits <- base::inherits [18:03:19.993] invokeRestart <- base::invokeRestart [18:03:19.993] is.null <- base::is.null [18:03:19.993] muffled <- FALSE [18:03:19.993] if (inherits(cond, "message")) { [18:03:19.993] muffled <- grepl(pattern, "muffleMessage") [18:03:19.993] if (muffled) [18:03:19.993] invokeRestart("muffleMessage") [18:03:19.993] } [18:03:19.993] else if (inherits(cond, "warning")) { [18:03:19.993] muffled <- grepl(pattern, "muffleWarning") [18:03:19.993] if (muffled) [18:03:19.993] invokeRestart("muffleWarning") [18:03:19.993] } [18:03:19.993] else if (inherits(cond, "condition")) { [18:03:19.993] if (!is.null(pattern)) { [18:03:19.993] computeRestarts <- base::computeRestarts [18:03:19.993] grepl <- base::grepl [18:03:19.993] restarts <- computeRestarts(cond) [18:03:19.993] for (restart in restarts) { [18:03:19.993] name <- restart$name [18:03:19.993] if (is.null(name)) [18:03:19.993] next [18:03:19.993] if (!grepl(pattern, name)) [18:03:19.993] next [18:03:19.993] invokeRestart(restart) [18:03:19.993] muffled <- TRUE [18:03:19.993] break [18:03:19.993] } [18:03:19.993] } [18:03:19.993] } [18:03:19.993] invisible(muffled) [18:03:19.993] } [18:03:19.993] muffleCondition(cond) [18:03:19.993] }) [18:03:19.993] })) [18:03:19.993] future::FutureResult(value = ...future.value$value, [18:03:19.993] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.993] ...future.rng), globalenv = if (FALSE) [18:03:19.993] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:19.993] ...future.globalenv.names)) [18:03:19.993] else NULL, started = ...future.startTime, version = "1.8") [18:03:19.993] }, condition = base::local({ [18:03:19.993] c <- base::c [18:03:19.993] inherits <- base::inherits [18:03:19.993] invokeRestart <- base::invokeRestart [18:03:19.993] length <- base::length [18:03:19.993] list <- base::list [18:03:19.993] seq.int <- base::seq.int [18:03:19.993] signalCondition <- base::signalCondition [18:03:19.993] sys.calls <- base::sys.calls [18:03:19.993] `[[` <- base::`[[` [18:03:19.993] `+` <- base::`+` [18:03:19.993] `<<-` <- base::`<<-` [18:03:19.993] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:19.993] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:19.993] 3L)] [18:03:19.993] } [18:03:19.993] function(cond) { [18:03:19.993] is_error <- inherits(cond, "error") [18:03:19.993] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:19.993] NULL) [18:03:19.993] if (is_error) { [18:03:19.993] sessionInformation <- function() { [18:03:19.993] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:19.993] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:19.993] search = base::search(), system = base::Sys.info()) [18:03:19.993] } [18:03:19.993] ...future.conditions[[length(...future.conditions) + [18:03:19.993] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:19.993] cond$call), session = sessionInformation(), [18:03:19.993] timestamp = base::Sys.time(), signaled = 0L) [18:03:19.993] signalCondition(cond) [18:03:19.993] } [18:03:19.993] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:19.993] "immediateCondition"))) { [18:03:19.993] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:19.993] ...future.conditions[[length(...future.conditions) + [18:03:19.993] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:19.993] if (TRUE && !signal) { [18:03:19.993] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.993] { [18:03:19.993] inherits <- base::inherits [18:03:19.993] invokeRestart <- base::invokeRestart [18:03:19.993] is.null <- base::is.null [18:03:19.993] muffled <- FALSE [18:03:19.993] if (inherits(cond, "message")) { [18:03:19.993] muffled <- grepl(pattern, "muffleMessage") [18:03:19.993] if (muffled) [18:03:19.993] invokeRestart("muffleMessage") [18:03:19.993] } [18:03:19.993] else if (inherits(cond, "warning")) { [18:03:19.993] muffled <- grepl(pattern, "muffleWarning") [18:03:19.993] if (muffled) [18:03:19.993] invokeRestart("muffleWarning") [18:03:19.993] } [18:03:19.993] else if (inherits(cond, "condition")) { [18:03:19.993] if (!is.null(pattern)) { [18:03:19.993] computeRestarts <- base::computeRestarts [18:03:19.993] grepl <- base::grepl [18:03:19.993] restarts <- computeRestarts(cond) [18:03:19.993] for (restart in restarts) { [18:03:19.993] name <- restart$name [18:03:19.993] if (is.null(name)) [18:03:19.993] next [18:03:19.993] if (!grepl(pattern, name)) [18:03:19.993] next [18:03:19.993] invokeRestart(restart) [18:03:19.993] muffled <- TRUE [18:03:19.993] break [18:03:19.993] } [18:03:19.993] } [18:03:19.993] } [18:03:19.993] invisible(muffled) [18:03:19.993] } [18:03:19.993] muffleCondition(cond, pattern = "^muffle") [18:03:19.993] } [18:03:19.993] } [18:03:19.993] else { [18:03:19.993] if (TRUE) { [18:03:19.993] muffleCondition <- function (cond, pattern = "^muffle") [18:03:19.993] { [18:03:19.993] inherits <- base::inherits [18:03:19.993] invokeRestart <- base::invokeRestart [18:03:19.993] is.null <- base::is.null [18:03:19.993] muffled <- FALSE [18:03:19.993] if (inherits(cond, "message")) { [18:03:19.993] muffled <- grepl(pattern, "muffleMessage") [18:03:19.993] if (muffled) [18:03:19.993] invokeRestart("muffleMessage") [18:03:19.993] } [18:03:19.993] else if (inherits(cond, "warning")) { [18:03:19.993] muffled <- grepl(pattern, "muffleWarning") [18:03:19.993] if (muffled) [18:03:19.993] invokeRestart("muffleWarning") [18:03:19.993] } [18:03:19.993] else if (inherits(cond, "condition")) { [18:03:19.993] if (!is.null(pattern)) { [18:03:19.993] computeRestarts <- base::computeRestarts [18:03:19.993] grepl <- base::grepl [18:03:19.993] restarts <- computeRestarts(cond) [18:03:19.993] for (restart in restarts) { [18:03:19.993] name <- restart$name [18:03:19.993] if (is.null(name)) [18:03:19.993] next [18:03:19.993] if (!grepl(pattern, name)) [18:03:19.993] next [18:03:19.993] invokeRestart(restart) [18:03:19.993] muffled <- TRUE [18:03:19.993] break [18:03:19.993] } [18:03:19.993] } [18:03:19.993] } [18:03:19.993] invisible(muffled) [18:03:19.993] } [18:03:19.993] muffleCondition(cond, pattern = "^muffle") [18:03:19.993] } [18:03:19.993] } [18:03:19.993] } [18:03:19.993] })) [18:03:19.993] }, error = function(ex) { [18:03:19.993] base::structure(base::list(value = NULL, visible = NULL, [18:03:19.993] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:19.993] ...future.rng), started = ...future.startTime, [18:03:19.993] finished = Sys.time(), session_uuid = NA_character_, [18:03:19.993] version = "1.8"), class = "FutureResult") [18:03:19.993] }, finally = { [18:03:19.993] if (!identical(...future.workdir, getwd())) [18:03:19.993] setwd(...future.workdir) [18:03:19.993] { [18:03:19.993] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:19.993] ...future.oldOptions$nwarnings <- NULL [18:03:19.993] } [18:03:19.993] base::options(...future.oldOptions) [18:03:19.993] if (.Platform$OS.type == "windows") { [18:03:19.993] old_names <- names(...future.oldEnvVars) [18:03:19.993] envs <- base::Sys.getenv() [18:03:19.993] names <- names(envs) [18:03:19.993] common <- intersect(names, old_names) [18:03:19.993] added <- setdiff(names, old_names) [18:03:19.993] removed <- setdiff(old_names, names) [18:03:19.993] changed <- common[...future.oldEnvVars[common] != [18:03:19.993] envs[common]] [18:03:19.993] NAMES <- toupper(changed) [18:03:19.993] args <- list() [18:03:19.993] for (kk in seq_along(NAMES)) { [18:03:19.993] name <- changed[[kk]] [18:03:19.993] NAME <- NAMES[[kk]] [18:03:19.993] if (name != NAME && is.element(NAME, old_names)) [18:03:19.993] next [18:03:19.993] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.993] } [18:03:19.993] NAMES <- toupper(added) [18:03:19.993] for (kk in seq_along(NAMES)) { [18:03:19.993] name <- added[[kk]] [18:03:19.993] NAME <- NAMES[[kk]] [18:03:19.993] if (name != NAME && is.element(NAME, old_names)) [18:03:19.993] next [18:03:19.993] args[[name]] <- "" [18:03:19.993] } [18:03:19.993] NAMES <- toupper(removed) [18:03:19.993] for (kk in seq_along(NAMES)) { [18:03:19.993] name <- removed[[kk]] [18:03:19.993] NAME <- NAMES[[kk]] [18:03:19.993] if (name != NAME && is.element(NAME, old_names)) [18:03:19.993] next [18:03:19.993] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:19.993] } [18:03:19.993] if (length(args) > 0) [18:03:19.993] base::do.call(base::Sys.setenv, args = args) [18:03:19.993] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:19.993] } [18:03:19.993] else { [18:03:19.993] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:19.993] } [18:03:19.993] { [18:03:19.993] if (base::length(...future.futureOptionsAdded) > [18:03:19.993] 0L) { [18:03:19.993] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:19.993] base::names(opts) <- ...future.futureOptionsAdded [18:03:19.993] base::options(opts) [18:03:19.993] } [18:03:19.993] { [18:03:19.993] { [18:03:19.993] base::options(mc.cores = ...future.mc.cores.old) [18:03:19.993] NULL [18:03:19.993] } [18:03:19.993] options(future.plan = NULL) [18:03:19.993] if (is.na(NA_character_)) [18:03:19.993] Sys.unsetenv("R_FUTURE_PLAN") [18:03:19.993] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:19.993] future::plan(list(function (..., workers = availableCores(), [18:03:19.993] lazy = FALSE, rscript_libs = .libPaths(), [18:03:19.993] envir = parent.frame()) [18:03:19.993] { [18:03:19.993] if (is.function(workers)) [18:03:19.993] workers <- workers() [18:03:19.993] workers <- structure(as.integer(workers), [18:03:19.993] class = class(workers)) [18:03:19.993] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:19.993] workers >= 1) [18:03:19.993] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:19.993] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:19.993] } [18:03:19.993] future <- MultisessionFuture(..., workers = workers, [18:03:19.993] lazy = lazy, rscript_libs = rscript_libs, [18:03:19.993] envir = envir) [18:03:19.993] if (!future$lazy) [18:03:19.993] future <- run(future) [18:03:19.993] invisible(future) [18:03:19.993] }), .cleanup = FALSE, .init = FALSE) [18:03:19.993] } [18:03:19.993] } [18:03:19.993] } [18:03:19.993] }) [18:03:19.993] if (TRUE) { [18:03:19.993] base::sink(type = "output", split = FALSE) [18:03:19.993] if (TRUE) { [18:03:19.993] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:19.993] } [18:03:19.993] else { [18:03:19.993] ...future.result["stdout"] <- base::list(NULL) [18:03:19.993] } [18:03:19.993] base::close(...future.stdout) [18:03:19.993] ...future.stdout <- NULL [18:03:19.993] } [18:03:19.993] ...future.result$conditions <- ...future.conditions [18:03:19.993] ...future.result$finished <- base::Sys.time() [18:03:19.993] ...future.result [18:03:19.993] } [18:03:20.001] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.001] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.002] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.002] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.003] MultisessionFuture started [18:03:20.003] - Launch lazy future ... done [18:03:20.003] run() for 'MultisessionFuture' ... done [18:03:20.004] getGlobalsAndPackages() ... [18:03:20.004] Searching for globals... [18:03:20.005] - globals found: [3] '{', 'sample', 'x' [18:03:20.005] Searching for globals ... DONE [18:03:20.005] Resolving globals: FALSE [18:03:20.006] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.006] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.006] - globals: [1] 'x' [18:03:20.007] [18:03:20.007] getGlobalsAndPackages() ... DONE [18:03:20.007] run() for 'Future' ... [18:03:20.007] - state: 'created' [18:03:20.007] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.021] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.021] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.021] - Field: 'node' [18:03:20.022] - Field: 'label' [18:03:20.022] - Field: 'local' [18:03:20.022] - Field: 'owner' [18:03:20.022] - Field: 'envir' [18:03:20.022] - Field: 'workers' [18:03:20.022] - Field: 'packages' [18:03:20.023] - Field: 'gc' [18:03:20.023] - Field: 'conditions' [18:03:20.023] - Field: 'persistent' [18:03:20.023] - Field: 'expr' [18:03:20.023] - Field: 'uuid' [18:03:20.024] - Field: 'seed' [18:03:20.024] - Field: 'version' [18:03:20.024] - Field: 'result' [18:03:20.024] - Field: 'asynchronous' [18:03:20.024] - Field: 'calls' [18:03:20.024] - Field: 'globals' [18:03:20.025] - Field: 'stdout' [18:03:20.025] - Field: 'earlySignal' [18:03:20.025] - Field: 'lazy' [18:03:20.025] - Field: 'state' [18:03:20.025] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.025] - Launch lazy future ... [18:03:20.026] Packages needed by the future expression (n = 0): [18:03:20.026] Packages needed by future strategies (n = 0): [18:03:20.027] { [18:03:20.027] { [18:03:20.027] { [18:03:20.027] ...future.startTime <- base::Sys.time() [18:03:20.027] { [18:03:20.027] { [18:03:20.027] { [18:03:20.027] { [18:03:20.027] { [18:03:20.027] base::local({ [18:03:20.027] has_future <- base::requireNamespace("future", [18:03:20.027] quietly = TRUE) [18:03:20.027] if (has_future) { [18:03:20.027] ns <- base::getNamespace("future") [18:03:20.027] version <- ns[[".package"]][["version"]] [18:03:20.027] if (is.null(version)) [18:03:20.027] version <- utils::packageVersion("future") [18:03:20.027] } [18:03:20.027] else { [18:03:20.027] version <- NULL [18:03:20.027] } [18:03:20.027] if (!has_future || version < "1.8.0") { [18:03:20.027] info <- base::c(r_version = base::gsub("R version ", [18:03:20.027] "", base::R.version$version.string), [18:03:20.027] platform = base::sprintf("%s (%s-bit)", [18:03:20.027] base::R.version$platform, 8 * [18:03:20.027] base::.Machine$sizeof.pointer), [18:03:20.027] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.027] "release", "version")], collapse = " "), [18:03:20.027] hostname = base::Sys.info()[["nodename"]]) [18:03:20.027] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.027] info) [18:03:20.027] info <- base::paste(info, collapse = "; ") [18:03:20.027] if (!has_future) { [18:03:20.027] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.027] info) [18:03:20.027] } [18:03:20.027] else { [18:03:20.027] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.027] info, version) [18:03:20.027] } [18:03:20.027] base::stop(msg) [18:03:20.027] } [18:03:20.027] }) [18:03:20.027] } [18:03:20.027] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.027] base::options(mc.cores = 1L) [18:03:20.027] } [18:03:20.027] options(future.plan = NULL) [18:03:20.027] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.027] future::plan("default", .cleanup = FALSE, [18:03:20.027] .init = FALSE) [18:03:20.027] } [18:03:20.027] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:20.027] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:20.027] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:20.027] } [18:03:20.027] ...future.workdir <- getwd() [18:03:20.027] } [18:03:20.027] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.027] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.027] } [18:03:20.027] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.027] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.027] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.027] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.027] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.027] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.027] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.027] base::names(...future.oldOptions)) [18:03:20.027] } [18:03:20.027] if (FALSE) { [18:03:20.027] } [18:03:20.027] else { [18:03:20.027] if (TRUE) { [18:03:20.027] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.027] open = "w") [18:03:20.027] } [18:03:20.027] else { [18:03:20.027] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.027] windows = "NUL", "/dev/null"), open = "w") [18:03:20.027] } [18:03:20.027] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.027] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.027] base::sink(type = "output", split = FALSE) [18:03:20.027] base::close(...future.stdout) [18:03:20.027] }, add = TRUE) [18:03:20.027] } [18:03:20.027] ...future.frame <- base::sys.nframe() [18:03:20.027] ...future.conditions <- base::list() [18:03:20.027] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.027] if (FALSE) { [18:03:20.027] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.027] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.027] } [18:03:20.027] ...future.result <- base::tryCatch({ [18:03:20.027] base::withCallingHandlers({ [18:03:20.027] ...future.value <- base::withVisible(base::local({ [18:03:20.027] ...future.makeSendCondition <- local({ [18:03:20.027] sendCondition <- NULL [18:03:20.027] function(frame = 1L) { [18:03:20.027] if (is.function(sendCondition)) [18:03:20.027] return(sendCondition) [18:03:20.027] ns <- getNamespace("parallel") [18:03:20.027] if (exists("sendData", mode = "function", [18:03:20.027] envir = ns)) { [18:03:20.027] parallel_sendData <- get("sendData", mode = "function", [18:03:20.027] envir = ns) [18:03:20.027] envir <- sys.frame(frame) [18:03:20.027] master <- NULL [18:03:20.027] while (!identical(envir, .GlobalEnv) && [18:03:20.027] !identical(envir, emptyenv())) { [18:03:20.027] if (exists("master", mode = "list", envir = envir, [18:03:20.027] inherits = FALSE)) { [18:03:20.027] master <- get("master", mode = "list", [18:03:20.027] envir = envir, inherits = FALSE) [18:03:20.027] if (inherits(master, c("SOCKnode", [18:03:20.027] "SOCK0node"))) { [18:03:20.027] sendCondition <<- function(cond) { [18:03:20.027] data <- list(type = "VALUE", value = cond, [18:03:20.027] success = TRUE) [18:03:20.027] parallel_sendData(master, data) [18:03:20.027] } [18:03:20.027] return(sendCondition) [18:03:20.027] } [18:03:20.027] } [18:03:20.027] frame <- frame + 1L [18:03:20.027] envir <- sys.frame(frame) [18:03:20.027] } [18:03:20.027] } [18:03:20.027] sendCondition <<- function(cond) NULL [18:03:20.027] } [18:03:20.027] }) [18:03:20.027] withCallingHandlers({ [18:03:20.027] { [18:03:20.027] sample(x, size = 1L) [18:03:20.027] } [18:03:20.027] }, immediateCondition = function(cond) { [18:03:20.027] sendCondition <- ...future.makeSendCondition() [18:03:20.027] sendCondition(cond) [18:03:20.027] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.027] { [18:03:20.027] inherits <- base::inherits [18:03:20.027] invokeRestart <- base::invokeRestart [18:03:20.027] is.null <- base::is.null [18:03:20.027] muffled <- FALSE [18:03:20.027] if (inherits(cond, "message")) { [18:03:20.027] muffled <- grepl(pattern, "muffleMessage") [18:03:20.027] if (muffled) [18:03:20.027] invokeRestart("muffleMessage") [18:03:20.027] } [18:03:20.027] else if (inherits(cond, "warning")) { [18:03:20.027] muffled <- grepl(pattern, "muffleWarning") [18:03:20.027] if (muffled) [18:03:20.027] invokeRestart("muffleWarning") [18:03:20.027] } [18:03:20.027] else if (inherits(cond, "condition")) { [18:03:20.027] if (!is.null(pattern)) { [18:03:20.027] computeRestarts <- base::computeRestarts [18:03:20.027] grepl <- base::grepl [18:03:20.027] restarts <- computeRestarts(cond) [18:03:20.027] for (restart in restarts) { [18:03:20.027] name <- restart$name [18:03:20.027] if (is.null(name)) [18:03:20.027] next [18:03:20.027] if (!grepl(pattern, name)) [18:03:20.027] next [18:03:20.027] invokeRestart(restart) [18:03:20.027] muffled <- TRUE [18:03:20.027] break [18:03:20.027] } [18:03:20.027] } [18:03:20.027] } [18:03:20.027] invisible(muffled) [18:03:20.027] } [18:03:20.027] muffleCondition(cond) [18:03:20.027] }) [18:03:20.027] })) [18:03:20.027] future::FutureResult(value = ...future.value$value, [18:03:20.027] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.027] ...future.rng), globalenv = if (FALSE) [18:03:20.027] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.027] ...future.globalenv.names)) [18:03:20.027] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.027] }, condition = base::local({ [18:03:20.027] c <- base::c [18:03:20.027] inherits <- base::inherits [18:03:20.027] invokeRestart <- base::invokeRestart [18:03:20.027] length <- base::length [18:03:20.027] list <- base::list [18:03:20.027] seq.int <- base::seq.int [18:03:20.027] signalCondition <- base::signalCondition [18:03:20.027] sys.calls <- base::sys.calls [18:03:20.027] `[[` <- base::`[[` [18:03:20.027] `+` <- base::`+` [18:03:20.027] `<<-` <- base::`<<-` [18:03:20.027] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.027] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.027] 3L)] [18:03:20.027] } [18:03:20.027] function(cond) { [18:03:20.027] is_error <- inherits(cond, "error") [18:03:20.027] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.027] NULL) [18:03:20.027] if (is_error) { [18:03:20.027] sessionInformation <- function() { [18:03:20.027] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.027] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.027] search = base::search(), system = base::Sys.info()) [18:03:20.027] } [18:03:20.027] ...future.conditions[[length(...future.conditions) + [18:03:20.027] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.027] cond$call), session = sessionInformation(), [18:03:20.027] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.027] signalCondition(cond) [18:03:20.027] } [18:03:20.027] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.027] "immediateCondition"))) { [18:03:20.027] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.027] ...future.conditions[[length(...future.conditions) + [18:03:20.027] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.027] if (TRUE && !signal) { [18:03:20.027] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.027] { [18:03:20.027] inherits <- base::inherits [18:03:20.027] invokeRestart <- base::invokeRestart [18:03:20.027] is.null <- base::is.null [18:03:20.027] muffled <- FALSE [18:03:20.027] if (inherits(cond, "message")) { [18:03:20.027] muffled <- grepl(pattern, "muffleMessage") [18:03:20.027] if (muffled) [18:03:20.027] invokeRestart("muffleMessage") [18:03:20.027] } [18:03:20.027] else if (inherits(cond, "warning")) { [18:03:20.027] muffled <- grepl(pattern, "muffleWarning") [18:03:20.027] if (muffled) [18:03:20.027] invokeRestart("muffleWarning") [18:03:20.027] } [18:03:20.027] else if (inherits(cond, "condition")) { [18:03:20.027] if (!is.null(pattern)) { [18:03:20.027] computeRestarts <- base::computeRestarts [18:03:20.027] grepl <- base::grepl [18:03:20.027] restarts <- computeRestarts(cond) [18:03:20.027] for (restart in restarts) { [18:03:20.027] name <- restart$name [18:03:20.027] if (is.null(name)) [18:03:20.027] next [18:03:20.027] if (!grepl(pattern, name)) [18:03:20.027] next [18:03:20.027] invokeRestart(restart) [18:03:20.027] muffled <- TRUE [18:03:20.027] break [18:03:20.027] } [18:03:20.027] } [18:03:20.027] } [18:03:20.027] invisible(muffled) [18:03:20.027] } [18:03:20.027] muffleCondition(cond, pattern = "^muffle") [18:03:20.027] } [18:03:20.027] } [18:03:20.027] else { [18:03:20.027] if (TRUE) { [18:03:20.027] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.027] { [18:03:20.027] inherits <- base::inherits [18:03:20.027] invokeRestart <- base::invokeRestart [18:03:20.027] is.null <- base::is.null [18:03:20.027] muffled <- FALSE [18:03:20.027] if (inherits(cond, "message")) { [18:03:20.027] muffled <- grepl(pattern, "muffleMessage") [18:03:20.027] if (muffled) [18:03:20.027] invokeRestart("muffleMessage") [18:03:20.027] } [18:03:20.027] else if (inherits(cond, "warning")) { [18:03:20.027] muffled <- grepl(pattern, "muffleWarning") [18:03:20.027] if (muffled) [18:03:20.027] invokeRestart("muffleWarning") [18:03:20.027] } [18:03:20.027] else if (inherits(cond, "condition")) { [18:03:20.027] if (!is.null(pattern)) { [18:03:20.027] computeRestarts <- base::computeRestarts [18:03:20.027] grepl <- base::grepl [18:03:20.027] restarts <- computeRestarts(cond) [18:03:20.027] for (restart in restarts) { [18:03:20.027] name <- restart$name [18:03:20.027] if (is.null(name)) [18:03:20.027] next [18:03:20.027] if (!grepl(pattern, name)) [18:03:20.027] next [18:03:20.027] invokeRestart(restart) [18:03:20.027] muffled <- TRUE [18:03:20.027] break [18:03:20.027] } [18:03:20.027] } [18:03:20.027] } [18:03:20.027] invisible(muffled) [18:03:20.027] } [18:03:20.027] muffleCondition(cond, pattern = "^muffle") [18:03:20.027] } [18:03:20.027] } [18:03:20.027] } [18:03:20.027] })) [18:03:20.027] }, error = function(ex) { [18:03:20.027] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.027] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.027] ...future.rng), started = ...future.startTime, [18:03:20.027] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.027] version = "1.8"), class = "FutureResult") [18:03:20.027] }, finally = { [18:03:20.027] if (!identical(...future.workdir, getwd())) [18:03:20.027] setwd(...future.workdir) [18:03:20.027] { [18:03:20.027] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.027] ...future.oldOptions$nwarnings <- NULL [18:03:20.027] } [18:03:20.027] base::options(...future.oldOptions) [18:03:20.027] if (.Platform$OS.type == "windows") { [18:03:20.027] old_names <- names(...future.oldEnvVars) [18:03:20.027] envs <- base::Sys.getenv() [18:03:20.027] names <- names(envs) [18:03:20.027] common <- intersect(names, old_names) [18:03:20.027] added <- setdiff(names, old_names) [18:03:20.027] removed <- setdiff(old_names, names) [18:03:20.027] changed <- common[...future.oldEnvVars[common] != [18:03:20.027] envs[common]] [18:03:20.027] NAMES <- toupper(changed) [18:03:20.027] args <- list() [18:03:20.027] for (kk in seq_along(NAMES)) { [18:03:20.027] name <- changed[[kk]] [18:03:20.027] NAME <- NAMES[[kk]] [18:03:20.027] if (name != NAME && is.element(NAME, old_names)) [18:03:20.027] next [18:03:20.027] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.027] } [18:03:20.027] NAMES <- toupper(added) [18:03:20.027] for (kk in seq_along(NAMES)) { [18:03:20.027] name <- added[[kk]] [18:03:20.027] NAME <- NAMES[[kk]] [18:03:20.027] if (name != NAME && is.element(NAME, old_names)) [18:03:20.027] next [18:03:20.027] args[[name]] <- "" [18:03:20.027] } [18:03:20.027] NAMES <- toupper(removed) [18:03:20.027] for (kk in seq_along(NAMES)) { [18:03:20.027] name <- removed[[kk]] [18:03:20.027] NAME <- NAMES[[kk]] [18:03:20.027] if (name != NAME && is.element(NAME, old_names)) [18:03:20.027] next [18:03:20.027] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.027] } [18:03:20.027] if (length(args) > 0) [18:03:20.027] base::do.call(base::Sys.setenv, args = args) [18:03:20.027] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.027] } [18:03:20.027] else { [18:03:20.027] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.027] } [18:03:20.027] { [18:03:20.027] if (base::length(...future.futureOptionsAdded) > [18:03:20.027] 0L) { [18:03:20.027] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.027] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.027] base::options(opts) [18:03:20.027] } [18:03:20.027] { [18:03:20.027] { [18:03:20.027] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.027] NULL [18:03:20.027] } [18:03:20.027] options(future.plan = NULL) [18:03:20.027] if (is.na(NA_character_)) [18:03:20.027] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.027] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.027] future::plan(list(function (..., workers = availableCores(), [18:03:20.027] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.027] envir = parent.frame()) [18:03:20.027] { [18:03:20.027] if (is.function(workers)) [18:03:20.027] workers <- workers() [18:03:20.027] workers <- structure(as.integer(workers), [18:03:20.027] class = class(workers)) [18:03:20.027] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.027] workers >= 1) [18:03:20.027] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.027] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.027] } [18:03:20.027] future <- MultisessionFuture(..., workers = workers, [18:03:20.027] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.027] envir = envir) [18:03:20.027] if (!future$lazy) [18:03:20.027] future <- run(future) [18:03:20.027] invisible(future) [18:03:20.027] }), .cleanup = FALSE, .init = FALSE) [18:03:20.027] } [18:03:20.027] } [18:03:20.027] } [18:03:20.027] }) [18:03:20.027] if (TRUE) { [18:03:20.027] base::sink(type = "output", split = FALSE) [18:03:20.027] if (TRUE) { [18:03:20.027] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.027] } [18:03:20.027] else { [18:03:20.027] ...future.result["stdout"] <- base::list(NULL) [18:03:20.027] } [18:03:20.027] base::close(...future.stdout) [18:03:20.027] ...future.stdout <- NULL [18:03:20.027] } [18:03:20.027] ...future.result$conditions <- ...future.conditions [18:03:20.027] ...future.result$finished <- base::Sys.time() [18:03:20.027] ...future.result [18:03:20.027] } [18:03:20.032] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.032] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.033] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.033] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.034] MultisessionFuture started [18:03:20.034] - Launch lazy future ... done [18:03:20.034] run() for 'MultisessionFuture' ... done [18:03:20.034] getGlobalsAndPackages() ... [18:03:20.035] Searching for globals... [18:03:20.036] - globals found: [3] '{', 'sample', 'x' [18:03:20.036] Searching for globals ... DONE [18:03:20.036] Resolving globals: FALSE [18:03:20.037] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.037] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.037] - globals: [1] 'x' [18:03:20.038] [18:03:20.038] getGlobalsAndPackages() ... DONE [18:03:20.038] run() for 'Future' ... [18:03:20.038] - state: 'created' [18:03:20.038] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.053] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.053] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.053] - Field: 'node' [18:03:20.053] - Field: 'label' [18:03:20.054] - Field: 'local' [18:03:20.054] - Field: 'owner' [18:03:20.054] - Field: 'envir' [18:03:20.054] - Field: 'workers' [18:03:20.054] - Field: 'packages' [18:03:20.054] - Field: 'gc' [18:03:20.055] - Field: 'conditions' [18:03:20.055] - Field: 'persistent' [18:03:20.055] - Field: 'expr' [18:03:20.055] - Field: 'uuid' [18:03:20.055] - Field: 'seed' [18:03:20.056] - Field: 'version' [18:03:20.056] - Field: 'result' [18:03:20.056] - Field: 'asynchronous' [18:03:20.056] - Field: 'calls' [18:03:20.056] - Field: 'globals' [18:03:20.056] - Field: 'stdout' [18:03:20.057] - Field: 'earlySignal' [18:03:20.057] - Field: 'lazy' [18:03:20.057] - Field: 'state' [18:03:20.057] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.057] - Launch lazy future ... [18:03:20.058] Packages needed by the future expression (n = 0): [18:03:20.058] Packages needed by future strategies (n = 0): [18:03:20.058] { [18:03:20.058] { [18:03:20.058] { [18:03:20.058] ...future.startTime <- base::Sys.time() [18:03:20.058] { [18:03:20.058] { [18:03:20.058] { [18:03:20.058] { [18:03:20.058] { [18:03:20.058] base::local({ [18:03:20.058] has_future <- base::requireNamespace("future", [18:03:20.058] quietly = TRUE) [18:03:20.058] if (has_future) { [18:03:20.058] ns <- base::getNamespace("future") [18:03:20.058] version <- ns[[".package"]][["version"]] [18:03:20.058] if (is.null(version)) [18:03:20.058] version <- utils::packageVersion("future") [18:03:20.058] } [18:03:20.058] else { [18:03:20.058] version <- NULL [18:03:20.058] } [18:03:20.058] if (!has_future || version < "1.8.0") { [18:03:20.058] info <- base::c(r_version = base::gsub("R version ", [18:03:20.058] "", base::R.version$version.string), [18:03:20.058] platform = base::sprintf("%s (%s-bit)", [18:03:20.058] base::R.version$platform, 8 * [18:03:20.058] base::.Machine$sizeof.pointer), [18:03:20.058] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.058] "release", "version")], collapse = " "), [18:03:20.058] hostname = base::Sys.info()[["nodename"]]) [18:03:20.058] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.058] info) [18:03:20.058] info <- base::paste(info, collapse = "; ") [18:03:20.058] if (!has_future) { [18:03:20.058] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.058] info) [18:03:20.058] } [18:03:20.058] else { [18:03:20.058] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.058] info, version) [18:03:20.058] } [18:03:20.058] base::stop(msg) [18:03:20.058] } [18:03:20.058] }) [18:03:20.058] } [18:03:20.058] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.058] base::options(mc.cores = 1L) [18:03:20.058] } [18:03:20.058] options(future.plan = NULL) [18:03:20.058] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.058] future::plan("default", .cleanup = FALSE, [18:03:20.058] .init = FALSE) [18:03:20.058] } [18:03:20.058] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:20.058] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:20.058] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:20.058] } [18:03:20.058] ...future.workdir <- getwd() [18:03:20.058] } [18:03:20.058] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.058] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.058] } [18:03:20.058] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.058] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.058] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.058] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.058] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.058] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.058] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.058] base::names(...future.oldOptions)) [18:03:20.058] } [18:03:20.058] if (FALSE) { [18:03:20.058] } [18:03:20.058] else { [18:03:20.058] if (TRUE) { [18:03:20.058] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.058] open = "w") [18:03:20.058] } [18:03:20.058] else { [18:03:20.058] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.058] windows = "NUL", "/dev/null"), open = "w") [18:03:20.058] } [18:03:20.058] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.058] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.058] base::sink(type = "output", split = FALSE) [18:03:20.058] base::close(...future.stdout) [18:03:20.058] }, add = TRUE) [18:03:20.058] } [18:03:20.058] ...future.frame <- base::sys.nframe() [18:03:20.058] ...future.conditions <- base::list() [18:03:20.058] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.058] if (FALSE) { [18:03:20.058] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.058] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.058] } [18:03:20.058] ...future.result <- base::tryCatch({ [18:03:20.058] base::withCallingHandlers({ [18:03:20.058] ...future.value <- base::withVisible(base::local({ [18:03:20.058] ...future.makeSendCondition <- local({ [18:03:20.058] sendCondition <- NULL [18:03:20.058] function(frame = 1L) { [18:03:20.058] if (is.function(sendCondition)) [18:03:20.058] return(sendCondition) [18:03:20.058] ns <- getNamespace("parallel") [18:03:20.058] if (exists("sendData", mode = "function", [18:03:20.058] envir = ns)) { [18:03:20.058] parallel_sendData <- get("sendData", mode = "function", [18:03:20.058] envir = ns) [18:03:20.058] envir <- sys.frame(frame) [18:03:20.058] master <- NULL [18:03:20.058] while (!identical(envir, .GlobalEnv) && [18:03:20.058] !identical(envir, emptyenv())) { [18:03:20.058] if (exists("master", mode = "list", envir = envir, [18:03:20.058] inherits = FALSE)) { [18:03:20.058] master <- get("master", mode = "list", [18:03:20.058] envir = envir, inherits = FALSE) [18:03:20.058] if (inherits(master, c("SOCKnode", [18:03:20.058] "SOCK0node"))) { [18:03:20.058] sendCondition <<- function(cond) { [18:03:20.058] data <- list(type = "VALUE", value = cond, [18:03:20.058] success = TRUE) [18:03:20.058] parallel_sendData(master, data) [18:03:20.058] } [18:03:20.058] return(sendCondition) [18:03:20.058] } [18:03:20.058] } [18:03:20.058] frame <- frame + 1L [18:03:20.058] envir <- sys.frame(frame) [18:03:20.058] } [18:03:20.058] } [18:03:20.058] sendCondition <<- function(cond) NULL [18:03:20.058] } [18:03:20.058] }) [18:03:20.058] withCallingHandlers({ [18:03:20.058] { [18:03:20.058] sample(x, size = 1L) [18:03:20.058] } [18:03:20.058] }, immediateCondition = function(cond) { [18:03:20.058] sendCondition <- ...future.makeSendCondition() [18:03:20.058] sendCondition(cond) [18:03:20.058] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.058] { [18:03:20.058] inherits <- base::inherits [18:03:20.058] invokeRestart <- base::invokeRestart [18:03:20.058] is.null <- base::is.null [18:03:20.058] muffled <- FALSE [18:03:20.058] if (inherits(cond, "message")) { [18:03:20.058] muffled <- grepl(pattern, "muffleMessage") [18:03:20.058] if (muffled) [18:03:20.058] invokeRestart("muffleMessage") [18:03:20.058] } [18:03:20.058] else if (inherits(cond, "warning")) { [18:03:20.058] muffled <- grepl(pattern, "muffleWarning") [18:03:20.058] if (muffled) [18:03:20.058] invokeRestart("muffleWarning") [18:03:20.058] } [18:03:20.058] else if (inherits(cond, "condition")) { [18:03:20.058] if (!is.null(pattern)) { [18:03:20.058] computeRestarts <- base::computeRestarts [18:03:20.058] grepl <- base::grepl [18:03:20.058] restarts <- computeRestarts(cond) [18:03:20.058] for (restart in restarts) { [18:03:20.058] name <- restart$name [18:03:20.058] if (is.null(name)) [18:03:20.058] next [18:03:20.058] if (!grepl(pattern, name)) [18:03:20.058] next [18:03:20.058] invokeRestart(restart) [18:03:20.058] muffled <- TRUE [18:03:20.058] break [18:03:20.058] } [18:03:20.058] } [18:03:20.058] } [18:03:20.058] invisible(muffled) [18:03:20.058] } [18:03:20.058] muffleCondition(cond) [18:03:20.058] }) [18:03:20.058] })) [18:03:20.058] future::FutureResult(value = ...future.value$value, [18:03:20.058] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.058] ...future.rng), globalenv = if (FALSE) [18:03:20.058] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.058] ...future.globalenv.names)) [18:03:20.058] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.058] }, condition = base::local({ [18:03:20.058] c <- base::c [18:03:20.058] inherits <- base::inherits [18:03:20.058] invokeRestart <- base::invokeRestart [18:03:20.058] length <- base::length [18:03:20.058] list <- base::list [18:03:20.058] seq.int <- base::seq.int [18:03:20.058] signalCondition <- base::signalCondition [18:03:20.058] sys.calls <- base::sys.calls [18:03:20.058] `[[` <- base::`[[` [18:03:20.058] `+` <- base::`+` [18:03:20.058] `<<-` <- base::`<<-` [18:03:20.058] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.058] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.058] 3L)] [18:03:20.058] } [18:03:20.058] function(cond) { [18:03:20.058] is_error <- inherits(cond, "error") [18:03:20.058] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.058] NULL) [18:03:20.058] if (is_error) { [18:03:20.058] sessionInformation <- function() { [18:03:20.058] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.058] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.058] search = base::search(), system = base::Sys.info()) [18:03:20.058] } [18:03:20.058] ...future.conditions[[length(...future.conditions) + [18:03:20.058] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.058] cond$call), session = sessionInformation(), [18:03:20.058] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.058] signalCondition(cond) [18:03:20.058] } [18:03:20.058] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.058] "immediateCondition"))) { [18:03:20.058] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.058] ...future.conditions[[length(...future.conditions) + [18:03:20.058] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.058] if (TRUE && !signal) { [18:03:20.058] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.058] { [18:03:20.058] inherits <- base::inherits [18:03:20.058] invokeRestart <- base::invokeRestart [18:03:20.058] is.null <- base::is.null [18:03:20.058] muffled <- FALSE [18:03:20.058] if (inherits(cond, "message")) { [18:03:20.058] muffled <- grepl(pattern, "muffleMessage") [18:03:20.058] if (muffled) [18:03:20.058] invokeRestart("muffleMessage") [18:03:20.058] } [18:03:20.058] else if (inherits(cond, "warning")) { [18:03:20.058] muffled <- grepl(pattern, "muffleWarning") [18:03:20.058] if (muffled) [18:03:20.058] invokeRestart("muffleWarning") [18:03:20.058] } [18:03:20.058] else if (inherits(cond, "condition")) { [18:03:20.058] if (!is.null(pattern)) { [18:03:20.058] computeRestarts <- base::computeRestarts [18:03:20.058] grepl <- base::grepl [18:03:20.058] restarts <- computeRestarts(cond) [18:03:20.058] for (restart in restarts) { [18:03:20.058] name <- restart$name [18:03:20.058] if (is.null(name)) [18:03:20.058] next [18:03:20.058] if (!grepl(pattern, name)) [18:03:20.058] next [18:03:20.058] invokeRestart(restart) [18:03:20.058] muffled <- TRUE [18:03:20.058] break [18:03:20.058] } [18:03:20.058] } [18:03:20.058] } [18:03:20.058] invisible(muffled) [18:03:20.058] } [18:03:20.058] muffleCondition(cond, pattern = "^muffle") [18:03:20.058] } [18:03:20.058] } [18:03:20.058] else { [18:03:20.058] if (TRUE) { [18:03:20.058] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.058] { [18:03:20.058] inherits <- base::inherits [18:03:20.058] invokeRestart <- base::invokeRestart [18:03:20.058] is.null <- base::is.null [18:03:20.058] muffled <- FALSE [18:03:20.058] if (inherits(cond, "message")) { [18:03:20.058] muffled <- grepl(pattern, "muffleMessage") [18:03:20.058] if (muffled) [18:03:20.058] invokeRestart("muffleMessage") [18:03:20.058] } [18:03:20.058] else if (inherits(cond, "warning")) { [18:03:20.058] muffled <- grepl(pattern, "muffleWarning") [18:03:20.058] if (muffled) [18:03:20.058] invokeRestart("muffleWarning") [18:03:20.058] } [18:03:20.058] else if (inherits(cond, "condition")) { [18:03:20.058] if (!is.null(pattern)) { [18:03:20.058] computeRestarts <- base::computeRestarts [18:03:20.058] grepl <- base::grepl [18:03:20.058] restarts <- computeRestarts(cond) [18:03:20.058] for (restart in restarts) { [18:03:20.058] name <- restart$name [18:03:20.058] if (is.null(name)) [18:03:20.058] next [18:03:20.058] if (!grepl(pattern, name)) [18:03:20.058] next [18:03:20.058] invokeRestart(restart) [18:03:20.058] muffled <- TRUE [18:03:20.058] break [18:03:20.058] } [18:03:20.058] } [18:03:20.058] } [18:03:20.058] invisible(muffled) [18:03:20.058] } [18:03:20.058] muffleCondition(cond, pattern = "^muffle") [18:03:20.058] } [18:03:20.058] } [18:03:20.058] } [18:03:20.058] })) [18:03:20.058] }, error = function(ex) { [18:03:20.058] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.058] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.058] ...future.rng), started = ...future.startTime, [18:03:20.058] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.058] version = "1.8"), class = "FutureResult") [18:03:20.058] }, finally = { [18:03:20.058] if (!identical(...future.workdir, getwd())) [18:03:20.058] setwd(...future.workdir) [18:03:20.058] { [18:03:20.058] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.058] ...future.oldOptions$nwarnings <- NULL [18:03:20.058] } [18:03:20.058] base::options(...future.oldOptions) [18:03:20.058] if (.Platform$OS.type == "windows") { [18:03:20.058] old_names <- names(...future.oldEnvVars) [18:03:20.058] envs <- base::Sys.getenv() [18:03:20.058] names <- names(envs) [18:03:20.058] common <- intersect(names, old_names) [18:03:20.058] added <- setdiff(names, old_names) [18:03:20.058] removed <- setdiff(old_names, names) [18:03:20.058] changed <- common[...future.oldEnvVars[common] != [18:03:20.058] envs[common]] [18:03:20.058] NAMES <- toupper(changed) [18:03:20.058] args <- list() [18:03:20.058] for (kk in seq_along(NAMES)) { [18:03:20.058] name <- changed[[kk]] [18:03:20.058] NAME <- NAMES[[kk]] [18:03:20.058] if (name != NAME && is.element(NAME, old_names)) [18:03:20.058] next [18:03:20.058] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.058] } [18:03:20.058] NAMES <- toupper(added) [18:03:20.058] for (kk in seq_along(NAMES)) { [18:03:20.058] name <- added[[kk]] [18:03:20.058] NAME <- NAMES[[kk]] [18:03:20.058] if (name != NAME && is.element(NAME, old_names)) [18:03:20.058] next [18:03:20.058] args[[name]] <- "" [18:03:20.058] } [18:03:20.058] NAMES <- toupper(removed) [18:03:20.058] for (kk in seq_along(NAMES)) { [18:03:20.058] name <- removed[[kk]] [18:03:20.058] NAME <- NAMES[[kk]] [18:03:20.058] if (name != NAME && is.element(NAME, old_names)) [18:03:20.058] next [18:03:20.058] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.058] } [18:03:20.058] if (length(args) > 0) [18:03:20.058] base::do.call(base::Sys.setenv, args = args) [18:03:20.058] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.058] } [18:03:20.058] else { [18:03:20.058] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.058] } [18:03:20.058] { [18:03:20.058] if (base::length(...future.futureOptionsAdded) > [18:03:20.058] 0L) { [18:03:20.058] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.058] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.058] base::options(opts) [18:03:20.058] } [18:03:20.058] { [18:03:20.058] { [18:03:20.058] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.058] NULL [18:03:20.058] } [18:03:20.058] options(future.plan = NULL) [18:03:20.058] if (is.na(NA_character_)) [18:03:20.058] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.058] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.058] future::plan(list(function (..., workers = availableCores(), [18:03:20.058] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.058] envir = parent.frame()) [18:03:20.058] { [18:03:20.058] if (is.function(workers)) [18:03:20.058] workers <- workers() [18:03:20.058] workers <- structure(as.integer(workers), [18:03:20.058] class = class(workers)) [18:03:20.058] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.058] workers >= 1) [18:03:20.058] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.058] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.058] } [18:03:20.058] future <- MultisessionFuture(..., workers = workers, [18:03:20.058] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.058] envir = envir) [18:03:20.058] if (!future$lazy) [18:03:20.058] future <- run(future) [18:03:20.058] invisible(future) [18:03:20.058] }), .cleanup = FALSE, .init = FALSE) [18:03:20.058] } [18:03:20.058] } [18:03:20.058] } [18:03:20.058] }) [18:03:20.058] if (TRUE) { [18:03:20.058] base::sink(type = "output", split = FALSE) [18:03:20.058] if (TRUE) { [18:03:20.058] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.058] } [18:03:20.058] else { [18:03:20.058] ...future.result["stdout"] <- base::list(NULL) [18:03:20.058] } [18:03:20.058] base::close(...future.stdout) [18:03:20.058] ...future.stdout <- NULL [18:03:20.058] } [18:03:20.058] ...future.result$conditions <- ...future.conditions [18:03:20.058] ...future.result$finished <- base::Sys.time() [18:03:20.058] ...future.result [18:03:20.058] } [18:03:20.063] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.080] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.080] - Validating connection of MultisessionFuture [18:03:20.080] - received message: FutureResult [18:03:20.081] - Received FutureResult [18:03:20.081] - Erased future from FutureRegistry [18:03:20.081] result() for ClusterFuture ... [18:03:20.081] - result already collected: FutureResult [18:03:20.081] result() for ClusterFuture ... done [18:03:20.081] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.082] result() for ClusterFuture ... [18:03:20.082] - result already collected: FutureResult [18:03:20.082] result() for ClusterFuture ... done [18:03:20.082] result() for ClusterFuture ... [18:03:20.082] - result already collected: FutureResult [18:03:20.082] result() for ClusterFuture ... done [18:03:20.083] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.083] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.084] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.084] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.085] MultisessionFuture started [18:03:20.085] - Launch lazy future ... done [18:03:20.085] run() for 'MultisessionFuture' ... done [18:03:20.086] getGlobalsAndPackages() ... [18:03:20.086] Searching for globals... [18:03:20.087] - globals found: [3] '{', 'sample', 'x' [18:03:20.087] Searching for globals ... DONE [18:03:20.087] Resolving globals: FALSE [18:03:20.088] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.088] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.088] - globals: [1] 'x' [18:03:20.089] [18:03:20.089] getGlobalsAndPackages() ... DONE [18:03:20.089] run() for 'Future' ... [18:03:20.089] - state: 'created' [18:03:20.090] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.103] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.103] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.104] - Field: 'node' [18:03:20.104] - Field: 'label' [18:03:20.104] - Field: 'local' [18:03:20.104] - Field: 'owner' [18:03:20.104] - Field: 'envir' [18:03:20.105] - Field: 'workers' [18:03:20.105] - Field: 'packages' [18:03:20.105] - Field: 'gc' [18:03:20.105] - Field: 'conditions' [18:03:20.105] - Field: 'persistent' [18:03:20.105] - Field: 'expr' [18:03:20.106] - Field: 'uuid' [18:03:20.106] - Field: 'seed' [18:03:20.106] - Field: 'version' [18:03:20.106] - Field: 'result' [18:03:20.106] - Field: 'asynchronous' [18:03:20.107] - Field: 'calls' [18:03:20.107] - Field: 'globals' [18:03:20.107] - Field: 'stdout' [18:03:20.107] - Field: 'earlySignal' [18:03:20.107] - Field: 'lazy' [18:03:20.107] - Field: 'state' [18:03:20.108] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.108] - Launch lazy future ... [18:03:20.108] Packages needed by the future expression (n = 0): [18:03:20.108] Packages needed by future strategies (n = 0): [18:03:20.109] { [18:03:20.109] { [18:03:20.109] { [18:03:20.109] ...future.startTime <- base::Sys.time() [18:03:20.109] { [18:03:20.109] { [18:03:20.109] { [18:03:20.109] { [18:03:20.109] { [18:03:20.109] base::local({ [18:03:20.109] has_future <- base::requireNamespace("future", [18:03:20.109] quietly = TRUE) [18:03:20.109] if (has_future) { [18:03:20.109] ns <- base::getNamespace("future") [18:03:20.109] version <- ns[[".package"]][["version"]] [18:03:20.109] if (is.null(version)) [18:03:20.109] version <- utils::packageVersion("future") [18:03:20.109] } [18:03:20.109] else { [18:03:20.109] version <- NULL [18:03:20.109] } [18:03:20.109] if (!has_future || version < "1.8.0") { [18:03:20.109] info <- base::c(r_version = base::gsub("R version ", [18:03:20.109] "", base::R.version$version.string), [18:03:20.109] platform = base::sprintf("%s (%s-bit)", [18:03:20.109] base::R.version$platform, 8 * [18:03:20.109] base::.Machine$sizeof.pointer), [18:03:20.109] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.109] "release", "version")], collapse = " "), [18:03:20.109] hostname = base::Sys.info()[["nodename"]]) [18:03:20.109] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.109] info) [18:03:20.109] info <- base::paste(info, collapse = "; ") [18:03:20.109] if (!has_future) { [18:03:20.109] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.109] info) [18:03:20.109] } [18:03:20.109] else { [18:03:20.109] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.109] info, version) [18:03:20.109] } [18:03:20.109] base::stop(msg) [18:03:20.109] } [18:03:20.109] }) [18:03:20.109] } [18:03:20.109] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.109] base::options(mc.cores = 1L) [18:03:20.109] } [18:03:20.109] options(future.plan = NULL) [18:03:20.109] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.109] future::plan("default", .cleanup = FALSE, [18:03:20.109] .init = FALSE) [18:03:20.109] } [18:03:20.109] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:20.109] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:20.109] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:20.109] } [18:03:20.109] ...future.workdir <- getwd() [18:03:20.109] } [18:03:20.109] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.109] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.109] } [18:03:20.109] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.109] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.109] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.109] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.109] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.109] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.109] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.109] base::names(...future.oldOptions)) [18:03:20.109] } [18:03:20.109] if (FALSE) { [18:03:20.109] } [18:03:20.109] else { [18:03:20.109] if (TRUE) { [18:03:20.109] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.109] open = "w") [18:03:20.109] } [18:03:20.109] else { [18:03:20.109] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.109] windows = "NUL", "/dev/null"), open = "w") [18:03:20.109] } [18:03:20.109] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.109] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.109] base::sink(type = "output", split = FALSE) [18:03:20.109] base::close(...future.stdout) [18:03:20.109] }, add = TRUE) [18:03:20.109] } [18:03:20.109] ...future.frame <- base::sys.nframe() [18:03:20.109] ...future.conditions <- base::list() [18:03:20.109] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.109] if (FALSE) { [18:03:20.109] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.109] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.109] } [18:03:20.109] ...future.result <- base::tryCatch({ [18:03:20.109] base::withCallingHandlers({ [18:03:20.109] ...future.value <- base::withVisible(base::local({ [18:03:20.109] ...future.makeSendCondition <- local({ [18:03:20.109] sendCondition <- NULL [18:03:20.109] function(frame = 1L) { [18:03:20.109] if (is.function(sendCondition)) [18:03:20.109] return(sendCondition) [18:03:20.109] ns <- getNamespace("parallel") [18:03:20.109] if (exists("sendData", mode = "function", [18:03:20.109] envir = ns)) { [18:03:20.109] parallel_sendData <- get("sendData", mode = "function", [18:03:20.109] envir = ns) [18:03:20.109] envir <- sys.frame(frame) [18:03:20.109] master <- NULL [18:03:20.109] while (!identical(envir, .GlobalEnv) && [18:03:20.109] !identical(envir, emptyenv())) { [18:03:20.109] if (exists("master", mode = "list", envir = envir, [18:03:20.109] inherits = FALSE)) { [18:03:20.109] master <- get("master", mode = "list", [18:03:20.109] envir = envir, inherits = FALSE) [18:03:20.109] if (inherits(master, c("SOCKnode", [18:03:20.109] "SOCK0node"))) { [18:03:20.109] sendCondition <<- function(cond) { [18:03:20.109] data <- list(type = "VALUE", value = cond, [18:03:20.109] success = TRUE) [18:03:20.109] parallel_sendData(master, data) [18:03:20.109] } [18:03:20.109] return(sendCondition) [18:03:20.109] } [18:03:20.109] } [18:03:20.109] frame <- frame + 1L [18:03:20.109] envir <- sys.frame(frame) [18:03:20.109] } [18:03:20.109] } [18:03:20.109] sendCondition <<- function(cond) NULL [18:03:20.109] } [18:03:20.109] }) [18:03:20.109] withCallingHandlers({ [18:03:20.109] { [18:03:20.109] sample(x, size = 1L) [18:03:20.109] } [18:03:20.109] }, immediateCondition = function(cond) { [18:03:20.109] sendCondition <- ...future.makeSendCondition() [18:03:20.109] sendCondition(cond) [18:03:20.109] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.109] { [18:03:20.109] inherits <- base::inherits [18:03:20.109] invokeRestart <- base::invokeRestart [18:03:20.109] is.null <- base::is.null [18:03:20.109] muffled <- FALSE [18:03:20.109] if (inherits(cond, "message")) { [18:03:20.109] muffled <- grepl(pattern, "muffleMessage") [18:03:20.109] if (muffled) [18:03:20.109] invokeRestart("muffleMessage") [18:03:20.109] } [18:03:20.109] else if (inherits(cond, "warning")) { [18:03:20.109] muffled <- grepl(pattern, "muffleWarning") [18:03:20.109] if (muffled) [18:03:20.109] invokeRestart("muffleWarning") [18:03:20.109] } [18:03:20.109] else if (inherits(cond, "condition")) { [18:03:20.109] if (!is.null(pattern)) { [18:03:20.109] computeRestarts <- base::computeRestarts [18:03:20.109] grepl <- base::grepl [18:03:20.109] restarts <- computeRestarts(cond) [18:03:20.109] for (restart in restarts) { [18:03:20.109] name <- restart$name [18:03:20.109] if (is.null(name)) [18:03:20.109] next [18:03:20.109] if (!grepl(pattern, name)) [18:03:20.109] next [18:03:20.109] invokeRestart(restart) [18:03:20.109] muffled <- TRUE [18:03:20.109] break [18:03:20.109] } [18:03:20.109] } [18:03:20.109] } [18:03:20.109] invisible(muffled) [18:03:20.109] } [18:03:20.109] muffleCondition(cond) [18:03:20.109] }) [18:03:20.109] })) [18:03:20.109] future::FutureResult(value = ...future.value$value, [18:03:20.109] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.109] ...future.rng), globalenv = if (FALSE) [18:03:20.109] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.109] ...future.globalenv.names)) [18:03:20.109] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.109] }, condition = base::local({ [18:03:20.109] c <- base::c [18:03:20.109] inherits <- base::inherits [18:03:20.109] invokeRestart <- base::invokeRestart [18:03:20.109] length <- base::length [18:03:20.109] list <- base::list [18:03:20.109] seq.int <- base::seq.int [18:03:20.109] signalCondition <- base::signalCondition [18:03:20.109] sys.calls <- base::sys.calls [18:03:20.109] `[[` <- base::`[[` [18:03:20.109] `+` <- base::`+` [18:03:20.109] `<<-` <- base::`<<-` [18:03:20.109] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.109] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.109] 3L)] [18:03:20.109] } [18:03:20.109] function(cond) { [18:03:20.109] is_error <- inherits(cond, "error") [18:03:20.109] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.109] NULL) [18:03:20.109] if (is_error) { [18:03:20.109] sessionInformation <- function() { [18:03:20.109] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.109] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.109] search = base::search(), system = base::Sys.info()) [18:03:20.109] } [18:03:20.109] ...future.conditions[[length(...future.conditions) + [18:03:20.109] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.109] cond$call), session = sessionInformation(), [18:03:20.109] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.109] signalCondition(cond) [18:03:20.109] } [18:03:20.109] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.109] "immediateCondition"))) { [18:03:20.109] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.109] ...future.conditions[[length(...future.conditions) + [18:03:20.109] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.109] if (TRUE && !signal) { [18:03:20.109] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.109] { [18:03:20.109] inherits <- base::inherits [18:03:20.109] invokeRestart <- base::invokeRestart [18:03:20.109] is.null <- base::is.null [18:03:20.109] muffled <- FALSE [18:03:20.109] if (inherits(cond, "message")) { [18:03:20.109] muffled <- grepl(pattern, "muffleMessage") [18:03:20.109] if (muffled) [18:03:20.109] invokeRestart("muffleMessage") [18:03:20.109] } [18:03:20.109] else if (inherits(cond, "warning")) { [18:03:20.109] muffled <- grepl(pattern, "muffleWarning") [18:03:20.109] if (muffled) [18:03:20.109] invokeRestart("muffleWarning") [18:03:20.109] } [18:03:20.109] else if (inherits(cond, "condition")) { [18:03:20.109] if (!is.null(pattern)) { [18:03:20.109] computeRestarts <- base::computeRestarts [18:03:20.109] grepl <- base::grepl [18:03:20.109] restarts <- computeRestarts(cond) [18:03:20.109] for (restart in restarts) { [18:03:20.109] name <- restart$name [18:03:20.109] if (is.null(name)) [18:03:20.109] next [18:03:20.109] if (!grepl(pattern, name)) [18:03:20.109] next [18:03:20.109] invokeRestart(restart) [18:03:20.109] muffled <- TRUE [18:03:20.109] break [18:03:20.109] } [18:03:20.109] } [18:03:20.109] } [18:03:20.109] invisible(muffled) [18:03:20.109] } [18:03:20.109] muffleCondition(cond, pattern = "^muffle") [18:03:20.109] } [18:03:20.109] } [18:03:20.109] else { [18:03:20.109] if (TRUE) { [18:03:20.109] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.109] { [18:03:20.109] inherits <- base::inherits [18:03:20.109] invokeRestart <- base::invokeRestart [18:03:20.109] is.null <- base::is.null [18:03:20.109] muffled <- FALSE [18:03:20.109] if (inherits(cond, "message")) { [18:03:20.109] muffled <- grepl(pattern, "muffleMessage") [18:03:20.109] if (muffled) [18:03:20.109] invokeRestart("muffleMessage") [18:03:20.109] } [18:03:20.109] else if (inherits(cond, "warning")) { [18:03:20.109] muffled <- grepl(pattern, "muffleWarning") [18:03:20.109] if (muffled) [18:03:20.109] invokeRestart("muffleWarning") [18:03:20.109] } [18:03:20.109] else if (inherits(cond, "condition")) { [18:03:20.109] if (!is.null(pattern)) { [18:03:20.109] computeRestarts <- base::computeRestarts [18:03:20.109] grepl <- base::grepl [18:03:20.109] restarts <- computeRestarts(cond) [18:03:20.109] for (restart in restarts) { [18:03:20.109] name <- restart$name [18:03:20.109] if (is.null(name)) [18:03:20.109] next [18:03:20.109] if (!grepl(pattern, name)) [18:03:20.109] next [18:03:20.109] invokeRestart(restart) [18:03:20.109] muffled <- TRUE [18:03:20.109] break [18:03:20.109] } [18:03:20.109] } [18:03:20.109] } [18:03:20.109] invisible(muffled) [18:03:20.109] } [18:03:20.109] muffleCondition(cond, pattern = "^muffle") [18:03:20.109] } [18:03:20.109] } [18:03:20.109] } [18:03:20.109] })) [18:03:20.109] }, error = function(ex) { [18:03:20.109] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.109] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.109] ...future.rng), started = ...future.startTime, [18:03:20.109] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.109] version = "1.8"), class = "FutureResult") [18:03:20.109] }, finally = { [18:03:20.109] if (!identical(...future.workdir, getwd())) [18:03:20.109] setwd(...future.workdir) [18:03:20.109] { [18:03:20.109] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.109] ...future.oldOptions$nwarnings <- NULL [18:03:20.109] } [18:03:20.109] base::options(...future.oldOptions) [18:03:20.109] if (.Platform$OS.type == "windows") { [18:03:20.109] old_names <- names(...future.oldEnvVars) [18:03:20.109] envs <- base::Sys.getenv() [18:03:20.109] names <- names(envs) [18:03:20.109] common <- intersect(names, old_names) [18:03:20.109] added <- setdiff(names, old_names) [18:03:20.109] removed <- setdiff(old_names, names) [18:03:20.109] changed <- common[...future.oldEnvVars[common] != [18:03:20.109] envs[common]] [18:03:20.109] NAMES <- toupper(changed) [18:03:20.109] args <- list() [18:03:20.109] for (kk in seq_along(NAMES)) { [18:03:20.109] name <- changed[[kk]] [18:03:20.109] NAME <- NAMES[[kk]] [18:03:20.109] if (name != NAME && is.element(NAME, old_names)) [18:03:20.109] next [18:03:20.109] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.109] } [18:03:20.109] NAMES <- toupper(added) [18:03:20.109] for (kk in seq_along(NAMES)) { [18:03:20.109] name <- added[[kk]] [18:03:20.109] NAME <- NAMES[[kk]] [18:03:20.109] if (name != NAME && is.element(NAME, old_names)) [18:03:20.109] next [18:03:20.109] args[[name]] <- "" [18:03:20.109] } [18:03:20.109] NAMES <- toupper(removed) [18:03:20.109] for (kk in seq_along(NAMES)) { [18:03:20.109] name <- removed[[kk]] [18:03:20.109] NAME <- NAMES[[kk]] [18:03:20.109] if (name != NAME && is.element(NAME, old_names)) [18:03:20.109] next [18:03:20.109] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.109] } [18:03:20.109] if (length(args) > 0) [18:03:20.109] base::do.call(base::Sys.setenv, args = args) [18:03:20.109] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.109] } [18:03:20.109] else { [18:03:20.109] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.109] } [18:03:20.109] { [18:03:20.109] if (base::length(...future.futureOptionsAdded) > [18:03:20.109] 0L) { [18:03:20.109] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.109] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.109] base::options(opts) [18:03:20.109] } [18:03:20.109] { [18:03:20.109] { [18:03:20.109] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.109] NULL [18:03:20.109] } [18:03:20.109] options(future.plan = NULL) [18:03:20.109] if (is.na(NA_character_)) [18:03:20.109] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.109] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.109] future::plan(list(function (..., workers = availableCores(), [18:03:20.109] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.109] envir = parent.frame()) [18:03:20.109] { [18:03:20.109] if (is.function(workers)) [18:03:20.109] workers <- workers() [18:03:20.109] workers <- structure(as.integer(workers), [18:03:20.109] class = class(workers)) [18:03:20.109] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.109] workers >= 1) [18:03:20.109] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.109] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.109] } [18:03:20.109] future <- MultisessionFuture(..., workers = workers, [18:03:20.109] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.109] envir = envir) [18:03:20.109] if (!future$lazy) [18:03:20.109] future <- run(future) [18:03:20.109] invisible(future) [18:03:20.109] }), .cleanup = FALSE, .init = FALSE) [18:03:20.109] } [18:03:20.109] } [18:03:20.109] } [18:03:20.109] }) [18:03:20.109] if (TRUE) { [18:03:20.109] base::sink(type = "output", split = FALSE) [18:03:20.109] if (TRUE) { [18:03:20.109] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.109] } [18:03:20.109] else { [18:03:20.109] ...future.result["stdout"] <- base::list(NULL) [18:03:20.109] } [18:03:20.109] base::close(...future.stdout) [18:03:20.109] ...future.stdout <- NULL [18:03:20.109] } [18:03:20.109] ...future.result$conditions <- ...future.conditions [18:03:20.109] ...future.result$finished <- base::Sys.time() [18:03:20.109] ...future.result [18:03:20.109] } [18:03:20.114] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.127] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.127] - Validating connection of MultisessionFuture [18:03:20.127] - received message: FutureResult [18:03:20.128] - Received FutureResult [18:03:20.128] - Erased future from FutureRegistry [18:03:20.128] result() for ClusterFuture ... [18:03:20.128] - result already collected: FutureResult [18:03:20.128] result() for ClusterFuture ... done [18:03:20.128] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.129] result() for ClusterFuture ... [18:03:20.129] - result already collected: FutureResult [18:03:20.129] result() for ClusterFuture ... done [18:03:20.129] result() for ClusterFuture ... [18:03:20.129] - result already collected: FutureResult [18:03:20.129] result() for ClusterFuture ... done [18:03:20.130] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.130] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.131] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.131] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.132] MultisessionFuture started [18:03:20.132] - Launch lazy future ... done [18:03:20.132] run() for 'MultisessionFuture' ... done [18:03:20.132] result() for ClusterFuture ... [18:03:20.133] - result already collected: FutureResult [18:03:20.133] result() for ClusterFuture ... done [18:03:20.133] result() for ClusterFuture ... [18:03:20.133] - result already collected: FutureResult [18:03:20.133] result() for ClusterFuture ... done [18:03:20.133] result() for ClusterFuture ... [18:03:20.134] - result already collected: FutureResult [18:03:20.134] result() for ClusterFuture ... done [18:03:20.134] result() for ClusterFuture ... [18:03:20.134] - result already collected: FutureResult [18:03:20.134] result() for ClusterFuture ... done [18:03:20.134] result() for ClusterFuture ... [18:03:20.135] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.135] - Validating connection of MultisessionFuture [18:03:20.135] - received message: FutureResult [18:03:20.135] - Received FutureResult [18:03:20.135] - Erased future from FutureRegistry [18:03:20.136] result() for ClusterFuture ... [18:03:20.136] - result already collected: FutureResult [18:03:20.136] result() for ClusterFuture ... done [18:03:20.136] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.136] result() for ClusterFuture ... done [18:03:20.136] result() for ClusterFuture ... [18:03:20.136] - result already collected: FutureResult [18:03:20.137] result() for ClusterFuture ... done [18:03:20.137] result() for ClusterFuture ... [18:03:20.137] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.137] - Validating connection of MultisessionFuture [18:03:20.150] - received message: FutureResult [18:03:20.150] - Received FutureResult [18:03:20.150] - Erased future from FutureRegistry [18:03:20.150] result() for ClusterFuture ... [18:03:20.151] - result already collected: FutureResult [18:03:20.151] result() for ClusterFuture ... done [18:03:20.151] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.151] result() for ClusterFuture ... done [18:03:20.151] result() for ClusterFuture ... [18:03:20.151] - result already collected: FutureResult [18:03:20.152] result() for ClusterFuture ... done [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:20.152] getGlobalsAndPackages() ... [18:03:20.152] Searching for globals... [18:03:20.154] - globals found: [3] '{', 'sample', 'x' [18:03:20.154] Searching for globals ... DONE [18:03:20.154] Resolving globals: FALSE [18:03:20.154] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.155] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.155] - globals: [1] 'x' [18:03:20.155] [18:03:20.155] getGlobalsAndPackages() ... DONE [18:03:20.156] run() for 'Future' ... [18:03:20.156] - state: 'created' [18:03:20.156] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.170] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.170] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.170] - Field: 'node' [18:03:20.170] - Field: 'label' [18:03:20.171] - Field: 'local' [18:03:20.171] - Field: 'owner' [18:03:20.171] - Field: 'envir' [18:03:20.171] - Field: 'workers' [18:03:20.171] - Field: 'packages' [18:03:20.172] - Field: 'gc' [18:03:20.172] - Field: 'conditions' [18:03:20.172] - Field: 'persistent' [18:03:20.172] - Field: 'expr' [18:03:20.172] - Field: 'uuid' [18:03:20.172] - Field: 'seed' [18:03:20.173] - Field: 'version' [18:03:20.173] - Field: 'result' [18:03:20.173] - Field: 'asynchronous' [18:03:20.173] - Field: 'calls' [18:03:20.173] - Field: 'globals' [18:03:20.173] - Field: 'stdout' [18:03:20.174] - Field: 'earlySignal' [18:03:20.174] - Field: 'lazy' [18:03:20.174] - Field: 'state' [18:03:20.174] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.174] - Launch lazy future ... [18:03:20.175] Packages needed by the future expression (n = 0): [18:03:20.175] Packages needed by future strategies (n = 0): [18:03:20.175] { [18:03:20.175] { [18:03:20.175] { [18:03:20.175] ...future.startTime <- base::Sys.time() [18:03:20.175] { [18:03:20.175] { [18:03:20.175] { [18:03:20.175] { [18:03:20.175] { [18:03:20.175] base::local({ [18:03:20.175] has_future <- base::requireNamespace("future", [18:03:20.175] quietly = TRUE) [18:03:20.175] if (has_future) { [18:03:20.175] ns <- base::getNamespace("future") [18:03:20.175] version <- ns[[".package"]][["version"]] [18:03:20.175] if (is.null(version)) [18:03:20.175] version <- utils::packageVersion("future") [18:03:20.175] } [18:03:20.175] else { [18:03:20.175] version <- NULL [18:03:20.175] } [18:03:20.175] if (!has_future || version < "1.8.0") { [18:03:20.175] info <- base::c(r_version = base::gsub("R version ", [18:03:20.175] "", base::R.version$version.string), [18:03:20.175] platform = base::sprintf("%s (%s-bit)", [18:03:20.175] base::R.version$platform, 8 * [18:03:20.175] base::.Machine$sizeof.pointer), [18:03:20.175] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.175] "release", "version")], collapse = " "), [18:03:20.175] hostname = base::Sys.info()[["nodename"]]) [18:03:20.175] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.175] info) [18:03:20.175] info <- base::paste(info, collapse = "; ") [18:03:20.175] if (!has_future) { [18:03:20.175] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.175] info) [18:03:20.175] } [18:03:20.175] else { [18:03:20.175] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.175] info, version) [18:03:20.175] } [18:03:20.175] base::stop(msg) [18:03:20.175] } [18:03:20.175] }) [18:03:20.175] } [18:03:20.175] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.175] base::options(mc.cores = 1L) [18:03:20.175] } [18:03:20.175] options(future.plan = NULL) [18:03:20.175] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.175] future::plan("default", .cleanup = FALSE, [18:03:20.175] .init = FALSE) [18:03:20.175] } [18:03:20.175] base::assign(".Random.seed", c(10407L, -94575036L, [18:03:20.175] -24861725L, 357812871L, 346211554L, -1301022835L, [18:03:20.175] 440649733L), envir = base::globalenv(), inherits = FALSE) [18:03:20.175] } [18:03:20.175] ...future.workdir <- getwd() [18:03:20.175] } [18:03:20.175] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.175] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.175] } [18:03:20.175] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.175] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.175] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.175] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.175] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.175] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.175] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.175] base::names(...future.oldOptions)) [18:03:20.175] } [18:03:20.175] if (FALSE) { [18:03:20.175] } [18:03:20.175] else { [18:03:20.175] if (TRUE) { [18:03:20.175] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.175] open = "w") [18:03:20.175] } [18:03:20.175] else { [18:03:20.175] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.175] windows = "NUL", "/dev/null"), open = "w") [18:03:20.175] } [18:03:20.175] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.175] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.175] base::sink(type = "output", split = FALSE) [18:03:20.175] base::close(...future.stdout) [18:03:20.175] }, add = TRUE) [18:03:20.175] } [18:03:20.175] ...future.frame <- base::sys.nframe() [18:03:20.175] ...future.conditions <- base::list() [18:03:20.175] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.175] if (FALSE) { [18:03:20.175] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.175] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.175] } [18:03:20.175] ...future.result <- base::tryCatch({ [18:03:20.175] base::withCallingHandlers({ [18:03:20.175] ...future.value <- base::withVisible(base::local({ [18:03:20.175] ...future.makeSendCondition <- local({ [18:03:20.175] sendCondition <- NULL [18:03:20.175] function(frame = 1L) { [18:03:20.175] if (is.function(sendCondition)) [18:03:20.175] return(sendCondition) [18:03:20.175] ns <- getNamespace("parallel") [18:03:20.175] if (exists("sendData", mode = "function", [18:03:20.175] envir = ns)) { [18:03:20.175] parallel_sendData <- get("sendData", mode = "function", [18:03:20.175] envir = ns) [18:03:20.175] envir <- sys.frame(frame) [18:03:20.175] master <- NULL [18:03:20.175] while (!identical(envir, .GlobalEnv) && [18:03:20.175] !identical(envir, emptyenv())) { [18:03:20.175] if (exists("master", mode = "list", envir = envir, [18:03:20.175] inherits = FALSE)) { [18:03:20.175] master <- get("master", mode = "list", [18:03:20.175] envir = envir, inherits = FALSE) [18:03:20.175] if (inherits(master, c("SOCKnode", [18:03:20.175] "SOCK0node"))) { [18:03:20.175] sendCondition <<- function(cond) { [18:03:20.175] data <- list(type = "VALUE", value = cond, [18:03:20.175] success = TRUE) [18:03:20.175] parallel_sendData(master, data) [18:03:20.175] } [18:03:20.175] return(sendCondition) [18:03:20.175] } [18:03:20.175] } [18:03:20.175] frame <- frame + 1L [18:03:20.175] envir <- sys.frame(frame) [18:03:20.175] } [18:03:20.175] } [18:03:20.175] sendCondition <<- function(cond) NULL [18:03:20.175] } [18:03:20.175] }) [18:03:20.175] withCallingHandlers({ [18:03:20.175] { [18:03:20.175] sample(x, size = 1L) [18:03:20.175] } [18:03:20.175] }, immediateCondition = function(cond) { [18:03:20.175] sendCondition <- ...future.makeSendCondition() [18:03:20.175] sendCondition(cond) [18:03:20.175] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.175] { [18:03:20.175] inherits <- base::inherits [18:03:20.175] invokeRestart <- base::invokeRestart [18:03:20.175] is.null <- base::is.null [18:03:20.175] muffled <- FALSE [18:03:20.175] if (inherits(cond, "message")) { [18:03:20.175] muffled <- grepl(pattern, "muffleMessage") [18:03:20.175] if (muffled) [18:03:20.175] invokeRestart("muffleMessage") [18:03:20.175] } [18:03:20.175] else if (inherits(cond, "warning")) { [18:03:20.175] muffled <- grepl(pattern, "muffleWarning") [18:03:20.175] if (muffled) [18:03:20.175] invokeRestart("muffleWarning") [18:03:20.175] } [18:03:20.175] else if (inherits(cond, "condition")) { [18:03:20.175] if (!is.null(pattern)) { [18:03:20.175] computeRestarts <- base::computeRestarts [18:03:20.175] grepl <- base::grepl [18:03:20.175] restarts <- computeRestarts(cond) [18:03:20.175] for (restart in restarts) { [18:03:20.175] name <- restart$name [18:03:20.175] if (is.null(name)) [18:03:20.175] next [18:03:20.175] if (!grepl(pattern, name)) [18:03:20.175] next [18:03:20.175] invokeRestart(restart) [18:03:20.175] muffled <- TRUE [18:03:20.175] break [18:03:20.175] } [18:03:20.175] } [18:03:20.175] } [18:03:20.175] invisible(muffled) [18:03:20.175] } [18:03:20.175] muffleCondition(cond) [18:03:20.175] }) [18:03:20.175] })) [18:03:20.175] future::FutureResult(value = ...future.value$value, [18:03:20.175] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.175] ...future.rng), globalenv = if (FALSE) [18:03:20.175] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.175] ...future.globalenv.names)) [18:03:20.175] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.175] }, condition = base::local({ [18:03:20.175] c <- base::c [18:03:20.175] inherits <- base::inherits [18:03:20.175] invokeRestart <- base::invokeRestart [18:03:20.175] length <- base::length [18:03:20.175] list <- base::list [18:03:20.175] seq.int <- base::seq.int [18:03:20.175] signalCondition <- base::signalCondition [18:03:20.175] sys.calls <- base::sys.calls [18:03:20.175] `[[` <- base::`[[` [18:03:20.175] `+` <- base::`+` [18:03:20.175] `<<-` <- base::`<<-` [18:03:20.175] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.175] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.175] 3L)] [18:03:20.175] } [18:03:20.175] function(cond) { [18:03:20.175] is_error <- inherits(cond, "error") [18:03:20.175] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.175] NULL) [18:03:20.175] if (is_error) { [18:03:20.175] sessionInformation <- function() { [18:03:20.175] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.175] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.175] search = base::search(), system = base::Sys.info()) [18:03:20.175] } [18:03:20.175] ...future.conditions[[length(...future.conditions) + [18:03:20.175] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.175] cond$call), session = sessionInformation(), [18:03:20.175] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.175] signalCondition(cond) [18:03:20.175] } [18:03:20.175] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.175] "immediateCondition"))) { [18:03:20.175] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.175] ...future.conditions[[length(...future.conditions) + [18:03:20.175] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.175] if (TRUE && !signal) { [18:03:20.175] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.175] { [18:03:20.175] inherits <- base::inherits [18:03:20.175] invokeRestart <- base::invokeRestart [18:03:20.175] is.null <- base::is.null [18:03:20.175] muffled <- FALSE [18:03:20.175] if (inherits(cond, "message")) { [18:03:20.175] muffled <- grepl(pattern, "muffleMessage") [18:03:20.175] if (muffled) [18:03:20.175] invokeRestart("muffleMessage") [18:03:20.175] } [18:03:20.175] else if (inherits(cond, "warning")) { [18:03:20.175] muffled <- grepl(pattern, "muffleWarning") [18:03:20.175] if (muffled) [18:03:20.175] invokeRestart("muffleWarning") [18:03:20.175] } [18:03:20.175] else if (inherits(cond, "condition")) { [18:03:20.175] if (!is.null(pattern)) { [18:03:20.175] computeRestarts <- base::computeRestarts [18:03:20.175] grepl <- base::grepl [18:03:20.175] restarts <- computeRestarts(cond) [18:03:20.175] for (restart in restarts) { [18:03:20.175] name <- restart$name [18:03:20.175] if (is.null(name)) [18:03:20.175] next [18:03:20.175] if (!grepl(pattern, name)) [18:03:20.175] next [18:03:20.175] invokeRestart(restart) [18:03:20.175] muffled <- TRUE [18:03:20.175] break [18:03:20.175] } [18:03:20.175] } [18:03:20.175] } [18:03:20.175] invisible(muffled) [18:03:20.175] } [18:03:20.175] muffleCondition(cond, pattern = "^muffle") [18:03:20.175] } [18:03:20.175] } [18:03:20.175] else { [18:03:20.175] if (TRUE) { [18:03:20.175] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.175] { [18:03:20.175] inherits <- base::inherits [18:03:20.175] invokeRestart <- base::invokeRestart [18:03:20.175] is.null <- base::is.null [18:03:20.175] muffled <- FALSE [18:03:20.175] if (inherits(cond, "message")) { [18:03:20.175] muffled <- grepl(pattern, "muffleMessage") [18:03:20.175] if (muffled) [18:03:20.175] invokeRestart("muffleMessage") [18:03:20.175] } [18:03:20.175] else if (inherits(cond, "warning")) { [18:03:20.175] muffled <- grepl(pattern, "muffleWarning") [18:03:20.175] if (muffled) [18:03:20.175] invokeRestart("muffleWarning") [18:03:20.175] } [18:03:20.175] else if (inherits(cond, "condition")) { [18:03:20.175] if (!is.null(pattern)) { [18:03:20.175] computeRestarts <- base::computeRestarts [18:03:20.175] grepl <- base::grepl [18:03:20.175] restarts <- computeRestarts(cond) [18:03:20.175] for (restart in restarts) { [18:03:20.175] name <- restart$name [18:03:20.175] if (is.null(name)) [18:03:20.175] next [18:03:20.175] if (!grepl(pattern, name)) [18:03:20.175] next [18:03:20.175] invokeRestart(restart) [18:03:20.175] muffled <- TRUE [18:03:20.175] break [18:03:20.175] } [18:03:20.175] } [18:03:20.175] } [18:03:20.175] invisible(muffled) [18:03:20.175] } [18:03:20.175] muffleCondition(cond, pattern = "^muffle") [18:03:20.175] } [18:03:20.175] } [18:03:20.175] } [18:03:20.175] })) [18:03:20.175] }, error = function(ex) { [18:03:20.175] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.175] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.175] ...future.rng), started = ...future.startTime, [18:03:20.175] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.175] version = "1.8"), class = "FutureResult") [18:03:20.175] }, finally = { [18:03:20.175] if (!identical(...future.workdir, getwd())) [18:03:20.175] setwd(...future.workdir) [18:03:20.175] { [18:03:20.175] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.175] ...future.oldOptions$nwarnings <- NULL [18:03:20.175] } [18:03:20.175] base::options(...future.oldOptions) [18:03:20.175] if (.Platform$OS.type == "windows") { [18:03:20.175] old_names <- names(...future.oldEnvVars) [18:03:20.175] envs <- base::Sys.getenv() [18:03:20.175] names <- names(envs) [18:03:20.175] common <- intersect(names, old_names) [18:03:20.175] added <- setdiff(names, old_names) [18:03:20.175] removed <- setdiff(old_names, names) [18:03:20.175] changed <- common[...future.oldEnvVars[common] != [18:03:20.175] envs[common]] [18:03:20.175] NAMES <- toupper(changed) [18:03:20.175] args <- list() [18:03:20.175] for (kk in seq_along(NAMES)) { [18:03:20.175] name <- changed[[kk]] [18:03:20.175] NAME <- NAMES[[kk]] [18:03:20.175] if (name != NAME && is.element(NAME, old_names)) [18:03:20.175] next [18:03:20.175] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.175] } [18:03:20.175] NAMES <- toupper(added) [18:03:20.175] for (kk in seq_along(NAMES)) { [18:03:20.175] name <- added[[kk]] [18:03:20.175] NAME <- NAMES[[kk]] [18:03:20.175] if (name != NAME && is.element(NAME, old_names)) [18:03:20.175] next [18:03:20.175] args[[name]] <- "" [18:03:20.175] } [18:03:20.175] NAMES <- toupper(removed) [18:03:20.175] for (kk in seq_along(NAMES)) { [18:03:20.175] name <- removed[[kk]] [18:03:20.175] NAME <- NAMES[[kk]] [18:03:20.175] if (name != NAME && is.element(NAME, old_names)) [18:03:20.175] next [18:03:20.175] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.175] } [18:03:20.175] if (length(args) > 0) [18:03:20.175] base::do.call(base::Sys.setenv, args = args) [18:03:20.175] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.175] } [18:03:20.175] else { [18:03:20.175] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.175] } [18:03:20.175] { [18:03:20.175] if (base::length(...future.futureOptionsAdded) > [18:03:20.175] 0L) { [18:03:20.175] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.175] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.175] base::options(opts) [18:03:20.175] } [18:03:20.175] { [18:03:20.175] { [18:03:20.175] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.175] NULL [18:03:20.175] } [18:03:20.175] options(future.plan = NULL) [18:03:20.175] if (is.na(NA_character_)) [18:03:20.175] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.175] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.175] future::plan(list(function (..., workers = availableCores(), [18:03:20.175] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.175] envir = parent.frame()) [18:03:20.175] { [18:03:20.175] if (is.function(workers)) [18:03:20.175] workers <- workers() [18:03:20.175] workers <- structure(as.integer(workers), [18:03:20.175] class = class(workers)) [18:03:20.175] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.175] workers >= 1) [18:03:20.175] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.175] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.175] } [18:03:20.175] future <- MultisessionFuture(..., workers = workers, [18:03:20.175] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.175] envir = envir) [18:03:20.175] if (!future$lazy) [18:03:20.175] future <- run(future) [18:03:20.175] invisible(future) [18:03:20.175] }), .cleanup = FALSE, .init = FALSE) [18:03:20.175] } [18:03:20.175] } [18:03:20.175] } [18:03:20.175] }) [18:03:20.175] if (TRUE) { [18:03:20.175] base::sink(type = "output", split = FALSE) [18:03:20.175] if (TRUE) { [18:03:20.175] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.175] } [18:03:20.175] else { [18:03:20.175] ...future.result["stdout"] <- base::list(NULL) [18:03:20.175] } [18:03:20.175] base::close(...future.stdout) [18:03:20.175] ...future.stdout <- NULL [18:03:20.175] } [18:03:20.175] ...future.result$conditions <- ...future.conditions [18:03:20.175] ...future.result$finished <- base::Sys.time() [18:03:20.175] ...future.result [18:03:20.175] } [18:03:20.181] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.181] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.182] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.182] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.183] MultisessionFuture started [18:03:20.183] - Launch lazy future ... done [18:03:20.183] run() for 'MultisessionFuture' ... done [18:03:20.183] getGlobalsAndPackages() ... [18:03:20.184] Searching for globals... [18:03:20.185] - globals found: [3] '{', 'sample', 'x' [18:03:20.185] Searching for globals ... DONE [18:03:20.185] Resolving globals: FALSE [18:03:20.186] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.186] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.186] - globals: [1] 'x' [18:03:20.186] [18:03:20.187] getGlobalsAndPackages() ... DONE [18:03:20.187] run() for 'Future' ... [18:03:20.187] - state: 'created' [18:03:20.187] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.201] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.201] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.201] - Field: 'node' [18:03:20.202] - Field: 'label' [18:03:20.202] - Field: 'local' [18:03:20.202] - Field: 'owner' [18:03:20.202] - Field: 'envir' [18:03:20.202] - Field: 'workers' [18:03:20.203] - Field: 'packages' [18:03:20.203] - Field: 'gc' [18:03:20.203] - Field: 'conditions' [18:03:20.203] - Field: 'persistent' [18:03:20.203] - Field: 'expr' [18:03:20.203] - Field: 'uuid' [18:03:20.204] - Field: 'seed' [18:03:20.204] - Field: 'version' [18:03:20.204] - Field: 'result' [18:03:20.204] - Field: 'asynchronous' [18:03:20.204] - Field: 'calls' [18:03:20.204] - Field: 'globals' [18:03:20.205] - Field: 'stdout' [18:03:20.205] - Field: 'earlySignal' [18:03:20.205] - Field: 'lazy' [18:03:20.205] - Field: 'state' [18:03:20.205] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.206] - Launch lazy future ... [18:03:20.206] Packages needed by the future expression (n = 0): [18:03:20.206] Packages needed by future strategies (n = 0): [18:03:20.207] { [18:03:20.207] { [18:03:20.207] { [18:03:20.207] ...future.startTime <- base::Sys.time() [18:03:20.207] { [18:03:20.207] { [18:03:20.207] { [18:03:20.207] { [18:03:20.207] { [18:03:20.207] base::local({ [18:03:20.207] has_future <- base::requireNamespace("future", [18:03:20.207] quietly = TRUE) [18:03:20.207] if (has_future) { [18:03:20.207] ns <- base::getNamespace("future") [18:03:20.207] version <- ns[[".package"]][["version"]] [18:03:20.207] if (is.null(version)) [18:03:20.207] version <- utils::packageVersion("future") [18:03:20.207] } [18:03:20.207] else { [18:03:20.207] version <- NULL [18:03:20.207] } [18:03:20.207] if (!has_future || version < "1.8.0") { [18:03:20.207] info <- base::c(r_version = base::gsub("R version ", [18:03:20.207] "", base::R.version$version.string), [18:03:20.207] platform = base::sprintf("%s (%s-bit)", [18:03:20.207] base::R.version$platform, 8 * [18:03:20.207] base::.Machine$sizeof.pointer), [18:03:20.207] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.207] "release", "version")], collapse = " "), [18:03:20.207] hostname = base::Sys.info()[["nodename"]]) [18:03:20.207] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.207] info) [18:03:20.207] info <- base::paste(info, collapse = "; ") [18:03:20.207] if (!has_future) { [18:03:20.207] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.207] info) [18:03:20.207] } [18:03:20.207] else { [18:03:20.207] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.207] info, version) [18:03:20.207] } [18:03:20.207] base::stop(msg) [18:03:20.207] } [18:03:20.207] }) [18:03:20.207] } [18:03:20.207] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.207] base::options(mc.cores = 1L) [18:03:20.207] } [18:03:20.207] options(future.plan = NULL) [18:03:20.207] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.207] future::plan("default", .cleanup = FALSE, [18:03:20.207] .init = FALSE) [18:03:20.207] } [18:03:20.207] base::assign(".Random.seed", c(10407L, -358246211L, [18:03:20.207] -1411857254L, -488221791L, 1069515918L, -1720689715L, [18:03:20.207] 1070199760L), envir = base::globalenv(), inherits = FALSE) [18:03:20.207] } [18:03:20.207] ...future.workdir <- getwd() [18:03:20.207] } [18:03:20.207] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.207] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.207] } [18:03:20.207] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.207] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.207] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.207] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.207] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.207] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.207] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.207] base::names(...future.oldOptions)) [18:03:20.207] } [18:03:20.207] if (FALSE) { [18:03:20.207] } [18:03:20.207] else { [18:03:20.207] if (TRUE) { [18:03:20.207] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.207] open = "w") [18:03:20.207] } [18:03:20.207] else { [18:03:20.207] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.207] windows = "NUL", "/dev/null"), open = "w") [18:03:20.207] } [18:03:20.207] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.207] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.207] base::sink(type = "output", split = FALSE) [18:03:20.207] base::close(...future.stdout) [18:03:20.207] }, add = TRUE) [18:03:20.207] } [18:03:20.207] ...future.frame <- base::sys.nframe() [18:03:20.207] ...future.conditions <- base::list() [18:03:20.207] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.207] if (FALSE) { [18:03:20.207] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.207] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.207] } [18:03:20.207] ...future.result <- base::tryCatch({ [18:03:20.207] base::withCallingHandlers({ [18:03:20.207] ...future.value <- base::withVisible(base::local({ [18:03:20.207] ...future.makeSendCondition <- local({ [18:03:20.207] sendCondition <- NULL [18:03:20.207] function(frame = 1L) { [18:03:20.207] if (is.function(sendCondition)) [18:03:20.207] return(sendCondition) [18:03:20.207] ns <- getNamespace("parallel") [18:03:20.207] if (exists("sendData", mode = "function", [18:03:20.207] envir = ns)) { [18:03:20.207] parallel_sendData <- get("sendData", mode = "function", [18:03:20.207] envir = ns) [18:03:20.207] envir <- sys.frame(frame) [18:03:20.207] master <- NULL [18:03:20.207] while (!identical(envir, .GlobalEnv) && [18:03:20.207] !identical(envir, emptyenv())) { [18:03:20.207] if (exists("master", mode = "list", envir = envir, [18:03:20.207] inherits = FALSE)) { [18:03:20.207] master <- get("master", mode = "list", [18:03:20.207] envir = envir, inherits = FALSE) [18:03:20.207] if (inherits(master, c("SOCKnode", [18:03:20.207] "SOCK0node"))) { [18:03:20.207] sendCondition <<- function(cond) { [18:03:20.207] data <- list(type = "VALUE", value = cond, [18:03:20.207] success = TRUE) [18:03:20.207] parallel_sendData(master, data) [18:03:20.207] } [18:03:20.207] return(sendCondition) [18:03:20.207] } [18:03:20.207] } [18:03:20.207] frame <- frame + 1L [18:03:20.207] envir <- sys.frame(frame) [18:03:20.207] } [18:03:20.207] } [18:03:20.207] sendCondition <<- function(cond) NULL [18:03:20.207] } [18:03:20.207] }) [18:03:20.207] withCallingHandlers({ [18:03:20.207] { [18:03:20.207] sample(x, size = 1L) [18:03:20.207] } [18:03:20.207] }, immediateCondition = function(cond) { [18:03:20.207] sendCondition <- ...future.makeSendCondition() [18:03:20.207] sendCondition(cond) [18:03:20.207] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.207] { [18:03:20.207] inherits <- base::inherits [18:03:20.207] invokeRestart <- base::invokeRestart [18:03:20.207] is.null <- base::is.null [18:03:20.207] muffled <- FALSE [18:03:20.207] if (inherits(cond, "message")) { [18:03:20.207] muffled <- grepl(pattern, "muffleMessage") [18:03:20.207] if (muffled) [18:03:20.207] invokeRestart("muffleMessage") [18:03:20.207] } [18:03:20.207] else if (inherits(cond, "warning")) { [18:03:20.207] muffled <- grepl(pattern, "muffleWarning") [18:03:20.207] if (muffled) [18:03:20.207] invokeRestart("muffleWarning") [18:03:20.207] } [18:03:20.207] else if (inherits(cond, "condition")) { [18:03:20.207] if (!is.null(pattern)) { [18:03:20.207] computeRestarts <- base::computeRestarts [18:03:20.207] grepl <- base::grepl [18:03:20.207] restarts <- computeRestarts(cond) [18:03:20.207] for (restart in restarts) { [18:03:20.207] name <- restart$name [18:03:20.207] if (is.null(name)) [18:03:20.207] next [18:03:20.207] if (!grepl(pattern, name)) [18:03:20.207] next [18:03:20.207] invokeRestart(restart) [18:03:20.207] muffled <- TRUE [18:03:20.207] break [18:03:20.207] } [18:03:20.207] } [18:03:20.207] } [18:03:20.207] invisible(muffled) [18:03:20.207] } [18:03:20.207] muffleCondition(cond) [18:03:20.207] }) [18:03:20.207] })) [18:03:20.207] future::FutureResult(value = ...future.value$value, [18:03:20.207] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.207] ...future.rng), globalenv = if (FALSE) [18:03:20.207] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.207] ...future.globalenv.names)) [18:03:20.207] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.207] }, condition = base::local({ [18:03:20.207] c <- base::c [18:03:20.207] inherits <- base::inherits [18:03:20.207] invokeRestart <- base::invokeRestart [18:03:20.207] length <- base::length [18:03:20.207] list <- base::list [18:03:20.207] seq.int <- base::seq.int [18:03:20.207] signalCondition <- base::signalCondition [18:03:20.207] sys.calls <- base::sys.calls [18:03:20.207] `[[` <- base::`[[` [18:03:20.207] `+` <- base::`+` [18:03:20.207] `<<-` <- base::`<<-` [18:03:20.207] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.207] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.207] 3L)] [18:03:20.207] } [18:03:20.207] function(cond) { [18:03:20.207] is_error <- inherits(cond, "error") [18:03:20.207] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.207] NULL) [18:03:20.207] if (is_error) { [18:03:20.207] sessionInformation <- function() { [18:03:20.207] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.207] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.207] search = base::search(), system = base::Sys.info()) [18:03:20.207] } [18:03:20.207] ...future.conditions[[length(...future.conditions) + [18:03:20.207] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.207] cond$call), session = sessionInformation(), [18:03:20.207] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.207] signalCondition(cond) [18:03:20.207] } [18:03:20.207] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.207] "immediateCondition"))) { [18:03:20.207] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.207] ...future.conditions[[length(...future.conditions) + [18:03:20.207] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.207] if (TRUE && !signal) { [18:03:20.207] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.207] { [18:03:20.207] inherits <- base::inherits [18:03:20.207] invokeRestart <- base::invokeRestart [18:03:20.207] is.null <- base::is.null [18:03:20.207] muffled <- FALSE [18:03:20.207] if (inherits(cond, "message")) { [18:03:20.207] muffled <- grepl(pattern, "muffleMessage") [18:03:20.207] if (muffled) [18:03:20.207] invokeRestart("muffleMessage") [18:03:20.207] } [18:03:20.207] else if (inherits(cond, "warning")) { [18:03:20.207] muffled <- grepl(pattern, "muffleWarning") [18:03:20.207] if (muffled) [18:03:20.207] invokeRestart("muffleWarning") [18:03:20.207] } [18:03:20.207] else if (inherits(cond, "condition")) { [18:03:20.207] if (!is.null(pattern)) { [18:03:20.207] computeRestarts <- base::computeRestarts [18:03:20.207] grepl <- base::grepl [18:03:20.207] restarts <- computeRestarts(cond) [18:03:20.207] for (restart in restarts) { [18:03:20.207] name <- restart$name [18:03:20.207] if (is.null(name)) [18:03:20.207] next [18:03:20.207] if (!grepl(pattern, name)) [18:03:20.207] next [18:03:20.207] invokeRestart(restart) [18:03:20.207] muffled <- TRUE [18:03:20.207] break [18:03:20.207] } [18:03:20.207] } [18:03:20.207] } [18:03:20.207] invisible(muffled) [18:03:20.207] } [18:03:20.207] muffleCondition(cond, pattern = "^muffle") [18:03:20.207] } [18:03:20.207] } [18:03:20.207] else { [18:03:20.207] if (TRUE) { [18:03:20.207] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.207] { [18:03:20.207] inherits <- base::inherits [18:03:20.207] invokeRestart <- base::invokeRestart [18:03:20.207] is.null <- base::is.null [18:03:20.207] muffled <- FALSE [18:03:20.207] if (inherits(cond, "message")) { [18:03:20.207] muffled <- grepl(pattern, "muffleMessage") [18:03:20.207] if (muffled) [18:03:20.207] invokeRestart("muffleMessage") [18:03:20.207] } [18:03:20.207] else if (inherits(cond, "warning")) { [18:03:20.207] muffled <- grepl(pattern, "muffleWarning") [18:03:20.207] if (muffled) [18:03:20.207] invokeRestart("muffleWarning") [18:03:20.207] } [18:03:20.207] else if (inherits(cond, "condition")) { [18:03:20.207] if (!is.null(pattern)) { [18:03:20.207] computeRestarts <- base::computeRestarts [18:03:20.207] grepl <- base::grepl [18:03:20.207] restarts <- computeRestarts(cond) [18:03:20.207] for (restart in restarts) { [18:03:20.207] name <- restart$name [18:03:20.207] if (is.null(name)) [18:03:20.207] next [18:03:20.207] if (!grepl(pattern, name)) [18:03:20.207] next [18:03:20.207] invokeRestart(restart) [18:03:20.207] muffled <- TRUE [18:03:20.207] break [18:03:20.207] } [18:03:20.207] } [18:03:20.207] } [18:03:20.207] invisible(muffled) [18:03:20.207] } [18:03:20.207] muffleCondition(cond, pattern = "^muffle") [18:03:20.207] } [18:03:20.207] } [18:03:20.207] } [18:03:20.207] })) [18:03:20.207] }, error = function(ex) { [18:03:20.207] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.207] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.207] ...future.rng), started = ...future.startTime, [18:03:20.207] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.207] version = "1.8"), class = "FutureResult") [18:03:20.207] }, finally = { [18:03:20.207] if (!identical(...future.workdir, getwd())) [18:03:20.207] setwd(...future.workdir) [18:03:20.207] { [18:03:20.207] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.207] ...future.oldOptions$nwarnings <- NULL [18:03:20.207] } [18:03:20.207] base::options(...future.oldOptions) [18:03:20.207] if (.Platform$OS.type == "windows") { [18:03:20.207] old_names <- names(...future.oldEnvVars) [18:03:20.207] envs <- base::Sys.getenv() [18:03:20.207] names <- names(envs) [18:03:20.207] common <- intersect(names, old_names) [18:03:20.207] added <- setdiff(names, old_names) [18:03:20.207] removed <- setdiff(old_names, names) [18:03:20.207] changed <- common[...future.oldEnvVars[common] != [18:03:20.207] envs[common]] [18:03:20.207] NAMES <- toupper(changed) [18:03:20.207] args <- list() [18:03:20.207] for (kk in seq_along(NAMES)) { [18:03:20.207] name <- changed[[kk]] [18:03:20.207] NAME <- NAMES[[kk]] [18:03:20.207] if (name != NAME && is.element(NAME, old_names)) [18:03:20.207] next [18:03:20.207] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.207] } [18:03:20.207] NAMES <- toupper(added) [18:03:20.207] for (kk in seq_along(NAMES)) { [18:03:20.207] name <- added[[kk]] [18:03:20.207] NAME <- NAMES[[kk]] [18:03:20.207] if (name != NAME && is.element(NAME, old_names)) [18:03:20.207] next [18:03:20.207] args[[name]] <- "" [18:03:20.207] } [18:03:20.207] NAMES <- toupper(removed) [18:03:20.207] for (kk in seq_along(NAMES)) { [18:03:20.207] name <- removed[[kk]] [18:03:20.207] NAME <- NAMES[[kk]] [18:03:20.207] if (name != NAME && is.element(NAME, old_names)) [18:03:20.207] next [18:03:20.207] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.207] } [18:03:20.207] if (length(args) > 0) [18:03:20.207] base::do.call(base::Sys.setenv, args = args) [18:03:20.207] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.207] } [18:03:20.207] else { [18:03:20.207] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.207] } [18:03:20.207] { [18:03:20.207] if (base::length(...future.futureOptionsAdded) > [18:03:20.207] 0L) { [18:03:20.207] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.207] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.207] base::options(opts) [18:03:20.207] } [18:03:20.207] { [18:03:20.207] { [18:03:20.207] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.207] NULL [18:03:20.207] } [18:03:20.207] options(future.plan = NULL) [18:03:20.207] if (is.na(NA_character_)) [18:03:20.207] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.207] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.207] future::plan(list(function (..., workers = availableCores(), [18:03:20.207] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.207] envir = parent.frame()) [18:03:20.207] { [18:03:20.207] if (is.function(workers)) [18:03:20.207] workers <- workers() [18:03:20.207] workers <- structure(as.integer(workers), [18:03:20.207] class = class(workers)) [18:03:20.207] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.207] workers >= 1) [18:03:20.207] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.207] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.207] } [18:03:20.207] future <- MultisessionFuture(..., workers = workers, [18:03:20.207] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.207] envir = envir) [18:03:20.207] if (!future$lazy) [18:03:20.207] future <- run(future) [18:03:20.207] invisible(future) [18:03:20.207] }), .cleanup = FALSE, .init = FALSE) [18:03:20.207] } [18:03:20.207] } [18:03:20.207] } [18:03:20.207] }) [18:03:20.207] if (TRUE) { [18:03:20.207] base::sink(type = "output", split = FALSE) [18:03:20.207] if (TRUE) { [18:03:20.207] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.207] } [18:03:20.207] else { [18:03:20.207] ...future.result["stdout"] <- base::list(NULL) [18:03:20.207] } [18:03:20.207] base::close(...future.stdout) [18:03:20.207] ...future.stdout <- NULL [18:03:20.207] } [18:03:20.207] ...future.result$conditions <- ...future.conditions [18:03:20.207] ...future.result$finished <- base::Sys.time() [18:03:20.207] ...future.result [18:03:20.207] } [18:03:20.212] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.213] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.213] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.213] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.214] MultisessionFuture started [18:03:20.214] - Launch lazy future ... done [18:03:20.214] run() for 'MultisessionFuture' ... done [18:03:20.215] getGlobalsAndPackages() ... [18:03:20.215] Searching for globals... [18:03:20.216] - globals found: [3] '{', 'sample', 'x' [18:03:20.216] Searching for globals ... DONE [18:03:20.217] Resolving globals: FALSE [18:03:20.217] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.217] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.218] - globals: [1] 'x' [18:03:20.218] [18:03:20.218] getGlobalsAndPackages() ... DONE [18:03:20.218] run() for 'Future' ... [18:03:20.219] - state: 'created' [18:03:20.219] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.235] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.235] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.235] - Field: 'node' [18:03:20.236] - Field: 'label' [18:03:20.236] - Field: 'local' [18:03:20.236] - Field: 'owner' [18:03:20.236] - Field: 'envir' [18:03:20.236] - Field: 'workers' [18:03:20.236] - Field: 'packages' [18:03:20.237] - Field: 'gc' [18:03:20.237] - Field: 'conditions' [18:03:20.237] - Field: 'persistent' [18:03:20.237] - Field: 'expr' [18:03:20.237] - Field: 'uuid' [18:03:20.237] - Field: 'seed' [18:03:20.238] - Field: 'version' [18:03:20.238] - Field: 'result' [18:03:20.238] - Field: 'asynchronous' [18:03:20.238] - Field: 'calls' [18:03:20.238] - Field: 'globals' [18:03:20.239] - Field: 'stdout' [18:03:20.239] - Field: 'earlySignal' [18:03:20.239] - Field: 'lazy' [18:03:20.239] - Field: 'state' [18:03:20.239] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.239] - Launch lazy future ... [18:03:20.240] Packages needed by the future expression (n = 0): [18:03:20.240] Packages needed by future strategies (n = 0): [18:03:20.240] { [18:03:20.240] { [18:03:20.240] { [18:03:20.240] ...future.startTime <- base::Sys.time() [18:03:20.240] { [18:03:20.240] { [18:03:20.240] { [18:03:20.240] { [18:03:20.240] { [18:03:20.240] base::local({ [18:03:20.240] has_future <- base::requireNamespace("future", [18:03:20.240] quietly = TRUE) [18:03:20.240] if (has_future) { [18:03:20.240] ns <- base::getNamespace("future") [18:03:20.240] version <- ns[[".package"]][["version"]] [18:03:20.240] if (is.null(version)) [18:03:20.240] version <- utils::packageVersion("future") [18:03:20.240] } [18:03:20.240] else { [18:03:20.240] version <- NULL [18:03:20.240] } [18:03:20.240] if (!has_future || version < "1.8.0") { [18:03:20.240] info <- base::c(r_version = base::gsub("R version ", [18:03:20.240] "", base::R.version$version.string), [18:03:20.240] platform = base::sprintf("%s (%s-bit)", [18:03:20.240] base::R.version$platform, 8 * [18:03:20.240] base::.Machine$sizeof.pointer), [18:03:20.240] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.240] "release", "version")], collapse = " "), [18:03:20.240] hostname = base::Sys.info()[["nodename"]]) [18:03:20.240] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.240] info) [18:03:20.240] info <- base::paste(info, collapse = "; ") [18:03:20.240] if (!has_future) { [18:03:20.240] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.240] info) [18:03:20.240] } [18:03:20.240] else { [18:03:20.240] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.240] info, version) [18:03:20.240] } [18:03:20.240] base::stop(msg) [18:03:20.240] } [18:03:20.240] }) [18:03:20.240] } [18:03:20.240] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.240] base::options(mc.cores = 1L) [18:03:20.240] } [18:03:20.240] options(future.plan = NULL) [18:03:20.240] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.240] future::plan("default", .cleanup = FALSE, [18:03:20.240] .init = FALSE) [18:03:20.240] } [18:03:20.240] base::assign(".Random.seed", c(10407L, 1805183335L, [18:03:20.240] -1982978684L, 1500882842L, -1897959390L, -204266259L, [18:03:20.240] -2006625641L), envir = base::globalenv(), inherits = FALSE) [18:03:20.240] } [18:03:20.240] ...future.workdir <- getwd() [18:03:20.240] } [18:03:20.240] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.240] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.240] } [18:03:20.240] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.240] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.240] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.240] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.240] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.240] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.240] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.240] base::names(...future.oldOptions)) [18:03:20.240] } [18:03:20.240] if (FALSE) { [18:03:20.240] } [18:03:20.240] else { [18:03:20.240] if (TRUE) { [18:03:20.240] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.240] open = "w") [18:03:20.240] } [18:03:20.240] else { [18:03:20.240] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.240] windows = "NUL", "/dev/null"), open = "w") [18:03:20.240] } [18:03:20.240] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.240] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.240] base::sink(type = "output", split = FALSE) [18:03:20.240] base::close(...future.stdout) [18:03:20.240] }, add = TRUE) [18:03:20.240] } [18:03:20.240] ...future.frame <- base::sys.nframe() [18:03:20.240] ...future.conditions <- base::list() [18:03:20.240] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.240] if (FALSE) { [18:03:20.240] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.240] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.240] } [18:03:20.240] ...future.result <- base::tryCatch({ [18:03:20.240] base::withCallingHandlers({ [18:03:20.240] ...future.value <- base::withVisible(base::local({ [18:03:20.240] ...future.makeSendCondition <- local({ [18:03:20.240] sendCondition <- NULL [18:03:20.240] function(frame = 1L) { [18:03:20.240] if (is.function(sendCondition)) [18:03:20.240] return(sendCondition) [18:03:20.240] ns <- getNamespace("parallel") [18:03:20.240] if (exists("sendData", mode = "function", [18:03:20.240] envir = ns)) { [18:03:20.240] parallel_sendData <- get("sendData", mode = "function", [18:03:20.240] envir = ns) [18:03:20.240] envir <- sys.frame(frame) [18:03:20.240] master <- NULL [18:03:20.240] while (!identical(envir, .GlobalEnv) && [18:03:20.240] !identical(envir, emptyenv())) { [18:03:20.240] if (exists("master", mode = "list", envir = envir, [18:03:20.240] inherits = FALSE)) { [18:03:20.240] master <- get("master", mode = "list", [18:03:20.240] envir = envir, inherits = FALSE) [18:03:20.240] if (inherits(master, c("SOCKnode", [18:03:20.240] "SOCK0node"))) { [18:03:20.240] sendCondition <<- function(cond) { [18:03:20.240] data <- list(type = "VALUE", value = cond, [18:03:20.240] success = TRUE) [18:03:20.240] parallel_sendData(master, data) [18:03:20.240] } [18:03:20.240] return(sendCondition) [18:03:20.240] } [18:03:20.240] } [18:03:20.240] frame <- frame + 1L [18:03:20.240] envir <- sys.frame(frame) [18:03:20.240] } [18:03:20.240] } [18:03:20.240] sendCondition <<- function(cond) NULL [18:03:20.240] } [18:03:20.240] }) [18:03:20.240] withCallingHandlers({ [18:03:20.240] { [18:03:20.240] sample(x, size = 1L) [18:03:20.240] } [18:03:20.240] }, immediateCondition = function(cond) { [18:03:20.240] sendCondition <- ...future.makeSendCondition() [18:03:20.240] sendCondition(cond) [18:03:20.240] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.240] { [18:03:20.240] inherits <- base::inherits [18:03:20.240] invokeRestart <- base::invokeRestart [18:03:20.240] is.null <- base::is.null [18:03:20.240] muffled <- FALSE [18:03:20.240] if (inherits(cond, "message")) { [18:03:20.240] muffled <- grepl(pattern, "muffleMessage") [18:03:20.240] if (muffled) [18:03:20.240] invokeRestart("muffleMessage") [18:03:20.240] } [18:03:20.240] else if (inherits(cond, "warning")) { [18:03:20.240] muffled <- grepl(pattern, "muffleWarning") [18:03:20.240] if (muffled) [18:03:20.240] invokeRestart("muffleWarning") [18:03:20.240] } [18:03:20.240] else if (inherits(cond, "condition")) { [18:03:20.240] if (!is.null(pattern)) { [18:03:20.240] computeRestarts <- base::computeRestarts [18:03:20.240] grepl <- base::grepl [18:03:20.240] restarts <- computeRestarts(cond) [18:03:20.240] for (restart in restarts) { [18:03:20.240] name <- restart$name [18:03:20.240] if (is.null(name)) [18:03:20.240] next [18:03:20.240] if (!grepl(pattern, name)) [18:03:20.240] next [18:03:20.240] invokeRestart(restart) [18:03:20.240] muffled <- TRUE [18:03:20.240] break [18:03:20.240] } [18:03:20.240] } [18:03:20.240] } [18:03:20.240] invisible(muffled) [18:03:20.240] } [18:03:20.240] muffleCondition(cond) [18:03:20.240] }) [18:03:20.240] })) [18:03:20.240] future::FutureResult(value = ...future.value$value, [18:03:20.240] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.240] ...future.rng), globalenv = if (FALSE) [18:03:20.240] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.240] ...future.globalenv.names)) [18:03:20.240] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.240] }, condition = base::local({ [18:03:20.240] c <- base::c [18:03:20.240] inherits <- base::inherits [18:03:20.240] invokeRestart <- base::invokeRestart [18:03:20.240] length <- base::length [18:03:20.240] list <- base::list [18:03:20.240] seq.int <- base::seq.int [18:03:20.240] signalCondition <- base::signalCondition [18:03:20.240] sys.calls <- base::sys.calls [18:03:20.240] `[[` <- base::`[[` [18:03:20.240] `+` <- base::`+` [18:03:20.240] `<<-` <- base::`<<-` [18:03:20.240] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.240] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.240] 3L)] [18:03:20.240] } [18:03:20.240] function(cond) { [18:03:20.240] is_error <- inherits(cond, "error") [18:03:20.240] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.240] NULL) [18:03:20.240] if (is_error) { [18:03:20.240] sessionInformation <- function() { [18:03:20.240] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.240] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.240] search = base::search(), system = base::Sys.info()) [18:03:20.240] } [18:03:20.240] ...future.conditions[[length(...future.conditions) + [18:03:20.240] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.240] cond$call), session = sessionInformation(), [18:03:20.240] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.240] signalCondition(cond) [18:03:20.240] } [18:03:20.240] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.240] "immediateCondition"))) { [18:03:20.240] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.240] ...future.conditions[[length(...future.conditions) + [18:03:20.240] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.240] if (TRUE && !signal) { [18:03:20.240] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.240] { [18:03:20.240] inherits <- base::inherits [18:03:20.240] invokeRestart <- base::invokeRestart [18:03:20.240] is.null <- base::is.null [18:03:20.240] muffled <- FALSE [18:03:20.240] if (inherits(cond, "message")) { [18:03:20.240] muffled <- grepl(pattern, "muffleMessage") [18:03:20.240] if (muffled) [18:03:20.240] invokeRestart("muffleMessage") [18:03:20.240] } [18:03:20.240] else if (inherits(cond, "warning")) { [18:03:20.240] muffled <- grepl(pattern, "muffleWarning") [18:03:20.240] if (muffled) [18:03:20.240] invokeRestart("muffleWarning") [18:03:20.240] } [18:03:20.240] else if (inherits(cond, "condition")) { [18:03:20.240] if (!is.null(pattern)) { [18:03:20.240] computeRestarts <- base::computeRestarts [18:03:20.240] grepl <- base::grepl [18:03:20.240] restarts <- computeRestarts(cond) [18:03:20.240] for (restart in restarts) { [18:03:20.240] name <- restart$name [18:03:20.240] if (is.null(name)) [18:03:20.240] next [18:03:20.240] if (!grepl(pattern, name)) [18:03:20.240] next [18:03:20.240] invokeRestart(restart) [18:03:20.240] muffled <- TRUE [18:03:20.240] break [18:03:20.240] } [18:03:20.240] } [18:03:20.240] } [18:03:20.240] invisible(muffled) [18:03:20.240] } [18:03:20.240] muffleCondition(cond, pattern = "^muffle") [18:03:20.240] } [18:03:20.240] } [18:03:20.240] else { [18:03:20.240] if (TRUE) { [18:03:20.240] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.240] { [18:03:20.240] inherits <- base::inherits [18:03:20.240] invokeRestart <- base::invokeRestart [18:03:20.240] is.null <- base::is.null [18:03:20.240] muffled <- FALSE [18:03:20.240] if (inherits(cond, "message")) { [18:03:20.240] muffled <- grepl(pattern, "muffleMessage") [18:03:20.240] if (muffled) [18:03:20.240] invokeRestart("muffleMessage") [18:03:20.240] } [18:03:20.240] else if (inherits(cond, "warning")) { [18:03:20.240] muffled <- grepl(pattern, "muffleWarning") [18:03:20.240] if (muffled) [18:03:20.240] invokeRestart("muffleWarning") [18:03:20.240] } [18:03:20.240] else if (inherits(cond, "condition")) { [18:03:20.240] if (!is.null(pattern)) { [18:03:20.240] computeRestarts <- base::computeRestarts [18:03:20.240] grepl <- base::grepl [18:03:20.240] restarts <- computeRestarts(cond) [18:03:20.240] for (restart in restarts) { [18:03:20.240] name <- restart$name [18:03:20.240] if (is.null(name)) [18:03:20.240] next [18:03:20.240] if (!grepl(pattern, name)) [18:03:20.240] next [18:03:20.240] invokeRestart(restart) [18:03:20.240] muffled <- TRUE [18:03:20.240] break [18:03:20.240] } [18:03:20.240] } [18:03:20.240] } [18:03:20.240] invisible(muffled) [18:03:20.240] } [18:03:20.240] muffleCondition(cond, pattern = "^muffle") [18:03:20.240] } [18:03:20.240] } [18:03:20.240] } [18:03:20.240] })) [18:03:20.240] }, error = function(ex) { [18:03:20.240] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.240] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.240] ...future.rng), started = ...future.startTime, [18:03:20.240] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.240] version = "1.8"), class = "FutureResult") [18:03:20.240] }, finally = { [18:03:20.240] if (!identical(...future.workdir, getwd())) [18:03:20.240] setwd(...future.workdir) [18:03:20.240] { [18:03:20.240] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.240] ...future.oldOptions$nwarnings <- NULL [18:03:20.240] } [18:03:20.240] base::options(...future.oldOptions) [18:03:20.240] if (.Platform$OS.type == "windows") { [18:03:20.240] old_names <- names(...future.oldEnvVars) [18:03:20.240] envs <- base::Sys.getenv() [18:03:20.240] names <- names(envs) [18:03:20.240] common <- intersect(names, old_names) [18:03:20.240] added <- setdiff(names, old_names) [18:03:20.240] removed <- setdiff(old_names, names) [18:03:20.240] changed <- common[...future.oldEnvVars[common] != [18:03:20.240] envs[common]] [18:03:20.240] NAMES <- toupper(changed) [18:03:20.240] args <- list() [18:03:20.240] for (kk in seq_along(NAMES)) { [18:03:20.240] name <- changed[[kk]] [18:03:20.240] NAME <- NAMES[[kk]] [18:03:20.240] if (name != NAME && is.element(NAME, old_names)) [18:03:20.240] next [18:03:20.240] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.240] } [18:03:20.240] NAMES <- toupper(added) [18:03:20.240] for (kk in seq_along(NAMES)) { [18:03:20.240] name <- added[[kk]] [18:03:20.240] NAME <- NAMES[[kk]] [18:03:20.240] if (name != NAME && is.element(NAME, old_names)) [18:03:20.240] next [18:03:20.240] args[[name]] <- "" [18:03:20.240] } [18:03:20.240] NAMES <- toupper(removed) [18:03:20.240] for (kk in seq_along(NAMES)) { [18:03:20.240] name <- removed[[kk]] [18:03:20.240] NAME <- NAMES[[kk]] [18:03:20.240] if (name != NAME && is.element(NAME, old_names)) [18:03:20.240] next [18:03:20.240] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.240] } [18:03:20.240] if (length(args) > 0) [18:03:20.240] base::do.call(base::Sys.setenv, args = args) [18:03:20.240] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.240] } [18:03:20.240] else { [18:03:20.240] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.240] } [18:03:20.240] { [18:03:20.240] if (base::length(...future.futureOptionsAdded) > [18:03:20.240] 0L) { [18:03:20.240] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.240] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.240] base::options(opts) [18:03:20.240] } [18:03:20.240] { [18:03:20.240] { [18:03:20.240] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.240] NULL [18:03:20.240] } [18:03:20.240] options(future.plan = NULL) [18:03:20.240] if (is.na(NA_character_)) [18:03:20.240] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.240] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.240] future::plan(list(function (..., workers = availableCores(), [18:03:20.240] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.240] envir = parent.frame()) [18:03:20.240] { [18:03:20.240] if (is.function(workers)) [18:03:20.240] workers <- workers() [18:03:20.240] workers <- structure(as.integer(workers), [18:03:20.240] class = class(workers)) [18:03:20.240] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.240] workers >= 1) [18:03:20.240] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.240] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.240] } [18:03:20.240] future <- MultisessionFuture(..., workers = workers, [18:03:20.240] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.240] envir = envir) [18:03:20.240] if (!future$lazy) [18:03:20.240] future <- run(future) [18:03:20.240] invisible(future) [18:03:20.240] }), .cleanup = FALSE, .init = FALSE) [18:03:20.240] } [18:03:20.240] } [18:03:20.240] } [18:03:20.240] }) [18:03:20.240] if (TRUE) { [18:03:20.240] base::sink(type = "output", split = FALSE) [18:03:20.240] if (TRUE) { [18:03:20.240] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.240] } [18:03:20.240] else { [18:03:20.240] ...future.result["stdout"] <- base::list(NULL) [18:03:20.240] } [18:03:20.240] base::close(...future.stdout) [18:03:20.240] ...future.stdout <- NULL [18:03:20.240] } [18:03:20.240] ...future.result$conditions <- ...future.conditions [18:03:20.240] ...future.result$finished <- base::Sys.time() [18:03:20.240] ...future.result [18:03:20.240] } [18:03:20.245] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.267] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.268] - Validating connection of MultisessionFuture [18:03:20.268] - received message: FutureResult [18:03:20.268] - Received FutureResult [18:03:20.268] - Erased future from FutureRegistry [18:03:20.269] result() for ClusterFuture ... [18:03:20.269] - result already collected: FutureResult [18:03:20.269] result() for ClusterFuture ... done [18:03:20.269] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.269] result() for ClusterFuture ... [18:03:20.269] - result already collected: FutureResult [18:03:20.269] result() for ClusterFuture ... done [18:03:20.270] result() for ClusterFuture ... [18:03:20.270] - result already collected: FutureResult [18:03:20.270] result() for ClusterFuture ... done [18:03:20.271] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.271] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.271] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.272] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.272] MultisessionFuture started [18:03:20.272] - Launch lazy future ... done [18:03:20.273] run() for 'MultisessionFuture' ... done [18:03:20.273] getGlobalsAndPackages() ... [18:03:20.273] Searching for globals... [18:03:20.274] - globals found: [3] '{', 'sample', 'x' [18:03:20.275] Searching for globals ... DONE [18:03:20.275] Resolving globals: FALSE [18:03:20.275] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.276] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.276] - globals: [1] 'x' [18:03:20.276] [18:03:20.276] getGlobalsAndPackages() ... DONE [18:03:20.276] run() for 'Future' ... [18:03:20.277] - state: 'created' [18:03:20.277] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.290] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.290] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.291] - Field: 'node' [18:03:20.291] - Field: 'label' [18:03:20.291] - Field: 'local' [18:03:20.291] - Field: 'owner' [18:03:20.291] - Field: 'envir' [18:03:20.292] - Field: 'workers' [18:03:20.292] - Field: 'packages' [18:03:20.292] - Field: 'gc' [18:03:20.292] - Field: 'conditions' [18:03:20.292] - Field: 'persistent' [18:03:20.292] - Field: 'expr' [18:03:20.293] - Field: 'uuid' [18:03:20.293] - Field: 'seed' [18:03:20.293] - Field: 'version' [18:03:20.293] - Field: 'result' [18:03:20.293] - Field: 'asynchronous' [18:03:20.293] - Field: 'calls' [18:03:20.294] - Field: 'globals' [18:03:20.294] - Field: 'stdout' [18:03:20.294] - Field: 'earlySignal' [18:03:20.294] - Field: 'lazy' [18:03:20.294] - Field: 'state' [18:03:20.294] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.295] - Launch lazy future ... [18:03:20.295] Packages needed by the future expression (n = 0): [18:03:20.295] Packages needed by future strategies (n = 0): [18:03:20.296] { [18:03:20.296] { [18:03:20.296] { [18:03:20.296] ...future.startTime <- base::Sys.time() [18:03:20.296] { [18:03:20.296] { [18:03:20.296] { [18:03:20.296] { [18:03:20.296] { [18:03:20.296] base::local({ [18:03:20.296] has_future <- base::requireNamespace("future", [18:03:20.296] quietly = TRUE) [18:03:20.296] if (has_future) { [18:03:20.296] ns <- base::getNamespace("future") [18:03:20.296] version <- ns[[".package"]][["version"]] [18:03:20.296] if (is.null(version)) [18:03:20.296] version <- utils::packageVersion("future") [18:03:20.296] } [18:03:20.296] else { [18:03:20.296] version <- NULL [18:03:20.296] } [18:03:20.296] if (!has_future || version < "1.8.0") { [18:03:20.296] info <- base::c(r_version = base::gsub("R version ", [18:03:20.296] "", base::R.version$version.string), [18:03:20.296] platform = base::sprintf("%s (%s-bit)", [18:03:20.296] base::R.version$platform, 8 * [18:03:20.296] base::.Machine$sizeof.pointer), [18:03:20.296] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.296] "release", "version")], collapse = " "), [18:03:20.296] hostname = base::Sys.info()[["nodename"]]) [18:03:20.296] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.296] info) [18:03:20.296] info <- base::paste(info, collapse = "; ") [18:03:20.296] if (!has_future) { [18:03:20.296] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.296] info) [18:03:20.296] } [18:03:20.296] else { [18:03:20.296] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.296] info, version) [18:03:20.296] } [18:03:20.296] base::stop(msg) [18:03:20.296] } [18:03:20.296] }) [18:03:20.296] } [18:03:20.296] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.296] base::options(mc.cores = 1L) [18:03:20.296] } [18:03:20.296] options(future.plan = NULL) [18:03:20.296] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.296] future::plan("default", .cleanup = FALSE, [18:03:20.296] .init = FALSE) [18:03:20.296] } [18:03:20.296] base::assign(".Random.seed", c(10407L, -860779432L, [18:03:20.296] 1203324979L, -1993452634L, -1372834584L, 704149361L, [18:03:20.296] 1348506385L), envir = base::globalenv(), inherits = FALSE) [18:03:20.296] } [18:03:20.296] ...future.workdir <- getwd() [18:03:20.296] } [18:03:20.296] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.296] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.296] } [18:03:20.296] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.296] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.296] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.296] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.296] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.296] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.296] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.296] base::names(...future.oldOptions)) [18:03:20.296] } [18:03:20.296] if (FALSE) { [18:03:20.296] } [18:03:20.296] else { [18:03:20.296] if (TRUE) { [18:03:20.296] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.296] open = "w") [18:03:20.296] } [18:03:20.296] else { [18:03:20.296] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.296] windows = "NUL", "/dev/null"), open = "w") [18:03:20.296] } [18:03:20.296] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.296] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.296] base::sink(type = "output", split = FALSE) [18:03:20.296] base::close(...future.stdout) [18:03:20.296] }, add = TRUE) [18:03:20.296] } [18:03:20.296] ...future.frame <- base::sys.nframe() [18:03:20.296] ...future.conditions <- base::list() [18:03:20.296] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.296] if (FALSE) { [18:03:20.296] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.296] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.296] } [18:03:20.296] ...future.result <- base::tryCatch({ [18:03:20.296] base::withCallingHandlers({ [18:03:20.296] ...future.value <- base::withVisible(base::local({ [18:03:20.296] ...future.makeSendCondition <- local({ [18:03:20.296] sendCondition <- NULL [18:03:20.296] function(frame = 1L) { [18:03:20.296] if (is.function(sendCondition)) [18:03:20.296] return(sendCondition) [18:03:20.296] ns <- getNamespace("parallel") [18:03:20.296] if (exists("sendData", mode = "function", [18:03:20.296] envir = ns)) { [18:03:20.296] parallel_sendData <- get("sendData", mode = "function", [18:03:20.296] envir = ns) [18:03:20.296] envir <- sys.frame(frame) [18:03:20.296] master <- NULL [18:03:20.296] while (!identical(envir, .GlobalEnv) && [18:03:20.296] !identical(envir, emptyenv())) { [18:03:20.296] if (exists("master", mode = "list", envir = envir, [18:03:20.296] inherits = FALSE)) { [18:03:20.296] master <- get("master", mode = "list", [18:03:20.296] envir = envir, inherits = FALSE) [18:03:20.296] if (inherits(master, c("SOCKnode", [18:03:20.296] "SOCK0node"))) { [18:03:20.296] sendCondition <<- function(cond) { [18:03:20.296] data <- list(type = "VALUE", value = cond, [18:03:20.296] success = TRUE) [18:03:20.296] parallel_sendData(master, data) [18:03:20.296] } [18:03:20.296] return(sendCondition) [18:03:20.296] } [18:03:20.296] } [18:03:20.296] frame <- frame + 1L [18:03:20.296] envir <- sys.frame(frame) [18:03:20.296] } [18:03:20.296] } [18:03:20.296] sendCondition <<- function(cond) NULL [18:03:20.296] } [18:03:20.296] }) [18:03:20.296] withCallingHandlers({ [18:03:20.296] { [18:03:20.296] sample(x, size = 1L) [18:03:20.296] } [18:03:20.296] }, immediateCondition = function(cond) { [18:03:20.296] sendCondition <- ...future.makeSendCondition() [18:03:20.296] sendCondition(cond) [18:03:20.296] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.296] { [18:03:20.296] inherits <- base::inherits [18:03:20.296] invokeRestart <- base::invokeRestart [18:03:20.296] is.null <- base::is.null [18:03:20.296] muffled <- FALSE [18:03:20.296] if (inherits(cond, "message")) { [18:03:20.296] muffled <- grepl(pattern, "muffleMessage") [18:03:20.296] if (muffled) [18:03:20.296] invokeRestart("muffleMessage") [18:03:20.296] } [18:03:20.296] else if (inherits(cond, "warning")) { [18:03:20.296] muffled <- grepl(pattern, "muffleWarning") [18:03:20.296] if (muffled) [18:03:20.296] invokeRestart("muffleWarning") [18:03:20.296] } [18:03:20.296] else if (inherits(cond, "condition")) { [18:03:20.296] if (!is.null(pattern)) { [18:03:20.296] computeRestarts <- base::computeRestarts [18:03:20.296] grepl <- base::grepl [18:03:20.296] restarts <- computeRestarts(cond) [18:03:20.296] for (restart in restarts) { [18:03:20.296] name <- restart$name [18:03:20.296] if (is.null(name)) [18:03:20.296] next [18:03:20.296] if (!grepl(pattern, name)) [18:03:20.296] next [18:03:20.296] invokeRestart(restart) [18:03:20.296] muffled <- TRUE [18:03:20.296] break [18:03:20.296] } [18:03:20.296] } [18:03:20.296] } [18:03:20.296] invisible(muffled) [18:03:20.296] } [18:03:20.296] muffleCondition(cond) [18:03:20.296] }) [18:03:20.296] })) [18:03:20.296] future::FutureResult(value = ...future.value$value, [18:03:20.296] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.296] ...future.rng), globalenv = if (FALSE) [18:03:20.296] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.296] ...future.globalenv.names)) [18:03:20.296] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.296] }, condition = base::local({ [18:03:20.296] c <- base::c [18:03:20.296] inherits <- base::inherits [18:03:20.296] invokeRestart <- base::invokeRestart [18:03:20.296] length <- base::length [18:03:20.296] list <- base::list [18:03:20.296] seq.int <- base::seq.int [18:03:20.296] signalCondition <- base::signalCondition [18:03:20.296] sys.calls <- base::sys.calls [18:03:20.296] `[[` <- base::`[[` [18:03:20.296] `+` <- base::`+` [18:03:20.296] `<<-` <- base::`<<-` [18:03:20.296] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.296] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.296] 3L)] [18:03:20.296] } [18:03:20.296] function(cond) { [18:03:20.296] is_error <- inherits(cond, "error") [18:03:20.296] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.296] NULL) [18:03:20.296] if (is_error) { [18:03:20.296] sessionInformation <- function() { [18:03:20.296] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.296] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.296] search = base::search(), system = base::Sys.info()) [18:03:20.296] } [18:03:20.296] ...future.conditions[[length(...future.conditions) + [18:03:20.296] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.296] cond$call), session = sessionInformation(), [18:03:20.296] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.296] signalCondition(cond) [18:03:20.296] } [18:03:20.296] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.296] "immediateCondition"))) { [18:03:20.296] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.296] ...future.conditions[[length(...future.conditions) + [18:03:20.296] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.296] if (TRUE && !signal) { [18:03:20.296] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.296] { [18:03:20.296] inherits <- base::inherits [18:03:20.296] invokeRestart <- base::invokeRestart [18:03:20.296] is.null <- base::is.null [18:03:20.296] muffled <- FALSE [18:03:20.296] if (inherits(cond, "message")) { [18:03:20.296] muffled <- grepl(pattern, "muffleMessage") [18:03:20.296] if (muffled) [18:03:20.296] invokeRestart("muffleMessage") [18:03:20.296] } [18:03:20.296] else if (inherits(cond, "warning")) { [18:03:20.296] muffled <- grepl(pattern, "muffleWarning") [18:03:20.296] if (muffled) [18:03:20.296] invokeRestart("muffleWarning") [18:03:20.296] } [18:03:20.296] else if (inherits(cond, "condition")) { [18:03:20.296] if (!is.null(pattern)) { [18:03:20.296] computeRestarts <- base::computeRestarts [18:03:20.296] grepl <- base::grepl [18:03:20.296] restarts <- computeRestarts(cond) [18:03:20.296] for (restart in restarts) { [18:03:20.296] name <- restart$name [18:03:20.296] if (is.null(name)) [18:03:20.296] next [18:03:20.296] if (!grepl(pattern, name)) [18:03:20.296] next [18:03:20.296] invokeRestart(restart) [18:03:20.296] muffled <- TRUE [18:03:20.296] break [18:03:20.296] } [18:03:20.296] } [18:03:20.296] } [18:03:20.296] invisible(muffled) [18:03:20.296] } [18:03:20.296] muffleCondition(cond, pattern = "^muffle") [18:03:20.296] } [18:03:20.296] } [18:03:20.296] else { [18:03:20.296] if (TRUE) { [18:03:20.296] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.296] { [18:03:20.296] inherits <- base::inherits [18:03:20.296] invokeRestart <- base::invokeRestart [18:03:20.296] is.null <- base::is.null [18:03:20.296] muffled <- FALSE [18:03:20.296] if (inherits(cond, "message")) { [18:03:20.296] muffled <- grepl(pattern, "muffleMessage") [18:03:20.296] if (muffled) [18:03:20.296] invokeRestart("muffleMessage") [18:03:20.296] } [18:03:20.296] else if (inherits(cond, "warning")) { [18:03:20.296] muffled <- grepl(pattern, "muffleWarning") [18:03:20.296] if (muffled) [18:03:20.296] invokeRestart("muffleWarning") [18:03:20.296] } [18:03:20.296] else if (inherits(cond, "condition")) { [18:03:20.296] if (!is.null(pattern)) { [18:03:20.296] computeRestarts <- base::computeRestarts [18:03:20.296] grepl <- base::grepl [18:03:20.296] restarts <- computeRestarts(cond) [18:03:20.296] for (restart in restarts) { [18:03:20.296] name <- restart$name [18:03:20.296] if (is.null(name)) [18:03:20.296] next [18:03:20.296] if (!grepl(pattern, name)) [18:03:20.296] next [18:03:20.296] invokeRestart(restart) [18:03:20.296] muffled <- TRUE [18:03:20.296] break [18:03:20.296] } [18:03:20.296] } [18:03:20.296] } [18:03:20.296] invisible(muffled) [18:03:20.296] } [18:03:20.296] muffleCondition(cond, pattern = "^muffle") [18:03:20.296] } [18:03:20.296] } [18:03:20.296] } [18:03:20.296] })) [18:03:20.296] }, error = function(ex) { [18:03:20.296] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.296] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.296] ...future.rng), started = ...future.startTime, [18:03:20.296] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.296] version = "1.8"), class = "FutureResult") [18:03:20.296] }, finally = { [18:03:20.296] if (!identical(...future.workdir, getwd())) [18:03:20.296] setwd(...future.workdir) [18:03:20.296] { [18:03:20.296] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.296] ...future.oldOptions$nwarnings <- NULL [18:03:20.296] } [18:03:20.296] base::options(...future.oldOptions) [18:03:20.296] if (.Platform$OS.type == "windows") { [18:03:20.296] old_names <- names(...future.oldEnvVars) [18:03:20.296] envs <- base::Sys.getenv() [18:03:20.296] names <- names(envs) [18:03:20.296] common <- intersect(names, old_names) [18:03:20.296] added <- setdiff(names, old_names) [18:03:20.296] removed <- setdiff(old_names, names) [18:03:20.296] changed <- common[...future.oldEnvVars[common] != [18:03:20.296] envs[common]] [18:03:20.296] NAMES <- toupper(changed) [18:03:20.296] args <- list() [18:03:20.296] for (kk in seq_along(NAMES)) { [18:03:20.296] name <- changed[[kk]] [18:03:20.296] NAME <- NAMES[[kk]] [18:03:20.296] if (name != NAME && is.element(NAME, old_names)) [18:03:20.296] next [18:03:20.296] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.296] } [18:03:20.296] NAMES <- toupper(added) [18:03:20.296] for (kk in seq_along(NAMES)) { [18:03:20.296] name <- added[[kk]] [18:03:20.296] NAME <- NAMES[[kk]] [18:03:20.296] if (name != NAME && is.element(NAME, old_names)) [18:03:20.296] next [18:03:20.296] args[[name]] <- "" [18:03:20.296] } [18:03:20.296] NAMES <- toupper(removed) [18:03:20.296] for (kk in seq_along(NAMES)) { [18:03:20.296] name <- removed[[kk]] [18:03:20.296] NAME <- NAMES[[kk]] [18:03:20.296] if (name != NAME && is.element(NAME, old_names)) [18:03:20.296] next [18:03:20.296] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.296] } [18:03:20.296] if (length(args) > 0) [18:03:20.296] base::do.call(base::Sys.setenv, args = args) [18:03:20.296] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.296] } [18:03:20.296] else { [18:03:20.296] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.296] } [18:03:20.296] { [18:03:20.296] if (base::length(...future.futureOptionsAdded) > [18:03:20.296] 0L) { [18:03:20.296] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.296] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.296] base::options(opts) [18:03:20.296] } [18:03:20.296] { [18:03:20.296] { [18:03:20.296] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.296] NULL [18:03:20.296] } [18:03:20.296] options(future.plan = NULL) [18:03:20.296] if (is.na(NA_character_)) [18:03:20.296] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.296] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.296] future::plan(list(function (..., workers = availableCores(), [18:03:20.296] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.296] envir = parent.frame()) [18:03:20.296] { [18:03:20.296] if (is.function(workers)) [18:03:20.296] workers <- workers() [18:03:20.296] workers <- structure(as.integer(workers), [18:03:20.296] class = class(workers)) [18:03:20.296] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.296] workers >= 1) [18:03:20.296] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.296] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.296] } [18:03:20.296] future <- MultisessionFuture(..., workers = workers, [18:03:20.296] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.296] envir = envir) [18:03:20.296] if (!future$lazy) [18:03:20.296] future <- run(future) [18:03:20.296] invisible(future) [18:03:20.296] }), .cleanup = FALSE, .init = FALSE) [18:03:20.296] } [18:03:20.296] } [18:03:20.296] } [18:03:20.296] }) [18:03:20.296] if (TRUE) { [18:03:20.296] base::sink(type = "output", split = FALSE) [18:03:20.296] if (TRUE) { [18:03:20.296] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.296] } [18:03:20.296] else { [18:03:20.296] ...future.result["stdout"] <- base::list(NULL) [18:03:20.296] } [18:03:20.296] base::close(...future.stdout) [18:03:20.296] ...future.stdout <- NULL [18:03:20.296] } [18:03:20.296] ...future.result$conditions <- ...future.conditions [18:03:20.296] ...future.result$finished <- base::Sys.time() [18:03:20.296] ...future.result [18:03:20.296] } [18:03:20.301] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.314] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.315] - Validating connection of MultisessionFuture [18:03:20.315] - received message: FutureResult [18:03:20.315] - Received FutureResult [18:03:20.315] - Erased future from FutureRegistry [18:03:20.315] result() for ClusterFuture ... [18:03:20.316] - result already collected: FutureResult [18:03:20.316] result() for ClusterFuture ... done [18:03:20.316] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.316] result() for ClusterFuture ... [18:03:20.316] - result already collected: FutureResult [18:03:20.316] result() for ClusterFuture ... done [18:03:20.317] result() for ClusterFuture ... [18:03:20.317] - result already collected: FutureResult [18:03:20.317] result() for ClusterFuture ... done [18:03:20.318] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.318] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.318] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.318] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.319] MultisessionFuture started [18:03:20.319] - Launch lazy future ... done [18:03:20.319] run() for 'MultisessionFuture' ... done [18:03:20.320] result() for ClusterFuture ... [18:03:20.320] - result already collected: FutureResult [18:03:20.320] result() for ClusterFuture ... done [18:03:20.320] result() for ClusterFuture ... [18:03:20.320] - result already collected: FutureResult [18:03:20.321] result() for ClusterFuture ... done [18:03:20.321] result() for ClusterFuture ... [18:03:20.321] - result already collected: FutureResult [18:03:20.321] result() for ClusterFuture ... done [18:03:20.321] result() for ClusterFuture ... [18:03:20.321] - result already collected: FutureResult [18:03:20.322] result() for ClusterFuture ... done [18:03:20.322] result() for ClusterFuture ... [18:03:20.322] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.322] - Validating connection of MultisessionFuture [18:03:20.322] - received message: FutureResult [18:03:20.323] - Received FutureResult [18:03:20.323] - Erased future from FutureRegistry [18:03:20.323] result() for ClusterFuture ... [18:03:20.323] - result already collected: FutureResult [18:03:20.323] result() for ClusterFuture ... done [18:03:20.323] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.324] result() for ClusterFuture ... done [18:03:20.324] result() for ClusterFuture ... [18:03:20.324] - result already collected: FutureResult [18:03:20.324] result() for ClusterFuture ... done [18:03:20.324] result() for ClusterFuture ... [18:03:20.324] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.325] - Validating connection of MultisessionFuture [18:03:20.335] - received message: FutureResult [18:03:20.335] - Received FutureResult [18:03:20.336] - Erased future from FutureRegistry [18:03:20.336] result() for ClusterFuture ... [18:03:20.336] - result already collected: FutureResult [18:03:20.336] result() for ClusterFuture ... done [18:03:20.336] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.336] result() for ClusterFuture ... done [18:03:20.337] result() for ClusterFuture ... [18:03:20.337] - result already collected: FutureResult [18:03:20.337] result() for ClusterFuture ... done [[1]] [1] 2 [[2]] [1] 0 [[3]] [1] 0 [[4]] [1] 1 [18:03:20.338] getGlobalsAndPackages() ... [18:03:20.338] Searching for globals... [18:03:20.339] - globals found: [3] '{', 'sample', 'x' [18:03:20.339] Searching for globals ... DONE [18:03:20.339] Resolving globals: FALSE [18:03:20.340] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.340] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.340] - globals: [1] 'x' [18:03:20.341] [18:03:20.341] getGlobalsAndPackages() ... DONE [18:03:20.341] run() for 'Future' ... [18:03:20.341] - state: 'created' [18:03:20.342] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.355] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.355] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.355] - Field: 'node' [18:03:20.356] - Field: 'label' [18:03:20.356] - Field: 'local' [18:03:20.356] - Field: 'owner' [18:03:20.356] - Field: 'envir' [18:03:20.356] - Field: 'workers' [18:03:20.357] - Field: 'packages' [18:03:20.357] - Field: 'gc' [18:03:20.357] - Field: 'conditions' [18:03:20.357] - Field: 'persistent' [18:03:20.357] - Field: 'expr' [18:03:20.357] - Field: 'uuid' [18:03:20.358] - Field: 'seed' [18:03:20.358] - Field: 'version' [18:03:20.358] - Field: 'result' [18:03:20.358] - Field: 'asynchronous' [18:03:20.358] - Field: 'calls' [18:03:20.359] - Field: 'globals' [18:03:20.359] - Field: 'stdout' [18:03:20.359] - Field: 'earlySignal' [18:03:20.359] - Field: 'lazy' [18:03:20.359] - Field: 'state' [18:03:20.359] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.360] - Launch lazy future ... [18:03:20.360] Packages needed by the future expression (n = 0): [18:03:20.360] Packages needed by future strategies (n = 0): [18:03:20.361] { [18:03:20.361] { [18:03:20.361] { [18:03:20.361] ...future.startTime <- base::Sys.time() [18:03:20.361] { [18:03:20.361] { [18:03:20.361] { [18:03:20.361] { [18:03:20.361] base::local({ [18:03:20.361] has_future <- base::requireNamespace("future", [18:03:20.361] quietly = TRUE) [18:03:20.361] if (has_future) { [18:03:20.361] ns <- base::getNamespace("future") [18:03:20.361] version <- ns[[".package"]][["version"]] [18:03:20.361] if (is.null(version)) [18:03:20.361] version <- utils::packageVersion("future") [18:03:20.361] } [18:03:20.361] else { [18:03:20.361] version <- NULL [18:03:20.361] } [18:03:20.361] if (!has_future || version < "1.8.0") { [18:03:20.361] info <- base::c(r_version = base::gsub("R version ", [18:03:20.361] "", base::R.version$version.string), [18:03:20.361] platform = base::sprintf("%s (%s-bit)", [18:03:20.361] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.361] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.361] "release", "version")], collapse = " "), [18:03:20.361] hostname = base::Sys.info()[["nodename"]]) [18:03:20.361] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.361] info) [18:03:20.361] info <- base::paste(info, collapse = "; ") [18:03:20.361] if (!has_future) { [18:03:20.361] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.361] info) [18:03:20.361] } [18:03:20.361] else { [18:03:20.361] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.361] info, version) [18:03:20.361] } [18:03:20.361] base::stop(msg) [18:03:20.361] } [18:03:20.361] }) [18:03:20.361] } [18:03:20.361] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.361] base::options(mc.cores = 1L) [18:03:20.361] } [18:03:20.361] options(future.plan = NULL) [18:03:20.361] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.361] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.361] } [18:03:20.361] ...future.workdir <- getwd() [18:03:20.361] } [18:03:20.361] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.361] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.361] } [18:03:20.361] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.361] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.361] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.361] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.361] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.361] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.361] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.361] base::names(...future.oldOptions)) [18:03:20.361] } [18:03:20.361] if (FALSE) { [18:03:20.361] } [18:03:20.361] else { [18:03:20.361] if (TRUE) { [18:03:20.361] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.361] open = "w") [18:03:20.361] } [18:03:20.361] else { [18:03:20.361] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.361] windows = "NUL", "/dev/null"), open = "w") [18:03:20.361] } [18:03:20.361] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.361] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.361] base::sink(type = "output", split = FALSE) [18:03:20.361] base::close(...future.stdout) [18:03:20.361] }, add = TRUE) [18:03:20.361] } [18:03:20.361] ...future.frame <- base::sys.nframe() [18:03:20.361] ...future.conditions <- base::list() [18:03:20.361] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.361] if (FALSE) { [18:03:20.361] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.361] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.361] } [18:03:20.361] ...future.result <- base::tryCatch({ [18:03:20.361] base::withCallingHandlers({ [18:03:20.361] ...future.value <- base::withVisible(base::local({ [18:03:20.361] ...future.makeSendCondition <- local({ [18:03:20.361] sendCondition <- NULL [18:03:20.361] function(frame = 1L) { [18:03:20.361] if (is.function(sendCondition)) [18:03:20.361] return(sendCondition) [18:03:20.361] ns <- getNamespace("parallel") [18:03:20.361] if (exists("sendData", mode = "function", [18:03:20.361] envir = ns)) { [18:03:20.361] parallel_sendData <- get("sendData", mode = "function", [18:03:20.361] envir = ns) [18:03:20.361] envir <- sys.frame(frame) [18:03:20.361] master <- NULL [18:03:20.361] while (!identical(envir, .GlobalEnv) && [18:03:20.361] !identical(envir, emptyenv())) { [18:03:20.361] if (exists("master", mode = "list", envir = envir, [18:03:20.361] inherits = FALSE)) { [18:03:20.361] master <- get("master", mode = "list", [18:03:20.361] envir = envir, inherits = FALSE) [18:03:20.361] if (inherits(master, c("SOCKnode", [18:03:20.361] "SOCK0node"))) { [18:03:20.361] sendCondition <<- function(cond) { [18:03:20.361] data <- list(type = "VALUE", value = cond, [18:03:20.361] success = TRUE) [18:03:20.361] parallel_sendData(master, data) [18:03:20.361] } [18:03:20.361] return(sendCondition) [18:03:20.361] } [18:03:20.361] } [18:03:20.361] frame <- frame + 1L [18:03:20.361] envir <- sys.frame(frame) [18:03:20.361] } [18:03:20.361] } [18:03:20.361] sendCondition <<- function(cond) NULL [18:03:20.361] } [18:03:20.361] }) [18:03:20.361] withCallingHandlers({ [18:03:20.361] { [18:03:20.361] sample(x, size = 1L) [18:03:20.361] } [18:03:20.361] }, immediateCondition = function(cond) { [18:03:20.361] sendCondition <- ...future.makeSendCondition() [18:03:20.361] sendCondition(cond) [18:03:20.361] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.361] { [18:03:20.361] inherits <- base::inherits [18:03:20.361] invokeRestart <- base::invokeRestart [18:03:20.361] is.null <- base::is.null [18:03:20.361] muffled <- FALSE [18:03:20.361] if (inherits(cond, "message")) { [18:03:20.361] muffled <- grepl(pattern, "muffleMessage") [18:03:20.361] if (muffled) [18:03:20.361] invokeRestart("muffleMessage") [18:03:20.361] } [18:03:20.361] else if (inherits(cond, "warning")) { [18:03:20.361] muffled <- grepl(pattern, "muffleWarning") [18:03:20.361] if (muffled) [18:03:20.361] invokeRestart("muffleWarning") [18:03:20.361] } [18:03:20.361] else if (inherits(cond, "condition")) { [18:03:20.361] if (!is.null(pattern)) { [18:03:20.361] computeRestarts <- base::computeRestarts [18:03:20.361] grepl <- base::grepl [18:03:20.361] restarts <- computeRestarts(cond) [18:03:20.361] for (restart in restarts) { [18:03:20.361] name <- restart$name [18:03:20.361] if (is.null(name)) [18:03:20.361] next [18:03:20.361] if (!grepl(pattern, name)) [18:03:20.361] next [18:03:20.361] invokeRestart(restart) [18:03:20.361] muffled <- TRUE [18:03:20.361] break [18:03:20.361] } [18:03:20.361] } [18:03:20.361] } [18:03:20.361] invisible(muffled) [18:03:20.361] } [18:03:20.361] muffleCondition(cond) [18:03:20.361] }) [18:03:20.361] })) [18:03:20.361] future::FutureResult(value = ...future.value$value, [18:03:20.361] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.361] ...future.rng), globalenv = if (FALSE) [18:03:20.361] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.361] ...future.globalenv.names)) [18:03:20.361] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.361] }, condition = base::local({ [18:03:20.361] c <- base::c [18:03:20.361] inherits <- base::inherits [18:03:20.361] invokeRestart <- base::invokeRestart [18:03:20.361] length <- base::length [18:03:20.361] list <- base::list [18:03:20.361] seq.int <- base::seq.int [18:03:20.361] signalCondition <- base::signalCondition [18:03:20.361] sys.calls <- base::sys.calls [18:03:20.361] `[[` <- base::`[[` [18:03:20.361] `+` <- base::`+` [18:03:20.361] `<<-` <- base::`<<-` [18:03:20.361] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.361] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.361] 3L)] [18:03:20.361] } [18:03:20.361] function(cond) { [18:03:20.361] is_error <- inherits(cond, "error") [18:03:20.361] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.361] NULL) [18:03:20.361] if (is_error) { [18:03:20.361] sessionInformation <- function() { [18:03:20.361] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.361] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.361] search = base::search(), system = base::Sys.info()) [18:03:20.361] } [18:03:20.361] ...future.conditions[[length(...future.conditions) + [18:03:20.361] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.361] cond$call), session = sessionInformation(), [18:03:20.361] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.361] signalCondition(cond) [18:03:20.361] } [18:03:20.361] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.361] "immediateCondition"))) { [18:03:20.361] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.361] ...future.conditions[[length(...future.conditions) + [18:03:20.361] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.361] if (TRUE && !signal) { [18:03:20.361] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.361] { [18:03:20.361] inherits <- base::inherits [18:03:20.361] invokeRestart <- base::invokeRestart [18:03:20.361] is.null <- base::is.null [18:03:20.361] muffled <- FALSE [18:03:20.361] if (inherits(cond, "message")) { [18:03:20.361] muffled <- grepl(pattern, "muffleMessage") [18:03:20.361] if (muffled) [18:03:20.361] invokeRestart("muffleMessage") [18:03:20.361] } [18:03:20.361] else if (inherits(cond, "warning")) { [18:03:20.361] muffled <- grepl(pattern, "muffleWarning") [18:03:20.361] if (muffled) [18:03:20.361] invokeRestart("muffleWarning") [18:03:20.361] } [18:03:20.361] else if (inherits(cond, "condition")) { [18:03:20.361] if (!is.null(pattern)) { [18:03:20.361] computeRestarts <- base::computeRestarts [18:03:20.361] grepl <- base::grepl [18:03:20.361] restarts <- computeRestarts(cond) [18:03:20.361] for (restart in restarts) { [18:03:20.361] name <- restart$name [18:03:20.361] if (is.null(name)) [18:03:20.361] next [18:03:20.361] if (!grepl(pattern, name)) [18:03:20.361] next [18:03:20.361] invokeRestart(restart) [18:03:20.361] muffled <- TRUE [18:03:20.361] break [18:03:20.361] } [18:03:20.361] } [18:03:20.361] } [18:03:20.361] invisible(muffled) [18:03:20.361] } [18:03:20.361] muffleCondition(cond, pattern = "^muffle") [18:03:20.361] } [18:03:20.361] } [18:03:20.361] else { [18:03:20.361] if (TRUE) { [18:03:20.361] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.361] { [18:03:20.361] inherits <- base::inherits [18:03:20.361] invokeRestart <- base::invokeRestart [18:03:20.361] is.null <- base::is.null [18:03:20.361] muffled <- FALSE [18:03:20.361] if (inherits(cond, "message")) { [18:03:20.361] muffled <- grepl(pattern, "muffleMessage") [18:03:20.361] if (muffled) [18:03:20.361] invokeRestart("muffleMessage") [18:03:20.361] } [18:03:20.361] else if (inherits(cond, "warning")) { [18:03:20.361] muffled <- grepl(pattern, "muffleWarning") [18:03:20.361] if (muffled) [18:03:20.361] invokeRestart("muffleWarning") [18:03:20.361] } [18:03:20.361] else if (inherits(cond, "condition")) { [18:03:20.361] if (!is.null(pattern)) { [18:03:20.361] computeRestarts <- base::computeRestarts [18:03:20.361] grepl <- base::grepl [18:03:20.361] restarts <- computeRestarts(cond) [18:03:20.361] for (restart in restarts) { [18:03:20.361] name <- restart$name [18:03:20.361] if (is.null(name)) [18:03:20.361] next [18:03:20.361] if (!grepl(pattern, name)) [18:03:20.361] next [18:03:20.361] invokeRestart(restart) [18:03:20.361] muffled <- TRUE [18:03:20.361] break [18:03:20.361] } [18:03:20.361] } [18:03:20.361] } [18:03:20.361] invisible(muffled) [18:03:20.361] } [18:03:20.361] muffleCondition(cond, pattern = "^muffle") [18:03:20.361] } [18:03:20.361] } [18:03:20.361] } [18:03:20.361] })) [18:03:20.361] }, error = function(ex) { [18:03:20.361] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.361] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.361] ...future.rng), started = ...future.startTime, [18:03:20.361] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.361] version = "1.8"), class = "FutureResult") [18:03:20.361] }, finally = { [18:03:20.361] if (!identical(...future.workdir, getwd())) [18:03:20.361] setwd(...future.workdir) [18:03:20.361] { [18:03:20.361] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.361] ...future.oldOptions$nwarnings <- NULL [18:03:20.361] } [18:03:20.361] base::options(...future.oldOptions) [18:03:20.361] if (.Platform$OS.type == "windows") { [18:03:20.361] old_names <- names(...future.oldEnvVars) [18:03:20.361] envs <- base::Sys.getenv() [18:03:20.361] names <- names(envs) [18:03:20.361] common <- intersect(names, old_names) [18:03:20.361] added <- setdiff(names, old_names) [18:03:20.361] removed <- setdiff(old_names, names) [18:03:20.361] changed <- common[...future.oldEnvVars[common] != [18:03:20.361] envs[common]] [18:03:20.361] NAMES <- toupper(changed) [18:03:20.361] args <- list() [18:03:20.361] for (kk in seq_along(NAMES)) { [18:03:20.361] name <- changed[[kk]] [18:03:20.361] NAME <- NAMES[[kk]] [18:03:20.361] if (name != NAME && is.element(NAME, old_names)) [18:03:20.361] next [18:03:20.361] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.361] } [18:03:20.361] NAMES <- toupper(added) [18:03:20.361] for (kk in seq_along(NAMES)) { [18:03:20.361] name <- added[[kk]] [18:03:20.361] NAME <- NAMES[[kk]] [18:03:20.361] if (name != NAME && is.element(NAME, old_names)) [18:03:20.361] next [18:03:20.361] args[[name]] <- "" [18:03:20.361] } [18:03:20.361] NAMES <- toupper(removed) [18:03:20.361] for (kk in seq_along(NAMES)) { [18:03:20.361] name <- removed[[kk]] [18:03:20.361] NAME <- NAMES[[kk]] [18:03:20.361] if (name != NAME && is.element(NAME, old_names)) [18:03:20.361] next [18:03:20.361] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.361] } [18:03:20.361] if (length(args) > 0) [18:03:20.361] base::do.call(base::Sys.setenv, args = args) [18:03:20.361] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.361] } [18:03:20.361] else { [18:03:20.361] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.361] } [18:03:20.361] { [18:03:20.361] if (base::length(...future.futureOptionsAdded) > [18:03:20.361] 0L) { [18:03:20.361] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.361] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.361] base::options(opts) [18:03:20.361] } [18:03:20.361] { [18:03:20.361] { [18:03:20.361] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.361] NULL [18:03:20.361] } [18:03:20.361] options(future.plan = NULL) [18:03:20.361] if (is.na(NA_character_)) [18:03:20.361] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.361] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.361] future::plan(list(function (..., workers = availableCores(), [18:03:20.361] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.361] envir = parent.frame()) [18:03:20.361] { [18:03:20.361] if (is.function(workers)) [18:03:20.361] workers <- workers() [18:03:20.361] workers <- structure(as.integer(workers), [18:03:20.361] class = class(workers)) [18:03:20.361] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.361] workers >= 1) [18:03:20.361] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.361] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.361] } [18:03:20.361] future <- MultisessionFuture(..., workers = workers, [18:03:20.361] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.361] envir = envir) [18:03:20.361] if (!future$lazy) [18:03:20.361] future <- run(future) [18:03:20.361] invisible(future) [18:03:20.361] }), .cleanup = FALSE, .init = FALSE) [18:03:20.361] } [18:03:20.361] } [18:03:20.361] } [18:03:20.361] }) [18:03:20.361] if (TRUE) { [18:03:20.361] base::sink(type = "output", split = FALSE) [18:03:20.361] if (TRUE) { [18:03:20.361] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.361] } [18:03:20.361] else { [18:03:20.361] ...future.result["stdout"] <- base::list(NULL) [18:03:20.361] } [18:03:20.361] base::close(...future.stdout) [18:03:20.361] ...future.stdout <- NULL [18:03:20.361] } [18:03:20.361] ...future.result$conditions <- ...future.conditions [18:03:20.361] ...future.result$finished <- base::Sys.time() [18:03:20.361] ...future.result [18:03:20.361] } [18:03:20.366] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.366] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.367] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.367] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.368] MultisessionFuture started [18:03:20.368] - Launch lazy future ... done [18:03:20.368] run() for 'MultisessionFuture' ... done [18:03:20.368] getGlobalsAndPackages() ... [18:03:20.369] Searching for globals... [18:03:20.370] - globals found: [3] '{', 'sample', 'x' [18:03:20.370] Searching for globals ... DONE [18:03:20.370] Resolving globals: FALSE [18:03:20.371] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.371] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.371] - globals: [1] 'x' [18:03:20.371] [18:03:20.372] getGlobalsAndPackages() ... DONE [18:03:20.372] run() for 'Future' ... [18:03:20.372] - state: 'created' [18:03:20.372] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.386] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.386] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.386] - Field: 'node' [18:03:20.386] - Field: 'label' [18:03:20.387] - Field: 'local' [18:03:20.387] - Field: 'owner' [18:03:20.387] - Field: 'envir' [18:03:20.387] - Field: 'workers' [18:03:20.387] - Field: 'packages' [18:03:20.387] - Field: 'gc' [18:03:20.388] - Field: 'conditions' [18:03:20.388] - Field: 'persistent' [18:03:20.388] - Field: 'expr' [18:03:20.388] - Field: 'uuid' [18:03:20.388] - Field: 'seed' [18:03:20.389] - Field: 'version' [18:03:20.389] - Field: 'result' [18:03:20.389] - Field: 'asynchronous' [18:03:20.389] - Field: 'calls' [18:03:20.389] - Field: 'globals' [18:03:20.389] - Field: 'stdout' [18:03:20.390] - Field: 'earlySignal' [18:03:20.390] - Field: 'lazy' [18:03:20.390] - Field: 'state' [18:03:20.390] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.390] - Launch lazy future ... [18:03:20.391] Packages needed by the future expression (n = 0): [18:03:20.391] Packages needed by future strategies (n = 0): [18:03:20.391] { [18:03:20.391] { [18:03:20.391] { [18:03:20.391] ...future.startTime <- base::Sys.time() [18:03:20.391] { [18:03:20.391] { [18:03:20.391] { [18:03:20.391] { [18:03:20.391] base::local({ [18:03:20.391] has_future <- base::requireNamespace("future", [18:03:20.391] quietly = TRUE) [18:03:20.391] if (has_future) { [18:03:20.391] ns <- base::getNamespace("future") [18:03:20.391] version <- ns[[".package"]][["version"]] [18:03:20.391] if (is.null(version)) [18:03:20.391] version <- utils::packageVersion("future") [18:03:20.391] } [18:03:20.391] else { [18:03:20.391] version <- NULL [18:03:20.391] } [18:03:20.391] if (!has_future || version < "1.8.0") { [18:03:20.391] info <- base::c(r_version = base::gsub("R version ", [18:03:20.391] "", base::R.version$version.string), [18:03:20.391] platform = base::sprintf("%s (%s-bit)", [18:03:20.391] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.391] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.391] "release", "version")], collapse = " "), [18:03:20.391] hostname = base::Sys.info()[["nodename"]]) [18:03:20.391] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.391] info) [18:03:20.391] info <- base::paste(info, collapse = "; ") [18:03:20.391] if (!has_future) { [18:03:20.391] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.391] info) [18:03:20.391] } [18:03:20.391] else { [18:03:20.391] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.391] info, version) [18:03:20.391] } [18:03:20.391] base::stop(msg) [18:03:20.391] } [18:03:20.391] }) [18:03:20.391] } [18:03:20.391] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.391] base::options(mc.cores = 1L) [18:03:20.391] } [18:03:20.391] options(future.plan = NULL) [18:03:20.391] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.391] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.391] } [18:03:20.391] ...future.workdir <- getwd() [18:03:20.391] } [18:03:20.391] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.391] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.391] } [18:03:20.391] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.391] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.391] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.391] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.391] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.391] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.391] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.391] base::names(...future.oldOptions)) [18:03:20.391] } [18:03:20.391] if (FALSE) { [18:03:20.391] } [18:03:20.391] else { [18:03:20.391] if (TRUE) { [18:03:20.391] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.391] open = "w") [18:03:20.391] } [18:03:20.391] else { [18:03:20.391] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.391] windows = "NUL", "/dev/null"), open = "w") [18:03:20.391] } [18:03:20.391] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.391] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.391] base::sink(type = "output", split = FALSE) [18:03:20.391] base::close(...future.stdout) [18:03:20.391] }, add = TRUE) [18:03:20.391] } [18:03:20.391] ...future.frame <- base::sys.nframe() [18:03:20.391] ...future.conditions <- base::list() [18:03:20.391] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.391] if (FALSE) { [18:03:20.391] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.391] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.391] } [18:03:20.391] ...future.result <- base::tryCatch({ [18:03:20.391] base::withCallingHandlers({ [18:03:20.391] ...future.value <- base::withVisible(base::local({ [18:03:20.391] ...future.makeSendCondition <- local({ [18:03:20.391] sendCondition <- NULL [18:03:20.391] function(frame = 1L) { [18:03:20.391] if (is.function(sendCondition)) [18:03:20.391] return(sendCondition) [18:03:20.391] ns <- getNamespace("parallel") [18:03:20.391] if (exists("sendData", mode = "function", [18:03:20.391] envir = ns)) { [18:03:20.391] parallel_sendData <- get("sendData", mode = "function", [18:03:20.391] envir = ns) [18:03:20.391] envir <- sys.frame(frame) [18:03:20.391] master <- NULL [18:03:20.391] while (!identical(envir, .GlobalEnv) && [18:03:20.391] !identical(envir, emptyenv())) { [18:03:20.391] if (exists("master", mode = "list", envir = envir, [18:03:20.391] inherits = FALSE)) { [18:03:20.391] master <- get("master", mode = "list", [18:03:20.391] envir = envir, inherits = FALSE) [18:03:20.391] if (inherits(master, c("SOCKnode", [18:03:20.391] "SOCK0node"))) { [18:03:20.391] sendCondition <<- function(cond) { [18:03:20.391] data <- list(type = "VALUE", value = cond, [18:03:20.391] success = TRUE) [18:03:20.391] parallel_sendData(master, data) [18:03:20.391] } [18:03:20.391] return(sendCondition) [18:03:20.391] } [18:03:20.391] } [18:03:20.391] frame <- frame + 1L [18:03:20.391] envir <- sys.frame(frame) [18:03:20.391] } [18:03:20.391] } [18:03:20.391] sendCondition <<- function(cond) NULL [18:03:20.391] } [18:03:20.391] }) [18:03:20.391] withCallingHandlers({ [18:03:20.391] { [18:03:20.391] sample(x, size = 1L) [18:03:20.391] } [18:03:20.391] }, immediateCondition = function(cond) { [18:03:20.391] sendCondition <- ...future.makeSendCondition() [18:03:20.391] sendCondition(cond) [18:03:20.391] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.391] { [18:03:20.391] inherits <- base::inherits [18:03:20.391] invokeRestart <- base::invokeRestart [18:03:20.391] is.null <- base::is.null [18:03:20.391] muffled <- FALSE [18:03:20.391] if (inherits(cond, "message")) { [18:03:20.391] muffled <- grepl(pattern, "muffleMessage") [18:03:20.391] if (muffled) [18:03:20.391] invokeRestart("muffleMessage") [18:03:20.391] } [18:03:20.391] else if (inherits(cond, "warning")) { [18:03:20.391] muffled <- grepl(pattern, "muffleWarning") [18:03:20.391] if (muffled) [18:03:20.391] invokeRestart("muffleWarning") [18:03:20.391] } [18:03:20.391] else if (inherits(cond, "condition")) { [18:03:20.391] if (!is.null(pattern)) { [18:03:20.391] computeRestarts <- base::computeRestarts [18:03:20.391] grepl <- base::grepl [18:03:20.391] restarts <- computeRestarts(cond) [18:03:20.391] for (restart in restarts) { [18:03:20.391] name <- restart$name [18:03:20.391] if (is.null(name)) [18:03:20.391] next [18:03:20.391] if (!grepl(pattern, name)) [18:03:20.391] next [18:03:20.391] invokeRestart(restart) [18:03:20.391] muffled <- TRUE [18:03:20.391] break [18:03:20.391] } [18:03:20.391] } [18:03:20.391] } [18:03:20.391] invisible(muffled) [18:03:20.391] } [18:03:20.391] muffleCondition(cond) [18:03:20.391] }) [18:03:20.391] })) [18:03:20.391] future::FutureResult(value = ...future.value$value, [18:03:20.391] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.391] ...future.rng), globalenv = if (FALSE) [18:03:20.391] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.391] ...future.globalenv.names)) [18:03:20.391] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.391] }, condition = base::local({ [18:03:20.391] c <- base::c [18:03:20.391] inherits <- base::inherits [18:03:20.391] invokeRestart <- base::invokeRestart [18:03:20.391] length <- base::length [18:03:20.391] list <- base::list [18:03:20.391] seq.int <- base::seq.int [18:03:20.391] signalCondition <- base::signalCondition [18:03:20.391] sys.calls <- base::sys.calls [18:03:20.391] `[[` <- base::`[[` [18:03:20.391] `+` <- base::`+` [18:03:20.391] `<<-` <- base::`<<-` [18:03:20.391] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.391] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.391] 3L)] [18:03:20.391] } [18:03:20.391] function(cond) { [18:03:20.391] is_error <- inherits(cond, "error") [18:03:20.391] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.391] NULL) [18:03:20.391] if (is_error) { [18:03:20.391] sessionInformation <- function() { [18:03:20.391] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.391] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.391] search = base::search(), system = base::Sys.info()) [18:03:20.391] } [18:03:20.391] ...future.conditions[[length(...future.conditions) + [18:03:20.391] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.391] cond$call), session = sessionInformation(), [18:03:20.391] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.391] signalCondition(cond) [18:03:20.391] } [18:03:20.391] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.391] "immediateCondition"))) { [18:03:20.391] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.391] ...future.conditions[[length(...future.conditions) + [18:03:20.391] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.391] if (TRUE && !signal) { [18:03:20.391] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.391] { [18:03:20.391] inherits <- base::inherits [18:03:20.391] invokeRestart <- base::invokeRestart [18:03:20.391] is.null <- base::is.null [18:03:20.391] muffled <- FALSE [18:03:20.391] if (inherits(cond, "message")) { [18:03:20.391] muffled <- grepl(pattern, "muffleMessage") [18:03:20.391] if (muffled) [18:03:20.391] invokeRestart("muffleMessage") [18:03:20.391] } [18:03:20.391] else if (inherits(cond, "warning")) { [18:03:20.391] muffled <- grepl(pattern, "muffleWarning") [18:03:20.391] if (muffled) [18:03:20.391] invokeRestart("muffleWarning") [18:03:20.391] } [18:03:20.391] else if (inherits(cond, "condition")) { [18:03:20.391] if (!is.null(pattern)) { [18:03:20.391] computeRestarts <- base::computeRestarts [18:03:20.391] grepl <- base::grepl [18:03:20.391] restarts <- computeRestarts(cond) [18:03:20.391] for (restart in restarts) { [18:03:20.391] name <- restart$name [18:03:20.391] if (is.null(name)) [18:03:20.391] next [18:03:20.391] if (!grepl(pattern, name)) [18:03:20.391] next [18:03:20.391] invokeRestart(restart) [18:03:20.391] muffled <- TRUE [18:03:20.391] break [18:03:20.391] } [18:03:20.391] } [18:03:20.391] } [18:03:20.391] invisible(muffled) [18:03:20.391] } [18:03:20.391] muffleCondition(cond, pattern = "^muffle") [18:03:20.391] } [18:03:20.391] } [18:03:20.391] else { [18:03:20.391] if (TRUE) { [18:03:20.391] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.391] { [18:03:20.391] inherits <- base::inherits [18:03:20.391] invokeRestart <- base::invokeRestart [18:03:20.391] is.null <- base::is.null [18:03:20.391] muffled <- FALSE [18:03:20.391] if (inherits(cond, "message")) { [18:03:20.391] muffled <- grepl(pattern, "muffleMessage") [18:03:20.391] if (muffled) [18:03:20.391] invokeRestart("muffleMessage") [18:03:20.391] } [18:03:20.391] else if (inherits(cond, "warning")) { [18:03:20.391] muffled <- grepl(pattern, "muffleWarning") [18:03:20.391] if (muffled) [18:03:20.391] invokeRestart("muffleWarning") [18:03:20.391] } [18:03:20.391] else if (inherits(cond, "condition")) { [18:03:20.391] if (!is.null(pattern)) { [18:03:20.391] computeRestarts <- base::computeRestarts [18:03:20.391] grepl <- base::grepl [18:03:20.391] restarts <- computeRestarts(cond) [18:03:20.391] for (restart in restarts) { [18:03:20.391] name <- restart$name [18:03:20.391] if (is.null(name)) [18:03:20.391] next [18:03:20.391] if (!grepl(pattern, name)) [18:03:20.391] next [18:03:20.391] invokeRestart(restart) [18:03:20.391] muffled <- TRUE [18:03:20.391] break [18:03:20.391] } [18:03:20.391] } [18:03:20.391] } [18:03:20.391] invisible(muffled) [18:03:20.391] } [18:03:20.391] muffleCondition(cond, pattern = "^muffle") [18:03:20.391] } [18:03:20.391] } [18:03:20.391] } [18:03:20.391] })) [18:03:20.391] }, error = function(ex) { [18:03:20.391] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.391] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.391] ...future.rng), started = ...future.startTime, [18:03:20.391] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.391] version = "1.8"), class = "FutureResult") [18:03:20.391] }, finally = { [18:03:20.391] if (!identical(...future.workdir, getwd())) [18:03:20.391] setwd(...future.workdir) [18:03:20.391] { [18:03:20.391] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.391] ...future.oldOptions$nwarnings <- NULL [18:03:20.391] } [18:03:20.391] base::options(...future.oldOptions) [18:03:20.391] if (.Platform$OS.type == "windows") { [18:03:20.391] old_names <- names(...future.oldEnvVars) [18:03:20.391] envs <- base::Sys.getenv() [18:03:20.391] names <- names(envs) [18:03:20.391] common <- intersect(names, old_names) [18:03:20.391] added <- setdiff(names, old_names) [18:03:20.391] removed <- setdiff(old_names, names) [18:03:20.391] changed <- common[...future.oldEnvVars[common] != [18:03:20.391] envs[common]] [18:03:20.391] NAMES <- toupper(changed) [18:03:20.391] args <- list() [18:03:20.391] for (kk in seq_along(NAMES)) { [18:03:20.391] name <- changed[[kk]] [18:03:20.391] NAME <- NAMES[[kk]] [18:03:20.391] if (name != NAME && is.element(NAME, old_names)) [18:03:20.391] next [18:03:20.391] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.391] } [18:03:20.391] NAMES <- toupper(added) [18:03:20.391] for (kk in seq_along(NAMES)) { [18:03:20.391] name <- added[[kk]] [18:03:20.391] NAME <- NAMES[[kk]] [18:03:20.391] if (name != NAME && is.element(NAME, old_names)) [18:03:20.391] next [18:03:20.391] args[[name]] <- "" [18:03:20.391] } [18:03:20.391] NAMES <- toupper(removed) [18:03:20.391] for (kk in seq_along(NAMES)) { [18:03:20.391] name <- removed[[kk]] [18:03:20.391] NAME <- NAMES[[kk]] [18:03:20.391] if (name != NAME && is.element(NAME, old_names)) [18:03:20.391] next [18:03:20.391] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.391] } [18:03:20.391] if (length(args) > 0) [18:03:20.391] base::do.call(base::Sys.setenv, args = args) [18:03:20.391] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.391] } [18:03:20.391] else { [18:03:20.391] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.391] } [18:03:20.391] { [18:03:20.391] if (base::length(...future.futureOptionsAdded) > [18:03:20.391] 0L) { [18:03:20.391] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.391] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.391] base::options(opts) [18:03:20.391] } [18:03:20.391] { [18:03:20.391] { [18:03:20.391] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.391] NULL [18:03:20.391] } [18:03:20.391] options(future.plan = NULL) [18:03:20.391] if (is.na(NA_character_)) [18:03:20.391] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.391] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.391] future::plan(list(function (..., workers = availableCores(), [18:03:20.391] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.391] envir = parent.frame()) [18:03:20.391] { [18:03:20.391] if (is.function(workers)) [18:03:20.391] workers <- workers() [18:03:20.391] workers <- structure(as.integer(workers), [18:03:20.391] class = class(workers)) [18:03:20.391] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.391] workers >= 1) [18:03:20.391] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.391] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.391] } [18:03:20.391] future <- MultisessionFuture(..., workers = workers, [18:03:20.391] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.391] envir = envir) [18:03:20.391] if (!future$lazy) [18:03:20.391] future <- run(future) [18:03:20.391] invisible(future) [18:03:20.391] }), .cleanup = FALSE, .init = FALSE) [18:03:20.391] } [18:03:20.391] } [18:03:20.391] } [18:03:20.391] }) [18:03:20.391] if (TRUE) { [18:03:20.391] base::sink(type = "output", split = FALSE) [18:03:20.391] if (TRUE) { [18:03:20.391] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.391] } [18:03:20.391] else { [18:03:20.391] ...future.result["stdout"] <- base::list(NULL) [18:03:20.391] } [18:03:20.391] base::close(...future.stdout) [18:03:20.391] ...future.stdout <- NULL [18:03:20.391] } [18:03:20.391] ...future.result$conditions <- ...future.conditions [18:03:20.391] ...future.result$finished <- base::Sys.time() [18:03:20.391] ...future.result [18:03:20.391] } [18:03:20.397] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.397] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.397] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.398] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.398] MultisessionFuture started [18:03:20.398] - Launch lazy future ... done [18:03:20.399] run() for 'MultisessionFuture' ... done [18:03:20.399] getGlobalsAndPackages() ... [18:03:20.399] Searching for globals... [18:03:20.400] - globals found: [3] '{', 'sample', 'x' [18:03:20.401] Searching for globals ... DONE [18:03:20.401] Resolving globals: FALSE [18:03:20.401] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.402] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.402] - globals: [1] 'x' [18:03:20.402] [18:03:20.402] getGlobalsAndPackages() ... DONE [18:03:20.403] run() for 'Future' ... [18:03:20.403] - state: 'created' [18:03:20.403] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.417] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.417] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.417] - Field: 'node' [18:03:20.417] - Field: 'label' [18:03:20.417] - Field: 'local' [18:03:20.418] - Field: 'owner' [18:03:20.418] - Field: 'envir' [18:03:20.418] - Field: 'workers' [18:03:20.418] - Field: 'packages' [18:03:20.418] - Field: 'gc' [18:03:20.419] - Field: 'conditions' [18:03:20.419] - Field: 'persistent' [18:03:20.419] - Field: 'expr' [18:03:20.419] - Field: 'uuid' [18:03:20.419] - Field: 'seed' [18:03:20.419] - Field: 'version' [18:03:20.420] - Field: 'result' [18:03:20.420] - Field: 'asynchronous' [18:03:20.420] - Field: 'calls' [18:03:20.420] - Field: 'globals' [18:03:20.420] - Field: 'stdout' [18:03:20.421] - Field: 'earlySignal' [18:03:20.421] - Field: 'lazy' [18:03:20.421] - Field: 'state' [18:03:20.421] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.421] - Launch lazy future ... [18:03:20.422] Packages needed by the future expression (n = 0): [18:03:20.422] Packages needed by future strategies (n = 0): [18:03:20.422] { [18:03:20.422] { [18:03:20.422] { [18:03:20.422] ...future.startTime <- base::Sys.time() [18:03:20.422] { [18:03:20.422] { [18:03:20.422] { [18:03:20.422] { [18:03:20.422] base::local({ [18:03:20.422] has_future <- base::requireNamespace("future", [18:03:20.422] quietly = TRUE) [18:03:20.422] if (has_future) { [18:03:20.422] ns <- base::getNamespace("future") [18:03:20.422] version <- ns[[".package"]][["version"]] [18:03:20.422] if (is.null(version)) [18:03:20.422] version <- utils::packageVersion("future") [18:03:20.422] } [18:03:20.422] else { [18:03:20.422] version <- NULL [18:03:20.422] } [18:03:20.422] if (!has_future || version < "1.8.0") { [18:03:20.422] info <- base::c(r_version = base::gsub("R version ", [18:03:20.422] "", base::R.version$version.string), [18:03:20.422] platform = base::sprintf("%s (%s-bit)", [18:03:20.422] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.422] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.422] "release", "version")], collapse = " "), [18:03:20.422] hostname = base::Sys.info()[["nodename"]]) [18:03:20.422] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.422] info) [18:03:20.422] info <- base::paste(info, collapse = "; ") [18:03:20.422] if (!has_future) { [18:03:20.422] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.422] info) [18:03:20.422] } [18:03:20.422] else { [18:03:20.422] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.422] info, version) [18:03:20.422] } [18:03:20.422] base::stop(msg) [18:03:20.422] } [18:03:20.422] }) [18:03:20.422] } [18:03:20.422] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.422] base::options(mc.cores = 1L) [18:03:20.422] } [18:03:20.422] options(future.plan = NULL) [18:03:20.422] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.422] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.422] } [18:03:20.422] ...future.workdir <- getwd() [18:03:20.422] } [18:03:20.422] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.422] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.422] } [18:03:20.422] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.422] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.422] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.422] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.422] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.422] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.422] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.422] base::names(...future.oldOptions)) [18:03:20.422] } [18:03:20.422] if (FALSE) { [18:03:20.422] } [18:03:20.422] else { [18:03:20.422] if (TRUE) { [18:03:20.422] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.422] open = "w") [18:03:20.422] } [18:03:20.422] else { [18:03:20.422] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.422] windows = "NUL", "/dev/null"), open = "w") [18:03:20.422] } [18:03:20.422] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.422] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.422] base::sink(type = "output", split = FALSE) [18:03:20.422] base::close(...future.stdout) [18:03:20.422] }, add = TRUE) [18:03:20.422] } [18:03:20.422] ...future.frame <- base::sys.nframe() [18:03:20.422] ...future.conditions <- base::list() [18:03:20.422] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.422] if (FALSE) { [18:03:20.422] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.422] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.422] } [18:03:20.422] ...future.result <- base::tryCatch({ [18:03:20.422] base::withCallingHandlers({ [18:03:20.422] ...future.value <- base::withVisible(base::local({ [18:03:20.422] ...future.makeSendCondition <- local({ [18:03:20.422] sendCondition <- NULL [18:03:20.422] function(frame = 1L) { [18:03:20.422] if (is.function(sendCondition)) [18:03:20.422] return(sendCondition) [18:03:20.422] ns <- getNamespace("parallel") [18:03:20.422] if (exists("sendData", mode = "function", [18:03:20.422] envir = ns)) { [18:03:20.422] parallel_sendData <- get("sendData", mode = "function", [18:03:20.422] envir = ns) [18:03:20.422] envir <- sys.frame(frame) [18:03:20.422] master <- NULL [18:03:20.422] while (!identical(envir, .GlobalEnv) && [18:03:20.422] !identical(envir, emptyenv())) { [18:03:20.422] if (exists("master", mode = "list", envir = envir, [18:03:20.422] inherits = FALSE)) { [18:03:20.422] master <- get("master", mode = "list", [18:03:20.422] envir = envir, inherits = FALSE) [18:03:20.422] if (inherits(master, c("SOCKnode", [18:03:20.422] "SOCK0node"))) { [18:03:20.422] sendCondition <<- function(cond) { [18:03:20.422] data <- list(type = "VALUE", value = cond, [18:03:20.422] success = TRUE) [18:03:20.422] parallel_sendData(master, data) [18:03:20.422] } [18:03:20.422] return(sendCondition) [18:03:20.422] } [18:03:20.422] } [18:03:20.422] frame <- frame + 1L [18:03:20.422] envir <- sys.frame(frame) [18:03:20.422] } [18:03:20.422] } [18:03:20.422] sendCondition <<- function(cond) NULL [18:03:20.422] } [18:03:20.422] }) [18:03:20.422] withCallingHandlers({ [18:03:20.422] { [18:03:20.422] sample(x, size = 1L) [18:03:20.422] } [18:03:20.422] }, immediateCondition = function(cond) { [18:03:20.422] sendCondition <- ...future.makeSendCondition() [18:03:20.422] sendCondition(cond) [18:03:20.422] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.422] { [18:03:20.422] inherits <- base::inherits [18:03:20.422] invokeRestart <- base::invokeRestart [18:03:20.422] is.null <- base::is.null [18:03:20.422] muffled <- FALSE [18:03:20.422] if (inherits(cond, "message")) { [18:03:20.422] muffled <- grepl(pattern, "muffleMessage") [18:03:20.422] if (muffled) [18:03:20.422] invokeRestart("muffleMessage") [18:03:20.422] } [18:03:20.422] else if (inherits(cond, "warning")) { [18:03:20.422] muffled <- grepl(pattern, "muffleWarning") [18:03:20.422] if (muffled) [18:03:20.422] invokeRestart("muffleWarning") [18:03:20.422] } [18:03:20.422] else if (inherits(cond, "condition")) { [18:03:20.422] if (!is.null(pattern)) { [18:03:20.422] computeRestarts <- base::computeRestarts [18:03:20.422] grepl <- base::grepl [18:03:20.422] restarts <- computeRestarts(cond) [18:03:20.422] for (restart in restarts) { [18:03:20.422] name <- restart$name [18:03:20.422] if (is.null(name)) [18:03:20.422] next [18:03:20.422] if (!grepl(pattern, name)) [18:03:20.422] next [18:03:20.422] invokeRestart(restart) [18:03:20.422] muffled <- TRUE [18:03:20.422] break [18:03:20.422] } [18:03:20.422] } [18:03:20.422] } [18:03:20.422] invisible(muffled) [18:03:20.422] } [18:03:20.422] muffleCondition(cond) [18:03:20.422] }) [18:03:20.422] })) [18:03:20.422] future::FutureResult(value = ...future.value$value, [18:03:20.422] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.422] ...future.rng), globalenv = if (FALSE) [18:03:20.422] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.422] ...future.globalenv.names)) [18:03:20.422] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.422] }, condition = base::local({ [18:03:20.422] c <- base::c [18:03:20.422] inherits <- base::inherits [18:03:20.422] invokeRestart <- base::invokeRestart [18:03:20.422] length <- base::length [18:03:20.422] list <- base::list [18:03:20.422] seq.int <- base::seq.int [18:03:20.422] signalCondition <- base::signalCondition [18:03:20.422] sys.calls <- base::sys.calls [18:03:20.422] `[[` <- base::`[[` [18:03:20.422] `+` <- base::`+` [18:03:20.422] `<<-` <- base::`<<-` [18:03:20.422] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.422] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.422] 3L)] [18:03:20.422] } [18:03:20.422] function(cond) { [18:03:20.422] is_error <- inherits(cond, "error") [18:03:20.422] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.422] NULL) [18:03:20.422] if (is_error) { [18:03:20.422] sessionInformation <- function() { [18:03:20.422] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.422] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.422] search = base::search(), system = base::Sys.info()) [18:03:20.422] } [18:03:20.422] ...future.conditions[[length(...future.conditions) + [18:03:20.422] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.422] cond$call), session = sessionInformation(), [18:03:20.422] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.422] signalCondition(cond) [18:03:20.422] } [18:03:20.422] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.422] "immediateCondition"))) { [18:03:20.422] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.422] ...future.conditions[[length(...future.conditions) + [18:03:20.422] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.422] if (TRUE && !signal) { [18:03:20.422] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.422] { [18:03:20.422] inherits <- base::inherits [18:03:20.422] invokeRestart <- base::invokeRestart [18:03:20.422] is.null <- base::is.null [18:03:20.422] muffled <- FALSE [18:03:20.422] if (inherits(cond, "message")) { [18:03:20.422] muffled <- grepl(pattern, "muffleMessage") [18:03:20.422] if (muffled) [18:03:20.422] invokeRestart("muffleMessage") [18:03:20.422] } [18:03:20.422] else if (inherits(cond, "warning")) { [18:03:20.422] muffled <- grepl(pattern, "muffleWarning") [18:03:20.422] if (muffled) [18:03:20.422] invokeRestart("muffleWarning") [18:03:20.422] } [18:03:20.422] else if (inherits(cond, "condition")) { [18:03:20.422] if (!is.null(pattern)) { [18:03:20.422] computeRestarts <- base::computeRestarts [18:03:20.422] grepl <- base::grepl [18:03:20.422] restarts <- computeRestarts(cond) [18:03:20.422] for (restart in restarts) { [18:03:20.422] name <- restart$name [18:03:20.422] if (is.null(name)) [18:03:20.422] next [18:03:20.422] if (!grepl(pattern, name)) [18:03:20.422] next [18:03:20.422] invokeRestart(restart) [18:03:20.422] muffled <- TRUE [18:03:20.422] break [18:03:20.422] } [18:03:20.422] } [18:03:20.422] } [18:03:20.422] invisible(muffled) [18:03:20.422] } [18:03:20.422] muffleCondition(cond, pattern = "^muffle") [18:03:20.422] } [18:03:20.422] } [18:03:20.422] else { [18:03:20.422] if (TRUE) { [18:03:20.422] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.422] { [18:03:20.422] inherits <- base::inherits [18:03:20.422] invokeRestart <- base::invokeRestart [18:03:20.422] is.null <- base::is.null [18:03:20.422] muffled <- FALSE [18:03:20.422] if (inherits(cond, "message")) { [18:03:20.422] muffled <- grepl(pattern, "muffleMessage") [18:03:20.422] if (muffled) [18:03:20.422] invokeRestart("muffleMessage") [18:03:20.422] } [18:03:20.422] else if (inherits(cond, "warning")) { [18:03:20.422] muffled <- grepl(pattern, "muffleWarning") [18:03:20.422] if (muffled) [18:03:20.422] invokeRestart("muffleWarning") [18:03:20.422] } [18:03:20.422] else if (inherits(cond, "condition")) { [18:03:20.422] if (!is.null(pattern)) { [18:03:20.422] computeRestarts <- base::computeRestarts [18:03:20.422] grepl <- base::grepl [18:03:20.422] restarts <- computeRestarts(cond) [18:03:20.422] for (restart in restarts) { [18:03:20.422] name <- restart$name [18:03:20.422] if (is.null(name)) [18:03:20.422] next [18:03:20.422] if (!grepl(pattern, name)) [18:03:20.422] next [18:03:20.422] invokeRestart(restart) [18:03:20.422] muffled <- TRUE [18:03:20.422] break [18:03:20.422] } [18:03:20.422] } [18:03:20.422] } [18:03:20.422] invisible(muffled) [18:03:20.422] } [18:03:20.422] muffleCondition(cond, pattern = "^muffle") [18:03:20.422] } [18:03:20.422] } [18:03:20.422] } [18:03:20.422] })) [18:03:20.422] }, error = function(ex) { [18:03:20.422] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.422] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.422] ...future.rng), started = ...future.startTime, [18:03:20.422] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.422] version = "1.8"), class = "FutureResult") [18:03:20.422] }, finally = { [18:03:20.422] if (!identical(...future.workdir, getwd())) [18:03:20.422] setwd(...future.workdir) [18:03:20.422] { [18:03:20.422] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.422] ...future.oldOptions$nwarnings <- NULL [18:03:20.422] } [18:03:20.422] base::options(...future.oldOptions) [18:03:20.422] if (.Platform$OS.type == "windows") { [18:03:20.422] old_names <- names(...future.oldEnvVars) [18:03:20.422] envs <- base::Sys.getenv() [18:03:20.422] names <- names(envs) [18:03:20.422] common <- intersect(names, old_names) [18:03:20.422] added <- setdiff(names, old_names) [18:03:20.422] removed <- setdiff(old_names, names) [18:03:20.422] changed <- common[...future.oldEnvVars[common] != [18:03:20.422] envs[common]] [18:03:20.422] NAMES <- toupper(changed) [18:03:20.422] args <- list() [18:03:20.422] for (kk in seq_along(NAMES)) { [18:03:20.422] name <- changed[[kk]] [18:03:20.422] NAME <- NAMES[[kk]] [18:03:20.422] if (name != NAME && is.element(NAME, old_names)) [18:03:20.422] next [18:03:20.422] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.422] } [18:03:20.422] NAMES <- toupper(added) [18:03:20.422] for (kk in seq_along(NAMES)) { [18:03:20.422] name <- added[[kk]] [18:03:20.422] NAME <- NAMES[[kk]] [18:03:20.422] if (name != NAME && is.element(NAME, old_names)) [18:03:20.422] next [18:03:20.422] args[[name]] <- "" [18:03:20.422] } [18:03:20.422] NAMES <- toupper(removed) [18:03:20.422] for (kk in seq_along(NAMES)) { [18:03:20.422] name <- removed[[kk]] [18:03:20.422] NAME <- NAMES[[kk]] [18:03:20.422] if (name != NAME && is.element(NAME, old_names)) [18:03:20.422] next [18:03:20.422] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.422] } [18:03:20.422] if (length(args) > 0) [18:03:20.422] base::do.call(base::Sys.setenv, args = args) [18:03:20.422] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.422] } [18:03:20.422] else { [18:03:20.422] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.422] } [18:03:20.422] { [18:03:20.422] if (base::length(...future.futureOptionsAdded) > [18:03:20.422] 0L) { [18:03:20.422] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.422] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.422] base::options(opts) [18:03:20.422] } [18:03:20.422] { [18:03:20.422] { [18:03:20.422] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.422] NULL [18:03:20.422] } [18:03:20.422] options(future.plan = NULL) [18:03:20.422] if (is.na(NA_character_)) [18:03:20.422] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.422] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.422] future::plan(list(function (..., workers = availableCores(), [18:03:20.422] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.422] envir = parent.frame()) [18:03:20.422] { [18:03:20.422] if (is.function(workers)) [18:03:20.422] workers <- workers() [18:03:20.422] workers <- structure(as.integer(workers), [18:03:20.422] class = class(workers)) [18:03:20.422] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.422] workers >= 1) [18:03:20.422] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.422] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.422] } [18:03:20.422] future <- MultisessionFuture(..., workers = workers, [18:03:20.422] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.422] envir = envir) [18:03:20.422] if (!future$lazy) [18:03:20.422] future <- run(future) [18:03:20.422] invisible(future) [18:03:20.422] }), .cleanup = FALSE, .init = FALSE) [18:03:20.422] } [18:03:20.422] } [18:03:20.422] } [18:03:20.422] }) [18:03:20.422] if (TRUE) { [18:03:20.422] base::sink(type = "output", split = FALSE) [18:03:20.422] if (TRUE) { [18:03:20.422] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.422] } [18:03:20.422] else { [18:03:20.422] ...future.result["stdout"] <- base::list(NULL) [18:03:20.422] } [18:03:20.422] base::close(...future.stdout) [18:03:20.422] ...future.stdout <- NULL [18:03:20.422] } [18:03:20.422] ...future.result$conditions <- ...future.conditions [18:03:20.422] ...future.result$finished <- base::Sys.time() [18:03:20.422] ...future.result [18:03:20.422] } [18:03:20.427] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.439] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.440] - Validating connection of MultisessionFuture [18:03:20.440] - received message: FutureResult [18:03:20.440] - Received FutureResult [18:03:20.440] - Erased future from FutureRegistry [18:03:20.440] result() for ClusterFuture ... [18:03:20.441] - result already collected: FutureResult [18:03:20.441] result() for ClusterFuture ... done [18:03:20.441] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.441] result() for ClusterFuture ... [18:03:20.441] - result already collected: FutureResult [18:03:20.441] result() for ClusterFuture ... done [18:03:20.442] result() for ClusterFuture ... [18:03:20.442] - result already collected: FutureResult [18:03:20.442] result() for ClusterFuture ... done [18:03:20.443] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.443] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.443] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.443] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.444] MultisessionFuture started [18:03:20.444] - Launch lazy future ... done [18:03:20.444] run() for 'MultisessionFuture' ... done [18:03:20.445] getGlobalsAndPackages() ... [18:03:20.445] Searching for globals... [18:03:20.446] - globals found: [3] '{', 'sample', 'x' [18:03:20.447] Searching for globals ... DONE [18:03:20.447] Resolving globals: FALSE [18:03:20.447] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.448] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.448] - globals: [1] 'x' [18:03:20.448] [18:03:20.448] getGlobalsAndPackages() ... DONE [18:03:20.448] run() for 'Future' ... [18:03:20.449] - state: 'created' [18:03:20.449] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.462] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.463] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.463] - Field: 'node' [18:03:20.463] - Field: 'label' [18:03:20.463] - Field: 'local' [18:03:20.463] - Field: 'owner' [18:03:20.464] - Field: 'envir' [18:03:20.464] - Field: 'workers' [18:03:20.464] - Field: 'packages' [18:03:20.464] - Field: 'gc' [18:03:20.464] - Field: 'conditions' [18:03:20.464] - Field: 'persistent' [18:03:20.465] - Field: 'expr' [18:03:20.465] - Field: 'uuid' [18:03:20.465] - Field: 'seed' [18:03:20.465] - Field: 'version' [18:03:20.465] - Field: 'result' [18:03:20.466] - Field: 'asynchronous' [18:03:20.466] - Field: 'calls' [18:03:20.466] - Field: 'globals' [18:03:20.466] - Field: 'stdout' [18:03:20.466] - Field: 'earlySignal' [18:03:20.466] - Field: 'lazy' [18:03:20.467] - Field: 'state' [18:03:20.467] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.467] - Launch lazy future ... [18:03:20.467] Packages needed by the future expression (n = 0): [18:03:20.467] Packages needed by future strategies (n = 0): [18:03:20.471] { [18:03:20.471] { [18:03:20.471] { [18:03:20.471] ...future.startTime <- base::Sys.time() [18:03:20.471] { [18:03:20.471] { [18:03:20.471] { [18:03:20.471] { [18:03:20.471] base::local({ [18:03:20.471] has_future <- base::requireNamespace("future", [18:03:20.471] quietly = TRUE) [18:03:20.471] if (has_future) { [18:03:20.471] ns <- base::getNamespace("future") [18:03:20.471] version <- ns[[".package"]][["version"]] [18:03:20.471] if (is.null(version)) [18:03:20.471] version <- utils::packageVersion("future") [18:03:20.471] } [18:03:20.471] else { [18:03:20.471] version <- NULL [18:03:20.471] } [18:03:20.471] if (!has_future || version < "1.8.0") { [18:03:20.471] info <- base::c(r_version = base::gsub("R version ", [18:03:20.471] "", base::R.version$version.string), [18:03:20.471] platform = base::sprintf("%s (%s-bit)", [18:03:20.471] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.471] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.471] "release", "version")], collapse = " "), [18:03:20.471] hostname = base::Sys.info()[["nodename"]]) [18:03:20.471] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.471] info) [18:03:20.471] info <- base::paste(info, collapse = "; ") [18:03:20.471] if (!has_future) { [18:03:20.471] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.471] info) [18:03:20.471] } [18:03:20.471] else { [18:03:20.471] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.471] info, version) [18:03:20.471] } [18:03:20.471] base::stop(msg) [18:03:20.471] } [18:03:20.471] }) [18:03:20.471] } [18:03:20.471] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.471] base::options(mc.cores = 1L) [18:03:20.471] } [18:03:20.471] options(future.plan = NULL) [18:03:20.471] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.471] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.471] } [18:03:20.471] ...future.workdir <- getwd() [18:03:20.471] } [18:03:20.471] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.471] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.471] } [18:03:20.471] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.471] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.471] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.471] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.471] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.471] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.471] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.471] base::names(...future.oldOptions)) [18:03:20.471] } [18:03:20.471] if (FALSE) { [18:03:20.471] } [18:03:20.471] else { [18:03:20.471] if (TRUE) { [18:03:20.471] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.471] open = "w") [18:03:20.471] } [18:03:20.471] else { [18:03:20.471] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.471] windows = "NUL", "/dev/null"), open = "w") [18:03:20.471] } [18:03:20.471] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.471] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.471] base::sink(type = "output", split = FALSE) [18:03:20.471] base::close(...future.stdout) [18:03:20.471] }, add = TRUE) [18:03:20.471] } [18:03:20.471] ...future.frame <- base::sys.nframe() [18:03:20.471] ...future.conditions <- base::list() [18:03:20.471] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.471] if (FALSE) { [18:03:20.471] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.471] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.471] } [18:03:20.471] ...future.result <- base::tryCatch({ [18:03:20.471] base::withCallingHandlers({ [18:03:20.471] ...future.value <- base::withVisible(base::local({ [18:03:20.471] ...future.makeSendCondition <- local({ [18:03:20.471] sendCondition <- NULL [18:03:20.471] function(frame = 1L) { [18:03:20.471] if (is.function(sendCondition)) [18:03:20.471] return(sendCondition) [18:03:20.471] ns <- getNamespace("parallel") [18:03:20.471] if (exists("sendData", mode = "function", [18:03:20.471] envir = ns)) { [18:03:20.471] parallel_sendData <- get("sendData", mode = "function", [18:03:20.471] envir = ns) [18:03:20.471] envir <- sys.frame(frame) [18:03:20.471] master <- NULL [18:03:20.471] while (!identical(envir, .GlobalEnv) && [18:03:20.471] !identical(envir, emptyenv())) { [18:03:20.471] if (exists("master", mode = "list", envir = envir, [18:03:20.471] inherits = FALSE)) { [18:03:20.471] master <- get("master", mode = "list", [18:03:20.471] envir = envir, inherits = FALSE) [18:03:20.471] if (inherits(master, c("SOCKnode", [18:03:20.471] "SOCK0node"))) { [18:03:20.471] sendCondition <<- function(cond) { [18:03:20.471] data <- list(type = "VALUE", value = cond, [18:03:20.471] success = TRUE) [18:03:20.471] parallel_sendData(master, data) [18:03:20.471] } [18:03:20.471] return(sendCondition) [18:03:20.471] } [18:03:20.471] } [18:03:20.471] frame <- frame + 1L [18:03:20.471] envir <- sys.frame(frame) [18:03:20.471] } [18:03:20.471] } [18:03:20.471] sendCondition <<- function(cond) NULL [18:03:20.471] } [18:03:20.471] }) [18:03:20.471] withCallingHandlers({ [18:03:20.471] { [18:03:20.471] sample(x, size = 1L) [18:03:20.471] } [18:03:20.471] }, immediateCondition = function(cond) { [18:03:20.471] sendCondition <- ...future.makeSendCondition() [18:03:20.471] sendCondition(cond) [18:03:20.471] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.471] { [18:03:20.471] inherits <- base::inherits [18:03:20.471] invokeRestart <- base::invokeRestart [18:03:20.471] is.null <- base::is.null [18:03:20.471] muffled <- FALSE [18:03:20.471] if (inherits(cond, "message")) { [18:03:20.471] muffled <- grepl(pattern, "muffleMessage") [18:03:20.471] if (muffled) [18:03:20.471] invokeRestart("muffleMessage") [18:03:20.471] } [18:03:20.471] else if (inherits(cond, "warning")) { [18:03:20.471] muffled <- grepl(pattern, "muffleWarning") [18:03:20.471] if (muffled) [18:03:20.471] invokeRestart("muffleWarning") [18:03:20.471] } [18:03:20.471] else if (inherits(cond, "condition")) { [18:03:20.471] if (!is.null(pattern)) { [18:03:20.471] computeRestarts <- base::computeRestarts [18:03:20.471] grepl <- base::grepl [18:03:20.471] restarts <- computeRestarts(cond) [18:03:20.471] for (restart in restarts) { [18:03:20.471] name <- restart$name [18:03:20.471] if (is.null(name)) [18:03:20.471] next [18:03:20.471] if (!grepl(pattern, name)) [18:03:20.471] next [18:03:20.471] invokeRestart(restart) [18:03:20.471] muffled <- TRUE [18:03:20.471] break [18:03:20.471] } [18:03:20.471] } [18:03:20.471] } [18:03:20.471] invisible(muffled) [18:03:20.471] } [18:03:20.471] muffleCondition(cond) [18:03:20.471] }) [18:03:20.471] })) [18:03:20.471] future::FutureResult(value = ...future.value$value, [18:03:20.471] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.471] ...future.rng), globalenv = if (FALSE) [18:03:20.471] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.471] ...future.globalenv.names)) [18:03:20.471] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.471] }, condition = base::local({ [18:03:20.471] c <- base::c [18:03:20.471] inherits <- base::inherits [18:03:20.471] invokeRestart <- base::invokeRestart [18:03:20.471] length <- base::length [18:03:20.471] list <- base::list [18:03:20.471] seq.int <- base::seq.int [18:03:20.471] signalCondition <- base::signalCondition [18:03:20.471] sys.calls <- base::sys.calls [18:03:20.471] `[[` <- base::`[[` [18:03:20.471] `+` <- base::`+` [18:03:20.471] `<<-` <- base::`<<-` [18:03:20.471] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.471] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.471] 3L)] [18:03:20.471] } [18:03:20.471] function(cond) { [18:03:20.471] is_error <- inherits(cond, "error") [18:03:20.471] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.471] NULL) [18:03:20.471] if (is_error) { [18:03:20.471] sessionInformation <- function() { [18:03:20.471] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.471] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.471] search = base::search(), system = base::Sys.info()) [18:03:20.471] } [18:03:20.471] ...future.conditions[[length(...future.conditions) + [18:03:20.471] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.471] cond$call), session = sessionInformation(), [18:03:20.471] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.471] signalCondition(cond) [18:03:20.471] } [18:03:20.471] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.471] "immediateCondition"))) { [18:03:20.471] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.471] ...future.conditions[[length(...future.conditions) + [18:03:20.471] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.471] if (TRUE && !signal) { [18:03:20.471] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.471] { [18:03:20.471] inherits <- base::inherits [18:03:20.471] invokeRestart <- base::invokeRestart [18:03:20.471] is.null <- base::is.null [18:03:20.471] muffled <- FALSE [18:03:20.471] if (inherits(cond, "message")) { [18:03:20.471] muffled <- grepl(pattern, "muffleMessage") [18:03:20.471] if (muffled) [18:03:20.471] invokeRestart("muffleMessage") [18:03:20.471] } [18:03:20.471] else if (inherits(cond, "warning")) { [18:03:20.471] muffled <- grepl(pattern, "muffleWarning") [18:03:20.471] if (muffled) [18:03:20.471] invokeRestart("muffleWarning") [18:03:20.471] } [18:03:20.471] else if (inherits(cond, "condition")) { [18:03:20.471] if (!is.null(pattern)) { [18:03:20.471] computeRestarts <- base::computeRestarts [18:03:20.471] grepl <- base::grepl [18:03:20.471] restarts <- computeRestarts(cond) [18:03:20.471] for (restart in restarts) { [18:03:20.471] name <- restart$name [18:03:20.471] if (is.null(name)) [18:03:20.471] next [18:03:20.471] if (!grepl(pattern, name)) [18:03:20.471] next [18:03:20.471] invokeRestart(restart) [18:03:20.471] muffled <- TRUE [18:03:20.471] break [18:03:20.471] } [18:03:20.471] } [18:03:20.471] } [18:03:20.471] invisible(muffled) [18:03:20.471] } [18:03:20.471] muffleCondition(cond, pattern = "^muffle") [18:03:20.471] } [18:03:20.471] } [18:03:20.471] else { [18:03:20.471] if (TRUE) { [18:03:20.471] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.471] { [18:03:20.471] inherits <- base::inherits [18:03:20.471] invokeRestart <- base::invokeRestart [18:03:20.471] is.null <- base::is.null [18:03:20.471] muffled <- FALSE [18:03:20.471] if (inherits(cond, "message")) { [18:03:20.471] muffled <- grepl(pattern, "muffleMessage") [18:03:20.471] if (muffled) [18:03:20.471] invokeRestart("muffleMessage") [18:03:20.471] } [18:03:20.471] else if (inherits(cond, "warning")) { [18:03:20.471] muffled <- grepl(pattern, "muffleWarning") [18:03:20.471] if (muffled) [18:03:20.471] invokeRestart("muffleWarning") [18:03:20.471] } [18:03:20.471] else if (inherits(cond, "condition")) { [18:03:20.471] if (!is.null(pattern)) { [18:03:20.471] computeRestarts <- base::computeRestarts [18:03:20.471] grepl <- base::grepl [18:03:20.471] restarts <- computeRestarts(cond) [18:03:20.471] for (restart in restarts) { [18:03:20.471] name <- restart$name [18:03:20.471] if (is.null(name)) [18:03:20.471] next [18:03:20.471] if (!grepl(pattern, name)) [18:03:20.471] next [18:03:20.471] invokeRestart(restart) [18:03:20.471] muffled <- TRUE [18:03:20.471] break [18:03:20.471] } [18:03:20.471] } [18:03:20.471] } [18:03:20.471] invisible(muffled) [18:03:20.471] } [18:03:20.471] muffleCondition(cond, pattern = "^muffle") [18:03:20.471] } [18:03:20.471] } [18:03:20.471] } [18:03:20.471] })) [18:03:20.471] }, error = function(ex) { [18:03:20.471] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.471] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.471] ...future.rng), started = ...future.startTime, [18:03:20.471] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.471] version = "1.8"), class = "FutureResult") [18:03:20.471] }, finally = { [18:03:20.471] if (!identical(...future.workdir, getwd())) [18:03:20.471] setwd(...future.workdir) [18:03:20.471] { [18:03:20.471] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.471] ...future.oldOptions$nwarnings <- NULL [18:03:20.471] } [18:03:20.471] base::options(...future.oldOptions) [18:03:20.471] if (.Platform$OS.type == "windows") { [18:03:20.471] old_names <- names(...future.oldEnvVars) [18:03:20.471] envs <- base::Sys.getenv() [18:03:20.471] names <- names(envs) [18:03:20.471] common <- intersect(names, old_names) [18:03:20.471] added <- setdiff(names, old_names) [18:03:20.471] removed <- setdiff(old_names, names) [18:03:20.471] changed <- common[...future.oldEnvVars[common] != [18:03:20.471] envs[common]] [18:03:20.471] NAMES <- toupper(changed) [18:03:20.471] args <- list() [18:03:20.471] for (kk in seq_along(NAMES)) { [18:03:20.471] name <- changed[[kk]] [18:03:20.471] NAME <- NAMES[[kk]] [18:03:20.471] if (name != NAME && is.element(NAME, old_names)) [18:03:20.471] next [18:03:20.471] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.471] } [18:03:20.471] NAMES <- toupper(added) [18:03:20.471] for (kk in seq_along(NAMES)) { [18:03:20.471] name <- added[[kk]] [18:03:20.471] NAME <- NAMES[[kk]] [18:03:20.471] if (name != NAME && is.element(NAME, old_names)) [18:03:20.471] next [18:03:20.471] args[[name]] <- "" [18:03:20.471] } [18:03:20.471] NAMES <- toupper(removed) [18:03:20.471] for (kk in seq_along(NAMES)) { [18:03:20.471] name <- removed[[kk]] [18:03:20.471] NAME <- NAMES[[kk]] [18:03:20.471] if (name != NAME && is.element(NAME, old_names)) [18:03:20.471] next [18:03:20.471] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.471] } [18:03:20.471] if (length(args) > 0) [18:03:20.471] base::do.call(base::Sys.setenv, args = args) [18:03:20.471] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.471] } [18:03:20.471] else { [18:03:20.471] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.471] } [18:03:20.471] { [18:03:20.471] if (base::length(...future.futureOptionsAdded) > [18:03:20.471] 0L) { [18:03:20.471] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.471] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.471] base::options(opts) [18:03:20.471] } [18:03:20.471] { [18:03:20.471] { [18:03:20.471] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.471] NULL [18:03:20.471] } [18:03:20.471] options(future.plan = NULL) [18:03:20.471] if (is.na(NA_character_)) [18:03:20.471] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.471] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.471] future::plan(list(function (..., workers = availableCores(), [18:03:20.471] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.471] envir = parent.frame()) [18:03:20.471] { [18:03:20.471] if (is.function(workers)) [18:03:20.471] workers <- workers() [18:03:20.471] workers <- structure(as.integer(workers), [18:03:20.471] class = class(workers)) [18:03:20.471] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.471] workers >= 1) [18:03:20.471] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.471] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.471] } [18:03:20.471] future <- MultisessionFuture(..., workers = workers, [18:03:20.471] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.471] envir = envir) [18:03:20.471] if (!future$lazy) [18:03:20.471] future <- run(future) [18:03:20.471] invisible(future) [18:03:20.471] }), .cleanup = FALSE, .init = FALSE) [18:03:20.471] } [18:03:20.471] } [18:03:20.471] } [18:03:20.471] }) [18:03:20.471] if (TRUE) { [18:03:20.471] base::sink(type = "output", split = FALSE) [18:03:20.471] if (TRUE) { [18:03:20.471] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.471] } [18:03:20.471] else { [18:03:20.471] ...future.result["stdout"] <- base::list(NULL) [18:03:20.471] } [18:03:20.471] base::close(...future.stdout) [18:03:20.471] ...future.stdout <- NULL [18:03:20.471] } [18:03:20.471] ...future.result$conditions <- ...future.conditions [18:03:20.471] ...future.result$finished <- base::Sys.time() [18:03:20.471] ...future.result [18:03:20.471] } [18:03:20.476] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.486] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.486] - Validating connection of MultisessionFuture [18:03:20.487] - received message: FutureResult [18:03:20.487] - Received FutureResult [18:03:20.487] - Erased future from FutureRegistry [18:03:20.487] result() for ClusterFuture ... [18:03:20.487] - result already collected: FutureResult [18:03:20.488] result() for ClusterFuture ... done [18:03:20.488] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.488] result() for ClusterFuture ... [18:03:20.488] - result already collected: FutureResult [18:03:20.488] result() for ClusterFuture ... done [18:03:20.488] result() for ClusterFuture ... [18:03:20.489] - result already collected: FutureResult [18:03:20.489] result() for ClusterFuture ... done [18:03:20.489] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.490] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.490] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.490] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.491] MultisessionFuture started [18:03:20.491] - Launch lazy future ... done [18:03:20.491] run() for 'MultisessionFuture' ... done [18:03:20.492] result() for ClusterFuture ... [18:03:20.492] - result already collected: FutureResult [18:03:20.492] result() for ClusterFuture ... done [18:03:20.492] result() for ClusterFuture ... [18:03:20.492] - result already collected: FutureResult [18:03:20.492] result() for ClusterFuture ... done [18:03:20.493] result() for ClusterFuture ... [18:03:20.493] - result already collected: FutureResult [18:03:20.493] result() for ClusterFuture ... done [18:03:20.493] result() for ClusterFuture ... [18:03:20.493] - result already collected: FutureResult [18:03:20.494] result() for ClusterFuture ... done [18:03:20.494] result() for ClusterFuture ... [18:03:20.494] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.494] - Validating connection of MultisessionFuture [18:03:20.494] - received message: FutureResult [18:03:20.495] - Received FutureResult [18:03:20.495] - Erased future from FutureRegistry [18:03:20.495] result() for ClusterFuture ... [18:03:20.495] - result already collected: FutureResult [18:03:20.495] result() for ClusterFuture ... done [18:03:20.495] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.496] result() for ClusterFuture ... done [18:03:20.496] result() for ClusterFuture ... [18:03:20.496] - result already collected: FutureResult [18:03:20.496] result() for ClusterFuture ... done [18:03:20.496] result() for ClusterFuture ... [18:03:20.496] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.497] - Validating connection of MultisessionFuture [18:03:20.507] - received message: FutureResult [18:03:20.507] - Received FutureResult [18:03:20.508] - Erased future from FutureRegistry [18:03:20.508] result() for ClusterFuture ... [18:03:20.508] - result already collected: FutureResult [18:03:20.508] result() for ClusterFuture ... done [18:03:20.508] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.508] result() for ClusterFuture ... done [18:03:20.509] result() for ClusterFuture ... [18:03:20.509] - result already collected: FutureResult [18:03:20.509] result() for ClusterFuture ... done [[1]] [1] 2 [[2]] [1] 3 [[3]] [1] 3 [[4]] [1] 2 [18:03:20.510] getGlobalsAndPackages() ... [18:03:20.510] Searching for globals... [18:03:20.511] - globals found: [3] '{', 'sample', 'x' [18:03:20.511] Searching for globals ... DONE [18:03:20.511] Resolving globals: FALSE [18:03:20.512] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.512] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.512] - globals: [1] 'x' [18:03:20.513] [18:03:20.513] getGlobalsAndPackages() ... DONE [18:03:20.513] run() for 'Future' ... [18:03:20.513] - state: 'created' [18:03:20.513] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.527] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.527] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.527] - Field: 'node' [18:03:20.528] - Field: 'label' [18:03:20.528] - Field: 'local' [18:03:20.528] - Field: 'owner' [18:03:20.528] - Field: 'envir' [18:03:20.528] - Field: 'workers' [18:03:20.528] - Field: 'packages' [18:03:20.529] - Field: 'gc' [18:03:20.529] - Field: 'conditions' [18:03:20.529] - Field: 'persistent' [18:03:20.529] - Field: 'expr' [18:03:20.529] - Field: 'uuid' [18:03:20.530] - Field: 'seed' [18:03:20.530] - Field: 'version' [18:03:20.530] - Field: 'result' [18:03:20.530] - Field: 'asynchronous' [18:03:20.530] - Field: 'calls' [18:03:20.530] - Field: 'globals' [18:03:20.531] - Field: 'stdout' [18:03:20.531] - Field: 'earlySignal' [18:03:20.531] - Field: 'lazy' [18:03:20.531] - Field: 'state' [18:03:20.531] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.531] - Launch lazy future ... [18:03:20.532] Packages needed by the future expression (n = 0): [18:03:20.532] Packages needed by future strategies (n = 0): [18:03:20.533] { [18:03:20.533] { [18:03:20.533] { [18:03:20.533] ...future.startTime <- base::Sys.time() [18:03:20.533] { [18:03:20.533] { [18:03:20.533] { [18:03:20.533] { [18:03:20.533] base::local({ [18:03:20.533] has_future <- base::requireNamespace("future", [18:03:20.533] quietly = TRUE) [18:03:20.533] if (has_future) { [18:03:20.533] ns <- base::getNamespace("future") [18:03:20.533] version <- ns[[".package"]][["version"]] [18:03:20.533] if (is.null(version)) [18:03:20.533] version <- utils::packageVersion("future") [18:03:20.533] } [18:03:20.533] else { [18:03:20.533] version <- NULL [18:03:20.533] } [18:03:20.533] if (!has_future || version < "1.8.0") { [18:03:20.533] info <- base::c(r_version = base::gsub("R version ", [18:03:20.533] "", base::R.version$version.string), [18:03:20.533] platform = base::sprintf("%s (%s-bit)", [18:03:20.533] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.533] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.533] "release", "version")], collapse = " "), [18:03:20.533] hostname = base::Sys.info()[["nodename"]]) [18:03:20.533] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.533] info) [18:03:20.533] info <- base::paste(info, collapse = "; ") [18:03:20.533] if (!has_future) { [18:03:20.533] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.533] info) [18:03:20.533] } [18:03:20.533] else { [18:03:20.533] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.533] info, version) [18:03:20.533] } [18:03:20.533] base::stop(msg) [18:03:20.533] } [18:03:20.533] }) [18:03:20.533] } [18:03:20.533] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.533] base::options(mc.cores = 1L) [18:03:20.533] } [18:03:20.533] options(future.plan = NULL) [18:03:20.533] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.533] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.533] } [18:03:20.533] ...future.workdir <- getwd() [18:03:20.533] } [18:03:20.533] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.533] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.533] } [18:03:20.533] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.533] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.533] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.533] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.533] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.533] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.533] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.533] base::names(...future.oldOptions)) [18:03:20.533] } [18:03:20.533] if (FALSE) { [18:03:20.533] } [18:03:20.533] else { [18:03:20.533] if (TRUE) { [18:03:20.533] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.533] open = "w") [18:03:20.533] } [18:03:20.533] else { [18:03:20.533] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.533] windows = "NUL", "/dev/null"), open = "w") [18:03:20.533] } [18:03:20.533] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.533] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.533] base::sink(type = "output", split = FALSE) [18:03:20.533] base::close(...future.stdout) [18:03:20.533] }, add = TRUE) [18:03:20.533] } [18:03:20.533] ...future.frame <- base::sys.nframe() [18:03:20.533] ...future.conditions <- base::list() [18:03:20.533] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.533] if (FALSE) { [18:03:20.533] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.533] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.533] } [18:03:20.533] ...future.result <- base::tryCatch({ [18:03:20.533] base::withCallingHandlers({ [18:03:20.533] ...future.value <- base::withVisible(base::local({ [18:03:20.533] ...future.makeSendCondition <- local({ [18:03:20.533] sendCondition <- NULL [18:03:20.533] function(frame = 1L) { [18:03:20.533] if (is.function(sendCondition)) [18:03:20.533] return(sendCondition) [18:03:20.533] ns <- getNamespace("parallel") [18:03:20.533] if (exists("sendData", mode = "function", [18:03:20.533] envir = ns)) { [18:03:20.533] parallel_sendData <- get("sendData", mode = "function", [18:03:20.533] envir = ns) [18:03:20.533] envir <- sys.frame(frame) [18:03:20.533] master <- NULL [18:03:20.533] while (!identical(envir, .GlobalEnv) && [18:03:20.533] !identical(envir, emptyenv())) { [18:03:20.533] if (exists("master", mode = "list", envir = envir, [18:03:20.533] inherits = FALSE)) { [18:03:20.533] master <- get("master", mode = "list", [18:03:20.533] envir = envir, inherits = FALSE) [18:03:20.533] if (inherits(master, c("SOCKnode", [18:03:20.533] "SOCK0node"))) { [18:03:20.533] sendCondition <<- function(cond) { [18:03:20.533] data <- list(type = "VALUE", value = cond, [18:03:20.533] success = TRUE) [18:03:20.533] parallel_sendData(master, data) [18:03:20.533] } [18:03:20.533] return(sendCondition) [18:03:20.533] } [18:03:20.533] } [18:03:20.533] frame <- frame + 1L [18:03:20.533] envir <- sys.frame(frame) [18:03:20.533] } [18:03:20.533] } [18:03:20.533] sendCondition <<- function(cond) NULL [18:03:20.533] } [18:03:20.533] }) [18:03:20.533] withCallingHandlers({ [18:03:20.533] { [18:03:20.533] sample(x, size = 1L) [18:03:20.533] } [18:03:20.533] }, immediateCondition = function(cond) { [18:03:20.533] sendCondition <- ...future.makeSendCondition() [18:03:20.533] sendCondition(cond) [18:03:20.533] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.533] { [18:03:20.533] inherits <- base::inherits [18:03:20.533] invokeRestart <- base::invokeRestart [18:03:20.533] is.null <- base::is.null [18:03:20.533] muffled <- FALSE [18:03:20.533] if (inherits(cond, "message")) { [18:03:20.533] muffled <- grepl(pattern, "muffleMessage") [18:03:20.533] if (muffled) [18:03:20.533] invokeRestart("muffleMessage") [18:03:20.533] } [18:03:20.533] else if (inherits(cond, "warning")) { [18:03:20.533] muffled <- grepl(pattern, "muffleWarning") [18:03:20.533] if (muffled) [18:03:20.533] invokeRestart("muffleWarning") [18:03:20.533] } [18:03:20.533] else if (inherits(cond, "condition")) { [18:03:20.533] if (!is.null(pattern)) { [18:03:20.533] computeRestarts <- base::computeRestarts [18:03:20.533] grepl <- base::grepl [18:03:20.533] restarts <- computeRestarts(cond) [18:03:20.533] for (restart in restarts) { [18:03:20.533] name <- restart$name [18:03:20.533] if (is.null(name)) [18:03:20.533] next [18:03:20.533] if (!grepl(pattern, name)) [18:03:20.533] next [18:03:20.533] invokeRestart(restart) [18:03:20.533] muffled <- TRUE [18:03:20.533] break [18:03:20.533] } [18:03:20.533] } [18:03:20.533] } [18:03:20.533] invisible(muffled) [18:03:20.533] } [18:03:20.533] muffleCondition(cond) [18:03:20.533] }) [18:03:20.533] })) [18:03:20.533] future::FutureResult(value = ...future.value$value, [18:03:20.533] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.533] ...future.rng), globalenv = if (FALSE) [18:03:20.533] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.533] ...future.globalenv.names)) [18:03:20.533] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.533] }, condition = base::local({ [18:03:20.533] c <- base::c [18:03:20.533] inherits <- base::inherits [18:03:20.533] invokeRestart <- base::invokeRestart [18:03:20.533] length <- base::length [18:03:20.533] list <- base::list [18:03:20.533] seq.int <- base::seq.int [18:03:20.533] signalCondition <- base::signalCondition [18:03:20.533] sys.calls <- base::sys.calls [18:03:20.533] `[[` <- base::`[[` [18:03:20.533] `+` <- base::`+` [18:03:20.533] `<<-` <- base::`<<-` [18:03:20.533] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.533] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.533] 3L)] [18:03:20.533] } [18:03:20.533] function(cond) { [18:03:20.533] is_error <- inherits(cond, "error") [18:03:20.533] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.533] NULL) [18:03:20.533] if (is_error) { [18:03:20.533] sessionInformation <- function() { [18:03:20.533] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.533] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.533] search = base::search(), system = base::Sys.info()) [18:03:20.533] } [18:03:20.533] ...future.conditions[[length(...future.conditions) + [18:03:20.533] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.533] cond$call), session = sessionInformation(), [18:03:20.533] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.533] signalCondition(cond) [18:03:20.533] } [18:03:20.533] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.533] "immediateCondition"))) { [18:03:20.533] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.533] ...future.conditions[[length(...future.conditions) + [18:03:20.533] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.533] if (TRUE && !signal) { [18:03:20.533] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.533] { [18:03:20.533] inherits <- base::inherits [18:03:20.533] invokeRestart <- base::invokeRestart [18:03:20.533] is.null <- base::is.null [18:03:20.533] muffled <- FALSE [18:03:20.533] if (inherits(cond, "message")) { [18:03:20.533] muffled <- grepl(pattern, "muffleMessage") [18:03:20.533] if (muffled) [18:03:20.533] invokeRestart("muffleMessage") [18:03:20.533] } [18:03:20.533] else if (inherits(cond, "warning")) { [18:03:20.533] muffled <- grepl(pattern, "muffleWarning") [18:03:20.533] if (muffled) [18:03:20.533] invokeRestart("muffleWarning") [18:03:20.533] } [18:03:20.533] else if (inherits(cond, "condition")) { [18:03:20.533] if (!is.null(pattern)) { [18:03:20.533] computeRestarts <- base::computeRestarts [18:03:20.533] grepl <- base::grepl [18:03:20.533] restarts <- computeRestarts(cond) [18:03:20.533] for (restart in restarts) { [18:03:20.533] name <- restart$name [18:03:20.533] if (is.null(name)) [18:03:20.533] next [18:03:20.533] if (!grepl(pattern, name)) [18:03:20.533] next [18:03:20.533] invokeRestart(restart) [18:03:20.533] muffled <- TRUE [18:03:20.533] break [18:03:20.533] } [18:03:20.533] } [18:03:20.533] } [18:03:20.533] invisible(muffled) [18:03:20.533] } [18:03:20.533] muffleCondition(cond, pattern = "^muffle") [18:03:20.533] } [18:03:20.533] } [18:03:20.533] else { [18:03:20.533] if (TRUE) { [18:03:20.533] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.533] { [18:03:20.533] inherits <- base::inherits [18:03:20.533] invokeRestart <- base::invokeRestart [18:03:20.533] is.null <- base::is.null [18:03:20.533] muffled <- FALSE [18:03:20.533] if (inherits(cond, "message")) { [18:03:20.533] muffled <- grepl(pattern, "muffleMessage") [18:03:20.533] if (muffled) [18:03:20.533] invokeRestart("muffleMessage") [18:03:20.533] } [18:03:20.533] else if (inherits(cond, "warning")) { [18:03:20.533] muffled <- grepl(pattern, "muffleWarning") [18:03:20.533] if (muffled) [18:03:20.533] invokeRestart("muffleWarning") [18:03:20.533] } [18:03:20.533] else if (inherits(cond, "condition")) { [18:03:20.533] if (!is.null(pattern)) { [18:03:20.533] computeRestarts <- base::computeRestarts [18:03:20.533] grepl <- base::grepl [18:03:20.533] restarts <- computeRestarts(cond) [18:03:20.533] for (restart in restarts) { [18:03:20.533] name <- restart$name [18:03:20.533] if (is.null(name)) [18:03:20.533] next [18:03:20.533] if (!grepl(pattern, name)) [18:03:20.533] next [18:03:20.533] invokeRestart(restart) [18:03:20.533] muffled <- TRUE [18:03:20.533] break [18:03:20.533] } [18:03:20.533] } [18:03:20.533] } [18:03:20.533] invisible(muffled) [18:03:20.533] } [18:03:20.533] muffleCondition(cond, pattern = "^muffle") [18:03:20.533] } [18:03:20.533] } [18:03:20.533] } [18:03:20.533] })) [18:03:20.533] }, error = function(ex) { [18:03:20.533] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.533] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.533] ...future.rng), started = ...future.startTime, [18:03:20.533] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.533] version = "1.8"), class = "FutureResult") [18:03:20.533] }, finally = { [18:03:20.533] if (!identical(...future.workdir, getwd())) [18:03:20.533] setwd(...future.workdir) [18:03:20.533] { [18:03:20.533] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.533] ...future.oldOptions$nwarnings <- NULL [18:03:20.533] } [18:03:20.533] base::options(...future.oldOptions) [18:03:20.533] if (.Platform$OS.type == "windows") { [18:03:20.533] old_names <- names(...future.oldEnvVars) [18:03:20.533] envs <- base::Sys.getenv() [18:03:20.533] names <- names(envs) [18:03:20.533] common <- intersect(names, old_names) [18:03:20.533] added <- setdiff(names, old_names) [18:03:20.533] removed <- setdiff(old_names, names) [18:03:20.533] changed <- common[...future.oldEnvVars[common] != [18:03:20.533] envs[common]] [18:03:20.533] NAMES <- toupper(changed) [18:03:20.533] args <- list() [18:03:20.533] for (kk in seq_along(NAMES)) { [18:03:20.533] name <- changed[[kk]] [18:03:20.533] NAME <- NAMES[[kk]] [18:03:20.533] if (name != NAME && is.element(NAME, old_names)) [18:03:20.533] next [18:03:20.533] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.533] } [18:03:20.533] NAMES <- toupper(added) [18:03:20.533] for (kk in seq_along(NAMES)) { [18:03:20.533] name <- added[[kk]] [18:03:20.533] NAME <- NAMES[[kk]] [18:03:20.533] if (name != NAME && is.element(NAME, old_names)) [18:03:20.533] next [18:03:20.533] args[[name]] <- "" [18:03:20.533] } [18:03:20.533] NAMES <- toupper(removed) [18:03:20.533] for (kk in seq_along(NAMES)) { [18:03:20.533] name <- removed[[kk]] [18:03:20.533] NAME <- NAMES[[kk]] [18:03:20.533] if (name != NAME && is.element(NAME, old_names)) [18:03:20.533] next [18:03:20.533] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.533] } [18:03:20.533] if (length(args) > 0) [18:03:20.533] base::do.call(base::Sys.setenv, args = args) [18:03:20.533] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.533] } [18:03:20.533] else { [18:03:20.533] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.533] } [18:03:20.533] { [18:03:20.533] if (base::length(...future.futureOptionsAdded) > [18:03:20.533] 0L) { [18:03:20.533] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.533] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.533] base::options(opts) [18:03:20.533] } [18:03:20.533] { [18:03:20.533] { [18:03:20.533] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.533] NULL [18:03:20.533] } [18:03:20.533] options(future.plan = NULL) [18:03:20.533] if (is.na(NA_character_)) [18:03:20.533] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.533] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.533] future::plan(list(function (..., workers = availableCores(), [18:03:20.533] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.533] envir = parent.frame()) [18:03:20.533] { [18:03:20.533] if (is.function(workers)) [18:03:20.533] workers <- workers() [18:03:20.533] workers <- structure(as.integer(workers), [18:03:20.533] class = class(workers)) [18:03:20.533] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.533] workers >= 1) [18:03:20.533] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.533] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.533] } [18:03:20.533] future <- MultisessionFuture(..., workers = workers, [18:03:20.533] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.533] envir = envir) [18:03:20.533] if (!future$lazy) [18:03:20.533] future <- run(future) [18:03:20.533] invisible(future) [18:03:20.533] }), .cleanup = FALSE, .init = FALSE) [18:03:20.533] } [18:03:20.533] } [18:03:20.533] } [18:03:20.533] }) [18:03:20.533] if (TRUE) { [18:03:20.533] base::sink(type = "output", split = FALSE) [18:03:20.533] if (TRUE) { [18:03:20.533] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.533] } [18:03:20.533] else { [18:03:20.533] ...future.result["stdout"] <- base::list(NULL) [18:03:20.533] } [18:03:20.533] base::close(...future.stdout) [18:03:20.533] ...future.stdout <- NULL [18:03:20.533] } [18:03:20.533] ...future.result$conditions <- ...future.conditions [18:03:20.533] ...future.result$finished <- base::Sys.time() [18:03:20.533] ...future.result [18:03:20.533] } [18:03:20.538] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.538] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.538] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.539] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.539] MultisessionFuture started [18:03:20.540] - Launch lazy future ... done [18:03:20.540] run() for 'MultisessionFuture' ... done [18:03:20.540] getGlobalsAndPackages() ... [18:03:20.540] Searching for globals... [18:03:20.542] - globals found: [3] '{', 'sample', 'x' [18:03:20.542] Searching for globals ... DONE [18:03:20.542] Resolving globals: FALSE [18:03:20.542] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.543] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.543] - globals: [1] 'x' [18:03:20.543] [18:03:20.543] getGlobalsAndPackages() ... DONE [18:03:20.544] run() for 'Future' ... [18:03:20.544] - state: 'created' [18:03:20.544] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.558] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.558] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.558] - Field: 'node' [18:03:20.558] - Field: 'label' [18:03:20.559] - Field: 'local' [18:03:20.559] - Field: 'owner' [18:03:20.559] - Field: 'envir' [18:03:20.559] - Field: 'workers' [18:03:20.559] - Field: 'packages' [18:03:20.559] - Field: 'gc' [18:03:20.560] - Field: 'conditions' [18:03:20.560] - Field: 'persistent' [18:03:20.560] - Field: 'expr' [18:03:20.560] - Field: 'uuid' [18:03:20.560] - Field: 'seed' [18:03:20.561] - Field: 'version' [18:03:20.561] - Field: 'result' [18:03:20.561] - Field: 'asynchronous' [18:03:20.561] - Field: 'calls' [18:03:20.561] - Field: 'globals' [18:03:20.561] - Field: 'stdout' [18:03:20.562] - Field: 'earlySignal' [18:03:20.562] - Field: 'lazy' [18:03:20.562] - Field: 'state' [18:03:20.562] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.562] - Launch lazy future ... [18:03:20.563] Packages needed by the future expression (n = 0): [18:03:20.563] Packages needed by future strategies (n = 0): [18:03:20.563] { [18:03:20.563] { [18:03:20.563] { [18:03:20.563] ...future.startTime <- base::Sys.time() [18:03:20.563] { [18:03:20.563] { [18:03:20.563] { [18:03:20.563] { [18:03:20.563] base::local({ [18:03:20.563] has_future <- base::requireNamespace("future", [18:03:20.563] quietly = TRUE) [18:03:20.563] if (has_future) { [18:03:20.563] ns <- base::getNamespace("future") [18:03:20.563] version <- ns[[".package"]][["version"]] [18:03:20.563] if (is.null(version)) [18:03:20.563] version <- utils::packageVersion("future") [18:03:20.563] } [18:03:20.563] else { [18:03:20.563] version <- NULL [18:03:20.563] } [18:03:20.563] if (!has_future || version < "1.8.0") { [18:03:20.563] info <- base::c(r_version = base::gsub("R version ", [18:03:20.563] "", base::R.version$version.string), [18:03:20.563] platform = base::sprintf("%s (%s-bit)", [18:03:20.563] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.563] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.563] "release", "version")], collapse = " "), [18:03:20.563] hostname = base::Sys.info()[["nodename"]]) [18:03:20.563] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.563] info) [18:03:20.563] info <- base::paste(info, collapse = "; ") [18:03:20.563] if (!has_future) { [18:03:20.563] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.563] info) [18:03:20.563] } [18:03:20.563] else { [18:03:20.563] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.563] info, version) [18:03:20.563] } [18:03:20.563] base::stop(msg) [18:03:20.563] } [18:03:20.563] }) [18:03:20.563] } [18:03:20.563] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.563] base::options(mc.cores = 1L) [18:03:20.563] } [18:03:20.563] options(future.plan = NULL) [18:03:20.563] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.563] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.563] } [18:03:20.563] ...future.workdir <- getwd() [18:03:20.563] } [18:03:20.563] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.563] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.563] } [18:03:20.563] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.563] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.563] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.563] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.563] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.563] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.563] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.563] base::names(...future.oldOptions)) [18:03:20.563] } [18:03:20.563] if (FALSE) { [18:03:20.563] } [18:03:20.563] else { [18:03:20.563] if (TRUE) { [18:03:20.563] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.563] open = "w") [18:03:20.563] } [18:03:20.563] else { [18:03:20.563] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.563] windows = "NUL", "/dev/null"), open = "w") [18:03:20.563] } [18:03:20.563] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.563] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.563] base::sink(type = "output", split = FALSE) [18:03:20.563] base::close(...future.stdout) [18:03:20.563] }, add = TRUE) [18:03:20.563] } [18:03:20.563] ...future.frame <- base::sys.nframe() [18:03:20.563] ...future.conditions <- base::list() [18:03:20.563] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.563] if (FALSE) { [18:03:20.563] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.563] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.563] } [18:03:20.563] ...future.result <- base::tryCatch({ [18:03:20.563] base::withCallingHandlers({ [18:03:20.563] ...future.value <- base::withVisible(base::local({ [18:03:20.563] ...future.makeSendCondition <- local({ [18:03:20.563] sendCondition <- NULL [18:03:20.563] function(frame = 1L) { [18:03:20.563] if (is.function(sendCondition)) [18:03:20.563] return(sendCondition) [18:03:20.563] ns <- getNamespace("parallel") [18:03:20.563] if (exists("sendData", mode = "function", [18:03:20.563] envir = ns)) { [18:03:20.563] parallel_sendData <- get("sendData", mode = "function", [18:03:20.563] envir = ns) [18:03:20.563] envir <- sys.frame(frame) [18:03:20.563] master <- NULL [18:03:20.563] while (!identical(envir, .GlobalEnv) && [18:03:20.563] !identical(envir, emptyenv())) { [18:03:20.563] if (exists("master", mode = "list", envir = envir, [18:03:20.563] inherits = FALSE)) { [18:03:20.563] master <- get("master", mode = "list", [18:03:20.563] envir = envir, inherits = FALSE) [18:03:20.563] if (inherits(master, c("SOCKnode", [18:03:20.563] "SOCK0node"))) { [18:03:20.563] sendCondition <<- function(cond) { [18:03:20.563] data <- list(type = "VALUE", value = cond, [18:03:20.563] success = TRUE) [18:03:20.563] parallel_sendData(master, data) [18:03:20.563] } [18:03:20.563] return(sendCondition) [18:03:20.563] } [18:03:20.563] } [18:03:20.563] frame <- frame + 1L [18:03:20.563] envir <- sys.frame(frame) [18:03:20.563] } [18:03:20.563] } [18:03:20.563] sendCondition <<- function(cond) NULL [18:03:20.563] } [18:03:20.563] }) [18:03:20.563] withCallingHandlers({ [18:03:20.563] { [18:03:20.563] sample(x, size = 1L) [18:03:20.563] } [18:03:20.563] }, immediateCondition = function(cond) { [18:03:20.563] sendCondition <- ...future.makeSendCondition() [18:03:20.563] sendCondition(cond) [18:03:20.563] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.563] { [18:03:20.563] inherits <- base::inherits [18:03:20.563] invokeRestart <- base::invokeRestart [18:03:20.563] is.null <- base::is.null [18:03:20.563] muffled <- FALSE [18:03:20.563] if (inherits(cond, "message")) { [18:03:20.563] muffled <- grepl(pattern, "muffleMessage") [18:03:20.563] if (muffled) [18:03:20.563] invokeRestart("muffleMessage") [18:03:20.563] } [18:03:20.563] else if (inherits(cond, "warning")) { [18:03:20.563] muffled <- grepl(pattern, "muffleWarning") [18:03:20.563] if (muffled) [18:03:20.563] invokeRestart("muffleWarning") [18:03:20.563] } [18:03:20.563] else if (inherits(cond, "condition")) { [18:03:20.563] if (!is.null(pattern)) { [18:03:20.563] computeRestarts <- base::computeRestarts [18:03:20.563] grepl <- base::grepl [18:03:20.563] restarts <- computeRestarts(cond) [18:03:20.563] for (restart in restarts) { [18:03:20.563] name <- restart$name [18:03:20.563] if (is.null(name)) [18:03:20.563] next [18:03:20.563] if (!grepl(pattern, name)) [18:03:20.563] next [18:03:20.563] invokeRestart(restart) [18:03:20.563] muffled <- TRUE [18:03:20.563] break [18:03:20.563] } [18:03:20.563] } [18:03:20.563] } [18:03:20.563] invisible(muffled) [18:03:20.563] } [18:03:20.563] muffleCondition(cond) [18:03:20.563] }) [18:03:20.563] })) [18:03:20.563] future::FutureResult(value = ...future.value$value, [18:03:20.563] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.563] ...future.rng), globalenv = if (FALSE) [18:03:20.563] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.563] ...future.globalenv.names)) [18:03:20.563] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.563] }, condition = base::local({ [18:03:20.563] c <- base::c [18:03:20.563] inherits <- base::inherits [18:03:20.563] invokeRestart <- base::invokeRestart [18:03:20.563] length <- base::length [18:03:20.563] list <- base::list [18:03:20.563] seq.int <- base::seq.int [18:03:20.563] signalCondition <- base::signalCondition [18:03:20.563] sys.calls <- base::sys.calls [18:03:20.563] `[[` <- base::`[[` [18:03:20.563] `+` <- base::`+` [18:03:20.563] `<<-` <- base::`<<-` [18:03:20.563] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.563] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.563] 3L)] [18:03:20.563] } [18:03:20.563] function(cond) { [18:03:20.563] is_error <- inherits(cond, "error") [18:03:20.563] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.563] NULL) [18:03:20.563] if (is_error) { [18:03:20.563] sessionInformation <- function() { [18:03:20.563] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.563] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.563] search = base::search(), system = base::Sys.info()) [18:03:20.563] } [18:03:20.563] ...future.conditions[[length(...future.conditions) + [18:03:20.563] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.563] cond$call), session = sessionInformation(), [18:03:20.563] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.563] signalCondition(cond) [18:03:20.563] } [18:03:20.563] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.563] "immediateCondition"))) { [18:03:20.563] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.563] ...future.conditions[[length(...future.conditions) + [18:03:20.563] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.563] if (TRUE && !signal) { [18:03:20.563] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.563] { [18:03:20.563] inherits <- base::inherits [18:03:20.563] invokeRestart <- base::invokeRestart [18:03:20.563] is.null <- base::is.null [18:03:20.563] muffled <- FALSE [18:03:20.563] if (inherits(cond, "message")) { [18:03:20.563] muffled <- grepl(pattern, "muffleMessage") [18:03:20.563] if (muffled) [18:03:20.563] invokeRestart("muffleMessage") [18:03:20.563] } [18:03:20.563] else if (inherits(cond, "warning")) { [18:03:20.563] muffled <- grepl(pattern, "muffleWarning") [18:03:20.563] if (muffled) [18:03:20.563] invokeRestart("muffleWarning") [18:03:20.563] } [18:03:20.563] else if (inherits(cond, "condition")) { [18:03:20.563] if (!is.null(pattern)) { [18:03:20.563] computeRestarts <- base::computeRestarts [18:03:20.563] grepl <- base::grepl [18:03:20.563] restarts <- computeRestarts(cond) [18:03:20.563] for (restart in restarts) { [18:03:20.563] name <- restart$name [18:03:20.563] if (is.null(name)) [18:03:20.563] next [18:03:20.563] if (!grepl(pattern, name)) [18:03:20.563] next [18:03:20.563] invokeRestart(restart) [18:03:20.563] muffled <- TRUE [18:03:20.563] break [18:03:20.563] } [18:03:20.563] } [18:03:20.563] } [18:03:20.563] invisible(muffled) [18:03:20.563] } [18:03:20.563] muffleCondition(cond, pattern = "^muffle") [18:03:20.563] } [18:03:20.563] } [18:03:20.563] else { [18:03:20.563] if (TRUE) { [18:03:20.563] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.563] { [18:03:20.563] inherits <- base::inherits [18:03:20.563] invokeRestart <- base::invokeRestart [18:03:20.563] is.null <- base::is.null [18:03:20.563] muffled <- FALSE [18:03:20.563] if (inherits(cond, "message")) { [18:03:20.563] muffled <- grepl(pattern, "muffleMessage") [18:03:20.563] if (muffled) [18:03:20.563] invokeRestart("muffleMessage") [18:03:20.563] } [18:03:20.563] else if (inherits(cond, "warning")) { [18:03:20.563] muffled <- grepl(pattern, "muffleWarning") [18:03:20.563] if (muffled) [18:03:20.563] invokeRestart("muffleWarning") [18:03:20.563] } [18:03:20.563] else if (inherits(cond, "condition")) { [18:03:20.563] if (!is.null(pattern)) { [18:03:20.563] computeRestarts <- base::computeRestarts [18:03:20.563] grepl <- base::grepl [18:03:20.563] restarts <- computeRestarts(cond) [18:03:20.563] for (restart in restarts) { [18:03:20.563] name <- restart$name [18:03:20.563] if (is.null(name)) [18:03:20.563] next [18:03:20.563] if (!grepl(pattern, name)) [18:03:20.563] next [18:03:20.563] invokeRestart(restart) [18:03:20.563] muffled <- TRUE [18:03:20.563] break [18:03:20.563] } [18:03:20.563] } [18:03:20.563] } [18:03:20.563] invisible(muffled) [18:03:20.563] } [18:03:20.563] muffleCondition(cond, pattern = "^muffle") [18:03:20.563] } [18:03:20.563] } [18:03:20.563] } [18:03:20.563] })) [18:03:20.563] }, error = function(ex) { [18:03:20.563] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.563] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.563] ...future.rng), started = ...future.startTime, [18:03:20.563] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.563] version = "1.8"), class = "FutureResult") [18:03:20.563] }, finally = { [18:03:20.563] if (!identical(...future.workdir, getwd())) [18:03:20.563] setwd(...future.workdir) [18:03:20.563] { [18:03:20.563] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.563] ...future.oldOptions$nwarnings <- NULL [18:03:20.563] } [18:03:20.563] base::options(...future.oldOptions) [18:03:20.563] if (.Platform$OS.type == "windows") { [18:03:20.563] old_names <- names(...future.oldEnvVars) [18:03:20.563] envs <- base::Sys.getenv() [18:03:20.563] names <- names(envs) [18:03:20.563] common <- intersect(names, old_names) [18:03:20.563] added <- setdiff(names, old_names) [18:03:20.563] removed <- setdiff(old_names, names) [18:03:20.563] changed <- common[...future.oldEnvVars[common] != [18:03:20.563] envs[common]] [18:03:20.563] NAMES <- toupper(changed) [18:03:20.563] args <- list() [18:03:20.563] for (kk in seq_along(NAMES)) { [18:03:20.563] name <- changed[[kk]] [18:03:20.563] NAME <- NAMES[[kk]] [18:03:20.563] if (name != NAME && is.element(NAME, old_names)) [18:03:20.563] next [18:03:20.563] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.563] } [18:03:20.563] NAMES <- toupper(added) [18:03:20.563] for (kk in seq_along(NAMES)) { [18:03:20.563] name <- added[[kk]] [18:03:20.563] NAME <- NAMES[[kk]] [18:03:20.563] if (name != NAME && is.element(NAME, old_names)) [18:03:20.563] next [18:03:20.563] args[[name]] <- "" [18:03:20.563] } [18:03:20.563] NAMES <- toupper(removed) [18:03:20.563] for (kk in seq_along(NAMES)) { [18:03:20.563] name <- removed[[kk]] [18:03:20.563] NAME <- NAMES[[kk]] [18:03:20.563] if (name != NAME && is.element(NAME, old_names)) [18:03:20.563] next [18:03:20.563] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.563] } [18:03:20.563] if (length(args) > 0) [18:03:20.563] base::do.call(base::Sys.setenv, args = args) [18:03:20.563] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.563] } [18:03:20.563] else { [18:03:20.563] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.563] } [18:03:20.563] { [18:03:20.563] if (base::length(...future.futureOptionsAdded) > [18:03:20.563] 0L) { [18:03:20.563] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.563] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.563] base::options(opts) [18:03:20.563] } [18:03:20.563] { [18:03:20.563] { [18:03:20.563] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.563] NULL [18:03:20.563] } [18:03:20.563] options(future.plan = NULL) [18:03:20.563] if (is.na(NA_character_)) [18:03:20.563] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.563] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.563] future::plan(list(function (..., workers = availableCores(), [18:03:20.563] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.563] envir = parent.frame()) [18:03:20.563] { [18:03:20.563] if (is.function(workers)) [18:03:20.563] workers <- workers() [18:03:20.563] workers <- structure(as.integer(workers), [18:03:20.563] class = class(workers)) [18:03:20.563] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.563] workers >= 1) [18:03:20.563] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.563] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.563] } [18:03:20.563] future <- MultisessionFuture(..., workers = workers, [18:03:20.563] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.563] envir = envir) [18:03:20.563] if (!future$lazy) [18:03:20.563] future <- run(future) [18:03:20.563] invisible(future) [18:03:20.563] }), .cleanup = FALSE, .init = FALSE) [18:03:20.563] } [18:03:20.563] } [18:03:20.563] } [18:03:20.563] }) [18:03:20.563] if (TRUE) { [18:03:20.563] base::sink(type = "output", split = FALSE) [18:03:20.563] if (TRUE) { [18:03:20.563] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.563] } [18:03:20.563] else { [18:03:20.563] ...future.result["stdout"] <- base::list(NULL) [18:03:20.563] } [18:03:20.563] base::close(...future.stdout) [18:03:20.563] ...future.stdout <- NULL [18:03:20.563] } [18:03:20.563] ...future.result$conditions <- ...future.conditions [18:03:20.563] ...future.result$finished <- base::Sys.time() [18:03:20.563] ...future.result [18:03:20.563] } [18:03:20.569] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.569] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.569] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.570] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.570] MultisessionFuture started [18:03:20.570] - Launch lazy future ... done [18:03:20.571] run() for 'MultisessionFuture' ... done [18:03:20.571] getGlobalsAndPackages() ... [18:03:20.571] Searching for globals... [18:03:20.573] - globals found: [3] '{', 'sample', 'x' [18:03:20.573] Searching for globals ... DONE [18:03:20.573] Resolving globals: FALSE [18:03:20.573] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.574] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.574] - globals: [1] 'x' [18:03:20.574] [18:03:20.574] getGlobalsAndPackages() ... DONE [18:03:20.575] run() for 'Future' ... [18:03:20.575] - state: 'created' [18:03:20.575] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.589] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.589] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.589] - Field: 'node' [18:03:20.589] - Field: 'label' [18:03:20.590] - Field: 'local' [18:03:20.590] - Field: 'owner' [18:03:20.590] - Field: 'envir' [18:03:20.590] - Field: 'workers' [18:03:20.590] - Field: 'packages' [18:03:20.590] - Field: 'gc' [18:03:20.591] - Field: 'conditions' [18:03:20.591] - Field: 'persistent' [18:03:20.591] - Field: 'expr' [18:03:20.591] - Field: 'uuid' [18:03:20.591] - Field: 'seed' [18:03:20.591] - Field: 'version' [18:03:20.592] - Field: 'result' [18:03:20.592] - Field: 'asynchronous' [18:03:20.592] - Field: 'calls' [18:03:20.592] - Field: 'globals' [18:03:20.592] - Field: 'stdout' [18:03:20.593] - Field: 'earlySignal' [18:03:20.593] - Field: 'lazy' [18:03:20.593] - Field: 'state' [18:03:20.593] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.593] - Launch lazy future ... [18:03:20.594] Packages needed by the future expression (n = 0): [18:03:20.594] Packages needed by future strategies (n = 0): [18:03:20.594] { [18:03:20.594] { [18:03:20.594] { [18:03:20.594] ...future.startTime <- base::Sys.time() [18:03:20.594] { [18:03:20.594] { [18:03:20.594] { [18:03:20.594] { [18:03:20.594] base::local({ [18:03:20.594] has_future <- base::requireNamespace("future", [18:03:20.594] quietly = TRUE) [18:03:20.594] if (has_future) { [18:03:20.594] ns <- base::getNamespace("future") [18:03:20.594] version <- ns[[".package"]][["version"]] [18:03:20.594] if (is.null(version)) [18:03:20.594] version <- utils::packageVersion("future") [18:03:20.594] } [18:03:20.594] else { [18:03:20.594] version <- NULL [18:03:20.594] } [18:03:20.594] if (!has_future || version < "1.8.0") { [18:03:20.594] info <- base::c(r_version = base::gsub("R version ", [18:03:20.594] "", base::R.version$version.string), [18:03:20.594] platform = base::sprintf("%s (%s-bit)", [18:03:20.594] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.594] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.594] "release", "version")], collapse = " "), [18:03:20.594] hostname = base::Sys.info()[["nodename"]]) [18:03:20.594] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.594] info) [18:03:20.594] info <- base::paste(info, collapse = "; ") [18:03:20.594] if (!has_future) { [18:03:20.594] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.594] info) [18:03:20.594] } [18:03:20.594] else { [18:03:20.594] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.594] info, version) [18:03:20.594] } [18:03:20.594] base::stop(msg) [18:03:20.594] } [18:03:20.594] }) [18:03:20.594] } [18:03:20.594] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.594] base::options(mc.cores = 1L) [18:03:20.594] } [18:03:20.594] options(future.plan = NULL) [18:03:20.594] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.594] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.594] } [18:03:20.594] ...future.workdir <- getwd() [18:03:20.594] } [18:03:20.594] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.594] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.594] } [18:03:20.594] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.594] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.594] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.594] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.594] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.594] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.594] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.594] base::names(...future.oldOptions)) [18:03:20.594] } [18:03:20.594] if (FALSE) { [18:03:20.594] } [18:03:20.594] else { [18:03:20.594] if (TRUE) { [18:03:20.594] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.594] open = "w") [18:03:20.594] } [18:03:20.594] else { [18:03:20.594] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.594] windows = "NUL", "/dev/null"), open = "w") [18:03:20.594] } [18:03:20.594] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.594] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.594] base::sink(type = "output", split = FALSE) [18:03:20.594] base::close(...future.stdout) [18:03:20.594] }, add = TRUE) [18:03:20.594] } [18:03:20.594] ...future.frame <- base::sys.nframe() [18:03:20.594] ...future.conditions <- base::list() [18:03:20.594] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.594] if (FALSE) { [18:03:20.594] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.594] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.594] } [18:03:20.594] ...future.result <- base::tryCatch({ [18:03:20.594] base::withCallingHandlers({ [18:03:20.594] ...future.value <- base::withVisible(base::local({ [18:03:20.594] ...future.makeSendCondition <- local({ [18:03:20.594] sendCondition <- NULL [18:03:20.594] function(frame = 1L) { [18:03:20.594] if (is.function(sendCondition)) [18:03:20.594] return(sendCondition) [18:03:20.594] ns <- getNamespace("parallel") [18:03:20.594] if (exists("sendData", mode = "function", [18:03:20.594] envir = ns)) { [18:03:20.594] parallel_sendData <- get("sendData", mode = "function", [18:03:20.594] envir = ns) [18:03:20.594] envir <- sys.frame(frame) [18:03:20.594] master <- NULL [18:03:20.594] while (!identical(envir, .GlobalEnv) && [18:03:20.594] !identical(envir, emptyenv())) { [18:03:20.594] if (exists("master", mode = "list", envir = envir, [18:03:20.594] inherits = FALSE)) { [18:03:20.594] master <- get("master", mode = "list", [18:03:20.594] envir = envir, inherits = FALSE) [18:03:20.594] if (inherits(master, c("SOCKnode", [18:03:20.594] "SOCK0node"))) { [18:03:20.594] sendCondition <<- function(cond) { [18:03:20.594] data <- list(type = "VALUE", value = cond, [18:03:20.594] success = TRUE) [18:03:20.594] parallel_sendData(master, data) [18:03:20.594] } [18:03:20.594] return(sendCondition) [18:03:20.594] } [18:03:20.594] } [18:03:20.594] frame <- frame + 1L [18:03:20.594] envir <- sys.frame(frame) [18:03:20.594] } [18:03:20.594] } [18:03:20.594] sendCondition <<- function(cond) NULL [18:03:20.594] } [18:03:20.594] }) [18:03:20.594] withCallingHandlers({ [18:03:20.594] { [18:03:20.594] sample(x, size = 1L) [18:03:20.594] } [18:03:20.594] }, immediateCondition = function(cond) { [18:03:20.594] sendCondition <- ...future.makeSendCondition() [18:03:20.594] sendCondition(cond) [18:03:20.594] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.594] { [18:03:20.594] inherits <- base::inherits [18:03:20.594] invokeRestart <- base::invokeRestart [18:03:20.594] is.null <- base::is.null [18:03:20.594] muffled <- FALSE [18:03:20.594] if (inherits(cond, "message")) { [18:03:20.594] muffled <- grepl(pattern, "muffleMessage") [18:03:20.594] if (muffled) [18:03:20.594] invokeRestart("muffleMessage") [18:03:20.594] } [18:03:20.594] else if (inherits(cond, "warning")) { [18:03:20.594] muffled <- grepl(pattern, "muffleWarning") [18:03:20.594] if (muffled) [18:03:20.594] invokeRestart("muffleWarning") [18:03:20.594] } [18:03:20.594] else if (inherits(cond, "condition")) { [18:03:20.594] if (!is.null(pattern)) { [18:03:20.594] computeRestarts <- base::computeRestarts [18:03:20.594] grepl <- base::grepl [18:03:20.594] restarts <- computeRestarts(cond) [18:03:20.594] for (restart in restarts) { [18:03:20.594] name <- restart$name [18:03:20.594] if (is.null(name)) [18:03:20.594] next [18:03:20.594] if (!grepl(pattern, name)) [18:03:20.594] next [18:03:20.594] invokeRestart(restart) [18:03:20.594] muffled <- TRUE [18:03:20.594] break [18:03:20.594] } [18:03:20.594] } [18:03:20.594] } [18:03:20.594] invisible(muffled) [18:03:20.594] } [18:03:20.594] muffleCondition(cond) [18:03:20.594] }) [18:03:20.594] })) [18:03:20.594] future::FutureResult(value = ...future.value$value, [18:03:20.594] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.594] ...future.rng), globalenv = if (FALSE) [18:03:20.594] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.594] ...future.globalenv.names)) [18:03:20.594] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.594] }, condition = base::local({ [18:03:20.594] c <- base::c [18:03:20.594] inherits <- base::inherits [18:03:20.594] invokeRestart <- base::invokeRestart [18:03:20.594] length <- base::length [18:03:20.594] list <- base::list [18:03:20.594] seq.int <- base::seq.int [18:03:20.594] signalCondition <- base::signalCondition [18:03:20.594] sys.calls <- base::sys.calls [18:03:20.594] `[[` <- base::`[[` [18:03:20.594] `+` <- base::`+` [18:03:20.594] `<<-` <- base::`<<-` [18:03:20.594] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.594] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.594] 3L)] [18:03:20.594] } [18:03:20.594] function(cond) { [18:03:20.594] is_error <- inherits(cond, "error") [18:03:20.594] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.594] NULL) [18:03:20.594] if (is_error) { [18:03:20.594] sessionInformation <- function() { [18:03:20.594] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.594] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.594] search = base::search(), system = base::Sys.info()) [18:03:20.594] } [18:03:20.594] ...future.conditions[[length(...future.conditions) + [18:03:20.594] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.594] cond$call), session = sessionInformation(), [18:03:20.594] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.594] signalCondition(cond) [18:03:20.594] } [18:03:20.594] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.594] "immediateCondition"))) { [18:03:20.594] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.594] ...future.conditions[[length(...future.conditions) + [18:03:20.594] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.594] if (TRUE && !signal) { [18:03:20.594] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.594] { [18:03:20.594] inherits <- base::inherits [18:03:20.594] invokeRestart <- base::invokeRestart [18:03:20.594] is.null <- base::is.null [18:03:20.594] muffled <- FALSE [18:03:20.594] if (inherits(cond, "message")) { [18:03:20.594] muffled <- grepl(pattern, "muffleMessage") [18:03:20.594] if (muffled) [18:03:20.594] invokeRestart("muffleMessage") [18:03:20.594] } [18:03:20.594] else if (inherits(cond, "warning")) { [18:03:20.594] muffled <- grepl(pattern, "muffleWarning") [18:03:20.594] if (muffled) [18:03:20.594] invokeRestart("muffleWarning") [18:03:20.594] } [18:03:20.594] else if (inherits(cond, "condition")) { [18:03:20.594] if (!is.null(pattern)) { [18:03:20.594] computeRestarts <- base::computeRestarts [18:03:20.594] grepl <- base::grepl [18:03:20.594] restarts <- computeRestarts(cond) [18:03:20.594] for (restart in restarts) { [18:03:20.594] name <- restart$name [18:03:20.594] if (is.null(name)) [18:03:20.594] next [18:03:20.594] if (!grepl(pattern, name)) [18:03:20.594] next [18:03:20.594] invokeRestart(restart) [18:03:20.594] muffled <- TRUE [18:03:20.594] break [18:03:20.594] } [18:03:20.594] } [18:03:20.594] } [18:03:20.594] invisible(muffled) [18:03:20.594] } [18:03:20.594] muffleCondition(cond, pattern = "^muffle") [18:03:20.594] } [18:03:20.594] } [18:03:20.594] else { [18:03:20.594] if (TRUE) { [18:03:20.594] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.594] { [18:03:20.594] inherits <- base::inherits [18:03:20.594] invokeRestart <- base::invokeRestart [18:03:20.594] is.null <- base::is.null [18:03:20.594] muffled <- FALSE [18:03:20.594] if (inherits(cond, "message")) { [18:03:20.594] muffled <- grepl(pattern, "muffleMessage") [18:03:20.594] if (muffled) [18:03:20.594] invokeRestart("muffleMessage") [18:03:20.594] } [18:03:20.594] else if (inherits(cond, "warning")) { [18:03:20.594] muffled <- grepl(pattern, "muffleWarning") [18:03:20.594] if (muffled) [18:03:20.594] invokeRestart("muffleWarning") [18:03:20.594] } [18:03:20.594] else if (inherits(cond, "condition")) { [18:03:20.594] if (!is.null(pattern)) { [18:03:20.594] computeRestarts <- base::computeRestarts [18:03:20.594] grepl <- base::grepl [18:03:20.594] restarts <- computeRestarts(cond) [18:03:20.594] for (restart in restarts) { [18:03:20.594] name <- restart$name [18:03:20.594] if (is.null(name)) [18:03:20.594] next [18:03:20.594] if (!grepl(pattern, name)) [18:03:20.594] next [18:03:20.594] invokeRestart(restart) [18:03:20.594] muffled <- TRUE [18:03:20.594] break [18:03:20.594] } [18:03:20.594] } [18:03:20.594] } [18:03:20.594] invisible(muffled) [18:03:20.594] } [18:03:20.594] muffleCondition(cond, pattern = "^muffle") [18:03:20.594] } [18:03:20.594] } [18:03:20.594] } [18:03:20.594] })) [18:03:20.594] }, error = function(ex) { [18:03:20.594] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.594] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.594] ...future.rng), started = ...future.startTime, [18:03:20.594] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.594] version = "1.8"), class = "FutureResult") [18:03:20.594] }, finally = { [18:03:20.594] if (!identical(...future.workdir, getwd())) [18:03:20.594] setwd(...future.workdir) [18:03:20.594] { [18:03:20.594] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.594] ...future.oldOptions$nwarnings <- NULL [18:03:20.594] } [18:03:20.594] base::options(...future.oldOptions) [18:03:20.594] if (.Platform$OS.type == "windows") { [18:03:20.594] old_names <- names(...future.oldEnvVars) [18:03:20.594] envs <- base::Sys.getenv() [18:03:20.594] names <- names(envs) [18:03:20.594] common <- intersect(names, old_names) [18:03:20.594] added <- setdiff(names, old_names) [18:03:20.594] removed <- setdiff(old_names, names) [18:03:20.594] changed <- common[...future.oldEnvVars[common] != [18:03:20.594] envs[common]] [18:03:20.594] NAMES <- toupper(changed) [18:03:20.594] args <- list() [18:03:20.594] for (kk in seq_along(NAMES)) { [18:03:20.594] name <- changed[[kk]] [18:03:20.594] NAME <- NAMES[[kk]] [18:03:20.594] if (name != NAME && is.element(NAME, old_names)) [18:03:20.594] next [18:03:20.594] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.594] } [18:03:20.594] NAMES <- toupper(added) [18:03:20.594] for (kk in seq_along(NAMES)) { [18:03:20.594] name <- added[[kk]] [18:03:20.594] NAME <- NAMES[[kk]] [18:03:20.594] if (name != NAME && is.element(NAME, old_names)) [18:03:20.594] next [18:03:20.594] args[[name]] <- "" [18:03:20.594] } [18:03:20.594] NAMES <- toupper(removed) [18:03:20.594] for (kk in seq_along(NAMES)) { [18:03:20.594] name <- removed[[kk]] [18:03:20.594] NAME <- NAMES[[kk]] [18:03:20.594] if (name != NAME && is.element(NAME, old_names)) [18:03:20.594] next [18:03:20.594] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.594] } [18:03:20.594] if (length(args) > 0) [18:03:20.594] base::do.call(base::Sys.setenv, args = args) [18:03:20.594] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.594] } [18:03:20.594] else { [18:03:20.594] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.594] } [18:03:20.594] { [18:03:20.594] if (base::length(...future.futureOptionsAdded) > [18:03:20.594] 0L) { [18:03:20.594] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.594] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.594] base::options(opts) [18:03:20.594] } [18:03:20.594] { [18:03:20.594] { [18:03:20.594] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.594] NULL [18:03:20.594] } [18:03:20.594] options(future.plan = NULL) [18:03:20.594] if (is.na(NA_character_)) [18:03:20.594] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.594] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.594] future::plan(list(function (..., workers = availableCores(), [18:03:20.594] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.594] envir = parent.frame()) [18:03:20.594] { [18:03:20.594] if (is.function(workers)) [18:03:20.594] workers <- workers() [18:03:20.594] workers <- structure(as.integer(workers), [18:03:20.594] class = class(workers)) [18:03:20.594] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.594] workers >= 1) [18:03:20.594] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.594] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.594] } [18:03:20.594] future <- MultisessionFuture(..., workers = workers, [18:03:20.594] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.594] envir = envir) [18:03:20.594] if (!future$lazy) [18:03:20.594] future <- run(future) [18:03:20.594] invisible(future) [18:03:20.594] }), .cleanup = FALSE, .init = FALSE) [18:03:20.594] } [18:03:20.594] } [18:03:20.594] } [18:03:20.594] }) [18:03:20.594] if (TRUE) { [18:03:20.594] base::sink(type = "output", split = FALSE) [18:03:20.594] if (TRUE) { [18:03:20.594] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.594] } [18:03:20.594] else { [18:03:20.594] ...future.result["stdout"] <- base::list(NULL) [18:03:20.594] } [18:03:20.594] base::close(...future.stdout) [18:03:20.594] ...future.stdout <- NULL [18:03:20.594] } [18:03:20.594] ...future.result$conditions <- ...future.conditions [18:03:20.594] ...future.result$finished <- base::Sys.time() [18:03:20.594] ...future.result [18:03:20.594] } [18:03:20.599] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.611] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.611] - Validating connection of MultisessionFuture [18:03:20.612] - received message: FutureResult [18:03:20.612] - Received FutureResult [18:03:20.612] - Erased future from FutureRegistry [18:03:20.612] result() for ClusterFuture ... [18:03:20.612] - result already collected: FutureResult [18:03:20.613] result() for ClusterFuture ... done [18:03:20.613] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.613] result() for ClusterFuture ... [18:03:20.613] - result already collected: FutureResult [18:03:20.613] result() for ClusterFuture ... done [18:03:20.613] result() for ClusterFuture ... [18:03:20.614] - result already collected: FutureResult [18:03:20.614] result() for ClusterFuture ... done [18:03:20.614] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.615] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.615] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.615] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.616] MultisessionFuture started [18:03:20.616] - Launch lazy future ... done [18:03:20.616] run() for 'MultisessionFuture' ... done [18:03:20.617] getGlobalsAndPackages() ... [18:03:20.617] Searching for globals... [18:03:20.618] - globals found: [3] '{', 'sample', 'x' [18:03:20.618] Searching for globals ... DONE [18:03:20.619] Resolving globals: FALSE [18:03:20.619] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.619] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.620] - globals: [1] 'x' [18:03:20.620] [18:03:20.620] getGlobalsAndPackages() ... DONE [18:03:20.620] run() for 'Future' ... [18:03:20.620] - state: 'created' [18:03:20.621] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.634] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.634] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.635] - Field: 'node' [18:03:20.635] - Field: 'label' [18:03:20.635] - Field: 'local' [18:03:20.635] - Field: 'owner' [18:03:20.635] - Field: 'envir' [18:03:20.636] - Field: 'workers' [18:03:20.636] - Field: 'packages' [18:03:20.636] - Field: 'gc' [18:03:20.636] - Field: 'conditions' [18:03:20.636] - Field: 'persistent' [18:03:20.636] - Field: 'expr' [18:03:20.637] - Field: 'uuid' [18:03:20.637] - Field: 'seed' [18:03:20.637] - Field: 'version' [18:03:20.637] - Field: 'result' [18:03:20.637] - Field: 'asynchronous' [18:03:20.638] - Field: 'calls' [18:03:20.638] - Field: 'globals' [18:03:20.638] - Field: 'stdout' [18:03:20.638] - Field: 'earlySignal' [18:03:20.638] - Field: 'lazy' [18:03:20.638] - Field: 'state' [18:03:20.639] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.639] - Launch lazy future ... [18:03:20.639] Packages needed by the future expression (n = 0): [18:03:20.639] Packages needed by future strategies (n = 0): [18:03:20.640] { [18:03:20.640] { [18:03:20.640] { [18:03:20.640] ...future.startTime <- base::Sys.time() [18:03:20.640] { [18:03:20.640] { [18:03:20.640] { [18:03:20.640] { [18:03:20.640] base::local({ [18:03:20.640] has_future <- base::requireNamespace("future", [18:03:20.640] quietly = TRUE) [18:03:20.640] if (has_future) { [18:03:20.640] ns <- base::getNamespace("future") [18:03:20.640] version <- ns[[".package"]][["version"]] [18:03:20.640] if (is.null(version)) [18:03:20.640] version <- utils::packageVersion("future") [18:03:20.640] } [18:03:20.640] else { [18:03:20.640] version <- NULL [18:03:20.640] } [18:03:20.640] if (!has_future || version < "1.8.0") { [18:03:20.640] info <- base::c(r_version = base::gsub("R version ", [18:03:20.640] "", base::R.version$version.string), [18:03:20.640] platform = base::sprintf("%s (%s-bit)", [18:03:20.640] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.640] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.640] "release", "version")], collapse = " "), [18:03:20.640] hostname = base::Sys.info()[["nodename"]]) [18:03:20.640] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.640] info) [18:03:20.640] info <- base::paste(info, collapse = "; ") [18:03:20.640] if (!has_future) { [18:03:20.640] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.640] info) [18:03:20.640] } [18:03:20.640] else { [18:03:20.640] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.640] info, version) [18:03:20.640] } [18:03:20.640] base::stop(msg) [18:03:20.640] } [18:03:20.640] }) [18:03:20.640] } [18:03:20.640] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.640] base::options(mc.cores = 1L) [18:03:20.640] } [18:03:20.640] options(future.plan = NULL) [18:03:20.640] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.640] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.640] } [18:03:20.640] ...future.workdir <- getwd() [18:03:20.640] } [18:03:20.640] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.640] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.640] } [18:03:20.640] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.640] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.640] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.640] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.640] future.rng.onMisuse = "ignore", future.rng.onMisuse.keepFuture = NULL, [18:03:20.640] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.640] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.640] base::names(...future.oldOptions)) [18:03:20.640] } [18:03:20.640] if (FALSE) { [18:03:20.640] } [18:03:20.640] else { [18:03:20.640] if (TRUE) { [18:03:20.640] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.640] open = "w") [18:03:20.640] } [18:03:20.640] else { [18:03:20.640] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.640] windows = "NUL", "/dev/null"), open = "w") [18:03:20.640] } [18:03:20.640] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.640] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.640] base::sink(type = "output", split = FALSE) [18:03:20.640] base::close(...future.stdout) [18:03:20.640] }, add = TRUE) [18:03:20.640] } [18:03:20.640] ...future.frame <- base::sys.nframe() [18:03:20.640] ...future.conditions <- base::list() [18:03:20.640] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.640] if (FALSE) { [18:03:20.640] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.640] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.640] } [18:03:20.640] ...future.result <- base::tryCatch({ [18:03:20.640] base::withCallingHandlers({ [18:03:20.640] ...future.value <- base::withVisible(base::local({ [18:03:20.640] ...future.makeSendCondition <- local({ [18:03:20.640] sendCondition <- NULL [18:03:20.640] function(frame = 1L) { [18:03:20.640] if (is.function(sendCondition)) [18:03:20.640] return(sendCondition) [18:03:20.640] ns <- getNamespace("parallel") [18:03:20.640] if (exists("sendData", mode = "function", [18:03:20.640] envir = ns)) { [18:03:20.640] parallel_sendData <- get("sendData", mode = "function", [18:03:20.640] envir = ns) [18:03:20.640] envir <- sys.frame(frame) [18:03:20.640] master <- NULL [18:03:20.640] while (!identical(envir, .GlobalEnv) && [18:03:20.640] !identical(envir, emptyenv())) { [18:03:20.640] if (exists("master", mode = "list", envir = envir, [18:03:20.640] inherits = FALSE)) { [18:03:20.640] master <- get("master", mode = "list", [18:03:20.640] envir = envir, inherits = FALSE) [18:03:20.640] if (inherits(master, c("SOCKnode", [18:03:20.640] "SOCK0node"))) { [18:03:20.640] sendCondition <<- function(cond) { [18:03:20.640] data <- list(type = "VALUE", value = cond, [18:03:20.640] success = TRUE) [18:03:20.640] parallel_sendData(master, data) [18:03:20.640] } [18:03:20.640] return(sendCondition) [18:03:20.640] } [18:03:20.640] } [18:03:20.640] frame <- frame + 1L [18:03:20.640] envir <- sys.frame(frame) [18:03:20.640] } [18:03:20.640] } [18:03:20.640] sendCondition <<- function(cond) NULL [18:03:20.640] } [18:03:20.640] }) [18:03:20.640] withCallingHandlers({ [18:03:20.640] { [18:03:20.640] sample(x, size = 1L) [18:03:20.640] } [18:03:20.640] }, immediateCondition = function(cond) { [18:03:20.640] sendCondition <- ...future.makeSendCondition() [18:03:20.640] sendCondition(cond) [18:03:20.640] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.640] { [18:03:20.640] inherits <- base::inherits [18:03:20.640] invokeRestart <- base::invokeRestart [18:03:20.640] is.null <- base::is.null [18:03:20.640] muffled <- FALSE [18:03:20.640] if (inherits(cond, "message")) { [18:03:20.640] muffled <- grepl(pattern, "muffleMessage") [18:03:20.640] if (muffled) [18:03:20.640] invokeRestart("muffleMessage") [18:03:20.640] } [18:03:20.640] else if (inherits(cond, "warning")) { [18:03:20.640] muffled <- grepl(pattern, "muffleWarning") [18:03:20.640] if (muffled) [18:03:20.640] invokeRestart("muffleWarning") [18:03:20.640] } [18:03:20.640] else if (inherits(cond, "condition")) { [18:03:20.640] if (!is.null(pattern)) { [18:03:20.640] computeRestarts <- base::computeRestarts [18:03:20.640] grepl <- base::grepl [18:03:20.640] restarts <- computeRestarts(cond) [18:03:20.640] for (restart in restarts) { [18:03:20.640] name <- restart$name [18:03:20.640] if (is.null(name)) [18:03:20.640] next [18:03:20.640] if (!grepl(pattern, name)) [18:03:20.640] next [18:03:20.640] invokeRestart(restart) [18:03:20.640] muffled <- TRUE [18:03:20.640] break [18:03:20.640] } [18:03:20.640] } [18:03:20.640] } [18:03:20.640] invisible(muffled) [18:03:20.640] } [18:03:20.640] muffleCondition(cond) [18:03:20.640] }) [18:03:20.640] })) [18:03:20.640] future::FutureResult(value = ...future.value$value, [18:03:20.640] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.640] ...future.rng), globalenv = if (FALSE) [18:03:20.640] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.640] ...future.globalenv.names)) [18:03:20.640] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.640] }, condition = base::local({ [18:03:20.640] c <- base::c [18:03:20.640] inherits <- base::inherits [18:03:20.640] invokeRestart <- base::invokeRestart [18:03:20.640] length <- base::length [18:03:20.640] list <- base::list [18:03:20.640] seq.int <- base::seq.int [18:03:20.640] signalCondition <- base::signalCondition [18:03:20.640] sys.calls <- base::sys.calls [18:03:20.640] `[[` <- base::`[[` [18:03:20.640] `+` <- base::`+` [18:03:20.640] `<<-` <- base::`<<-` [18:03:20.640] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.640] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.640] 3L)] [18:03:20.640] } [18:03:20.640] function(cond) { [18:03:20.640] is_error <- inherits(cond, "error") [18:03:20.640] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.640] NULL) [18:03:20.640] if (is_error) { [18:03:20.640] sessionInformation <- function() { [18:03:20.640] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.640] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.640] search = base::search(), system = base::Sys.info()) [18:03:20.640] } [18:03:20.640] ...future.conditions[[length(...future.conditions) + [18:03:20.640] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.640] cond$call), session = sessionInformation(), [18:03:20.640] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.640] signalCondition(cond) [18:03:20.640] } [18:03:20.640] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.640] "immediateCondition"))) { [18:03:20.640] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.640] ...future.conditions[[length(...future.conditions) + [18:03:20.640] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.640] if (TRUE && !signal) { [18:03:20.640] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.640] { [18:03:20.640] inherits <- base::inherits [18:03:20.640] invokeRestart <- base::invokeRestart [18:03:20.640] is.null <- base::is.null [18:03:20.640] muffled <- FALSE [18:03:20.640] if (inherits(cond, "message")) { [18:03:20.640] muffled <- grepl(pattern, "muffleMessage") [18:03:20.640] if (muffled) [18:03:20.640] invokeRestart("muffleMessage") [18:03:20.640] } [18:03:20.640] else if (inherits(cond, "warning")) { [18:03:20.640] muffled <- grepl(pattern, "muffleWarning") [18:03:20.640] if (muffled) [18:03:20.640] invokeRestart("muffleWarning") [18:03:20.640] } [18:03:20.640] else if (inherits(cond, "condition")) { [18:03:20.640] if (!is.null(pattern)) { [18:03:20.640] computeRestarts <- base::computeRestarts [18:03:20.640] grepl <- base::grepl [18:03:20.640] restarts <- computeRestarts(cond) [18:03:20.640] for (restart in restarts) { [18:03:20.640] name <- restart$name [18:03:20.640] if (is.null(name)) [18:03:20.640] next [18:03:20.640] if (!grepl(pattern, name)) [18:03:20.640] next [18:03:20.640] invokeRestart(restart) [18:03:20.640] muffled <- TRUE [18:03:20.640] break [18:03:20.640] } [18:03:20.640] } [18:03:20.640] } [18:03:20.640] invisible(muffled) [18:03:20.640] } [18:03:20.640] muffleCondition(cond, pattern = "^muffle") [18:03:20.640] } [18:03:20.640] } [18:03:20.640] else { [18:03:20.640] if (TRUE) { [18:03:20.640] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.640] { [18:03:20.640] inherits <- base::inherits [18:03:20.640] invokeRestart <- base::invokeRestart [18:03:20.640] is.null <- base::is.null [18:03:20.640] muffled <- FALSE [18:03:20.640] if (inherits(cond, "message")) { [18:03:20.640] muffled <- grepl(pattern, "muffleMessage") [18:03:20.640] if (muffled) [18:03:20.640] invokeRestart("muffleMessage") [18:03:20.640] } [18:03:20.640] else if (inherits(cond, "warning")) { [18:03:20.640] muffled <- grepl(pattern, "muffleWarning") [18:03:20.640] if (muffled) [18:03:20.640] invokeRestart("muffleWarning") [18:03:20.640] } [18:03:20.640] else if (inherits(cond, "condition")) { [18:03:20.640] if (!is.null(pattern)) { [18:03:20.640] computeRestarts <- base::computeRestarts [18:03:20.640] grepl <- base::grepl [18:03:20.640] restarts <- computeRestarts(cond) [18:03:20.640] for (restart in restarts) { [18:03:20.640] name <- restart$name [18:03:20.640] if (is.null(name)) [18:03:20.640] next [18:03:20.640] if (!grepl(pattern, name)) [18:03:20.640] next [18:03:20.640] invokeRestart(restart) [18:03:20.640] muffled <- TRUE [18:03:20.640] break [18:03:20.640] } [18:03:20.640] } [18:03:20.640] } [18:03:20.640] invisible(muffled) [18:03:20.640] } [18:03:20.640] muffleCondition(cond, pattern = "^muffle") [18:03:20.640] } [18:03:20.640] } [18:03:20.640] } [18:03:20.640] })) [18:03:20.640] }, error = function(ex) { [18:03:20.640] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.640] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.640] ...future.rng), started = ...future.startTime, [18:03:20.640] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.640] version = "1.8"), class = "FutureResult") [18:03:20.640] }, finally = { [18:03:20.640] if (!identical(...future.workdir, getwd())) [18:03:20.640] setwd(...future.workdir) [18:03:20.640] { [18:03:20.640] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.640] ...future.oldOptions$nwarnings <- NULL [18:03:20.640] } [18:03:20.640] base::options(...future.oldOptions) [18:03:20.640] if (.Platform$OS.type == "windows") { [18:03:20.640] old_names <- names(...future.oldEnvVars) [18:03:20.640] envs <- base::Sys.getenv() [18:03:20.640] names <- names(envs) [18:03:20.640] common <- intersect(names, old_names) [18:03:20.640] added <- setdiff(names, old_names) [18:03:20.640] removed <- setdiff(old_names, names) [18:03:20.640] changed <- common[...future.oldEnvVars[common] != [18:03:20.640] envs[common]] [18:03:20.640] NAMES <- toupper(changed) [18:03:20.640] args <- list() [18:03:20.640] for (kk in seq_along(NAMES)) { [18:03:20.640] name <- changed[[kk]] [18:03:20.640] NAME <- NAMES[[kk]] [18:03:20.640] if (name != NAME && is.element(NAME, old_names)) [18:03:20.640] next [18:03:20.640] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.640] } [18:03:20.640] NAMES <- toupper(added) [18:03:20.640] for (kk in seq_along(NAMES)) { [18:03:20.640] name <- added[[kk]] [18:03:20.640] NAME <- NAMES[[kk]] [18:03:20.640] if (name != NAME && is.element(NAME, old_names)) [18:03:20.640] next [18:03:20.640] args[[name]] <- "" [18:03:20.640] } [18:03:20.640] NAMES <- toupper(removed) [18:03:20.640] for (kk in seq_along(NAMES)) { [18:03:20.640] name <- removed[[kk]] [18:03:20.640] NAME <- NAMES[[kk]] [18:03:20.640] if (name != NAME && is.element(NAME, old_names)) [18:03:20.640] next [18:03:20.640] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.640] } [18:03:20.640] if (length(args) > 0) [18:03:20.640] base::do.call(base::Sys.setenv, args = args) [18:03:20.640] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.640] } [18:03:20.640] else { [18:03:20.640] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.640] } [18:03:20.640] { [18:03:20.640] if (base::length(...future.futureOptionsAdded) > [18:03:20.640] 0L) { [18:03:20.640] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.640] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.640] base::options(opts) [18:03:20.640] } [18:03:20.640] { [18:03:20.640] { [18:03:20.640] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.640] NULL [18:03:20.640] } [18:03:20.640] options(future.plan = NULL) [18:03:20.640] if (is.na(NA_character_)) [18:03:20.640] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.640] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.640] future::plan(list(function (..., workers = availableCores(), [18:03:20.640] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.640] envir = parent.frame()) [18:03:20.640] { [18:03:20.640] if (is.function(workers)) [18:03:20.640] workers <- workers() [18:03:20.640] workers <- structure(as.integer(workers), [18:03:20.640] class = class(workers)) [18:03:20.640] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.640] workers >= 1) [18:03:20.640] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.640] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.640] } [18:03:20.640] future <- MultisessionFuture(..., workers = workers, [18:03:20.640] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.640] envir = envir) [18:03:20.640] if (!future$lazy) [18:03:20.640] future <- run(future) [18:03:20.640] invisible(future) [18:03:20.640] }), .cleanup = FALSE, .init = FALSE) [18:03:20.640] } [18:03:20.640] } [18:03:20.640] } [18:03:20.640] }) [18:03:20.640] if (TRUE) { [18:03:20.640] base::sink(type = "output", split = FALSE) [18:03:20.640] if (TRUE) { [18:03:20.640] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.640] } [18:03:20.640] else { [18:03:20.640] ...future.result["stdout"] <- base::list(NULL) [18:03:20.640] } [18:03:20.640] base::close(...future.stdout) [18:03:20.640] ...future.stdout <- NULL [18:03:20.640] } [18:03:20.640] ...future.result$conditions <- ...future.conditions [18:03:20.640] ...future.result$finished <- base::Sys.time() [18:03:20.640] ...future.result [18:03:20.640] } [18:03:20.645] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.658] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.658] - Validating connection of MultisessionFuture [18:03:20.659] - received message: FutureResult [18:03:20.659] - Received FutureResult [18:03:20.659] - Erased future from FutureRegistry [18:03:20.659] result() for ClusterFuture ... [18:03:20.659] - result already collected: FutureResult [18:03:20.660] result() for ClusterFuture ... done [18:03:20.660] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.660] result() for ClusterFuture ... [18:03:20.660] - result already collected: FutureResult [18:03:20.660] result() for ClusterFuture ... done [18:03:20.660] result() for ClusterFuture ... [18:03:20.661] - result already collected: FutureResult [18:03:20.661] result() for ClusterFuture ... done [18:03:20.661] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.662] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.662] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.662] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.663] MultisessionFuture started [18:03:20.663] - Launch lazy future ... done [18:03:20.663] run() for 'MultisessionFuture' ... done [18:03:20.664] result() for ClusterFuture ... [18:03:20.664] - result already collected: FutureResult [18:03:20.664] result() for ClusterFuture ... done [18:03:20.664] result() for ClusterFuture ... [18:03:20.664] - result already collected: FutureResult [18:03:20.664] result() for ClusterFuture ... done [18:03:20.665] result() for ClusterFuture ... [18:03:20.665] - result already collected: FutureResult [18:03:20.665] result() for ClusterFuture ... done [18:03:20.665] result() for ClusterFuture ... [18:03:20.665] - result already collected: FutureResult [18:03:20.665] result() for ClusterFuture ... done [18:03:20.666] result() for ClusterFuture ... [18:03:20.666] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.666] - Validating connection of MultisessionFuture [18:03:20.666] - received message: FutureResult [18:03:20.666] - Received FutureResult [18:03:20.667] - Erased future from FutureRegistry [18:03:20.667] result() for ClusterFuture ... [18:03:20.667] - result already collected: FutureResult [18:03:20.667] result() for ClusterFuture ... done [18:03:20.667] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.667] result() for ClusterFuture ... done [18:03:20.668] result() for ClusterFuture ... [18:03:20.668] - result already collected: FutureResult [18:03:20.668] result() for ClusterFuture ... done [18:03:20.668] result() for ClusterFuture ... [18:03:20.668] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.669] - Validating connection of MultisessionFuture [18:03:20.680] - received message: FutureResult [18:03:20.680] - Received FutureResult [18:03:20.681] - Erased future from FutureRegistry [18:03:20.681] result() for ClusterFuture ... [18:03:20.681] - result already collected: FutureResult [18:03:20.681] result() for ClusterFuture ... done [18:03:20.681] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.681] result() for ClusterFuture ... done [18:03:20.682] result() for ClusterFuture ... [18:03:20.682] - result already collected: FutureResult [18:03:20.682] result() for ClusterFuture ... done [[1]] [1] 3 [[2]] [1] 3 [[3]] [1] 3 [[4]] [1] 1 [18:03:20.683] getGlobalsAndPackages() ... [18:03:20.683] Searching for globals... [18:03:20.684] - globals found: [3] '{', 'sample', 'x' [18:03:20.684] Searching for globals ... DONE [18:03:20.684] Resolving globals: FALSE [18:03:20.685] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.685] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.685] - globals: [1] 'x' [18:03:20.686] [18:03:20.686] getGlobalsAndPackages() ... DONE [18:03:20.686] run() for 'Future' ... [18:03:20.686] - state: 'created' [18:03:20.686] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.700] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.700] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.701] - Field: 'node' [18:03:20.701] - Field: 'label' [18:03:20.701] - Field: 'local' [18:03:20.701] - Field: 'owner' [18:03:20.701] - Field: 'envir' [18:03:20.701] - Field: 'workers' [18:03:20.702] - Field: 'packages' [18:03:20.702] - Field: 'gc' [18:03:20.702] - Field: 'conditions' [18:03:20.702] - Field: 'persistent' [18:03:20.702] - Field: 'expr' [18:03:20.703] - Field: 'uuid' [18:03:20.703] - Field: 'seed' [18:03:20.703] - Field: 'version' [18:03:20.703] - Field: 'result' [18:03:20.706] - Field: 'asynchronous' [18:03:20.706] - Field: 'calls' [18:03:20.706] - Field: 'globals' [18:03:20.706] - Field: 'stdout' [18:03:20.707] - Field: 'earlySignal' [18:03:20.707] - Field: 'lazy' [18:03:20.707] - Field: 'state' [18:03:20.707] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.707] - Launch lazy future ... [18:03:20.708] Packages needed by the future expression (n = 0): [18:03:20.708] Packages needed by future strategies (n = 0): [18:03:20.708] { [18:03:20.708] { [18:03:20.708] { [18:03:20.708] ...future.startTime <- base::Sys.time() [18:03:20.708] { [18:03:20.708] { [18:03:20.708] { [18:03:20.708] { [18:03:20.708] base::local({ [18:03:20.708] has_future <- base::requireNamespace("future", [18:03:20.708] quietly = TRUE) [18:03:20.708] if (has_future) { [18:03:20.708] ns <- base::getNamespace("future") [18:03:20.708] version <- ns[[".package"]][["version"]] [18:03:20.708] if (is.null(version)) [18:03:20.708] version <- utils::packageVersion("future") [18:03:20.708] } [18:03:20.708] else { [18:03:20.708] version <- NULL [18:03:20.708] } [18:03:20.708] if (!has_future || version < "1.8.0") { [18:03:20.708] info <- base::c(r_version = base::gsub("R version ", [18:03:20.708] "", base::R.version$version.string), [18:03:20.708] platform = base::sprintf("%s (%s-bit)", [18:03:20.708] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.708] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.708] "release", "version")], collapse = " "), [18:03:20.708] hostname = base::Sys.info()[["nodename"]]) [18:03:20.708] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.708] info) [18:03:20.708] info <- base::paste(info, collapse = "; ") [18:03:20.708] if (!has_future) { [18:03:20.708] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.708] info) [18:03:20.708] } [18:03:20.708] else { [18:03:20.708] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.708] info, version) [18:03:20.708] } [18:03:20.708] base::stop(msg) [18:03:20.708] } [18:03:20.708] }) [18:03:20.708] } [18:03:20.708] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.708] base::options(mc.cores = 1L) [18:03:20.708] } [18:03:20.708] options(future.plan = NULL) [18:03:20.708] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.708] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.708] } [18:03:20.708] ...future.workdir <- getwd() [18:03:20.708] } [18:03:20.708] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.708] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.708] } [18:03:20.708] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.708] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.708] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.708] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.708] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:20.708] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.708] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.708] base::names(...future.oldOptions)) [18:03:20.708] } [18:03:20.708] if (FALSE) { [18:03:20.708] } [18:03:20.708] else { [18:03:20.708] if (TRUE) { [18:03:20.708] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.708] open = "w") [18:03:20.708] } [18:03:20.708] else { [18:03:20.708] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.708] windows = "NUL", "/dev/null"), open = "w") [18:03:20.708] } [18:03:20.708] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.708] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.708] base::sink(type = "output", split = FALSE) [18:03:20.708] base::close(...future.stdout) [18:03:20.708] }, add = TRUE) [18:03:20.708] } [18:03:20.708] ...future.frame <- base::sys.nframe() [18:03:20.708] ...future.conditions <- base::list() [18:03:20.708] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.708] if (FALSE) { [18:03:20.708] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.708] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.708] } [18:03:20.708] ...future.result <- base::tryCatch({ [18:03:20.708] base::withCallingHandlers({ [18:03:20.708] ...future.value <- base::withVisible(base::local({ [18:03:20.708] ...future.makeSendCondition <- local({ [18:03:20.708] sendCondition <- NULL [18:03:20.708] function(frame = 1L) { [18:03:20.708] if (is.function(sendCondition)) [18:03:20.708] return(sendCondition) [18:03:20.708] ns <- getNamespace("parallel") [18:03:20.708] if (exists("sendData", mode = "function", [18:03:20.708] envir = ns)) { [18:03:20.708] parallel_sendData <- get("sendData", mode = "function", [18:03:20.708] envir = ns) [18:03:20.708] envir <- sys.frame(frame) [18:03:20.708] master <- NULL [18:03:20.708] while (!identical(envir, .GlobalEnv) && [18:03:20.708] !identical(envir, emptyenv())) { [18:03:20.708] if (exists("master", mode = "list", envir = envir, [18:03:20.708] inherits = FALSE)) { [18:03:20.708] master <- get("master", mode = "list", [18:03:20.708] envir = envir, inherits = FALSE) [18:03:20.708] if (inherits(master, c("SOCKnode", [18:03:20.708] "SOCK0node"))) { [18:03:20.708] sendCondition <<- function(cond) { [18:03:20.708] data <- list(type = "VALUE", value = cond, [18:03:20.708] success = TRUE) [18:03:20.708] parallel_sendData(master, data) [18:03:20.708] } [18:03:20.708] return(sendCondition) [18:03:20.708] } [18:03:20.708] } [18:03:20.708] frame <- frame + 1L [18:03:20.708] envir <- sys.frame(frame) [18:03:20.708] } [18:03:20.708] } [18:03:20.708] sendCondition <<- function(cond) NULL [18:03:20.708] } [18:03:20.708] }) [18:03:20.708] withCallingHandlers({ [18:03:20.708] { [18:03:20.708] sample(x, size = 1L) [18:03:20.708] } [18:03:20.708] }, immediateCondition = function(cond) { [18:03:20.708] sendCondition <- ...future.makeSendCondition() [18:03:20.708] sendCondition(cond) [18:03:20.708] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.708] { [18:03:20.708] inherits <- base::inherits [18:03:20.708] invokeRestart <- base::invokeRestart [18:03:20.708] is.null <- base::is.null [18:03:20.708] muffled <- FALSE [18:03:20.708] if (inherits(cond, "message")) { [18:03:20.708] muffled <- grepl(pattern, "muffleMessage") [18:03:20.708] if (muffled) [18:03:20.708] invokeRestart("muffleMessage") [18:03:20.708] } [18:03:20.708] else if (inherits(cond, "warning")) { [18:03:20.708] muffled <- grepl(pattern, "muffleWarning") [18:03:20.708] if (muffled) [18:03:20.708] invokeRestart("muffleWarning") [18:03:20.708] } [18:03:20.708] else if (inherits(cond, "condition")) { [18:03:20.708] if (!is.null(pattern)) { [18:03:20.708] computeRestarts <- base::computeRestarts [18:03:20.708] grepl <- base::grepl [18:03:20.708] restarts <- computeRestarts(cond) [18:03:20.708] for (restart in restarts) { [18:03:20.708] name <- restart$name [18:03:20.708] if (is.null(name)) [18:03:20.708] next [18:03:20.708] if (!grepl(pattern, name)) [18:03:20.708] next [18:03:20.708] invokeRestart(restart) [18:03:20.708] muffled <- TRUE [18:03:20.708] break [18:03:20.708] } [18:03:20.708] } [18:03:20.708] } [18:03:20.708] invisible(muffled) [18:03:20.708] } [18:03:20.708] muffleCondition(cond) [18:03:20.708] }) [18:03:20.708] })) [18:03:20.708] future::FutureResult(value = ...future.value$value, [18:03:20.708] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.708] ...future.rng), globalenv = if (FALSE) [18:03:20.708] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.708] ...future.globalenv.names)) [18:03:20.708] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.708] }, condition = base::local({ [18:03:20.708] c <- base::c [18:03:20.708] inherits <- base::inherits [18:03:20.708] invokeRestart <- base::invokeRestart [18:03:20.708] length <- base::length [18:03:20.708] list <- base::list [18:03:20.708] seq.int <- base::seq.int [18:03:20.708] signalCondition <- base::signalCondition [18:03:20.708] sys.calls <- base::sys.calls [18:03:20.708] `[[` <- base::`[[` [18:03:20.708] `+` <- base::`+` [18:03:20.708] `<<-` <- base::`<<-` [18:03:20.708] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.708] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.708] 3L)] [18:03:20.708] } [18:03:20.708] function(cond) { [18:03:20.708] is_error <- inherits(cond, "error") [18:03:20.708] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.708] NULL) [18:03:20.708] if (is_error) { [18:03:20.708] sessionInformation <- function() { [18:03:20.708] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.708] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.708] search = base::search(), system = base::Sys.info()) [18:03:20.708] } [18:03:20.708] ...future.conditions[[length(...future.conditions) + [18:03:20.708] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.708] cond$call), session = sessionInformation(), [18:03:20.708] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.708] signalCondition(cond) [18:03:20.708] } [18:03:20.708] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.708] "immediateCondition"))) { [18:03:20.708] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.708] ...future.conditions[[length(...future.conditions) + [18:03:20.708] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.708] if (TRUE && !signal) { [18:03:20.708] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.708] { [18:03:20.708] inherits <- base::inherits [18:03:20.708] invokeRestart <- base::invokeRestart [18:03:20.708] is.null <- base::is.null [18:03:20.708] muffled <- FALSE [18:03:20.708] if (inherits(cond, "message")) { [18:03:20.708] muffled <- grepl(pattern, "muffleMessage") [18:03:20.708] if (muffled) [18:03:20.708] invokeRestart("muffleMessage") [18:03:20.708] } [18:03:20.708] else if (inherits(cond, "warning")) { [18:03:20.708] muffled <- grepl(pattern, "muffleWarning") [18:03:20.708] if (muffled) [18:03:20.708] invokeRestart("muffleWarning") [18:03:20.708] } [18:03:20.708] else if (inherits(cond, "condition")) { [18:03:20.708] if (!is.null(pattern)) { [18:03:20.708] computeRestarts <- base::computeRestarts [18:03:20.708] grepl <- base::grepl [18:03:20.708] restarts <- computeRestarts(cond) [18:03:20.708] for (restart in restarts) { [18:03:20.708] name <- restart$name [18:03:20.708] if (is.null(name)) [18:03:20.708] next [18:03:20.708] if (!grepl(pattern, name)) [18:03:20.708] next [18:03:20.708] invokeRestart(restart) [18:03:20.708] muffled <- TRUE [18:03:20.708] break [18:03:20.708] } [18:03:20.708] } [18:03:20.708] } [18:03:20.708] invisible(muffled) [18:03:20.708] } [18:03:20.708] muffleCondition(cond, pattern = "^muffle") [18:03:20.708] } [18:03:20.708] } [18:03:20.708] else { [18:03:20.708] if (TRUE) { [18:03:20.708] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.708] { [18:03:20.708] inherits <- base::inherits [18:03:20.708] invokeRestart <- base::invokeRestart [18:03:20.708] is.null <- base::is.null [18:03:20.708] muffled <- FALSE [18:03:20.708] if (inherits(cond, "message")) { [18:03:20.708] muffled <- grepl(pattern, "muffleMessage") [18:03:20.708] if (muffled) [18:03:20.708] invokeRestart("muffleMessage") [18:03:20.708] } [18:03:20.708] else if (inherits(cond, "warning")) { [18:03:20.708] muffled <- grepl(pattern, "muffleWarning") [18:03:20.708] if (muffled) [18:03:20.708] invokeRestart("muffleWarning") [18:03:20.708] } [18:03:20.708] else if (inherits(cond, "condition")) { [18:03:20.708] if (!is.null(pattern)) { [18:03:20.708] computeRestarts <- base::computeRestarts [18:03:20.708] grepl <- base::grepl [18:03:20.708] restarts <- computeRestarts(cond) [18:03:20.708] for (restart in restarts) { [18:03:20.708] name <- restart$name [18:03:20.708] if (is.null(name)) [18:03:20.708] next [18:03:20.708] if (!grepl(pattern, name)) [18:03:20.708] next [18:03:20.708] invokeRestart(restart) [18:03:20.708] muffled <- TRUE [18:03:20.708] break [18:03:20.708] } [18:03:20.708] } [18:03:20.708] } [18:03:20.708] invisible(muffled) [18:03:20.708] } [18:03:20.708] muffleCondition(cond, pattern = "^muffle") [18:03:20.708] } [18:03:20.708] } [18:03:20.708] } [18:03:20.708] })) [18:03:20.708] }, error = function(ex) { [18:03:20.708] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.708] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.708] ...future.rng), started = ...future.startTime, [18:03:20.708] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.708] version = "1.8"), class = "FutureResult") [18:03:20.708] }, finally = { [18:03:20.708] if (!identical(...future.workdir, getwd())) [18:03:20.708] setwd(...future.workdir) [18:03:20.708] { [18:03:20.708] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.708] ...future.oldOptions$nwarnings <- NULL [18:03:20.708] } [18:03:20.708] base::options(...future.oldOptions) [18:03:20.708] if (.Platform$OS.type == "windows") { [18:03:20.708] old_names <- names(...future.oldEnvVars) [18:03:20.708] envs <- base::Sys.getenv() [18:03:20.708] names <- names(envs) [18:03:20.708] common <- intersect(names, old_names) [18:03:20.708] added <- setdiff(names, old_names) [18:03:20.708] removed <- setdiff(old_names, names) [18:03:20.708] changed <- common[...future.oldEnvVars[common] != [18:03:20.708] envs[common]] [18:03:20.708] NAMES <- toupper(changed) [18:03:20.708] args <- list() [18:03:20.708] for (kk in seq_along(NAMES)) { [18:03:20.708] name <- changed[[kk]] [18:03:20.708] NAME <- NAMES[[kk]] [18:03:20.708] if (name != NAME && is.element(NAME, old_names)) [18:03:20.708] next [18:03:20.708] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.708] } [18:03:20.708] NAMES <- toupper(added) [18:03:20.708] for (kk in seq_along(NAMES)) { [18:03:20.708] name <- added[[kk]] [18:03:20.708] NAME <- NAMES[[kk]] [18:03:20.708] if (name != NAME && is.element(NAME, old_names)) [18:03:20.708] next [18:03:20.708] args[[name]] <- "" [18:03:20.708] } [18:03:20.708] NAMES <- toupper(removed) [18:03:20.708] for (kk in seq_along(NAMES)) { [18:03:20.708] name <- removed[[kk]] [18:03:20.708] NAME <- NAMES[[kk]] [18:03:20.708] if (name != NAME && is.element(NAME, old_names)) [18:03:20.708] next [18:03:20.708] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.708] } [18:03:20.708] if (length(args) > 0) [18:03:20.708] base::do.call(base::Sys.setenv, args = args) [18:03:20.708] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.708] } [18:03:20.708] else { [18:03:20.708] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.708] } [18:03:20.708] { [18:03:20.708] if (base::length(...future.futureOptionsAdded) > [18:03:20.708] 0L) { [18:03:20.708] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.708] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.708] base::options(opts) [18:03:20.708] } [18:03:20.708] { [18:03:20.708] { [18:03:20.708] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.708] NULL [18:03:20.708] } [18:03:20.708] options(future.plan = NULL) [18:03:20.708] if (is.na(NA_character_)) [18:03:20.708] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.708] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.708] future::plan(list(function (..., workers = availableCores(), [18:03:20.708] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.708] envir = parent.frame()) [18:03:20.708] { [18:03:20.708] if (is.function(workers)) [18:03:20.708] workers <- workers() [18:03:20.708] workers <- structure(as.integer(workers), [18:03:20.708] class = class(workers)) [18:03:20.708] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.708] workers >= 1) [18:03:20.708] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.708] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.708] } [18:03:20.708] future <- MultisessionFuture(..., workers = workers, [18:03:20.708] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.708] envir = envir) [18:03:20.708] if (!future$lazy) [18:03:20.708] future <- run(future) [18:03:20.708] invisible(future) [18:03:20.708] }), .cleanup = FALSE, .init = FALSE) [18:03:20.708] } [18:03:20.708] } [18:03:20.708] } [18:03:20.708] }) [18:03:20.708] if (TRUE) { [18:03:20.708] base::sink(type = "output", split = FALSE) [18:03:20.708] if (TRUE) { [18:03:20.708] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.708] } [18:03:20.708] else { [18:03:20.708] ...future.result["stdout"] <- base::list(NULL) [18:03:20.708] } [18:03:20.708] base::close(...future.stdout) [18:03:20.708] ...future.stdout <- NULL [18:03:20.708] } [18:03:20.708] ...future.result$conditions <- ...future.conditions [18:03:20.708] ...future.result$finished <- base::Sys.time() [18:03:20.708] ...future.result [18:03:20.708] } [18:03:20.714] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.714] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.714] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.715] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.715] MultisessionFuture started [18:03:20.715] - Launch lazy future ... done [18:03:20.716] run() for 'MultisessionFuture' ... done [18:03:20.716] getGlobalsAndPackages() ... [18:03:20.716] Searching for globals... [18:03:20.717] - globals found: [3] '{', 'sample', 'x' [18:03:20.718] Searching for globals ... DONE [18:03:20.718] Resolving globals: FALSE [18:03:20.718] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.719] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.719] - globals: [1] 'x' [18:03:20.719] [18:03:20.719] getGlobalsAndPackages() ... DONE [18:03:20.720] run() for 'Future' ... [18:03:20.720] - state: 'created' [18:03:20.720] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.733] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.733] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.734] - Field: 'node' [18:03:20.734] - Field: 'label' [18:03:20.734] - Field: 'local' [18:03:20.734] - Field: 'owner' [18:03:20.734] - Field: 'envir' [18:03:20.735] - Field: 'workers' [18:03:20.735] - Field: 'packages' [18:03:20.735] - Field: 'gc' [18:03:20.735] - Field: 'conditions' [18:03:20.735] - Field: 'persistent' [18:03:20.735] - Field: 'expr' [18:03:20.736] - Field: 'uuid' [18:03:20.736] - Field: 'seed' [18:03:20.736] - Field: 'version' [18:03:20.736] - Field: 'result' [18:03:20.736] - Field: 'asynchronous' [18:03:20.737] - Field: 'calls' [18:03:20.737] - Field: 'globals' [18:03:20.737] - Field: 'stdout' [18:03:20.737] - Field: 'earlySignal' [18:03:20.737] - Field: 'lazy' [18:03:20.737] - Field: 'state' [18:03:20.738] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.738] - Launch lazy future ... [18:03:20.738] Packages needed by the future expression (n = 0): [18:03:20.738] Packages needed by future strategies (n = 0): [18:03:20.739] { [18:03:20.739] { [18:03:20.739] { [18:03:20.739] ...future.startTime <- base::Sys.time() [18:03:20.739] { [18:03:20.739] { [18:03:20.739] { [18:03:20.739] { [18:03:20.739] base::local({ [18:03:20.739] has_future <- base::requireNamespace("future", [18:03:20.739] quietly = TRUE) [18:03:20.739] if (has_future) { [18:03:20.739] ns <- base::getNamespace("future") [18:03:20.739] version <- ns[[".package"]][["version"]] [18:03:20.739] if (is.null(version)) [18:03:20.739] version <- utils::packageVersion("future") [18:03:20.739] } [18:03:20.739] else { [18:03:20.739] version <- NULL [18:03:20.739] } [18:03:20.739] if (!has_future || version < "1.8.0") { [18:03:20.739] info <- base::c(r_version = base::gsub("R version ", [18:03:20.739] "", base::R.version$version.string), [18:03:20.739] platform = base::sprintf("%s (%s-bit)", [18:03:20.739] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.739] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.739] "release", "version")], collapse = " "), [18:03:20.739] hostname = base::Sys.info()[["nodename"]]) [18:03:20.739] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.739] info) [18:03:20.739] info <- base::paste(info, collapse = "; ") [18:03:20.739] if (!has_future) { [18:03:20.739] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.739] info) [18:03:20.739] } [18:03:20.739] else { [18:03:20.739] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.739] info, version) [18:03:20.739] } [18:03:20.739] base::stop(msg) [18:03:20.739] } [18:03:20.739] }) [18:03:20.739] } [18:03:20.739] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.739] base::options(mc.cores = 1L) [18:03:20.739] } [18:03:20.739] options(future.plan = NULL) [18:03:20.739] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.739] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.739] } [18:03:20.739] ...future.workdir <- getwd() [18:03:20.739] } [18:03:20.739] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.739] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.739] } [18:03:20.739] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.739] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.739] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.739] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.739] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:20.739] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.739] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.739] base::names(...future.oldOptions)) [18:03:20.739] } [18:03:20.739] if (FALSE) { [18:03:20.739] } [18:03:20.739] else { [18:03:20.739] if (TRUE) { [18:03:20.739] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.739] open = "w") [18:03:20.739] } [18:03:20.739] else { [18:03:20.739] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.739] windows = "NUL", "/dev/null"), open = "w") [18:03:20.739] } [18:03:20.739] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.739] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.739] base::sink(type = "output", split = FALSE) [18:03:20.739] base::close(...future.stdout) [18:03:20.739] }, add = TRUE) [18:03:20.739] } [18:03:20.739] ...future.frame <- base::sys.nframe() [18:03:20.739] ...future.conditions <- base::list() [18:03:20.739] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.739] if (FALSE) { [18:03:20.739] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.739] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.739] } [18:03:20.739] ...future.result <- base::tryCatch({ [18:03:20.739] base::withCallingHandlers({ [18:03:20.739] ...future.value <- base::withVisible(base::local({ [18:03:20.739] ...future.makeSendCondition <- local({ [18:03:20.739] sendCondition <- NULL [18:03:20.739] function(frame = 1L) { [18:03:20.739] if (is.function(sendCondition)) [18:03:20.739] return(sendCondition) [18:03:20.739] ns <- getNamespace("parallel") [18:03:20.739] if (exists("sendData", mode = "function", [18:03:20.739] envir = ns)) { [18:03:20.739] parallel_sendData <- get("sendData", mode = "function", [18:03:20.739] envir = ns) [18:03:20.739] envir <- sys.frame(frame) [18:03:20.739] master <- NULL [18:03:20.739] while (!identical(envir, .GlobalEnv) && [18:03:20.739] !identical(envir, emptyenv())) { [18:03:20.739] if (exists("master", mode = "list", envir = envir, [18:03:20.739] inherits = FALSE)) { [18:03:20.739] master <- get("master", mode = "list", [18:03:20.739] envir = envir, inherits = FALSE) [18:03:20.739] if (inherits(master, c("SOCKnode", [18:03:20.739] "SOCK0node"))) { [18:03:20.739] sendCondition <<- function(cond) { [18:03:20.739] data <- list(type = "VALUE", value = cond, [18:03:20.739] success = TRUE) [18:03:20.739] parallel_sendData(master, data) [18:03:20.739] } [18:03:20.739] return(sendCondition) [18:03:20.739] } [18:03:20.739] } [18:03:20.739] frame <- frame + 1L [18:03:20.739] envir <- sys.frame(frame) [18:03:20.739] } [18:03:20.739] } [18:03:20.739] sendCondition <<- function(cond) NULL [18:03:20.739] } [18:03:20.739] }) [18:03:20.739] withCallingHandlers({ [18:03:20.739] { [18:03:20.739] sample(x, size = 1L) [18:03:20.739] } [18:03:20.739] }, immediateCondition = function(cond) { [18:03:20.739] sendCondition <- ...future.makeSendCondition() [18:03:20.739] sendCondition(cond) [18:03:20.739] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.739] { [18:03:20.739] inherits <- base::inherits [18:03:20.739] invokeRestart <- base::invokeRestart [18:03:20.739] is.null <- base::is.null [18:03:20.739] muffled <- FALSE [18:03:20.739] if (inherits(cond, "message")) { [18:03:20.739] muffled <- grepl(pattern, "muffleMessage") [18:03:20.739] if (muffled) [18:03:20.739] invokeRestart("muffleMessage") [18:03:20.739] } [18:03:20.739] else if (inherits(cond, "warning")) { [18:03:20.739] muffled <- grepl(pattern, "muffleWarning") [18:03:20.739] if (muffled) [18:03:20.739] invokeRestart("muffleWarning") [18:03:20.739] } [18:03:20.739] else if (inherits(cond, "condition")) { [18:03:20.739] if (!is.null(pattern)) { [18:03:20.739] computeRestarts <- base::computeRestarts [18:03:20.739] grepl <- base::grepl [18:03:20.739] restarts <- computeRestarts(cond) [18:03:20.739] for (restart in restarts) { [18:03:20.739] name <- restart$name [18:03:20.739] if (is.null(name)) [18:03:20.739] next [18:03:20.739] if (!grepl(pattern, name)) [18:03:20.739] next [18:03:20.739] invokeRestart(restart) [18:03:20.739] muffled <- TRUE [18:03:20.739] break [18:03:20.739] } [18:03:20.739] } [18:03:20.739] } [18:03:20.739] invisible(muffled) [18:03:20.739] } [18:03:20.739] muffleCondition(cond) [18:03:20.739] }) [18:03:20.739] })) [18:03:20.739] future::FutureResult(value = ...future.value$value, [18:03:20.739] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.739] ...future.rng), globalenv = if (FALSE) [18:03:20.739] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.739] ...future.globalenv.names)) [18:03:20.739] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.739] }, condition = base::local({ [18:03:20.739] c <- base::c [18:03:20.739] inherits <- base::inherits [18:03:20.739] invokeRestart <- base::invokeRestart [18:03:20.739] length <- base::length [18:03:20.739] list <- base::list [18:03:20.739] seq.int <- base::seq.int [18:03:20.739] signalCondition <- base::signalCondition [18:03:20.739] sys.calls <- base::sys.calls [18:03:20.739] `[[` <- base::`[[` [18:03:20.739] `+` <- base::`+` [18:03:20.739] `<<-` <- base::`<<-` [18:03:20.739] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.739] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.739] 3L)] [18:03:20.739] } [18:03:20.739] function(cond) { [18:03:20.739] is_error <- inherits(cond, "error") [18:03:20.739] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.739] NULL) [18:03:20.739] if (is_error) { [18:03:20.739] sessionInformation <- function() { [18:03:20.739] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.739] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.739] search = base::search(), system = base::Sys.info()) [18:03:20.739] } [18:03:20.739] ...future.conditions[[length(...future.conditions) + [18:03:20.739] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.739] cond$call), session = sessionInformation(), [18:03:20.739] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.739] signalCondition(cond) [18:03:20.739] } [18:03:20.739] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.739] "immediateCondition"))) { [18:03:20.739] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.739] ...future.conditions[[length(...future.conditions) + [18:03:20.739] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.739] if (TRUE && !signal) { [18:03:20.739] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.739] { [18:03:20.739] inherits <- base::inherits [18:03:20.739] invokeRestart <- base::invokeRestart [18:03:20.739] is.null <- base::is.null [18:03:20.739] muffled <- FALSE [18:03:20.739] if (inherits(cond, "message")) { [18:03:20.739] muffled <- grepl(pattern, "muffleMessage") [18:03:20.739] if (muffled) [18:03:20.739] invokeRestart("muffleMessage") [18:03:20.739] } [18:03:20.739] else if (inherits(cond, "warning")) { [18:03:20.739] muffled <- grepl(pattern, "muffleWarning") [18:03:20.739] if (muffled) [18:03:20.739] invokeRestart("muffleWarning") [18:03:20.739] } [18:03:20.739] else if (inherits(cond, "condition")) { [18:03:20.739] if (!is.null(pattern)) { [18:03:20.739] computeRestarts <- base::computeRestarts [18:03:20.739] grepl <- base::grepl [18:03:20.739] restarts <- computeRestarts(cond) [18:03:20.739] for (restart in restarts) { [18:03:20.739] name <- restart$name [18:03:20.739] if (is.null(name)) [18:03:20.739] next [18:03:20.739] if (!grepl(pattern, name)) [18:03:20.739] next [18:03:20.739] invokeRestart(restart) [18:03:20.739] muffled <- TRUE [18:03:20.739] break [18:03:20.739] } [18:03:20.739] } [18:03:20.739] } [18:03:20.739] invisible(muffled) [18:03:20.739] } [18:03:20.739] muffleCondition(cond, pattern = "^muffle") [18:03:20.739] } [18:03:20.739] } [18:03:20.739] else { [18:03:20.739] if (TRUE) { [18:03:20.739] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.739] { [18:03:20.739] inherits <- base::inherits [18:03:20.739] invokeRestart <- base::invokeRestart [18:03:20.739] is.null <- base::is.null [18:03:20.739] muffled <- FALSE [18:03:20.739] if (inherits(cond, "message")) { [18:03:20.739] muffled <- grepl(pattern, "muffleMessage") [18:03:20.739] if (muffled) [18:03:20.739] invokeRestart("muffleMessage") [18:03:20.739] } [18:03:20.739] else if (inherits(cond, "warning")) { [18:03:20.739] muffled <- grepl(pattern, "muffleWarning") [18:03:20.739] if (muffled) [18:03:20.739] invokeRestart("muffleWarning") [18:03:20.739] } [18:03:20.739] else if (inherits(cond, "condition")) { [18:03:20.739] if (!is.null(pattern)) { [18:03:20.739] computeRestarts <- base::computeRestarts [18:03:20.739] grepl <- base::grepl [18:03:20.739] restarts <- computeRestarts(cond) [18:03:20.739] for (restart in restarts) { [18:03:20.739] name <- restart$name [18:03:20.739] if (is.null(name)) [18:03:20.739] next [18:03:20.739] if (!grepl(pattern, name)) [18:03:20.739] next [18:03:20.739] invokeRestart(restart) [18:03:20.739] muffled <- TRUE [18:03:20.739] break [18:03:20.739] } [18:03:20.739] } [18:03:20.739] } [18:03:20.739] invisible(muffled) [18:03:20.739] } [18:03:20.739] muffleCondition(cond, pattern = "^muffle") [18:03:20.739] } [18:03:20.739] } [18:03:20.739] } [18:03:20.739] })) [18:03:20.739] }, error = function(ex) { [18:03:20.739] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.739] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.739] ...future.rng), started = ...future.startTime, [18:03:20.739] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.739] version = "1.8"), class = "FutureResult") [18:03:20.739] }, finally = { [18:03:20.739] if (!identical(...future.workdir, getwd())) [18:03:20.739] setwd(...future.workdir) [18:03:20.739] { [18:03:20.739] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.739] ...future.oldOptions$nwarnings <- NULL [18:03:20.739] } [18:03:20.739] base::options(...future.oldOptions) [18:03:20.739] if (.Platform$OS.type == "windows") { [18:03:20.739] old_names <- names(...future.oldEnvVars) [18:03:20.739] envs <- base::Sys.getenv() [18:03:20.739] names <- names(envs) [18:03:20.739] common <- intersect(names, old_names) [18:03:20.739] added <- setdiff(names, old_names) [18:03:20.739] removed <- setdiff(old_names, names) [18:03:20.739] changed <- common[...future.oldEnvVars[common] != [18:03:20.739] envs[common]] [18:03:20.739] NAMES <- toupper(changed) [18:03:20.739] args <- list() [18:03:20.739] for (kk in seq_along(NAMES)) { [18:03:20.739] name <- changed[[kk]] [18:03:20.739] NAME <- NAMES[[kk]] [18:03:20.739] if (name != NAME && is.element(NAME, old_names)) [18:03:20.739] next [18:03:20.739] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.739] } [18:03:20.739] NAMES <- toupper(added) [18:03:20.739] for (kk in seq_along(NAMES)) { [18:03:20.739] name <- added[[kk]] [18:03:20.739] NAME <- NAMES[[kk]] [18:03:20.739] if (name != NAME && is.element(NAME, old_names)) [18:03:20.739] next [18:03:20.739] args[[name]] <- "" [18:03:20.739] } [18:03:20.739] NAMES <- toupper(removed) [18:03:20.739] for (kk in seq_along(NAMES)) { [18:03:20.739] name <- removed[[kk]] [18:03:20.739] NAME <- NAMES[[kk]] [18:03:20.739] if (name != NAME && is.element(NAME, old_names)) [18:03:20.739] next [18:03:20.739] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.739] } [18:03:20.739] if (length(args) > 0) [18:03:20.739] base::do.call(base::Sys.setenv, args = args) [18:03:20.739] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.739] } [18:03:20.739] else { [18:03:20.739] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.739] } [18:03:20.739] { [18:03:20.739] if (base::length(...future.futureOptionsAdded) > [18:03:20.739] 0L) { [18:03:20.739] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.739] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.739] base::options(opts) [18:03:20.739] } [18:03:20.739] { [18:03:20.739] { [18:03:20.739] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.739] NULL [18:03:20.739] } [18:03:20.739] options(future.plan = NULL) [18:03:20.739] if (is.na(NA_character_)) [18:03:20.739] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.739] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.739] future::plan(list(function (..., workers = availableCores(), [18:03:20.739] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.739] envir = parent.frame()) [18:03:20.739] { [18:03:20.739] if (is.function(workers)) [18:03:20.739] workers <- workers() [18:03:20.739] workers <- structure(as.integer(workers), [18:03:20.739] class = class(workers)) [18:03:20.739] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.739] workers >= 1) [18:03:20.739] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.739] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.739] } [18:03:20.739] future <- MultisessionFuture(..., workers = workers, [18:03:20.739] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.739] envir = envir) [18:03:20.739] if (!future$lazy) [18:03:20.739] future <- run(future) [18:03:20.739] invisible(future) [18:03:20.739] }), .cleanup = FALSE, .init = FALSE) [18:03:20.739] } [18:03:20.739] } [18:03:20.739] } [18:03:20.739] }) [18:03:20.739] if (TRUE) { [18:03:20.739] base::sink(type = "output", split = FALSE) [18:03:20.739] if (TRUE) { [18:03:20.739] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.739] } [18:03:20.739] else { [18:03:20.739] ...future.result["stdout"] <- base::list(NULL) [18:03:20.739] } [18:03:20.739] base::close(...future.stdout) [18:03:20.739] ...future.stdout <- NULL [18:03:20.739] } [18:03:20.739] ...future.result$conditions <- ...future.conditions [18:03:20.739] ...future.result$finished <- base::Sys.time() [18:03:20.739] ...future.result [18:03:20.739] } [18:03:20.744] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.744] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.745] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.745] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.746] MultisessionFuture started [18:03:20.746] - Launch lazy future ... done [18:03:20.746] run() for 'MultisessionFuture' ... done [18:03:20.746] getGlobalsAndPackages() ... [18:03:20.747] Searching for globals... [18:03:20.748] - globals found: [3] '{', 'sample', 'x' [18:03:20.748] Searching for globals ... DONE [18:03:20.748] Resolving globals: FALSE [18:03:20.749] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.749] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.749] - globals: [1] 'x' [18:03:20.749] [18:03:20.750] getGlobalsAndPackages() ... DONE [18:03:20.750] run() for 'Future' ... [18:03:20.750] - state: 'created' [18:03:20.750] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.766] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.766] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.766] - Field: 'node' [18:03:20.766] - Field: 'label' [18:03:20.767] - Field: 'local' [18:03:20.767] - Field: 'owner' [18:03:20.767] - Field: 'envir' [18:03:20.767] - Field: 'workers' [18:03:20.767] - Field: 'packages' [18:03:20.767] - Field: 'gc' [18:03:20.768] - Field: 'conditions' [18:03:20.768] - Field: 'persistent' [18:03:20.768] - Field: 'expr' [18:03:20.768] - Field: 'uuid' [18:03:20.768] - Field: 'seed' [18:03:20.769] - Field: 'version' [18:03:20.769] - Field: 'result' [18:03:20.769] - Field: 'asynchronous' [18:03:20.769] - Field: 'calls' [18:03:20.769] - Field: 'globals' [18:03:20.769] - Field: 'stdout' [18:03:20.770] - Field: 'earlySignal' [18:03:20.770] - Field: 'lazy' [18:03:20.770] - Field: 'state' [18:03:20.770] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.770] - Launch lazy future ... [18:03:20.771] Packages needed by the future expression (n = 0): [18:03:20.771] Packages needed by future strategies (n = 0): [18:03:20.771] { [18:03:20.771] { [18:03:20.771] { [18:03:20.771] ...future.startTime <- base::Sys.time() [18:03:20.771] { [18:03:20.771] { [18:03:20.771] { [18:03:20.771] { [18:03:20.771] base::local({ [18:03:20.771] has_future <- base::requireNamespace("future", [18:03:20.771] quietly = TRUE) [18:03:20.771] if (has_future) { [18:03:20.771] ns <- base::getNamespace("future") [18:03:20.771] version <- ns[[".package"]][["version"]] [18:03:20.771] if (is.null(version)) [18:03:20.771] version <- utils::packageVersion("future") [18:03:20.771] } [18:03:20.771] else { [18:03:20.771] version <- NULL [18:03:20.771] } [18:03:20.771] if (!has_future || version < "1.8.0") { [18:03:20.771] info <- base::c(r_version = base::gsub("R version ", [18:03:20.771] "", base::R.version$version.string), [18:03:20.771] platform = base::sprintf("%s (%s-bit)", [18:03:20.771] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.771] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.771] "release", "version")], collapse = " "), [18:03:20.771] hostname = base::Sys.info()[["nodename"]]) [18:03:20.771] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.771] info) [18:03:20.771] info <- base::paste(info, collapse = "; ") [18:03:20.771] if (!has_future) { [18:03:20.771] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.771] info) [18:03:20.771] } [18:03:20.771] else { [18:03:20.771] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.771] info, version) [18:03:20.771] } [18:03:20.771] base::stop(msg) [18:03:20.771] } [18:03:20.771] }) [18:03:20.771] } [18:03:20.771] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.771] base::options(mc.cores = 1L) [18:03:20.771] } [18:03:20.771] options(future.plan = NULL) [18:03:20.771] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.771] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.771] } [18:03:20.771] ...future.workdir <- getwd() [18:03:20.771] } [18:03:20.771] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.771] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.771] } [18:03:20.771] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.771] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.771] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.771] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.771] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:20.771] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.771] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.771] base::names(...future.oldOptions)) [18:03:20.771] } [18:03:20.771] if (FALSE) { [18:03:20.771] } [18:03:20.771] else { [18:03:20.771] if (TRUE) { [18:03:20.771] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.771] open = "w") [18:03:20.771] } [18:03:20.771] else { [18:03:20.771] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.771] windows = "NUL", "/dev/null"), open = "w") [18:03:20.771] } [18:03:20.771] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.771] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.771] base::sink(type = "output", split = FALSE) [18:03:20.771] base::close(...future.stdout) [18:03:20.771] }, add = TRUE) [18:03:20.771] } [18:03:20.771] ...future.frame <- base::sys.nframe() [18:03:20.771] ...future.conditions <- base::list() [18:03:20.771] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.771] if (FALSE) { [18:03:20.771] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.771] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.771] } [18:03:20.771] ...future.result <- base::tryCatch({ [18:03:20.771] base::withCallingHandlers({ [18:03:20.771] ...future.value <- base::withVisible(base::local({ [18:03:20.771] ...future.makeSendCondition <- local({ [18:03:20.771] sendCondition <- NULL [18:03:20.771] function(frame = 1L) { [18:03:20.771] if (is.function(sendCondition)) [18:03:20.771] return(sendCondition) [18:03:20.771] ns <- getNamespace("parallel") [18:03:20.771] if (exists("sendData", mode = "function", [18:03:20.771] envir = ns)) { [18:03:20.771] parallel_sendData <- get("sendData", mode = "function", [18:03:20.771] envir = ns) [18:03:20.771] envir <- sys.frame(frame) [18:03:20.771] master <- NULL [18:03:20.771] while (!identical(envir, .GlobalEnv) && [18:03:20.771] !identical(envir, emptyenv())) { [18:03:20.771] if (exists("master", mode = "list", envir = envir, [18:03:20.771] inherits = FALSE)) { [18:03:20.771] master <- get("master", mode = "list", [18:03:20.771] envir = envir, inherits = FALSE) [18:03:20.771] if (inherits(master, c("SOCKnode", [18:03:20.771] "SOCK0node"))) { [18:03:20.771] sendCondition <<- function(cond) { [18:03:20.771] data <- list(type = "VALUE", value = cond, [18:03:20.771] success = TRUE) [18:03:20.771] parallel_sendData(master, data) [18:03:20.771] } [18:03:20.771] return(sendCondition) [18:03:20.771] } [18:03:20.771] } [18:03:20.771] frame <- frame + 1L [18:03:20.771] envir <- sys.frame(frame) [18:03:20.771] } [18:03:20.771] } [18:03:20.771] sendCondition <<- function(cond) NULL [18:03:20.771] } [18:03:20.771] }) [18:03:20.771] withCallingHandlers({ [18:03:20.771] { [18:03:20.771] sample(x, size = 1L) [18:03:20.771] } [18:03:20.771] }, immediateCondition = function(cond) { [18:03:20.771] sendCondition <- ...future.makeSendCondition() [18:03:20.771] sendCondition(cond) [18:03:20.771] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.771] { [18:03:20.771] inherits <- base::inherits [18:03:20.771] invokeRestart <- base::invokeRestart [18:03:20.771] is.null <- base::is.null [18:03:20.771] muffled <- FALSE [18:03:20.771] if (inherits(cond, "message")) { [18:03:20.771] muffled <- grepl(pattern, "muffleMessage") [18:03:20.771] if (muffled) [18:03:20.771] invokeRestart("muffleMessage") [18:03:20.771] } [18:03:20.771] else if (inherits(cond, "warning")) { [18:03:20.771] muffled <- grepl(pattern, "muffleWarning") [18:03:20.771] if (muffled) [18:03:20.771] invokeRestart("muffleWarning") [18:03:20.771] } [18:03:20.771] else if (inherits(cond, "condition")) { [18:03:20.771] if (!is.null(pattern)) { [18:03:20.771] computeRestarts <- base::computeRestarts [18:03:20.771] grepl <- base::grepl [18:03:20.771] restarts <- computeRestarts(cond) [18:03:20.771] for (restart in restarts) { [18:03:20.771] name <- restart$name [18:03:20.771] if (is.null(name)) [18:03:20.771] next [18:03:20.771] if (!grepl(pattern, name)) [18:03:20.771] next [18:03:20.771] invokeRestart(restart) [18:03:20.771] muffled <- TRUE [18:03:20.771] break [18:03:20.771] } [18:03:20.771] } [18:03:20.771] } [18:03:20.771] invisible(muffled) [18:03:20.771] } [18:03:20.771] muffleCondition(cond) [18:03:20.771] }) [18:03:20.771] })) [18:03:20.771] future::FutureResult(value = ...future.value$value, [18:03:20.771] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.771] ...future.rng), globalenv = if (FALSE) [18:03:20.771] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.771] ...future.globalenv.names)) [18:03:20.771] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.771] }, condition = base::local({ [18:03:20.771] c <- base::c [18:03:20.771] inherits <- base::inherits [18:03:20.771] invokeRestart <- base::invokeRestart [18:03:20.771] length <- base::length [18:03:20.771] list <- base::list [18:03:20.771] seq.int <- base::seq.int [18:03:20.771] signalCondition <- base::signalCondition [18:03:20.771] sys.calls <- base::sys.calls [18:03:20.771] `[[` <- base::`[[` [18:03:20.771] `+` <- base::`+` [18:03:20.771] `<<-` <- base::`<<-` [18:03:20.771] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.771] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.771] 3L)] [18:03:20.771] } [18:03:20.771] function(cond) { [18:03:20.771] is_error <- inherits(cond, "error") [18:03:20.771] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.771] NULL) [18:03:20.771] if (is_error) { [18:03:20.771] sessionInformation <- function() { [18:03:20.771] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.771] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.771] search = base::search(), system = base::Sys.info()) [18:03:20.771] } [18:03:20.771] ...future.conditions[[length(...future.conditions) + [18:03:20.771] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.771] cond$call), session = sessionInformation(), [18:03:20.771] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.771] signalCondition(cond) [18:03:20.771] } [18:03:20.771] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.771] "immediateCondition"))) { [18:03:20.771] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.771] ...future.conditions[[length(...future.conditions) + [18:03:20.771] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.771] if (TRUE && !signal) { [18:03:20.771] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.771] { [18:03:20.771] inherits <- base::inherits [18:03:20.771] invokeRestart <- base::invokeRestart [18:03:20.771] is.null <- base::is.null [18:03:20.771] muffled <- FALSE [18:03:20.771] if (inherits(cond, "message")) { [18:03:20.771] muffled <- grepl(pattern, "muffleMessage") [18:03:20.771] if (muffled) [18:03:20.771] invokeRestart("muffleMessage") [18:03:20.771] } [18:03:20.771] else if (inherits(cond, "warning")) { [18:03:20.771] muffled <- grepl(pattern, "muffleWarning") [18:03:20.771] if (muffled) [18:03:20.771] invokeRestart("muffleWarning") [18:03:20.771] } [18:03:20.771] else if (inherits(cond, "condition")) { [18:03:20.771] if (!is.null(pattern)) { [18:03:20.771] computeRestarts <- base::computeRestarts [18:03:20.771] grepl <- base::grepl [18:03:20.771] restarts <- computeRestarts(cond) [18:03:20.771] for (restart in restarts) { [18:03:20.771] name <- restart$name [18:03:20.771] if (is.null(name)) [18:03:20.771] next [18:03:20.771] if (!grepl(pattern, name)) [18:03:20.771] next [18:03:20.771] invokeRestart(restart) [18:03:20.771] muffled <- TRUE [18:03:20.771] break [18:03:20.771] } [18:03:20.771] } [18:03:20.771] } [18:03:20.771] invisible(muffled) [18:03:20.771] } [18:03:20.771] muffleCondition(cond, pattern = "^muffle") [18:03:20.771] } [18:03:20.771] } [18:03:20.771] else { [18:03:20.771] if (TRUE) { [18:03:20.771] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.771] { [18:03:20.771] inherits <- base::inherits [18:03:20.771] invokeRestart <- base::invokeRestart [18:03:20.771] is.null <- base::is.null [18:03:20.771] muffled <- FALSE [18:03:20.771] if (inherits(cond, "message")) { [18:03:20.771] muffled <- grepl(pattern, "muffleMessage") [18:03:20.771] if (muffled) [18:03:20.771] invokeRestart("muffleMessage") [18:03:20.771] } [18:03:20.771] else if (inherits(cond, "warning")) { [18:03:20.771] muffled <- grepl(pattern, "muffleWarning") [18:03:20.771] if (muffled) [18:03:20.771] invokeRestart("muffleWarning") [18:03:20.771] } [18:03:20.771] else if (inherits(cond, "condition")) { [18:03:20.771] if (!is.null(pattern)) { [18:03:20.771] computeRestarts <- base::computeRestarts [18:03:20.771] grepl <- base::grepl [18:03:20.771] restarts <- computeRestarts(cond) [18:03:20.771] for (restart in restarts) { [18:03:20.771] name <- restart$name [18:03:20.771] if (is.null(name)) [18:03:20.771] next [18:03:20.771] if (!grepl(pattern, name)) [18:03:20.771] next [18:03:20.771] invokeRestart(restart) [18:03:20.771] muffled <- TRUE [18:03:20.771] break [18:03:20.771] } [18:03:20.771] } [18:03:20.771] } [18:03:20.771] invisible(muffled) [18:03:20.771] } [18:03:20.771] muffleCondition(cond, pattern = "^muffle") [18:03:20.771] } [18:03:20.771] } [18:03:20.771] } [18:03:20.771] })) [18:03:20.771] }, error = function(ex) { [18:03:20.771] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.771] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.771] ...future.rng), started = ...future.startTime, [18:03:20.771] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.771] version = "1.8"), class = "FutureResult") [18:03:20.771] }, finally = { [18:03:20.771] if (!identical(...future.workdir, getwd())) [18:03:20.771] setwd(...future.workdir) [18:03:20.771] { [18:03:20.771] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.771] ...future.oldOptions$nwarnings <- NULL [18:03:20.771] } [18:03:20.771] base::options(...future.oldOptions) [18:03:20.771] if (.Platform$OS.type == "windows") { [18:03:20.771] old_names <- names(...future.oldEnvVars) [18:03:20.771] envs <- base::Sys.getenv() [18:03:20.771] names <- names(envs) [18:03:20.771] common <- intersect(names, old_names) [18:03:20.771] added <- setdiff(names, old_names) [18:03:20.771] removed <- setdiff(old_names, names) [18:03:20.771] changed <- common[...future.oldEnvVars[common] != [18:03:20.771] envs[common]] [18:03:20.771] NAMES <- toupper(changed) [18:03:20.771] args <- list() [18:03:20.771] for (kk in seq_along(NAMES)) { [18:03:20.771] name <- changed[[kk]] [18:03:20.771] NAME <- NAMES[[kk]] [18:03:20.771] if (name != NAME && is.element(NAME, old_names)) [18:03:20.771] next [18:03:20.771] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.771] } [18:03:20.771] NAMES <- toupper(added) [18:03:20.771] for (kk in seq_along(NAMES)) { [18:03:20.771] name <- added[[kk]] [18:03:20.771] NAME <- NAMES[[kk]] [18:03:20.771] if (name != NAME && is.element(NAME, old_names)) [18:03:20.771] next [18:03:20.771] args[[name]] <- "" [18:03:20.771] } [18:03:20.771] NAMES <- toupper(removed) [18:03:20.771] for (kk in seq_along(NAMES)) { [18:03:20.771] name <- removed[[kk]] [18:03:20.771] NAME <- NAMES[[kk]] [18:03:20.771] if (name != NAME && is.element(NAME, old_names)) [18:03:20.771] next [18:03:20.771] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.771] } [18:03:20.771] if (length(args) > 0) [18:03:20.771] base::do.call(base::Sys.setenv, args = args) [18:03:20.771] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.771] } [18:03:20.771] else { [18:03:20.771] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.771] } [18:03:20.771] { [18:03:20.771] if (base::length(...future.futureOptionsAdded) > [18:03:20.771] 0L) { [18:03:20.771] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.771] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.771] base::options(opts) [18:03:20.771] } [18:03:20.771] { [18:03:20.771] { [18:03:20.771] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.771] NULL [18:03:20.771] } [18:03:20.771] options(future.plan = NULL) [18:03:20.771] if (is.na(NA_character_)) [18:03:20.771] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.771] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.771] future::plan(list(function (..., workers = availableCores(), [18:03:20.771] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.771] envir = parent.frame()) [18:03:20.771] { [18:03:20.771] if (is.function(workers)) [18:03:20.771] workers <- workers() [18:03:20.771] workers <- structure(as.integer(workers), [18:03:20.771] class = class(workers)) [18:03:20.771] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.771] workers >= 1) [18:03:20.771] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.771] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.771] } [18:03:20.771] future <- MultisessionFuture(..., workers = workers, [18:03:20.771] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.771] envir = envir) [18:03:20.771] if (!future$lazy) [18:03:20.771] future <- run(future) [18:03:20.771] invisible(future) [18:03:20.771] }), .cleanup = FALSE, .init = FALSE) [18:03:20.771] } [18:03:20.771] } [18:03:20.771] } [18:03:20.771] }) [18:03:20.771] if (TRUE) { [18:03:20.771] base::sink(type = "output", split = FALSE) [18:03:20.771] if (TRUE) { [18:03:20.771] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.771] } [18:03:20.771] else { [18:03:20.771] ...future.result["stdout"] <- base::list(NULL) [18:03:20.771] } [18:03:20.771] base::close(...future.stdout) [18:03:20.771] ...future.stdout <- NULL [18:03:20.771] } [18:03:20.771] ...future.result$conditions <- ...future.conditions [18:03:20.771] ...future.result$finished <- base::Sys.time() [18:03:20.771] ...future.result [18:03:20.771] } [18:03:20.776] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.799] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.799] - Validating connection of MultisessionFuture [18:03:20.799] - received message: FutureResult [18:03:20.800] - Received FutureResult [18:03:20.800] - Erased future from FutureRegistry [18:03:20.800] result() for ClusterFuture ... [18:03:20.800] - result already collected: FutureResult [18:03:20.800] result() for ClusterFuture ... done [18:03:20.800] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.801] result() for ClusterFuture ... [18:03:20.801] - result already collected: FutureResult [18:03:20.801] result() for ClusterFuture ... done [18:03:20.801] result() for ClusterFuture ... [18:03:20.801] - result already collected: FutureResult [18:03:20.801] result() for ClusterFuture ... done [18:03:20.802] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.802] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.803] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.803] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.804] MultisessionFuture started [18:03:20.804] - Launch lazy future ... done [18:03:20.804] run() for 'MultisessionFuture' ... done [18:03:20.805] getGlobalsAndPackages() ... [18:03:20.805] Searching for globals... [18:03:20.806] - globals found: [3] '{', 'sample', 'x' [18:03:20.806] Searching for globals ... DONE [18:03:20.806] Resolving globals: FALSE [18:03:20.807] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.807] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.808] - globals: [1] 'x' [18:03:20.808] [18:03:20.808] getGlobalsAndPackages() ... DONE [18:03:20.808] run() for 'Future' ... [18:03:20.808] - state: 'created' [18:03:20.809] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.824] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.824] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.824] - Field: 'node' [18:03:20.825] - Field: 'label' [18:03:20.825] - Field: 'local' [18:03:20.825] - Field: 'owner' [18:03:20.825] - Field: 'envir' [18:03:20.825] - Field: 'workers' [18:03:20.825] - Field: 'packages' [18:03:20.826] - Field: 'gc' [18:03:20.826] - Field: 'conditions' [18:03:20.826] - Field: 'persistent' [18:03:20.826] - Field: 'expr' [18:03:20.826] - Field: 'uuid' [18:03:20.827] - Field: 'seed' [18:03:20.827] - Field: 'version' [18:03:20.827] - Field: 'result' [18:03:20.827] - Field: 'asynchronous' [18:03:20.827] - Field: 'calls' [18:03:20.827] - Field: 'globals' [18:03:20.828] - Field: 'stdout' [18:03:20.828] - Field: 'earlySignal' [18:03:20.828] - Field: 'lazy' [18:03:20.828] - Field: 'state' [18:03:20.828] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.828] - Launch lazy future ... [18:03:20.829] Packages needed by the future expression (n = 0): [18:03:20.829] Packages needed by future strategies (n = 0): [18:03:20.830] { [18:03:20.830] { [18:03:20.830] { [18:03:20.830] ...future.startTime <- base::Sys.time() [18:03:20.830] { [18:03:20.830] { [18:03:20.830] { [18:03:20.830] { [18:03:20.830] base::local({ [18:03:20.830] has_future <- base::requireNamespace("future", [18:03:20.830] quietly = TRUE) [18:03:20.830] if (has_future) { [18:03:20.830] ns <- base::getNamespace("future") [18:03:20.830] version <- ns[[".package"]][["version"]] [18:03:20.830] if (is.null(version)) [18:03:20.830] version <- utils::packageVersion("future") [18:03:20.830] } [18:03:20.830] else { [18:03:20.830] version <- NULL [18:03:20.830] } [18:03:20.830] if (!has_future || version < "1.8.0") { [18:03:20.830] info <- base::c(r_version = base::gsub("R version ", [18:03:20.830] "", base::R.version$version.string), [18:03:20.830] platform = base::sprintf("%s (%s-bit)", [18:03:20.830] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.830] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.830] "release", "version")], collapse = " "), [18:03:20.830] hostname = base::Sys.info()[["nodename"]]) [18:03:20.830] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.830] info) [18:03:20.830] info <- base::paste(info, collapse = "; ") [18:03:20.830] if (!has_future) { [18:03:20.830] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.830] info) [18:03:20.830] } [18:03:20.830] else { [18:03:20.830] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.830] info, version) [18:03:20.830] } [18:03:20.830] base::stop(msg) [18:03:20.830] } [18:03:20.830] }) [18:03:20.830] } [18:03:20.830] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.830] base::options(mc.cores = 1L) [18:03:20.830] } [18:03:20.830] options(future.plan = NULL) [18:03:20.830] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.830] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.830] } [18:03:20.830] ...future.workdir <- getwd() [18:03:20.830] } [18:03:20.830] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.830] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.830] } [18:03:20.830] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.830] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.830] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.830] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.830] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:20.830] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.830] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.830] base::names(...future.oldOptions)) [18:03:20.830] } [18:03:20.830] if (FALSE) { [18:03:20.830] } [18:03:20.830] else { [18:03:20.830] if (TRUE) { [18:03:20.830] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.830] open = "w") [18:03:20.830] } [18:03:20.830] else { [18:03:20.830] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.830] windows = "NUL", "/dev/null"), open = "w") [18:03:20.830] } [18:03:20.830] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.830] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.830] base::sink(type = "output", split = FALSE) [18:03:20.830] base::close(...future.stdout) [18:03:20.830] }, add = TRUE) [18:03:20.830] } [18:03:20.830] ...future.frame <- base::sys.nframe() [18:03:20.830] ...future.conditions <- base::list() [18:03:20.830] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.830] if (FALSE) { [18:03:20.830] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.830] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.830] } [18:03:20.830] ...future.result <- base::tryCatch({ [18:03:20.830] base::withCallingHandlers({ [18:03:20.830] ...future.value <- base::withVisible(base::local({ [18:03:20.830] ...future.makeSendCondition <- local({ [18:03:20.830] sendCondition <- NULL [18:03:20.830] function(frame = 1L) { [18:03:20.830] if (is.function(sendCondition)) [18:03:20.830] return(sendCondition) [18:03:20.830] ns <- getNamespace("parallel") [18:03:20.830] if (exists("sendData", mode = "function", [18:03:20.830] envir = ns)) { [18:03:20.830] parallel_sendData <- get("sendData", mode = "function", [18:03:20.830] envir = ns) [18:03:20.830] envir <- sys.frame(frame) [18:03:20.830] master <- NULL [18:03:20.830] while (!identical(envir, .GlobalEnv) && [18:03:20.830] !identical(envir, emptyenv())) { [18:03:20.830] if (exists("master", mode = "list", envir = envir, [18:03:20.830] inherits = FALSE)) { [18:03:20.830] master <- get("master", mode = "list", [18:03:20.830] envir = envir, inherits = FALSE) [18:03:20.830] if (inherits(master, c("SOCKnode", [18:03:20.830] "SOCK0node"))) { [18:03:20.830] sendCondition <<- function(cond) { [18:03:20.830] data <- list(type = "VALUE", value = cond, [18:03:20.830] success = TRUE) [18:03:20.830] parallel_sendData(master, data) [18:03:20.830] } [18:03:20.830] return(sendCondition) [18:03:20.830] } [18:03:20.830] } [18:03:20.830] frame <- frame + 1L [18:03:20.830] envir <- sys.frame(frame) [18:03:20.830] } [18:03:20.830] } [18:03:20.830] sendCondition <<- function(cond) NULL [18:03:20.830] } [18:03:20.830] }) [18:03:20.830] withCallingHandlers({ [18:03:20.830] { [18:03:20.830] sample(x, size = 1L) [18:03:20.830] } [18:03:20.830] }, immediateCondition = function(cond) { [18:03:20.830] sendCondition <- ...future.makeSendCondition() [18:03:20.830] sendCondition(cond) [18:03:20.830] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.830] { [18:03:20.830] inherits <- base::inherits [18:03:20.830] invokeRestart <- base::invokeRestart [18:03:20.830] is.null <- base::is.null [18:03:20.830] muffled <- FALSE [18:03:20.830] if (inherits(cond, "message")) { [18:03:20.830] muffled <- grepl(pattern, "muffleMessage") [18:03:20.830] if (muffled) [18:03:20.830] invokeRestart("muffleMessage") [18:03:20.830] } [18:03:20.830] else if (inherits(cond, "warning")) { [18:03:20.830] muffled <- grepl(pattern, "muffleWarning") [18:03:20.830] if (muffled) [18:03:20.830] invokeRestart("muffleWarning") [18:03:20.830] } [18:03:20.830] else if (inherits(cond, "condition")) { [18:03:20.830] if (!is.null(pattern)) { [18:03:20.830] computeRestarts <- base::computeRestarts [18:03:20.830] grepl <- base::grepl [18:03:20.830] restarts <- computeRestarts(cond) [18:03:20.830] for (restart in restarts) { [18:03:20.830] name <- restart$name [18:03:20.830] if (is.null(name)) [18:03:20.830] next [18:03:20.830] if (!grepl(pattern, name)) [18:03:20.830] next [18:03:20.830] invokeRestart(restart) [18:03:20.830] muffled <- TRUE [18:03:20.830] break [18:03:20.830] } [18:03:20.830] } [18:03:20.830] } [18:03:20.830] invisible(muffled) [18:03:20.830] } [18:03:20.830] muffleCondition(cond) [18:03:20.830] }) [18:03:20.830] })) [18:03:20.830] future::FutureResult(value = ...future.value$value, [18:03:20.830] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.830] ...future.rng), globalenv = if (FALSE) [18:03:20.830] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.830] ...future.globalenv.names)) [18:03:20.830] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.830] }, condition = base::local({ [18:03:20.830] c <- base::c [18:03:20.830] inherits <- base::inherits [18:03:20.830] invokeRestart <- base::invokeRestart [18:03:20.830] length <- base::length [18:03:20.830] list <- base::list [18:03:20.830] seq.int <- base::seq.int [18:03:20.830] signalCondition <- base::signalCondition [18:03:20.830] sys.calls <- base::sys.calls [18:03:20.830] `[[` <- base::`[[` [18:03:20.830] `+` <- base::`+` [18:03:20.830] `<<-` <- base::`<<-` [18:03:20.830] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.830] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.830] 3L)] [18:03:20.830] } [18:03:20.830] function(cond) { [18:03:20.830] is_error <- inherits(cond, "error") [18:03:20.830] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.830] NULL) [18:03:20.830] if (is_error) { [18:03:20.830] sessionInformation <- function() { [18:03:20.830] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.830] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.830] search = base::search(), system = base::Sys.info()) [18:03:20.830] } [18:03:20.830] ...future.conditions[[length(...future.conditions) + [18:03:20.830] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.830] cond$call), session = sessionInformation(), [18:03:20.830] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.830] signalCondition(cond) [18:03:20.830] } [18:03:20.830] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.830] "immediateCondition"))) { [18:03:20.830] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.830] ...future.conditions[[length(...future.conditions) + [18:03:20.830] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.830] if (TRUE && !signal) { [18:03:20.830] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.830] { [18:03:20.830] inherits <- base::inherits [18:03:20.830] invokeRestart <- base::invokeRestart [18:03:20.830] is.null <- base::is.null [18:03:20.830] muffled <- FALSE [18:03:20.830] if (inherits(cond, "message")) { [18:03:20.830] muffled <- grepl(pattern, "muffleMessage") [18:03:20.830] if (muffled) [18:03:20.830] invokeRestart("muffleMessage") [18:03:20.830] } [18:03:20.830] else if (inherits(cond, "warning")) { [18:03:20.830] muffled <- grepl(pattern, "muffleWarning") [18:03:20.830] if (muffled) [18:03:20.830] invokeRestart("muffleWarning") [18:03:20.830] } [18:03:20.830] else if (inherits(cond, "condition")) { [18:03:20.830] if (!is.null(pattern)) { [18:03:20.830] computeRestarts <- base::computeRestarts [18:03:20.830] grepl <- base::grepl [18:03:20.830] restarts <- computeRestarts(cond) [18:03:20.830] for (restart in restarts) { [18:03:20.830] name <- restart$name [18:03:20.830] if (is.null(name)) [18:03:20.830] next [18:03:20.830] if (!grepl(pattern, name)) [18:03:20.830] next [18:03:20.830] invokeRestart(restart) [18:03:20.830] muffled <- TRUE [18:03:20.830] break [18:03:20.830] } [18:03:20.830] } [18:03:20.830] } [18:03:20.830] invisible(muffled) [18:03:20.830] } [18:03:20.830] muffleCondition(cond, pattern = "^muffle") [18:03:20.830] } [18:03:20.830] } [18:03:20.830] else { [18:03:20.830] if (TRUE) { [18:03:20.830] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.830] { [18:03:20.830] inherits <- base::inherits [18:03:20.830] invokeRestart <- base::invokeRestart [18:03:20.830] is.null <- base::is.null [18:03:20.830] muffled <- FALSE [18:03:20.830] if (inherits(cond, "message")) { [18:03:20.830] muffled <- grepl(pattern, "muffleMessage") [18:03:20.830] if (muffled) [18:03:20.830] invokeRestart("muffleMessage") [18:03:20.830] } [18:03:20.830] else if (inherits(cond, "warning")) { [18:03:20.830] muffled <- grepl(pattern, "muffleWarning") [18:03:20.830] if (muffled) [18:03:20.830] invokeRestart("muffleWarning") [18:03:20.830] } [18:03:20.830] else if (inherits(cond, "condition")) { [18:03:20.830] if (!is.null(pattern)) { [18:03:20.830] computeRestarts <- base::computeRestarts [18:03:20.830] grepl <- base::grepl [18:03:20.830] restarts <- computeRestarts(cond) [18:03:20.830] for (restart in restarts) { [18:03:20.830] name <- restart$name [18:03:20.830] if (is.null(name)) [18:03:20.830] next [18:03:20.830] if (!grepl(pattern, name)) [18:03:20.830] next [18:03:20.830] invokeRestart(restart) [18:03:20.830] muffled <- TRUE [18:03:20.830] break [18:03:20.830] } [18:03:20.830] } [18:03:20.830] } [18:03:20.830] invisible(muffled) [18:03:20.830] } [18:03:20.830] muffleCondition(cond, pattern = "^muffle") [18:03:20.830] } [18:03:20.830] } [18:03:20.830] } [18:03:20.830] })) [18:03:20.830] }, error = function(ex) { [18:03:20.830] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.830] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.830] ...future.rng), started = ...future.startTime, [18:03:20.830] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.830] version = "1.8"), class = "FutureResult") [18:03:20.830] }, finally = { [18:03:20.830] if (!identical(...future.workdir, getwd())) [18:03:20.830] setwd(...future.workdir) [18:03:20.830] { [18:03:20.830] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.830] ...future.oldOptions$nwarnings <- NULL [18:03:20.830] } [18:03:20.830] base::options(...future.oldOptions) [18:03:20.830] if (.Platform$OS.type == "windows") { [18:03:20.830] old_names <- names(...future.oldEnvVars) [18:03:20.830] envs <- base::Sys.getenv() [18:03:20.830] names <- names(envs) [18:03:20.830] common <- intersect(names, old_names) [18:03:20.830] added <- setdiff(names, old_names) [18:03:20.830] removed <- setdiff(old_names, names) [18:03:20.830] changed <- common[...future.oldEnvVars[common] != [18:03:20.830] envs[common]] [18:03:20.830] NAMES <- toupper(changed) [18:03:20.830] args <- list() [18:03:20.830] for (kk in seq_along(NAMES)) { [18:03:20.830] name <- changed[[kk]] [18:03:20.830] NAME <- NAMES[[kk]] [18:03:20.830] if (name != NAME && is.element(NAME, old_names)) [18:03:20.830] next [18:03:20.830] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.830] } [18:03:20.830] NAMES <- toupper(added) [18:03:20.830] for (kk in seq_along(NAMES)) { [18:03:20.830] name <- added[[kk]] [18:03:20.830] NAME <- NAMES[[kk]] [18:03:20.830] if (name != NAME && is.element(NAME, old_names)) [18:03:20.830] next [18:03:20.830] args[[name]] <- "" [18:03:20.830] } [18:03:20.830] NAMES <- toupper(removed) [18:03:20.830] for (kk in seq_along(NAMES)) { [18:03:20.830] name <- removed[[kk]] [18:03:20.830] NAME <- NAMES[[kk]] [18:03:20.830] if (name != NAME && is.element(NAME, old_names)) [18:03:20.830] next [18:03:20.830] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.830] } [18:03:20.830] if (length(args) > 0) [18:03:20.830] base::do.call(base::Sys.setenv, args = args) [18:03:20.830] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.830] } [18:03:20.830] else { [18:03:20.830] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.830] } [18:03:20.830] { [18:03:20.830] if (base::length(...future.futureOptionsAdded) > [18:03:20.830] 0L) { [18:03:20.830] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.830] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.830] base::options(opts) [18:03:20.830] } [18:03:20.830] { [18:03:20.830] { [18:03:20.830] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.830] NULL [18:03:20.830] } [18:03:20.830] options(future.plan = NULL) [18:03:20.830] if (is.na(NA_character_)) [18:03:20.830] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.830] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.830] future::plan(list(function (..., workers = availableCores(), [18:03:20.830] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.830] envir = parent.frame()) [18:03:20.830] { [18:03:20.830] if (is.function(workers)) [18:03:20.830] workers <- workers() [18:03:20.830] workers <- structure(as.integer(workers), [18:03:20.830] class = class(workers)) [18:03:20.830] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.830] workers >= 1) [18:03:20.830] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.830] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.830] } [18:03:20.830] future <- MultisessionFuture(..., workers = workers, [18:03:20.830] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.830] envir = envir) [18:03:20.830] if (!future$lazy) [18:03:20.830] future <- run(future) [18:03:20.830] invisible(future) [18:03:20.830] }), .cleanup = FALSE, .init = FALSE) [18:03:20.830] } [18:03:20.830] } [18:03:20.830] } [18:03:20.830] }) [18:03:20.830] if (TRUE) { [18:03:20.830] base::sink(type = "output", split = FALSE) [18:03:20.830] if (TRUE) { [18:03:20.830] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.830] } [18:03:20.830] else { [18:03:20.830] ...future.result["stdout"] <- base::list(NULL) [18:03:20.830] } [18:03:20.830] base::close(...future.stdout) [18:03:20.830] ...future.stdout <- NULL [18:03:20.830] } [18:03:20.830] ...future.result$conditions <- ...future.conditions [18:03:20.830] ...future.result$finished <- base::Sys.time() [18:03:20.830] ...future.result [18:03:20.830] } [18:03:20.834] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.846] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.846] - Validating connection of MultisessionFuture [18:03:20.846] - received message: FutureResult [18:03:20.846] - Received FutureResult [18:03:20.846] - Erased future from FutureRegistry [18:03:20.847] result() for ClusterFuture ... [18:03:20.847] - result already collected: FutureResult [18:03:20.847] result() for ClusterFuture ... done [18:03:20.847] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.847] result() for ClusterFuture ... [18:03:20.847] - result already collected: FutureResult [18:03:20.848] result() for ClusterFuture ... done [18:03:20.848] result() for ClusterFuture ... [18:03:20.848] - result already collected: FutureResult [18:03:20.848] result() for ClusterFuture ... done [18:03:20.849] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.849] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.850] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.850] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.850] MultisessionFuture started [18:03:20.851] - Launch lazy future ... done [18:03:20.851] run() for 'MultisessionFuture' ... done [18:03:20.851] result() for ClusterFuture ... [18:03:20.851] - result already collected: FutureResult [18:03:20.851] result() for ClusterFuture ... done [18:03:20.852] result() for ClusterFuture ... [18:03:20.852] - result already collected: FutureResult [18:03:20.852] result() for ClusterFuture ... done [18:03:20.852] signalConditions() ... [18:03:20.852] - include = 'immediateCondition' [18:03:20.852] - exclude = [18:03:20.853] - resignal = FALSE [18:03:20.853] - Number of conditions: 1 [18:03:20.853] signalConditions() ... done [18:03:20.853] Future state: 'finished' [18:03:20.853] result() for ClusterFuture ... [18:03:20.853] - result already collected: FutureResult [18:03:20.854] result() for ClusterFuture ... done [18:03:20.854] signalConditions() ... [18:03:20.854] - include = 'condition' [18:03:20.854] - exclude = 'immediateCondition' [18:03:20.854] - resignal = TRUE [18:03:20.854] - Number of conditions: 1 [18:03:20.855] - Condition #1: 'RngFutureWarning', 'FutureWarning', 'warning', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:20.855] signalConditions() ... done Future UUID: 332917a1-5c73-222d-b2fe-83f57dfcb8f0 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: MultisessionFuture: Label: 'fsample_1-337766' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f6d8dd10 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureWarning' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:20.856] getGlobalsAndPackages() ... [18:03:20.856] Searching for globals... [18:03:20.858] - globals found: [3] '{', 'sample', 'x' [18:03:20.858] Searching for globals ... DONE [18:03:20.858] Resolving globals: FALSE [18:03:20.858] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.859] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.859] - globals: [1] 'x' [18:03:20.859] [18:03:20.859] getGlobalsAndPackages() ... DONE [18:03:20.860] run() for 'Future' ... [18:03:20.860] - state: 'created' [18:03:20.860] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.875] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.875] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.875] - Field: 'node' [18:03:20.875] - Field: 'label' [18:03:20.876] - Field: 'local' [18:03:20.876] - Field: 'owner' [18:03:20.876] - Field: 'envir' [18:03:20.876] - Field: 'workers' [18:03:20.876] - Field: 'packages' [18:03:20.876] - Field: 'gc' [18:03:20.877] - Field: 'conditions' [18:03:20.877] - Field: 'persistent' [18:03:20.877] - Field: 'expr' [18:03:20.877] - Field: 'uuid' [18:03:20.877] - Field: 'seed' [18:03:20.878] - Field: 'version' [18:03:20.878] - Field: 'result' [18:03:20.878] - Field: 'asynchronous' [18:03:20.878] - Field: 'calls' [18:03:20.878] - Field: 'globals' [18:03:20.879] - Field: 'stdout' [18:03:20.879] - Field: 'earlySignal' [18:03:20.879] - Field: 'lazy' [18:03:20.879] - Field: 'state' [18:03:20.879] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.879] - Launch lazy future ... [18:03:20.880] Packages needed by the future expression (n = 0): [18:03:20.880] Packages needed by future strategies (n = 0): [18:03:20.881] { [18:03:20.881] { [18:03:20.881] { [18:03:20.881] ...future.startTime <- base::Sys.time() [18:03:20.881] { [18:03:20.881] { [18:03:20.881] { [18:03:20.881] { [18:03:20.881] base::local({ [18:03:20.881] has_future <- base::requireNamespace("future", [18:03:20.881] quietly = TRUE) [18:03:20.881] if (has_future) { [18:03:20.881] ns <- base::getNamespace("future") [18:03:20.881] version <- ns[[".package"]][["version"]] [18:03:20.881] if (is.null(version)) [18:03:20.881] version <- utils::packageVersion("future") [18:03:20.881] } [18:03:20.881] else { [18:03:20.881] version <- NULL [18:03:20.881] } [18:03:20.881] if (!has_future || version < "1.8.0") { [18:03:20.881] info <- base::c(r_version = base::gsub("R version ", [18:03:20.881] "", base::R.version$version.string), [18:03:20.881] platform = base::sprintf("%s (%s-bit)", [18:03:20.881] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.881] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.881] "release", "version")], collapse = " "), [18:03:20.881] hostname = base::Sys.info()[["nodename"]]) [18:03:20.881] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.881] info) [18:03:20.881] info <- base::paste(info, collapse = "; ") [18:03:20.881] if (!has_future) { [18:03:20.881] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.881] info) [18:03:20.881] } [18:03:20.881] else { [18:03:20.881] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.881] info, version) [18:03:20.881] } [18:03:20.881] base::stop(msg) [18:03:20.881] } [18:03:20.881] }) [18:03:20.881] } [18:03:20.881] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.881] base::options(mc.cores = 1L) [18:03:20.881] } [18:03:20.881] options(future.plan = NULL) [18:03:20.881] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.881] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.881] } [18:03:20.881] ...future.workdir <- getwd() [18:03:20.881] } [18:03:20.881] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.881] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.881] } [18:03:20.881] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.881] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.881] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.881] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.881] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:20.881] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.881] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.881] base::names(...future.oldOptions)) [18:03:20.881] } [18:03:20.881] if (FALSE) { [18:03:20.881] } [18:03:20.881] else { [18:03:20.881] if (TRUE) { [18:03:20.881] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.881] open = "w") [18:03:20.881] } [18:03:20.881] else { [18:03:20.881] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.881] windows = "NUL", "/dev/null"), open = "w") [18:03:20.881] } [18:03:20.881] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.881] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.881] base::sink(type = "output", split = FALSE) [18:03:20.881] base::close(...future.stdout) [18:03:20.881] }, add = TRUE) [18:03:20.881] } [18:03:20.881] ...future.frame <- base::sys.nframe() [18:03:20.881] ...future.conditions <- base::list() [18:03:20.881] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.881] if (FALSE) { [18:03:20.881] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.881] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.881] } [18:03:20.881] ...future.result <- base::tryCatch({ [18:03:20.881] base::withCallingHandlers({ [18:03:20.881] ...future.value <- base::withVisible(base::local({ [18:03:20.881] ...future.makeSendCondition <- local({ [18:03:20.881] sendCondition <- NULL [18:03:20.881] function(frame = 1L) { [18:03:20.881] if (is.function(sendCondition)) [18:03:20.881] return(sendCondition) [18:03:20.881] ns <- getNamespace("parallel") [18:03:20.881] if (exists("sendData", mode = "function", [18:03:20.881] envir = ns)) { [18:03:20.881] parallel_sendData <- get("sendData", mode = "function", [18:03:20.881] envir = ns) [18:03:20.881] envir <- sys.frame(frame) [18:03:20.881] master <- NULL [18:03:20.881] while (!identical(envir, .GlobalEnv) && [18:03:20.881] !identical(envir, emptyenv())) { [18:03:20.881] if (exists("master", mode = "list", envir = envir, [18:03:20.881] inherits = FALSE)) { [18:03:20.881] master <- get("master", mode = "list", [18:03:20.881] envir = envir, inherits = FALSE) [18:03:20.881] if (inherits(master, c("SOCKnode", [18:03:20.881] "SOCK0node"))) { [18:03:20.881] sendCondition <<- function(cond) { [18:03:20.881] data <- list(type = "VALUE", value = cond, [18:03:20.881] success = TRUE) [18:03:20.881] parallel_sendData(master, data) [18:03:20.881] } [18:03:20.881] return(sendCondition) [18:03:20.881] } [18:03:20.881] } [18:03:20.881] frame <- frame + 1L [18:03:20.881] envir <- sys.frame(frame) [18:03:20.881] } [18:03:20.881] } [18:03:20.881] sendCondition <<- function(cond) NULL [18:03:20.881] } [18:03:20.881] }) [18:03:20.881] withCallingHandlers({ [18:03:20.881] { [18:03:20.881] sample(x, size = 1L) [18:03:20.881] } [18:03:20.881] }, immediateCondition = function(cond) { [18:03:20.881] sendCondition <- ...future.makeSendCondition() [18:03:20.881] sendCondition(cond) [18:03:20.881] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.881] { [18:03:20.881] inherits <- base::inherits [18:03:20.881] invokeRestart <- base::invokeRestart [18:03:20.881] is.null <- base::is.null [18:03:20.881] muffled <- FALSE [18:03:20.881] if (inherits(cond, "message")) { [18:03:20.881] muffled <- grepl(pattern, "muffleMessage") [18:03:20.881] if (muffled) [18:03:20.881] invokeRestart("muffleMessage") [18:03:20.881] } [18:03:20.881] else if (inherits(cond, "warning")) { [18:03:20.881] muffled <- grepl(pattern, "muffleWarning") [18:03:20.881] if (muffled) [18:03:20.881] invokeRestart("muffleWarning") [18:03:20.881] } [18:03:20.881] else if (inherits(cond, "condition")) { [18:03:20.881] if (!is.null(pattern)) { [18:03:20.881] computeRestarts <- base::computeRestarts [18:03:20.881] grepl <- base::grepl [18:03:20.881] restarts <- computeRestarts(cond) [18:03:20.881] for (restart in restarts) { [18:03:20.881] name <- restart$name [18:03:20.881] if (is.null(name)) [18:03:20.881] next [18:03:20.881] if (!grepl(pattern, name)) [18:03:20.881] next [18:03:20.881] invokeRestart(restart) [18:03:20.881] muffled <- TRUE [18:03:20.881] break [18:03:20.881] } [18:03:20.881] } [18:03:20.881] } [18:03:20.881] invisible(muffled) [18:03:20.881] } [18:03:20.881] muffleCondition(cond) [18:03:20.881] }) [18:03:20.881] })) [18:03:20.881] future::FutureResult(value = ...future.value$value, [18:03:20.881] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.881] ...future.rng), globalenv = if (FALSE) [18:03:20.881] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.881] ...future.globalenv.names)) [18:03:20.881] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.881] }, condition = base::local({ [18:03:20.881] c <- base::c [18:03:20.881] inherits <- base::inherits [18:03:20.881] invokeRestart <- base::invokeRestart [18:03:20.881] length <- base::length [18:03:20.881] list <- base::list [18:03:20.881] seq.int <- base::seq.int [18:03:20.881] signalCondition <- base::signalCondition [18:03:20.881] sys.calls <- base::sys.calls [18:03:20.881] `[[` <- base::`[[` [18:03:20.881] `+` <- base::`+` [18:03:20.881] `<<-` <- base::`<<-` [18:03:20.881] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.881] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.881] 3L)] [18:03:20.881] } [18:03:20.881] function(cond) { [18:03:20.881] is_error <- inherits(cond, "error") [18:03:20.881] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.881] NULL) [18:03:20.881] if (is_error) { [18:03:20.881] sessionInformation <- function() { [18:03:20.881] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.881] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.881] search = base::search(), system = base::Sys.info()) [18:03:20.881] } [18:03:20.881] ...future.conditions[[length(...future.conditions) + [18:03:20.881] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.881] cond$call), session = sessionInformation(), [18:03:20.881] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.881] signalCondition(cond) [18:03:20.881] } [18:03:20.881] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.881] "immediateCondition"))) { [18:03:20.881] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.881] ...future.conditions[[length(...future.conditions) + [18:03:20.881] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.881] if (TRUE && !signal) { [18:03:20.881] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.881] { [18:03:20.881] inherits <- base::inherits [18:03:20.881] invokeRestart <- base::invokeRestart [18:03:20.881] is.null <- base::is.null [18:03:20.881] muffled <- FALSE [18:03:20.881] if (inherits(cond, "message")) { [18:03:20.881] muffled <- grepl(pattern, "muffleMessage") [18:03:20.881] if (muffled) [18:03:20.881] invokeRestart("muffleMessage") [18:03:20.881] } [18:03:20.881] else if (inherits(cond, "warning")) { [18:03:20.881] muffled <- grepl(pattern, "muffleWarning") [18:03:20.881] if (muffled) [18:03:20.881] invokeRestart("muffleWarning") [18:03:20.881] } [18:03:20.881] else if (inherits(cond, "condition")) { [18:03:20.881] if (!is.null(pattern)) { [18:03:20.881] computeRestarts <- base::computeRestarts [18:03:20.881] grepl <- base::grepl [18:03:20.881] restarts <- computeRestarts(cond) [18:03:20.881] for (restart in restarts) { [18:03:20.881] name <- restart$name [18:03:20.881] if (is.null(name)) [18:03:20.881] next [18:03:20.881] if (!grepl(pattern, name)) [18:03:20.881] next [18:03:20.881] invokeRestart(restart) [18:03:20.881] muffled <- TRUE [18:03:20.881] break [18:03:20.881] } [18:03:20.881] } [18:03:20.881] } [18:03:20.881] invisible(muffled) [18:03:20.881] } [18:03:20.881] muffleCondition(cond, pattern = "^muffle") [18:03:20.881] } [18:03:20.881] } [18:03:20.881] else { [18:03:20.881] if (TRUE) { [18:03:20.881] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.881] { [18:03:20.881] inherits <- base::inherits [18:03:20.881] invokeRestart <- base::invokeRestart [18:03:20.881] is.null <- base::is.null [18:03:20.881] muffled <- FALSE [18:03:20.881] if (inherits(cond, "message")) { [18:03:20.881] muffled <- grepl(pattern, "muffleMessage") [18:03:20.881] if (muffled) [18:03:20.881] invokeRestart("muffleMessage") [18:03:20.881] } [18:03:20.881] else if (inherits(cond, "warning")) { [18:03:20.881] muffled <- grepl(pattern, "muffleWarning") [18:03:20.881] if (muffled) [18:03:20.881] invokeRestart("muffleWarning") [18:03:20.881] } [18:03:20.881] else if (inherits(cond, "condition")) { [18:03:20.881] if (!is.null(pattern)) { [18:03:20.881] computeRestarts <- base::computeRestarts [18:03:20.881] grepl <- base::grepl [18:03:20.881] restarts <- computeRestarts(cond) [18:03:20.881] for (restart in restarts) { [18:03:20.881] name <- restart$name [18:03:20.881] if (is.null(name)) [18:03:20.881] next [18:03:20.881] if (!grepl(pattern, name)) [18:03:20.881] next [18:03:20.881] invokeRestart(restart) [18:03:20.881] muffled <- TRUE [18:03:20.881] break [18:03:20.881] } [18:03:20.881] } [18:03:20.881] } [18:03:20.881] invisible(muffled) [18:03:20.881] } [18:03:20.881] muffleCondition(cond, pattern = "^muffle") [18:03:20.881] } [18:03:20.881] } [18:03:20.881] } [18:03:20.881] })) [18:03:20.881] }, error = function(ex) { [18:03:20.881] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.881] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.881] ...future.rng), started = ...future.startTime, [18:03:20.881] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.881] version = "1.8"), class = "FutureResult") [18:03:20.881] }, finally = { [18:03:20.881] if (!identical(...future.workdir, getwd())) [18:03:20.881] setwd(...future.workdir) [18:03:20.881] { [18:03:20.881] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.881] ...future.oldOptions$nwarnings <- NULL [18:03:20.881] } [18:03:20.881] base::options(...future.oldOptions) [18:03:20.881] if (.Platform$OS.type == "windows") { [18:03:20.881] old_names <- names(...future.oldEnvVars) [18:03:20.881] envs <- base::Sys.getenv() [18:03:20.881] names <- names(envs) [18:03:20.881] common <- intersect(names, old_names) [18:03:20.881] added <- setdiff(names, old_names) [18:03:20.881] removed <- setdiff(old_names, names) [18:03:20.881] changed <- common[...future.oldEnvVars[common] != [18:03:20.881] envs[common]] [18:03:20.881] NAMES <- toupper(changed) [18:03:20.881] args <- list() [18:03:20.881] for (kk in seq_along(NAMES)) { [18:03:20.881] name <- changed[[kk]] [18:03:20.881] NAME <- NAMES[[kk]] [18:03:20.881] if (name != NAME && is.element(NAME, old_names)) [18:03:20.881] next [18:03:20.881] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.881] } [18:03:20.881] NAMES <- toupper(added) [18:03:20.881] for (kk in seq_along(NAMES)) { [18:03:20.881] name <- added[[kk]] [18:03:20.881] NAME <- NAMES[[kk]] [18:03:20.881] if (name != NAME && is.element(NAME, old_names)) [18:03:20.881] next [18:03:20.881] args[[name]] <- "" [18:03:20.881] } [18:03:20.881] NAMES <- toupper(removed) [18:03:20.881] for (kk in seq_along(NAMES)) { [18:03:20.881] name <- removed[[kk]] [18:03:20.881] NAME <- NAMES[[kk]] [18:03:20.881] if (name != NAME && is.element(NAME, old_names)) [18:03:20.881] next [18:03:20.881] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.881] } [18:03:20.881] if (length(args) > 0) [18:03:20.881] base::do.call(base::Sys.setenv, args = args) [18:03:20.881] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.881] } [18:03:20.881] else { [18:03:20.881] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.881] } [18:03:20.881] { [18:03:20.881] if (base::length(...future.futureOptionsAdded) > [18:03:20.881] 0L) { [18:03:20.881] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.881] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.881] base::options(opts) [18:03:20.881] } [18:03:20.881] { [18:03:20.881] { [18:03:20.881] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.881] NULL [18:03:20.881] } [18:03:20.881] options(future.plan = NULL) [18:03:20.881] if (is.na(NA_character_)) [18:03:20.881] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.881] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.881] future::plan(list(function (..., workers = availableCores(), [18:03:20.881] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.881] envir = parent.frame()) [18:03:20.881] { [18:03:20.881] if (is.function(workers)) [18:03:20.881] workers <- workers() [18:03:20.881] workers <- structure(as.integer(workers), [18:03:20.881] class = class(workers)) [18:03:20.881] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.881] workers >= 1) [18:03:20.881] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.881] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.881] } [18:03:20.881] future <- MultisessionFuture(..., workers = workers, [18:03:20.881] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.881] envir = envir) [18:03:20.881] if (!future$lazy) [18:03:20.881] future <- run(future) [18:03:20.881] invisible(future) [18:03:20.881] }), .cleanup = FALSE, .init = FALSE) [18:03:20.881] } [18:03:20.881] } [18:03:20.881] } [18:03:20.881] }) [18:03:20.881] if (TRUE) { [18:03:20.881] base::sink(type = "output", split = FALSE) [18:03:20.881] if (TRUE) { [18:03:20.881] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.881] } [18:03:20.881] else { [18:03:20.881] ...future.result["stdout"] <- base::list(NULL) [18:03:20.881] } [18:03:20.881] base::close(...future.stdout) [18:03:20.881] ...future.stdout <- NULL [18:03:20.881] } [18:03:20.881] ...future.result$conditions <- ...future.conditions [18:03:20.881] ...future.result$finished <- base::Sys.time() [18:03:20.881] ...future.result [18:03:20.881] } [18:03:20.885] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.908] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.908] - Validating connection of MultisessionFuture [18:03:20.909] - received message: FutureResult [18:03:20.909] - Received FutureResult [18:03:20.909] - Erased future from FutureRegistry [18:03:20.909] result() for ClusterFuture ... [18:03:20.909] - result already collected: FutureResult [18:03:20.909] result() for ClusterFuture ... done [18:03:20.910] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.910] result() for ClusterFuture ... [18:03:20.910] - result already collected: FutureResult [18:03:20.910] result() for ClusterFuture ... done [18:03:20.910] result() for ClusterFuture ... [18:03:20.910] - result already collected: FutureResult [18:03:20.911] result() for ClusterFuture ... done [18:03:20.911] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:20.912] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:20.912] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:20.912] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:20.913] MultisessionFuture started [18:03:20.913] - Launch lazy future ... done [18:03:20.913] run() for 'MultisessionFuture' ... done [18:03:20.914] getGlobalsAndPackages() ... [18:03:20.914] Searching for globals... [18:03:20.915] - globals found: [3] '{', 'sample', 'x' [18:03:20.915] Searching for globals ... DONE [18:03:20.916] Resolving globals: FALSE [18:03:20.916] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.917] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.917] - globals: [1] 'x' [18:03:20.917] [18:03:20.917] getGlobalsAndPackages() ... DONE [18:03:20.917] run() for 'Future' ... [18:03:20.918] - state: 'created' [18:03:20.918] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.932] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.932] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.932] - Field: 'node' [18:03:20.932] - Field: 'label' [18:03:20.932] - Field: 'local' [18:03:20.933] - Field: 'owner' [18:03:20.933] - Field: 'envir' [18:03:20.933] - Field: 'workers' [18:03:20.933] - Field: 'packages' [18:03:20.933] - Field: 'gc' [18:03:20.933] - Field: 'conditions' [18:03:20.934] - Field: 'persistent' [18:03:20.934] - Field: 'expr' [18:03:20.934] - Field: 'uuid' [18:03:20.934] - Field: 'seed' [18:03:20.934] - Field: 'version' [18:03:20.935] - Field: 'result' [18:03:20.935] - Field: 'asynchronous' [18:03:20.935] - Field: 'calls' [18:03:20.935] - Field: 'globals' [18:03:20.935] - Field: 'stdout' [18:03:20.935] - Field: 'earlySignal' [18:03:20.936] - Field: 'lazy' [18:03:20.936] - Field: 'state' [18:03:20.936] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.936] - Launch lazy future ... [18:03:20.936] Packages needed by the future expression (n = 0): [18:03:20.937] Packages needed by future strategies (n = 0): [18:03:20.937] { [18:03:20.937] { [18:03:20.937] { [18:03:20.937] ...future.startTime <- base::Sys.time() [18:03:20.937] { [18:03:20.937] { [18:03:20.937] { [18:03:20.937] { [18:03:20.937] base::local({ [18:03:20.937] has_future <- base::requireNamespace("future", [18:03:20.937] quietly = TRUE) [18:03:20.937] if (has_future) { [18:03:20.937] ns <- base::getNamespace("future") [18:03:20.937] version <- ns[[".package"]][["version"]] [18:03:20.937] if (is.null(version)) [18:03:20.937] version <- utils::packageVersion("future") [18:03:20.937] } [18:03:20.937] else { [18:03:20.937] version <- NULL [18:03:20.937] } [18:03:20.937] if (!has_future || version < "1.8.0") { [18:03:20.937] info <- base::c(r_version = base::gsub("R version ", [18:03:20.937] "", base::R.version$version.string), [18:03:20.937] platform = base::sprintf("%s (%s-bit)", [18:03:20.937] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.937] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.937] "release", "version")], collapse = " "), [18:03:20.937] hostname = base::Sys.info()[["nodename"]]) [18:03:20.937] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.937] info) [18:03:20.937] info <- base::paste(info, collapse = "; ") [18:03:20.937] if (!has_future) { [18:03:20.937] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.937] info) [18:03:20.937] } [18:03:20.937] else { [18:03:20.937] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.937] info, version) [18:03:20.937] } [18:03:20.937] base::stop(msg) [18:03:20.937] } [18:03:20.937] }) [18:03:20.937] } [18:03:20.937] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.937] base::options(mc.cores = 1L) [18:03:20.937] } [18:03:20.937] options(future.plan = NULL) [18:03:20.937] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.937] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.937] } [18:03:20.937] ...future.workdir <- getwd() [18:03:20.937] } [18:03:20.937] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.937] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.937] } [18:03:20.937] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.937] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.937] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.937] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.937] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:20.937] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.937] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.937] base::names(...future.oldOptions)) [18:03:20.937] } [18:03:20.937] if (FALSE) { [18:03:20.937] } [18:03:20.937] else { [18:03:20.937] if (TRUE) { [18:03:20.937] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.937] open = "w") [18:03:20.937] } [18:03:20.937] else { [18:03:20.937] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.937] windows = "NUL", "/dev/null"), open = "w") [18:03:20.937] } [18:03:20.937] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.937] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.937] base::sink(type = "output", split = FALSE) [18:03:20.937] base::close(...future.stdout) [18:03:20.937] }, add = TRUE) [18:03:20.937] } [18:03:20.937] ...future.frame <- base::sys.nframe() [18:03:20.937] ...future.conditions <- base::list() [18:03:20.937] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.937] if (FALSE) { [18:03:20.937] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.937] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.937] } [18:03:20.937] ...future.result <- base::tryCatch({ [18:03:20.937] base::withCallingHandlers({ [18:03:20.937] ...future.value <- base::withVisible(base::local({ [18:03:20.937] ...future.makeSendCondition <- local({ [18:03:20.937] sendCondition <- NULL [18:03:20.937] function(frame = 1L) { [18:03:20.937] if (is.function(sendCondition)) [18:03:20.937] return(sendCondition) [18:03:20.937] ns <- getNamespace("parallel") [18:03:20.937] if (exists("sendData", mode = "function", [18:03:20.937] envir = ns)) { [18:03:20.937] parallel_sendData <- get("sendData", mode = "function", [18:03:20.937] envir = ns) [18:03:20.937] envir <- sys.frame(frame) [18:03:20.937] master <- NULL [18:03:20.937] while (!identical(envir, .GlobalEnv) && [18:03:20.937] !identical(envir, emptyenv())) { [18:03:20.937] if (exists("master", mode = "list", envir = envir, [18:03:20.937] inherits = FALSE)) { [18:03:20.937] master <- get("master", mode = "list", [18:03:20.937] envir = envir, inherits = FALSE) [18:03:20.937] if (inherits(master, c("SOCKnode", [18:03:20.937] "SOCK0node"))) { [18:03:20.937] sendCondition <<- function(cond) { [18:03:20.937] data <- list(type = "VALUE", value = cond, [18:03:20.937] success = TRUE) [18:03:20.937] parallel_sendData(master, data) [18:03:20.937] } [18:03:20.937] return(sendCondition) [18:03:20.937] } [18:03:20.937] } [18:03:20.937] frame <- frame + 1L [18:03:20.937] envir <- sys.frame(frame) [18:03:20.937] } [18:03:20.937] } [18:03:20.937] sendCondition <<- function(cond) NULL [18:03:20.937] } [18:03:20.937] }) [18:03:20.937] withCallingHandlers({ [18:03:20.937] { [18:03:20.937] sample(x, size = 1L) [18:03:20.937] } [18:03:20.937] }, immediateCondition = function(cond) { [18:03:20.937] sendCondition <- ...future.makeSendCondition() [18:03:20.937] sendCondition(cond) [18:03:20.937] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.937] { [18:03:20.937] inherits <- base::inherits [18:03:20.937] invokeRestart <- base::invokeRestart [18:03:20.937] is.null <- base::is.null [18:03:20.937] muffled <- FALSE [18:03:20.937] if (inherits(cond, "message")) { [18:03:20.937] muffled <- grepl(pattern, "muffleMessage") [18:03:20.937] if (muffled) [18:03:20.937] invokeRestart("muffleMessage") [18:03:20.937] } [18:03:20.937] else if (inherits(cond, "warning")) { [18:03:20.937] muffled <- grepl(pattern, "muffleWarning") [18:03:20.937] if (muffled) [18:03:20.937] invokeRestart("muffleWarning") [18:03:20.937] } [18:03:20.937] else if (inherits(cond, "condition")) { [18:03:20.937] if (!is.null(pattern)) { [18:03:20.937] computeRestarts <- base::computeRestarts [18:03:20.937] grepl <- base::grepl [18:03:20.937] restarts <- computeRestarts(cond) [18:03:20.937] for (restart in restarts) { [18:03:20.937] name <- restart$name [18:03:20.937] if (is.null(name)) [18:03:20.937] next [18:03:20.937] if (!grepl(pattern, name)) [18:03:20.937] next [18:03:20.937] invokeRestart(restart) [18:03:20.937] muffled <- TRUE [18:03:20.937] break [18:03:20.937] } [18:03:20.937] } [18:03:20.937] } [18:03:20.937] invisible(muffled) [18:03:20.937] } [18:03:20.937] muffleCondition(cond) [18:03:20.937] }) [18:03:20.937] })) [18:03:20.937] future::FutureResult(value = ...future.value$value, [18:03:20.937] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.937] ...future.rng), globalenv = if (FALSE) [18:03:20.937] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.937] ...future.globalenv.names)) [18:03:20.937] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.937] }, condition = base::local({ [18:03:20.937] c <- base::c [18:03:20.937] inherits <- base::inherits [18:03:20.937] invokeRestart <- base::invokeRestart [18:03:20.937] length <- base::length [18:03:20.937] list <- base::list [18:03:20.937] seq.int <- base::seq.int [18:03:20.937] signalCondition <- base::signalCondition [18:03:20.937] sys.calls <- base::sys.calls [18:03:20.937] `[[` <- base::`[[` [18:03:20.937] `+` <- base::`+` [18:03:20.937] `<<-` <- base::`<<-` [18:03:20.937] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.937] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.937] 3L)] [18:03:20.937] } [18:03:20.937] function(cond) { [18:03:20.937] is_error <- inherits(cond, "error") [18:03:20.937] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.937] NULL) [18:03:20.937] if (is_error) { [18:03:20.937] sessionInformation <- function() { [18:03:20.937] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.937] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.937] search = base::search(), system = base::Sys.info()) [18:03:20.937] } [18:03:20.937] ...future.conditions[[length(...future.conditions) + [18:03:20.937] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.937] cond$call), session = sessionInformation(), [18:03:20.937] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.937] signalCondition(cond) [18:03:20.937] } [18:03:20.937] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.937] "immediateCondition"))) { [18:03:20.937] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.937] ...future.conditions[[length(...future.conditions) + [18:03:20.937] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.937] if (TRUE && !signal) { [18:03:20.937] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.937] { [18:03:20.937] inherits <- base::inherits [18:03:20.937] invokeRestart <- base::invokeRestart [18:03:20.937] is.null <- base::is.null [18:03:20.937] muffled <- FALSE [18:03:20.937] if (inherits(cond, "message")) { [18:03:20.937] muffled <- grepl(pattern, "muffleMessage") [18:03:20.937] if (muffled) [18:03:20.937] invokeRestart("muffleMessage") [18:03:20.937] } [18:03:20.937] else if (inherits(cond, "warning")) { [18:03:20.937] muffled <- grepl(pattern, "muffleWarning") [18:03:20.937] if (muffled) [18:03:20.937] invokeRestart("muffleWarning") [18:03:20.937] } [18:03:20.937] else if (inherits(cond, "condition")) { [18:03:20.937] if (!is.null(pattern)) { [18:03:20.937] computeRestarts <- base::computeRestarts [18:03:20.937] grepl <- base::grepl [18:03:20.937] restarts <- computeRestarts(cond) [18:03:20.937] for (restart in restarts) { [18:03:20.937] name <- restart$name [18:03:20.937] if (is.null(name)) [18:03:20.937] next [18:03:20.937] if (!grepl(pattern, name)) [18:03:20.937] next [18:03:20.937] invokeRestart(restart) [18:03:20.937] muffled <- TRUE [18:03:20.937] break [18:03:20.937] } [18:03:20.937] } [18:03:20.937] } [18:03:20.937] invisible(muffled) [18:03:20.937] } [18:03:20.937] muffleCondition(cond, pattern = "^muffle") [18:03:20.937] } [18:03:20.937] } [18:03:20.937] else { [18:03:20.937] if (TRUE) { [18:03:20.937] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.937] { [18:03:20.937] inherits <- base::inherits [18:03:20.937] invokeRestart <- base::invokeRestart [18:03:20.937] is.null <- base::is.null [18:03:20.937] muffled <- FALSE [18:03:20.937] if (inherits(cond, "message")) { [18:03:20.937] muffled <- grepl(pattern, "muffleMessage") [18:03:20.937] if (muffled) [18:03:20.937] invokeRestart("muffleMessage") [18:03:20.937] } [18:03:20.937] else if (inherits(cond, "warning")) { [18:03:20.937] muffled <- grepl(pattern, "muffleWarning") [18:03:20.937] if (muffled) [18:03:20.937] invokeRestart("muffleWarning") [18:03:20.937] } [18:03:20.937] else if (inherits(cond, "condition")) { [18:03:20.937] if (!is.null(pattern)) { [18:03:20.937] computeRestarts <- base::computeRestarts [18:03:20.937] grepl <- base::grepl [18:03:20.937] restarts <- computeRestarts(cond) [18:03:20.937] for (restart in restarts) { [18:03:20.937] name <- restart$name [18:03:20.937] if (is.null(name)) [18:03:20.937] next [18:03:20.937] if (!grepl(pattern, name)) [18:03:20.937] next [18:03:20.937] invokeRestart(restart) [18:03:20.937] muffled <- TRUE [18:03:20.937] break [18:03:20.937] } [18:03:20.937] } [18:03:20.937] } [18:03:20.937] invisible(muffled) [18:03:20.937] } [18:03:20.937] muffleCondition(cond, pattern = "^muffle") [18:03:20.937] } [18:03:20.937] } [18:03:20.937] } [18:03:20.937] })) [18:03:20.937] }, error = function(ex) { [18:03:20.937] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.937] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.937] ...future.rng), started = ...future.startTime, [18:03:20.937] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.937] version = "1.8"), class = "FutureResult") [18:03:20.937] }, finally = { [18:03:20.937] if (!identical(...future.workdir, getwd())) [18:03:20.937] setwd(...future.workdir) [18:03:20.937] { [18:03:20.937] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.937] ...future.oldOptions$nwarnings <- NULL [18:03:20.937] } [18:03:20.937] base::options(...future.oldOptions) [18:03:20.937] if (.Platform$OS.type == "windows") { [18:03:20.937] old_names <- names(...future.oldEnvVars) [18:03:20.937] envs <- base::Sys.getenv() [18:03:20.937] names <- names(envs) [18:03:20.937] common <- intersect(names, old_names) [18:03:20.937] added <- setdiff(names, old_names) [18:03:20.937] removed <- setdiff(old_names, names) [18:03:20.937] changed <- common[...future.oldEnvVars[common] != [18:03:20.937] envs[common]] [18:03:20.937] NAMES <- toupper(changed) [18:03:20.937] args <- list() [18:03:20.937] for (kk in seq_along(NAMES)) { [18:03:20.937] name <- changed[[kk]] [18:03:20.937] NAME <- NAMES[[kk]] [18:03:20.937] if (name != NAME && is.element(NAME, old_names)) [18:03:20.937] next [18:03:20.937] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.937] } [18:03:20.937] NAMES <- toupper(added) [18:03:20.937] for (kk in seq_along(NAMES)) { [18:03:20.937] name <- added[[kk]] [18:03:20.937] NAME <- NAMES[[kk]] [18:03:20.937] if (name != NAME && is.element(NAME, old_names)) [18:03:20.937] next [18:03:20.937] args[[name]] <- "" [18:03:20.937] } [18:03:20.937] NAMES <- toupper(removed) [18:03:20.937] for (kk in seq_along(NAMES)) { [18:03:20.937] name <- removed[[kk]] [18:03:20.937] NAME <- NAMES[[kk]] [18:03:20.937] if (name != NAME && is.element(NAME, old_names)) [18:03:20.937] next [18:03:20.937] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.937] } [18:03:20.937] if (length(args) > 0) [18:03:20.937] base::do.call(base::Sys.setenv, args = args) [18:03:20.937] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.937] } [18:03:20.937] else { [18:03:20.937] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.937] } [18:03:20.937] { [18:03:20.937] if (base::length(...future.futureOptionsAdded) > [18:03:20.937] 0L) { [18:03:20.937] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.937] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.937] base::options(opts) [18:03:20.937] } [18:03:20.937] { [18:03:20.937] { [18:03:20.937] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.937] NULL [18:03:20.937] } [18:03:20.937] options(future.plan = NULL) [18:03:20.937] if (is.na(NA_character_)) [18:03:20.937] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.937] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.937] future::plan(list(function (..., workers = availableCores(), [18:03:20.937] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.937] envir = parent.frame()) [18:03:20.937] { [18:03:20.937] if (is.function(workers)) [18:03:20.937] workers <- workers() [18:03:20.937] workers <- structure(as.integer(workers), [18:03:20.937] class = class(workers)) [18:03:20.937] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.937] workers >= 1) [18:03:20.937] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.937] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.937] } [18:03:20.937] future <- MultisessionFuture(..., workers = workers, [18:03:20.937] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.937] envir = envir) [18:03:20.937] if (!future$lazy) [18:03:20.937] future <- run(future) [18:03:20.937] invisible(future) [18:03:20.937] }), .cleanup = FALSE, .init = FALSE) [18:03:20.937] } [18:03:20.937] } [18:03:20.937] } [18:03:20.937] }) [18:03:20.937] if (TRUE) { [18:03:20.937] base::sink(type = "output", split = FALSE) [18:03:20.937] if (TRUE) { [18:03:20.937] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.937] } [18:03:20.937] else { [18:03:20.937] ...future.result["stdout"] <- base::list(NULL) [18:03:20.937] } [18:03:20.937] base::close(...future.stdout) [18:03:20.937] ...future.stdout <- NULL [18:03:20.937] } [18:03:20.937] ...future.result$conditions <- ...future.conditions [18:03:20.937] ...future.result$finished <- base::Sys.time() [18:03:20.937] ...future.result [18:03:20.937] } [18:03:20.942] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:20.955] receiveMessageFromWorker() for ClusterFuture ... [18:03:20.955] - Validating connection of MultisessionFuture [18:03:20.955] - received message: FutureResult [18:03:20.956] - Received FutureResult [18:03:20.956] - Erased future from FutureRegistry [18:03:20.956] result() for ClusterFuture ... [18:03:20.956] - result already collected: FutureResult [18:03:20.956] result() for ClusterFuture ... done [18:03:20.956] receiveMessageFromWorker() for ClusterFuture ... done [18:03:20.957] result() for ClusterFuture ... [18:03:20.957] - result already collected: FutureResult [18:03:20.959] result() for ClusterFuture ... done [18:03:20.960] result() for ClusterFuture ... [18:03:20.960] - result already collected: FutureResult [18:03:20.960] result() for ClusterFuture ... done [18:03:20.961] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:20.961] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:20.962] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:20.962] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:20.962] MultisessionFuture started [18:03:20.963] - Launch lazy future ... done [18:03:20.963] run() for 'MultisessionFuture' ... done [18:03:20.964] getGlobalsAndPackages() ... [18:03:20.964] Searching for globals... [18:03:20.965] - globals found: [3] '{', 'sample', 'x' [18:03:20.965] Searching for globals ... DONE [18:03:20.965] Resolving globals: FALSE [18:03:20.966] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:20.966] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:20.966] - globals: [1] 'x' [18:03:20.967] [18:03:20.967] getGlobalsAndPackages() ... DONE [18:03:20.967] run() for 'Future' ... [18:03:20.967] - state: 'created' [18:03:20.967] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:20.981] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:20.981] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:20.981] - Field: 'node' [18:03:20.981] - Field: 'label' [18:03:20.982] - Field: 'local' [18:03:20.982] - Field: 'owner' [18:03:20.982] - Field: 'envir' [18:03:20.982] - Field: 'workers' [18:03:20.982] - Field: 'packages' [18:03:20.983] - Field: 'gc' [18:03:20.983] - Field: 'conditions' [18:03:20.983] - Field: 'persistent' [18:03:20.983] - Field: 'expr' [18:03:20.983] - Field: 'uuid' [18:03:20.983] - Field: 'seed' [18:03:20.984] - Field: 'version' [18:03:20.984] - Field: 'result' [18:03:20.984] - Field: 'asynchronous' [18:03:20.984] - Field: 'calls' [18:03:20.984] - Field: 'globals' [18:03:20.984] - Field: 'stdout' [18:03:20.985] - Field: 'earlySignal' [18:03:20.985] - Field: 'lazy' [18:03:20.985] - Field: 'state' [18:03:20.985] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:20.985] - Launch lazy future ... [18:03:20.986] Packages needed by the future expression (n = 0): [18:03:20.986] Packages needed by future strategies (n = 0): [18:03:20.986] { [18:03:20.986] { [18:03:20.986] { [18:03:20.986] ...future.startTime <- base::Sys.time() [18:03:20.986] { [18:03:20.986] { [18:03:20.986] { [18:03:20.986] { [18:03:20.986] base::local({ [18:03:20.986] has_future <- base::requireNamespace("future", [18:03:20.986] quietly = TRUE) [18:03:20.986] if (has_future) { [18:03:20.986] ns <- base::getNamespace("future") [18:03:20.986] version <- ns[[".package"]][["version"]] [18:03:20.986] if (is.null(version)) [18:03:20.986] version <- utils::packageVersion("future") [18:03:20.986] } [18:03:20.986] else { [18:03:20.986] version <- NULL [18:03:20.986] } [18:03:20.986] if (!has_future || version < "1.8.0") { [18:03:20.986] info <- base::c(r_version = base::gsub("R version ", [18:03:20.986] "", base::R.version$version.string), [18:03:20.986] platform = base::sprintf("%s (%s-bit)", [18:03:20.986] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:20.986] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:20.986] "release", "version")], collapse = " "), [18:03:20.986] hostname = base::Sys.info()[["nodename"]]) [18:03:20.986] info <- base::sprintf("%s: %s", base::names(info), [18:03:20.986] info) [18:03:20.986] info <- base::paste(info, collapse = "; ") [18:03:20.986] if (!has_future) { [18:03:20.986] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:20.986] info) [18:03:20.986] } [18:03:20.986] else { [18:03:20.986] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:20.986] info, version) [18:03:20.986] } [18:03:20.986] base::stop(msg) [18:03:20.986] } [18:03:20.986] }) [18:03:20.986] } [18:03:20.986] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:20.986] base::options(mc.cores = 1L) [18:03:20.986] } [18:03:20.986] options(future.plan = NULL) [18:03:20.986] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.986] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:20.986] } [18:03:20.986] ...future.workdir <- getwd() [18:03:20.986] } [18:03:20.986] ...future.oldOptions <- base::as.list(base::.Options) [18:03:20.986] ...future.oldEnvVars <- base::Sys.getenv() [18:03:20.986] } [18:03:20.986] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:20.986] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:20.986] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:20.986] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:20.986] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:20.986] future.stdout.windows.reencode = NULL, width = 80L) [18:03:20.986] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:20.986] base::names(...future.oldOptions)) [18:03:20.986] } [18:03:20.986] if (FALSE) { [18:03:20.986] } [18:03:20.986] else { [18:03:20.986] if (TRUE) { [18:03:20.986] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:20.986] open = "w") [18:03:20.986] } [18:03:20.986] else { [18:03:20.986] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:20.986] windows = "NUL", "/dev/null"), open = "w") [18:03:20.986] } [18:03:20.986] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:20.986] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:20.986] base::sink(type = "output", split = FALSE) [18:03:20.986] base::close(...future.stdout) [18:03:20.986] }, add = TRUE) [18:03:20.986] } [18:03:20.986] ...future.frame <- base::sys.nframe() [18:03:20.986] ...future.conditions <- base::list() [18:03:20.986] ...future.rng <- base::globalenv()$.Random.seed [18:03:20.986] if (FALSE) { [18:03:20.986] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:20.986] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:20.986] } [18:03:20.986] ...future.result <- base::tryCatch({ [18:03:20.986] base::withCallingHandlers({ [18:03:20.986] ...future.value <- base::withVisible(base::local({ [18:03:20.986] ...future.makeSendCondition <- local({ [18:03:20.986] sendCondition <- NULL [18:03:20.986] function(frame = 1L) { [18:03:20.986] if (is.function(sendCondition)) [18:03:20.986] return(sendCondition) [18:03:20.986] ns <- getNamespace("parallel") [18:03:20.986] if (exists("sendData", mode = "function", [18:03:20.986] envir = ns)) { [18:03:20.986] parallel_sendData <- get("sendData", mode = "function", [18:03:20.986] envir = ns) [18:03:20.986] envir <- sys.frame(frame) [18:03:20.986] master <- NULL [18:03:20.986] while (!identical(envir, .GlobalEnv) && [18:03:20.986] !identical(envir, emptyenv())) { [18:03:20.986] if (exists("master", mode = "list", envir = envir, [18:03:20.986] inherits = FALSE)) { [18:03:20.986] master <- get("master", mode = "list", [18:03:20.986] envir = envir, inherits = FALSE) [18:03:20.986] if (inherits(master, c("SOCKnode", [18:03:20.986] "SOCK0node"))) { [18:03:20.986] sendCondition <<- function(cond) { [18:03:20.986] data <- list(type = "VALUE", value = cond, [18:03:20.986] success = TRUE) [18:03:20.986] parallel_sendData(master, data) [18:03:20.986] } [18:03:20.986] return(sendCondition) [18:03:20.986] } [18:03:20.986] } [18:03:20.986] frame <- frame + 1L [18:03:20.986] envir <- sys.frame(frame) [18:03:20.986] } [18:03:20.986] } [18:03:20.986] sendCondition <<- function(cond) NULL [18:03:20.986] } [18:03:20.986] }) [18:03:20.986] withCallingHandlers({ [18:03:20.986] { [18:03:20.986] sample(x, size = 1L) [18:03:20.986] } [18:03:20.986] }, immediateCondition = function(cond) { [18:03:20.986] sendCondition <- ...future.makeSendCondition() [18:03:20.986] sendCondition(cond) [18:03:20.986] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.986] { [18:03:20.986] inherits <- base::inherits [18:03:20.986] invokeRestart <- base::invokeRestart [18:03:20.986] is.null <- base::is.null [18:03:20.986] muffled <- FALSE [18:03:20.986] if (inherits(cond, "message")) { [18:03:20.986] muffled <- grepl(pattern, "muffleMessage") [18:03:20.986] if (muffled) [18:03:20.986] invokeRestart("muffleMessage") [18:03:20.986] } [18:03:20.986] else if (inherits(cond, "warning")) { [18:03:20.986] muffled <- grepl(pattern, "muffleWarning") [18:03:20.986] if (muffled) [18:03:20.986] invokeRestart("muffleWarning") [18:03:20.986] } [18:03:20.986] else if (inherits(cond, "condition")) { [18:03:20.986] if (!is.null(pattern)) { [18:03:20.986] computeRestarts <- base::computeRestarts [18:03:20.986] grepl <- base::grepl [18:03:20.986] restarts <- computeRestarts(cond) [18:03:20.986] for (restart in restarts) { [18:03:20.986] name <- restart$name [18:03:20.986] if (is.null(name)) [18:03:20.986] next [18:03:20.986] if (!grepl(pattern, name)) [18:03:20.986] next [18:03:20.986] invokeRestart(restart) [18:03:20.986] muffled <- TRUE [18:03:20.986] break [18:03:20.986] } [18:03:20.986] } [18:03:20.986] } [18:03:20.986] invisible(muffled) [18:03:20.986] } [18:03:20.986] muffleCondition(cond) [18:03:20.986] }) [18:03:20.986] })) [18:03:20.986] future::FutureResult(value = ...future.value$value, [18:03:20.986] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.986] ...future.rng), globalenv = if (FALSE) [18:03:20.986] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:20.986] ...future.globalenv.names)) [18:03:20.986] else NULL, started = ...future.startTime, version = "1.8") [18:03:20.986] }, condition = base::local({ [18:03:20.986] c <- base::c [18:03:20.986] inherits <- base::inherits [18:03:20.986] invokeRestart <- base::invokeRestart [18:03:20.986] length <- base::length [18:03:20.986] list <- base::list [18:03:20.986] seq.int <- base::seq.int [18:03:20.986] signalCondition <- base::signalCondition [18:03:20.986] sys.calls <- base::sys.calls [18:03:20.986] `[[` <- base::`[[` [18:03:20.986] `+` <- base::`+` [18:03:20.986] `<<-` <- base::`<<-` [18:03:20.986] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:20.986] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:20.986] 3L)] [18:03:20.986] } [18:03:20.986] function(cond) { [18:03:20.986] is_error <- inherits(cond, "error") [18:03:20.986] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:20.986] NULL) [18:03:20.986] if (is_error) { [18:03:20.986] sessionInformation <- function() { [18:03:20.986] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:20.986] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:20.986] search = base::search(), system = base::Sys.info()) [18:03:20.986] } [18:03:20.986] ...future.conditions[[length(...future.conditions) + [18:03:20.986] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:20.986] cond$call), session = sessionInformation(), [18:03:20.986] timestamp = base::Sys.time(), signaled = 0L) [18:03:20.986] signalCondition(cond) [18:03:20.986] } [18:03:20.986] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:20.986] "immediateCondition"))) { [18:03:20.986] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:20.986] ...future.conditions[[length(...future.conditions) + [18:03:20.986] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:20.986] if (TRUE && !signal) { [18:03:20.986] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.986] { [18:03:20.986] inherits <- base::inherits [18:03:20.986] invokeRestart <- base::invokeRestart [18:03:20.986] is.null <- base::is.null [18:03:20.986] muffled <- FALSE [18:03:20.986] if (inherits(cond, "message")) { [18:03:20.986] muffled <- grepl(pattern, "muffleMessage") [18:03:20.986] if (muffled) [18:03:20.986] invokeRestart("muffleMessage") [18:03:20.986] } [18:03:20.986] else if (inherits(cond, "warning")) { [18:03:20.986] muffled <- grepl(pattern, "muffleWarning") [18:03:20.986] if (muffled) [18:03:20.986] invokeRestart("muffleWarning") [18:03:20.986] } [18:03:20.986] else if (inherits(cond, "condition")) { [18:03:20.986] if (!is.null(pattern)) { [18:03:20.986] computeRestarts <- base::computeRestarts [18:03:20.986] grepl <- base::grepl [18:03:20.986] restarts <- computeRestarts(cond) [18:03:20.986] for (restart in restarts) { [18:03:20.986] name <- restart$name [18:03:20.986] if (is.null(name)) [18:03:20.986] next [18:03:20.986] if (!grepl(pattern, name)) [18:03:20.986] next [18:03:20.986] invokeRestart(restart) [18:03:20.986] muffled <- TRUE [18:03:20.986] break [18:03:20.986] } [18:03:20.986] } [18:03:20.986] } [18:03:20.986] invisible(muffled) [18:03:20.986] } [18:03:20.986] muffleCondition(cond, pattern = "^muffle") [18:03:20.986] } [18:03:20.986] } [18:03:20.986] else { [18:03:20.986] if (TRUE) { [18:03:20.986] muffleCondition <- function (cond, pattern = "^muffle") [18:03:20.986] { [18:03:20.986] inherits <- base::inherits [18:03:20.986] invokeRestart <- base::invokeRestart [18:03:20.986] is.null <- base::is.null [18:03:20.986] muffled <- FALSE [18:03:20.986] if (inherits(cond, "message")) { [18:03:20.986] muffled <- grepl(pattern, "muffleMessage") [18:03:20.986] if (muffled) [18:03:20.986] invokeRestart("muffleMessage") [18:03:20.986] } [18:03:20.986] else if (inherits(cond, "warning")) { [18:03:20.986] muffled <- grepl(pattern, "muffleWarning") [18:03:20.986] if (muffled) [18:03:20.986] invokeRestart("muffleWarning") [18:03:20.986] } [18:03:20.986] else if (inherits(cond, "condition")) { [18:03:20.986] if (!is.null(pattern)) { [18:03:20.986] computeRestarts <- base::computeRestarts [18:03:20.986] grepl <- base::grepl [18:03:20.986] restarts <- computeRestarts(cond) [18:03:20.986] for (restart in restarts) { [18:03:20.986] name <- restart$name [18:03:20.986] if (is.null(name)) [18:03:20.986] next [18:03:20.986] if (!grepl(pattern, name)) [18:03:20.986] next [18:03:20.986] invokeRestart(restart) [18:03:20.986] muffled <- TRUE [18:03:20.986] break [18:03:20.986] } [18:03:20.986] } [18:03:20.986] } [18:03:20.986] invisible(muffled) [18:03:20.986] } [18:03:20.986] muffleCondition(cond, pattern = "^muffle") [18:03:20.986] } [18:03:20.986] } [18:03:20.986] } [18:03:20.986] })) [18:03:20.986] }, error = function(ex) { [18:03:20.986] base::structure(base::list(value = NULL, visible = NULL, [18:03:20.986] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:20.986] ...future.rng), started = ...future.startTime, [18:03:20.986] finished = Sys.time(), session_uuid = NA_character_, [18:03:20.986] version = "1.8"), class = "FutureResult") [18:03:20.986] }, finally = { [18:03:20.986] if (!identical(...future.workdir, getwd())) [18:03:20.986] setwd(...future.workdir) [18:03:20.986] { [18:03:20.986] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:20.986] ...future.oldOptions$nwarnings <- NULL [18:03:20.986] } [18:03:20.986] base::options(...future.oldOptions) [18:03:20.986] if (.Platform$OS.type == "windows") { [18:03:20.986] old_names <- names(...future.oldEnvVars) [18:03:20.986] envs <- base::Sys.getenv() [18:03:20.986] names <- names(envs) [18:03:20.986] common <- intersect(names, old_names) [18:03:20.986] added <- setdiff(names, old_names) [18:03:20.986] removed <- setdiff(old_names, names) [18:03:20.986] changed <- common[...future.oldEnvVars[common] != [18:03:20.986] envs[common]] [18:03:20.986] NAMES <- toupper(changed) [18:03:20.986] args <- list() [18:03:20.986] for (kk in seq_along(NAMES)) { [18:03:20.986] name <- changed[[kk]] [18:03:20.986] NAME <- NAMES[[kk]] [18:03:20.986] if (name != NAME && is.element(NAME, old_names)) [18:03:20.986] next [18:03:20.986] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.986] } [18:03:20.986] NAMES <- toupper(added) [18:03:20.986] for (kk in seq_along(NAMES)) { [18:03:20.986] name <- added[[kk]] [18:03:20.986] NAME <- NAMES[[kk]] [18:03:20.986] if (name != NAME && is.element(NAME, old_names)) [18:03:20.986] next [18:03:20.986] args[[name]] <- "" [18:03:20.986] } [18:03:20.986] NAMES <- toupper(removed) [18:03:20.986] for (kk in seq_along(NAMES)) { [18:03:20.986] name <- removed[[kk]] [18:03:20.986] NAME <- NAMES[[kk]] [18:03:20.986] if (name != NAME && is.element(NAME, old_names)) [18:03:20.986] next [18:03:20.986] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:20.986] } [18:03:20.986] if (length(args) > 0) [18:03:20.986] base::do.call(base::Sys.setenv, args = args) [18:03:20.986] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:20.986] } [18:03:20.986] else { [18:03:20.986] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:20.986] } [18:03:20.986] { [18:03:20.986] if (base::length(...future.futureOptionsAdded) > [18:03:20.986] 0L) { [18:03:20.986] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:20.986] base::names(opts) <- ...future.futureOptionsAdded [18:03:20.986] base::options(opts) [18:03:20.986] } [18:03:20.986] { [18:03:20.986] { [18:03:20.986] base::options(mc.cores = ...future.mc.cores.old) [18:03:20.986] NULL [18:03:20.986] } [18:03:20.986] options(future.plan = NULL) [18:03:20.986] if (is.na(NA_character_)) [18:03:20.986] Sys.unsetenv("R_FUTURE_PLAN") [18:03:20.986] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:20.986] future::plan(list(function (..., workers = availableCores(), [18:03:20.986] lazy = FALSE, rscript_libs = .libPaths(), [18:03:20.986] envir = parent.frame()) [18:03:20.986] { [18:03:20.986] if (is.function(workers)) [18:03:20.986] workers <- workers() [18:03:20.986] workers <- structure(as.integer(workers), [18:03:20.986] class = class(workers)) [18:03:20.986] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:20.986] workers >= 1) [18:03:20.986] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:20.986] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:20.986] } [18:03:20.986] future <- MultisessionFuture(..., workers = workers, [18:03:20.986] lazy = lazy, rscript_libs = rscript_libs, [18:03:20.986] envir = envir) [18:03:20.986] if (!future$lazy) [18:03:20.986] future <- run(future) [18:03:20.986] invisible(future) [18:03:20.986] }), .cleanup = FALSE, .init = FALSE) [18:03:20.986] } [18:03:20.986] } [18:03:20.986] } [18:03:20.986] }) [18:03:20.986] if (TRUE) { [18:03:20.986] base::sink(type = "output", split = FALSE) [18:03:20.986] if (TRUE) { [18:03:20.986] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:20.986] } [18:03:20.986] else { [18:03:20.986] ...future.result["stdout"] <- base::list(NULL) [18:03:20.986] } [18:03:20.986] base::close(...future.stdout) [18:03:20.986] ...future.stdout <- NULL [18:03:20.986] } [18:03:20.986] ...future.result$conditions <- ...future.conditions [18:03:20.986] ...future.result$finished <- base::Sys.time() [18:03:20.986] ...future.result [18:03:20.986] } [18:03:20.991] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.002] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.002] - Validating connection of MultisessionFuture [18:03:21.002] - received message: FutureResult [18:03:21.003] - Received FutureResult [18:03:21.003] - Erased future from FutureRegistry [18:03:21.003] result() for ClusterFuture ... [18:03:21.003] - result already collected: FutureResult [18:03:21.003] result() for ClusterFuture ... done [18:03:21.004] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.004] result() for ClusterFuture ... [18:03:21.004] - result already collected: FutureResult [18:03:21.004] result() for ClusterFuture ... done [18:03:21.004] result() for ClusterFuture ... [18:03:21.004] - result already collected: FutureResult [18:03:21.005] result() for ClusterFuture ... done [18:03:21.005] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:21.006] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:21.006] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:21.006] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:21.007] MultisessionFuture started [18:03:21.007] - Launch lazy future ... done [18:03:21.007] run() for 'MultisessionFuture' ... done [18:03:21.008] getGlobalsAndPackages() ... [18:03:21.008] Searching for globals... [18:03:21.009] - globals found: [3] '{', 'sample', 'x' [18:03:21.009] Searching for globals ... DONE [18:03:21.010] Resolving globals: FALSE [18:03:21.010] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.011] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.011] - globals: [1] 'x' [18:03:21.011] [18:03:21.011] getGlobalsAndPackages() ... DONE [18:03:21.011] run() for 'Future' ... [18:03:21.012] - state: 'created' [18:03:21.012] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.027] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.027] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.027] - Field: 'node' [18:03:21.028] - Field: 'label' [18:03:21.028] - Field: 'local' [18:03:21.028] - Field: 'owner' [18:03:21.028] - Field: 'envir' [18:03:21.028] - Field: 'workers' [18:03:21.028] - Field: 'packages' [18:03:21.029] - Field: 'gc' [18:03:21.029] - Field: 'conditions' [18:03:21.029] - Field: 'persistent' [18:03:21.029] - Field: 'expr' [18:03:21.029] - Field: 'uuid' [18:03:21.030] - Field: 'seed' [18:03:21.030] - Field: 'version' [18:03:21.030] - Field: 'result' [18:03:21.030] - Field: 'asynchronous' [18:03:21.030] - Field: 'calls' [18:03:21.030] - Field: 'globals' [18:03:21.031] - Field: 'stdout' [18:03:21.031] - Field: 'earlySignal' [18:03:21.031] - Field: 'lazy' [18:03:21.031] - Field: 'state' [18:03:21.031] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.032] - Launch lazy future ... [18:03:21.032] Packages needed by the future expression (n = 0): [18:03:21.032] Packages needed by future strategies (n = 0): [18:03:21.033] { [18:03:21.033] { [18:03:21.033] { [18:03:21.033] ...future.startTime <- base::Sys.time() [18:03:21.033] { [18:03:21.033] { [18:03:21.033] { [18:03:21.033] { [18:03:21.033] base::local({ [18:03:21.033] has_future <- base::requireNamespace("future", [18:03:21.033] quietly = TRUE) [18:03:21.033] if (has_future) { [18:03:21.033] ns <- base::getNamespace("future") [18:03:21.033] version <- ns[[".package"]][["version"]] [18:03:21.033] if (is.null(version)) [18:03:21.033] version <- utils::packageVersion("future") [18:03:21.033] } [18:03:21.033] else { [18:03:21.033] version <- NULL [18:03:21.033] } [18:03:21.033] if (!has_future || version < "1.8.0") { [18:03:21.033] info <- base::c(r_version = base::gsub("R version ", [18:03:21.033] "", base::R.version$version.string), [18:03:21.033] platform = base::sprintf("%s (%s-bit)", [18:03:21.033] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.033] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.033] "release", "version")], collapse = " "), [18:03:21.033] hostname = base::Sys.info()[["nodename"]]) [18:03:21.033] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.033] info) [18:03:21.033] info <- base::paste(info, collapse = "; ") [18:03:21.033] if (!has_future) { [18:03:21.033] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.033] info) [18:03:21.033] } [18:03:21.033] else { [18:03:21.033] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.033] info, version) [18:03:21.033] } [18:03:21.033] base::stop(msg) [18:03:21.033] } [18:03:21.033] }) [18:03:21.033] } [18:03:21.033] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.033] base::options(mc.cores = 1L) [18:03:21.033] } [18:03:21.033] options(future.plan = NULL) [18:03:21.033] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.033] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.033] } [18:03:21.033] ...future.workdir <- getwd() [18:03:21.033] } [18:03:21.033] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.033] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.033] } [18:03:21.033] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.033] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.033] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.033] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.033] future.rng.onMisuse = "warning", future.rng.onMisuse.keepFuture = NULL, [18:03:21.033] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.033] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.033] base::names(...future.oldOptions)) [18:03:21.033] } [18:03:21.033] if (FALSE) { [18:03:21.033] } [18:03:21.033] else { [18:03:21.033] if (TRUE) { [18:03:21.033] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.033] open = "w") [18:03:21.033] } [18:03:21.033] else { [18:03:21.033] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.033] windows = "NUL", "/dev/null"), open = "w") [18:03:21.033] } [18:03:21.033] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.033] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.033] base::sink(type = "output", split = FALSE) [18:03:21.033] base::close(...future.stdout) [18:03:21.033] }, add = TRUE) [18:03:21.033] } [18:03:21.033] ...future.frame <- base::sys.nframe() [18:03:21.033] ...future.conditions <- base::list() [18:03:21.033] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.033] if (FALSE) { [18:03:21.033] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.033] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.033] } [18:03:21.033] ...future.result <- base::tryCatch({ [18:03:21.033] base::withCallingHandlers({ [18:03:21.033] ...future.value <- base::withVisible(base::local({ [18:03:21.033] ...future.makeSendCondition <- local({ [18:03:21.033] sendCondition <- NULL [18:03:21.033] function(frame = 1L) { [18:03:21.033] if (is.function(sendCondition)) [18:03:21.033] return(sendCondition) [18:03:21.033] ns <- getNamespace("parallel") [18:03:21.033] if (exists("sendData", mode = "function", [18:03:21.033] envir = ns)) { [18:03:21.033] parallel_sendData <- get("sendData", mode = "function", [18:03:21.033] envir = ns) [18:03:21.033] envir <- sys.frame(frame) [18:03:21.033] master <- NULL [18:03:21.033] while (!identical(envir, .GlobalEnv) && [18:03:21.033] !identical(envir, emptyenv())) { [18:03:21.033] if (exists("master", mode = "list", envir = envir, [18:03:21.033] inherits = FALSE)) { [18:03:21.033] master <- get("master", mode = "list", [18:03:21.033] envir = envir, inherits = FALSE) [18:03:21.033] if (inherits(master, c("SOCKnode", [18:03:21.033] "SOCK0node"))) { [18:03:21.033] sendCondition <<- function(cond) { [18:03:21.033] data <- list(type = "VALUE", value = cond, [18:03:21.033] success = TRUE) [18:03:21.033] parallel_sendData(master, data) [18:03:21.033] } [18:03:21.033] return(sendCondition) [18:03:21.033] } [18:03:21.033] } [18:03:21.033] frame <- frame + 1L [18:03:21.033] envir <- sys.frame(frame) [18:03:21.033] } [18:03:21.033] } [18:03:21.033] sendCondition <<- function(cond) NULL [18:03:21.033] } [18:03:21.033] }) [18:03:21.033] withCallingHandlers({ [18:03:21.033] { [18:03:21.033] sample(x, size = 1L) [18:03:21.033] } [18:03:21.033] }, immediateCondition = function(cond) { [18:03:21.033] sendCondition <- ...future.makeSendCondition() [18:03:21.033] sendCondition(cond) [18:03:21.033] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.033] { [18:03:21.033] inherits <- base::inherits [18:03:21.033] invokeRestart <- base::invokeRestart [18:03:21.033] is.null <- base::is.null [18:03:21.033] muffled <- FALSE [18:03:21.033] if (inherits(cond, "message")) { [18:03:21.033] muffled <- grepl(pattern, "muffleMessage") [18:03:21.033] if (muffled) [18:03:21.033] invokeRestart("muffleMessage") [18:03:21.033] } [18:03:21.033] else if (inherits(cond, "warning")) { [18:03:21.033] muffled <- grepl(pattern, "muffleWarning") [18:03:21.033] if (muffled) [18:03:21.033] invokeRestart("muffleWarning") [18:03:21.033] } [18:03:21.033] else if (inherits(cond, "condition")) { [18:03:21.033] if (!is.null(pattern)) { [18:03:21.033] computeRestarts <- base::computeRestarts [18:03:21.033] grepl <- base::grepl [18:03:21.033] restarts <- computeRestarts(cond) [18:03:21.033] for (restart in restarts) { [18:03:21.033] name <- restart$name [18:03:21.033] if (is.null(name)) [18:03:21.033] next [18:03:21.033] if (!grepl(pattern, name)) [18:03:21.033] next [18:03:21.033] invokeRestart(restart) [18:03:21.033] muffled <- TRUE [18:03:21.033] break [18:03:21.033] } [18:03:21.033] } [18:03:21.033] } [18:03:21.033] invisible(muffled) [18:03:21.033] } [18:03:21.033] muffleCondition(cond) [18:03:21.033] }) [18:03:21.033] })) [18:03:21.033] future::FutureResult(value = ...future.value$value, [18:03:21.033] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.033] ...future.rng), globalenv = if (FALSE) [18:03:21.033] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.033] ...future.globalenv.names)) [18:03:21.033] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.033] }, condition = base::local({ [18:03:21.033] c <- base::c [18:03:21.033] inherits <- base::inherits [18:03:21.033] invokeRestart <- base::invokeRestart [18:03:21.033] length <- base::length [18:03:21.033] list <- base::list [18:03:21.033] seq.int <- base::seq.int [18:03:21.033] signalCondition <- base::signalCondition [18:03:21.033] sys.calls <- base::sys.calls [18:03:21.033] `[[` <- base::`[[` [18:03:21.033] `+` <- base::`+` [18:03:21.033] `<<-` <- base::`<<-` [18:03:21.033] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.033] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.033] 3L)] [18:03:21.033] } [18:03:21.033] function(cond) { [18:03:21.033] is_error <- inherits(cond, "error") [18:03:21.033] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.033] NULL) [18:03:21.033] if (is_error) { [18:03:21.033] sessionInformation <- function() { [18:03:21.033] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.033] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.033] search = base::search(), system = base::Sys.info()) [18:03:21.033] } [18:03:21.033] ...future.conditions[[length(...future.conditions) + [18:03:21.033] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.033] cond$call), session = sessionInformation(), [18:03:21.033] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.033] signalCondition(cond) [18:03:21.033] } [18:03:21.033] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.033] "immediateCondition"))) { [18:03:21.033] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.033] ...future.conditions[[length(...future.conditions) + [18:03:21.033] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.033] if (TRUE && !signal) { [18:03:21.033] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.033] { [18:03:21.033] inherits <- base::inherits [18:03:21.033] invokeRestart <- base::invokeRestart [18:03:21.033] is.null <- base::is.null [18:03:21.033] muffled <- FALSE [18:03:21.033] if (inherits(cond, "message")) { [18:03:21.033] muffled <- grepl(pattern, "muffleMessage") [18:03:21.033] if (muffled) [18:03:21.033] invokeRestart("muffleMessage") [18:03:21.033] } [18:03:21.033] else if (inherits(cond, "warning")) { [18:03:21.033] muffled <- grepl(pattern, "muffleWarning") [18:03:21.033] if (muffled) [18:03:21.033] invokeRestart("muffleWarning") [18:03:21.033] } [18:03:21.033] else if (inherits(cond, "condition")) { [18:03:21.033] if (!is.null(pattern)) { [18:03:21.033] computeRestarts <- base::computeRestarts [18:03:21.033] grepl <- base::grepl [18:03:21.033] restarts <- computeRestarts(cond) [18:03:21.033] for (restart in restarts) { [18:03:21.033] name <- restart$name [18:03:21.033] if (is.null(name)) [18:03:21.033] next [18:03:21.033] if (!grepl(pattern, name)) [18:03:21.033] next [18:03:21.033] invokeRestart(restart) [18:03:21.033] muffled <- TRUE [18:03:21.033] break [18:03:21.033] } [18:03:21.033] } [18:03:21.033] } [18:03:21.033] invisible(muffled) [18:03:21.033] } [18:03:21.033] muffleCondition(cond, pattern = "^muffle") [18:03:21.033] } [18:03:21.033] } [18:03:21.033] else { [18:03:21.033] if (TRUE) { [18:03:21.033] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.033] { [18:03:21.033] inherits <- base::inherits [18:03:21.033] invokeRestart <- base::invokeRestart [18:03:21.033] is.null <- base::is.null [18:03:21.033] muffled <- FALSE [18:03:21.033] if (inherits(cond, "message")) { [18:03:21.033] muffled <- grepl(pattern, "muffleMessage") [18:03:21.033] if (muffled) [18:03:21.033] invokeRestart("muffleMessage") [18:03:21.033] } [18:03:21.033] else if (inherits(cond, "warning")) { [18:03:21.033] muffled <- grepl(pattern, "muffleWarning") [18:03:21.033] if (muffled) [18:03:21.033] invokeRestart("muffleWarning") [18:03:21.033] } [18:03:21.033] else if (inherits(cond, "condition")) { [18:03:21.033] if (!is.null(pattern)) { [18:03:21.033] computeRestarts <- base::computeRestarts [18:03:21.033] grepl <- base::grepl [18:03:21.033] restarts <- computeRestarts(cond) [18:03:21.033] for (restart in restarts) { [18:03:21.033] name <- restart$name [18:03:21.033] if (is.null(name)) [18:03:21.033] next [18:03:21.033] if (!grepl(pattern, name)) [18:03:21.033] next [18:03:21.033] invokeRestart(restart) [18:03:21.033] muffled <- TRUE [18:03:21.033] break [18:03:21.033] } [18:03:21.033] } [18:03:21.033] } [18:03:21.033] invisible(muffled) [18:03:21.033] } [18:03:21.033] muffleCondition(cond, pattern = "^muffle") [18:03:21.033] } [18:03:21.033] } [18:03:21.033] } [18:03:21.033] })) [18:03:21.033] }, error = function(ex) { [18:03:21.033] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.033] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.033] ...future.rng), started = ...future.startTime, [18:03:21.033] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.033] version = "1.8"), class = "FutureResult") [18:03:21.033] }, finally = { [18:03:21.033] if (!identical(...future.workdir, getwd())) [18:03:21.033] setwd(...future.workdir) [18:03:21.033] { [18:03:21.033] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.033] ...future.oldOptions$nwarnings <- NULL [18:03:21.033] } [18:03:21.033] base::options(...future.oldOptions) [18:03:21.033] if (.Platform$OS.type == "windows") { [18:03:21.033] old_names <- names(...future.oldEnvVars) [18:03:21.033] envs <- base::Sys.getenv() [18:03:21.033] names <- names(envs) [18:03:21.033] common <- intersect(names, old_names) [18:03:21.033] added <- setdiff(names, old_names) [18:03:21.033] removed <- setdiff(old_names, names) [18:03:21.033] changed <- common[...future.oldEnvVars[common] != [18:03:21.033] envs[common]] [18:03:21.033] NAMES <- toupper(changed) [18:03:21.033] args <- list() [18:03:21.033] for (kk in seq_along(NAMES)) { [18:03:21.033] name <- changed[[kk]] [18:03:21.033] NAME <- NAMES[[kk]] [18:03:21.033] if (name != NAME && is.element(NAME, old_names)) [18:03:21.033] next [18:03:21.033] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.033] } [18:03:21.033] NAMES <- toupper(added) [18:03:21.033] for (kk in seq_along(NAMES)) { [18:03:21.033] name <- added[[kk]] [18:03:21.033] NAME <- NAMES[[kk]] [18:03:21.033] if (name != NAME && is.element(NAME, old_names)) [18:03:21.033] next [18:03:21.033] args[[name]] <- "" [18:03:21.033] } [18:03:21.033] NAMES <- toupper(removed) [18:03:21.033] for (kk in seq_along(NAMES)) { [18:03:21.033] name <- removed[[kk]] [18:03:21.033] NAME <- NAMES[[kk]] [18:03:21.033] if (name != NAME && is.element(NAME, old_names)) [18:03:21.033] next [18:03:21.033] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.033] } [18:03:21.033] if (length(args) > 0) [18:03:21.033] base::do.call(base::Sys.setenv, args = args) [18:03:21.033] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.033] } [18:03:21.033] else { [18:03:21.033] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.033] } [18:03:21.033] { [18:03:21.033] if (base::length(...future.futureOptionsAdded) > [18:03:21.033] 0L) { [18:03:21.033] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.033] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.033] base::options(opts) [18:03:21.033] } [18:03:21.033] { [18:03:21.033] { [18:03:21.033] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.033] NULL [18:03:21.033] } [18:03:21.033] options(future.plan = NULL) [18:03:21.033] if (is.na(NA_character_)) [18:03:21.033] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.033] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.033] future::plan(list(function (..., workers = availableCores(), [18:03:21.033] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.033] envir = parent.frame()) [18:03:21.033] { [18:03:21.033] if (is.function(workers)) [18:03:21.033] workers <- workers() [18:03:21.033] workers <- structure(as.integer(workers), [18:03:21.033] class = class(workers)) [18:03:21.033] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.033] workers >= 1) [18:03:21.033] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.033] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.033] } [18:03:21.033] future <- MultisessionFuture(..., workers = workers, [18:03:21.033] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.033] envir = envir) [18:03:21.033] if (!future$lazy) [18:03:21.033] future <- run(future) [18:03:21.033] invisible(future) [18:03:21.033] }), .cleanup = FALSE, .init = FALSE) [18:03:21.033] } [18:03:21.033] } [18:03:21.033] } [18:03:21.033] }) [18:03:21.033] if (TRUE) { [18:03:21.033] base::sink(type = "output", split = FALSE) [18:03:21.033] if (TRUE) { [18:03:21.033] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.033] } [18:03:21.033] else { [18:03:21.033] ...future.result["stdout"] <- base::list(NULL) [18:03:21.033] } [18:03:21.033] base::close(...future.stdout) [18:03:21.033] ...future.stdout <- NULL [18:03:21.033] } [18:03:21.033] ...future.result$conditions <- ...future.conditions [18:03:21.033] ...future.result$finished <- base::Sys.time() [18:03:21.033] ...future.result [18:03:21.033] } [18:03:21.038] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.049] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.049] - Validating connection of MultisessionFuture [18:03:21.049] - received message: FutureResult [18:03:21.049] - Received FutureResult [18:03:21.050] - Erased future from FutureRegistry [18:03:21.050] result() for ClusterFuture ... [18:03:21.050] - result already collected: FutureResult [18:03:21.050] result() for ClusterFuture ... done [18:03:21.050] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.050] result() for ClusterFuture ... [18:03:21.051] - result already collected: FutureResult [18:03:21.051] result() for ClusterFuture ... done [18:03:21.051] result() for ClusterFuture ... [18:03:21.051] - result already collected: FutureResult [18:03:21.051] result() for ClusterFuture ... done [18:03:21.052] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:21.052] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:21.053] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:21.053] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:21.053] MultisessionFuture started [18:03:21.054] - Launch lazy future ... done [18:03:21.054] run() for 'MultisessionFuture' ... done [18:03:21.054] result() for ClusterFuture ... [18:03:21.054] - result already collected: FutureResult [18:03:21.054] result() for ClusterFuture ... done [18:03:21.055] result() for ClusterFuture ... [18:03:21.055] - result already collected: FutureResult [18:03:21.055] result() for ClusterFuture ... done [18:03:21.055] result() for ClusterFuture ... [18:03:21.055] - result already collected: FutureResult [18:03:21.055] result() for ClusterFuture ... done [18:03:21.056] result() for ClusterFuture ... [18:03:21.056] - result already collected: FutureResult [18:03:21.056] result() for ClusterFuture ... done [18:03:21.056] result() for ClusterFuture ... [18:03:21.056] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.057] - Validating connection of MultisessionFuture [18:03:21.057] - received message: FutureResult [18:03:21.057] - Received FutureResult [18:03:21.057] - Erased future from FutureRegistry [18:03:21.057] result() for ClusterFuture ... [18:03:21.057] - result already collected: FutureResult [18:03:21.058] result() for ClusterFuture ... done [18:03:21.058] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.058] result() for ClusterFuture ... done [18:03:21.058] result() for ClusterFuture ... [18:03:21.058] - result already collected: FutureResult [18:03:21.058] result() for ClusterFuture ... done [18:03:21.059] result() for ClusterFuture ... [18:03:21.059] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.059] - Validating connection of MultisessionFuture [18:03:21.071] - received message: FutureResult [18:03:21.071] - Received FutureResult [18:03:21.071] - Erased future from FutureRegistry [18:03:21.071] result() for ClusterFuture ... [18:03:21.072] - result already collected: FutureResult [18:03:21.072] result() for ClusterFuture ... done [18:03:21.072] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.072] result() for ClusterFuture ... done [18:03:21.072] result() for ClusterFuture ... [18:03:21.072] - result already collected: FutureResult [18:03:21.073] result() for ClusterFuture ... done [[1]] [1] 2 [[2]] [1] 1 [[3]] [1] 0 [[4]] [1] 0 [18:03:21.073] getGlobalsAndPackages() ... [18:03:21.073] Searching for globals... [18:03:21.075] - globals found: [3] '{', 'sample', 'x' [18:03:21.075] Searching for globals ... DONE [18:03:21.075] Resolving globals: FALSE [18:03:21.075] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.076] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.076] - globals: [1] 'x' [18:03:21.076] [18:03:21.076] getGlobalsAndPackages() ... DONE [18:03:21.077] run() for 'Future' ... [18:03:21.077] - state: 'created' [18:03:21.077] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.091] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.091] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.091] - Field: 'node' [18:03:21.091] - Field: 'label' [18:03:21.091] - Field: 'local' [18:03:21.092] - Field: 'owner' [18:03:21.092] - Field: 'envir' [18:03:21.092] - Field: 'workers' [18:03:21.092] - Field: 'packages' [18:03:21.092] - Field: 'gc' [18:03:21.093] - Field: 'conditions' [18:03:21.093] - Field: 'persistent' [18:03:21.093] - Field: 'expr' [18:03:21.093] - Field: 'uuid' [18:03:21.093] - Field: 'seed' [18:03:21.093] - Field: 'version' [18:03:21.094] - Field: 'result' [18:03:21.094] - Field: 'asynchronous' [18:03:21.094] - Field: 'calls' [18:03:21.094] - Field: 'globals' [18:03:21.094] - Field: 'stdout' [18:03:21.094] - Field: 'earlySignal' [18:03:21.095] - Field: 'lazy' [18:03:21.095] - Field: 'state' [18:03:21.095] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.095] - Launch lazy future ... [18:03:21.096] Packages needed by the future expression (n = 0): [18:03:21.096] Packages needed by future strategies (n = 0): [18:03:21.096] { [18:03:21.096] { [18:03:21.096] { [18:03:21.096] ...future.startTime <- base::Sys.time() [18:03:21.096] { [18:03:21.096] { [18:03:21.096] { [18:03:21.096] { [18:03:21.096] base::local({ [18:03:21.096] has_future <- base::requireNamespace("future", [18:03:21.096] quietly = TRUE) [18:03:21.096] if (has_future) { [18:03:21.096] ns <- base::getNamespace("future") [18:03:21.096] version <- ns[[".package"]][["version"]] [18:03:21.096] if (is.null(version)) [18:03:21.096] version <- utils::packageVersion("future") [18:03:21.096] } [18:03:21.096] else { [18:03:21.096] version <- NULL [18:03:21.096] } [18:03:21.096] if (!has_future || version < "1.8.0") { [18:03:21.096] info <- base::c(r_version = base::gsub("R version ", [18:03:21.096] "", base::R.version$version.string), [18:03:21.096] platform = base::sprintf("%s (%s-bit)", [18:03:21.096] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.096] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.096] "release", "version")], collapse = " "), [18:03:21.096] hostname = base::Sys.info()[["nodename"]]) [18:03:21.096] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.096] info) [18:03:21.096] info <- base::paste(info, collapse = "; ") [18:03:21.096] if (!has_future) { [18:03:21.096] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.096] info) [18:03:21.096] } [18:03:21.096] else { [18:03:21.096] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.096] info, version) [18:03:21.096] } [18:03:21.096] base::stop(msg) [18:03:21.096] } [18:03:21.096] }) [18:03:21.096] } [18:03:21.096] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.096] base::options(mc.cores = 1L) [18:03:21.096] } [18:03:21.096] options(future.plan = NULL) [18:03:21.096] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.096] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.096] } [18:03:21.096] ...future.workdir <- getwd() [18:03:21.096] } [18:03:21.096] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.096] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.096] } [18:03:21.096] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.096] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.096] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.096] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.096] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.096] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.096] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.096] base::names(...future.oldOptions)) [18:03:21.096] } [18:03:21.096] if (FALSE) { [18:03:21.096] } [18:03:21.096] else { [18:03:21.096] if (TRUE) { [18:03:21.096] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.096] open = "w") [18:03:21.096] } [18:03:21.096] else { [18:03:21.096] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.096] windows = "NUL", "/dev/null"), open = "w") [18:03:21.096] } [18:03:21.096] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.096] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.096] base::sink(type = "output", split = FALSE) [18:03:21.096] base::close(...future.stdout) [18:03:21.096] }, add = TRUE) [18:03:21.096] } [18:03:21.096] ...future.frame <- base::sys.nframe() [18:03:21.096] ...future.conditions <- base::list() [18:03:21.096] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.096] if (FALSE) { [18:03:21.096] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.096] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.096] } [18:03:21.096] ...future.result <- base::tryCatch({ [18:03:21.096] base::withCallingHandlers({ [18:03:21.096] ...future.value <- base::withVisible(base::local({ [18:03:21.096] ...future.makeSendCondition <- local({ [18:03:21.096] sendCondition <- NULL [18:03:21.096] function(frame = 1L) { [18:03:21.096] if (is.function(sendCondition)) [18:03:21.096] return(sendCondition) [18:03:21.096] ns <- getNamespace("parallel") [18:03:21.096] if (exists("sendData", mode = "function", [18:03:21.096] envir = ns)) { [18:03:21.096] parallel_sendData <- get("sendData", mode = "function", [18:03:21.096] envir = ns) [18:03:21.096] envir <- sys.frame(frame) [18:03:21.096] master <- NULL [18:03:21.096] while (!identical(envir, .GlobalEnv) && [18:03:21.096] !identical(envir, emptyenv())) { [18:03:21.096] if (exists("master", mode = "list", envir = envir, [18:03:21.096] inherits = FALSE)) { [18:03:21.096] master <- get("master", mode = "list", [18:03:21.096] envir = envir, inherits = FALSE) [18:03:21.096] if (inherits(master, c("SOCKnode", [18:03:21.096] "SOCK0node"))) { [18:03:21.096] sendCondition <<- function(cond) { [18:03:21.096] data <- list(type = "VALUE", value = cond, [18:03:21.096] success = TRUE) [18:03:21.096] parallel_sendData(master, data) [18:03:21.096] } [18:03:21.096] return(sendCondition) [18:03:21.096] } [18:03:21.096] } [18:03:21.096] frame <- frame + 1L [18:03:21.096] envir <- sys.frame(frame) [18:03:21.096] } [18:03:21.096] } [18:03:21.096] sendCondition <<- function(cond) NULL [18:03:21.096] } [18:03:21.096] }) [18:03:21.096] withCallingHandlers({ [18:03:21.096] { [18:03:21.096] sample(x, size = 1L) [18:03:21.096] } [18:03:21.096] }, immediateCondition = function(cond) { [18:03:21.096] sendCondition <- ...future.makeSendCondition() [18:03:21.096] sendCondition(cond) [18:03:21.096] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.096] { [18:03:21.096] inherits <- base::inherits [18:03:21.096] invokeRestart <- base::invokeRestart [18:03:21.096] is.null <- base::is.null [18:03:21.096] muffled <- FALSE [18:03:21.096] if (inherits(cond, "message")) { [18:03:21.096] muffled <- grepl(pattern, "muffleMessage") [18:03:21.096] if (muffled) [18:03:21.096] invokeRestart("muffleMessage") [18:03:21.096] } [18:03:21.096] else if (inherits(cond, "warning")) { [18:03:21.096] muffled <- grepl(pattern, "muffleWarning") [18:03:21.096] if (muffled) [18:03:21.096] invokeRestart("muffleWarning") [18:03:21.096] } [18:03:21.096] else if (inherits(cond, "condition")) { [18:03:21.096] if (!is.null(pattern)) { [18:03:21.096] computeRestarts <- base::computeRestarts [18:03:21.096] grepl <- base::grepl [18:03:21.096] restarts <- computeRestarts(cond) [18:03:21.096] for (restart in restarts) { [18:03:21.096] name <- restart$name [18:03:21.096] if (is.null(name)) [18:03:21.096] next [18:03:21.096] if (!grepl(pattern, name)) [18:03:21.096] next [18:03:21.096] invokeRestart(restart) [18:03:21.096] muffled <- TRUE [18:03:21.096] break [18:03:21.096] } [18:03:21.096] } [18:03:21.096] } [18:03:21.096] invisible(muffled) [18:03:21.096] } [18:03:21.096] muffleCondition(cond) [18:03:21.096] }) [18:03:21.096] })) [18:03:21.096] future::FutureResult(value = ...future.value$value, [18:03:21.096] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.096] ...future.rng), globalenv = if (FALSE) [18:03:21.096] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.096] ...future.globalenv.names)) [18:03:21.096] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.096] }, condition = base::local({ [18:03:21.096] c <- base::c [18:03:21.096] inherits <- base::inherits [18:03:21.096] invokeRestart <- base::invokeRestart [18:03:21.096] length <- base::length [18:03:21.096] list <- base::list [18:03:21.096] seq.int <- base::seq.int [18:03:21.096] signalCondition <- base::signalCondition [18:03:21.096] sys.calls <- base::sys.calls [18:03:21.096] `[[` <- base::`[[` [18:03:21.096] `+` <- base::`+` [18:03:21.096] `<<-` <- base::`<<-` [18:03:21.096] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.096] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.096] 3L)] [18:03:21.096] } [18:03:21.096] function(cond) { [18:03:21.096] is_error <- inherits(cond, "error") [18:03:21.096] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.096] NULL) [18:03:21.096] if (is_error) { [18:03:21.096] sessionInformation <- function() { [18:03:21.096] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.096] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.096] search = base::search(), system = base::Sys.info()) [18:03:21.096] } [18:03:21.096] ...future.conditions[[length(...future.conditions) + [18:03:21.096] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.096] cond$call), session = sessionInformation(), [18:03:21.096] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.096] signalCondition(cond) [18:03:21.096] } [18:03:21.096] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.096] "immediateCondition"))) { [18:03:21.096] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.096] ...future.conditions[[length(...future.conditions) + [18:03:21.096] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.096] if (TRUE && !signal) { [18:03:21.096] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.096] { [18:03:21.096] inherits <- base::inherits [18:03:21.096] invokeRestart <- base::invokeRestart [18:03:21.096] is.null <- base::is.null [18:03:21.096] muffled <- FALSE [18:03:21.096] if (inherits(cond, "message")) { [18:03:21.096] muffled <- grepl(pattern, "muffleMessage") [18:03:21.096] if (muffled) [18:03:21.096] invokeRestart("muffleMessage") [18:03:21.096] } [18:03:21.096] else if (inherits(cond, "warning")) { [18:03:21.096] muffled <- grepl(pattern, "muffleWarning") [18:03:21.096] if (muffled) [18:03:21.096] invokeRestart("muffleWarning") [18:03:21.096] } [18:03:21.096] else if (inherits(cond, "condition")) { [18:03:21.096] if (!is.null(pattern)) { [18:03:21.096] computeRestarts <- base::computeRestarts [18:03:21.096] grepl <- base::grepl [18:03:21.096] restarts <- computeRestarts(cond) [18:03:21.096] for (restart in restarts) { [18:03:21.096] name <- restart$name [18:03:21.096] if (is.null(name)) [18:03:21.096] next [18:03:21.096] if (!grepl(pattern, name)) [18:03:21.096] next [18:03:21.096] invokeRestart(restart) [18:03:21.096] muffled <- TRUE [18:03:21.096] break [18:03:21.096] } [18:03:21.096] } [18:03:21.096] } [18:03:21.096] invisible(muffled) [18:03:21.096] } [18:03:21.096] muffleCondition(cond, pattern = "^muffle") [18:03:21.096] } [18:03:21.096] } [18:03:21.096] else { [18:03:21.096] if (TRUE) { [18:03:21.096] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.096] { [18:03:21.096] inherits <- base::inherits [18:03:21.096] invokeRestart <- base::invokeRestart [18:03:21.096] is.null <- base::is.null [18:03:21.096] muffled <- FALSE [18:03:21.096] if (inherits(cond, "message")) { [18:03:21.096] muffled <- grepl(pattern, "muffleMessage") [18:03:21.096] if (muffled) [18:03:21.096] invokeRestart("muffleMessage") [18:03:21.096] } [18:03:21.096] else if (inherits(cond, "warning")) { [18:03:21.096] muffled <- grepl(pattern, "muffleWarning") [18:03:21.096] if (muffled) [18:03:21.096] invokeRestart("muffleWarning") [18:03:21.096] } [18:03:21.096] else if (inherits(cond, "condition")) { [18:03:21.096] if (!is.null(pattern)) { [18:03:21.096] computeRestarts <- base::computeRestarts [18:03:21.096] grepl <- base::grepl [18:03:21.096] restarts <- computeRestarts(cond) [18:03:21.096] for (restart in restarts) { [18:03:21.096] name <- restart$name [18:03:21.096] if (is.null(name)) [18:03:21.096] next [18:03:21.096] if (!grepl(pattern, name)) [18:03:21.096] next [18:03:21.096] invokeRestart(restart) [18:03:21.096] muffled <- TRUE [18:03:21.096] break [18:03:21.096] } [18:03:21.096] } [18:03:21.096] } [18:03:21.096] invisible(muffled) [18:03:21.096] } [18:03:21.096] muffleCondition(cond, pattern = "^muffle") [18:03:21.096] } [18:03:21.096] } [18:03:21.096] } [18:03:21.096] })) [18:03:21.096] }, error = function(ex) { [18:03:21.096] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.096] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.096] ...future.rng), started = ...future.startTime, [18:03:21.096] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.096] version = "1.8"), class = "FutureResult") [18:03:21.096] }, finally = { [18:03:21.096] if (!identical(...future.workdir, getwd())) [18:03:21.096] setwd(...future.workdir) [18:03:21.096] { [18:03:21.096] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.096] ...future.oldOptions$nwarnings <- NULL [18:03:21.096] } [18:03:21.096] base::options(...future.oldOptions) [18:03:21.096] if (.Platform$OS.type == "windows") { [18:03:21.096] old_names <- names(...future.oldEnvVars) [18:03:21.096] envs <- base::Sys.getenv() [18:03:21.096] names <- names(envs) [18:03:21.096] common <- intersect(names, old_names) [18:03:21.096] added <- setdiff(names, old_names) [18:03:21.096] removed <- setdiff(old_names, names) [18:03:21.096] changed <- common[...future.oldEnvVars[common] != [18:03:21.096] envs[common]] [18:03:21.096] NAMES <- toupper(changed) [18:03:21.096] args <- list() [18:03:21.096] for (kk in seq_along(NAMES)) { [18:03:21.096] name <- changed[[kk]] [18:03:21.096] NAME <- NAMES[[kk]] [18:03:21.096] if (name != NAME && is.element(NAME, old_names)) [18:03:21.096] next [18:03:21.096] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.096] } [18:03:21.096] NAMES <- toupper(added) [18:03:21.096] for (kk in seq_along(NAMES)) { [18:03:21.096] name <- added[[kk]] [18:03:21.096] NAME <- NAMES[[kk]] [18:03:21.096] if (name != NAME && is.element(NAME, old_names)) [18:03:21.096] next [18:03:21.096] args[[name]] <- "" [18:03:21.096] } [18:03:21.096] NAMES <- toupper(removed) [18:03:21.096] for (kk in seq_along(NAMES)) { [18:03:21.096] name <- removed[[kk]] [18:03:21.096] NAME <- NAMES[[kk]] [18:03:21.096] if (name != NAME && is.element(NAME, old_names)) [18:03:21.096] next [18:03:21.096] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.096] } [18:03:21.096] if (length(args) > 0) [18:03:21.096] base::do.call(base::Sys.setenv, args = args) [18:03:21.096] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.096] } [18:03:21.096] else { [18:03:21.096] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.096] } [18:03:21.096] { [18:03:21.096] if (base::length(...future.futureOptionsAdded) > [18:03:21.096] 0L) { [18:03:21.096] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.096] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.096] base::options(opts) [18:03:21.096] } [18:03:21.096] { [18:03:21.096] { [18:03:21.096] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.096] NULL [18:03:21.096] } [18:03:21.096] options(future.plan = NULL) [18:03:21.096] if (is.na(NA_character_)) [18:03:21.096] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.096] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.096] future::plan(list(function (..., workers = availableCores(), [18:03:21.096] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.096] envir = parent.frame()) [18:03:21.096] { [18:03:21.096] if (is.function(workers)) [18:03:21.096] workers <- workers() [18:03:21.096] workers <- structure(as.integer(workers), [18:03:21.096] class = class(workers)) [18:03:21.096] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.096] workers >= 1) [18:03:21.096] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.096] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.096] } [18:03:21.096] future <- MultisessionFuture(..., workers = workers, [18:03:21.096] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.096] envir = envir) [18:03:21.096] if (!future$lazy) [18:03:21.096] future <- run(future) [18:03:21.096] invisible(future) [18:03:21.096] }), .cleanup = FALSE, .init = FALSE) [18:03:21.096] } [18:03:21.096] } [18:03:21.096] } [18:03:21.096] }) [18:03:21.096] if (TRUE) { [18:03:21.096] base::sink(type = "output", split = FALSE) [18:03:21.096] if (TRUE) { [18:03:21.096] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.096] } [18:03:21.096] else { [18:03:21.096] ...future.result["stdout"] <- base::list(NULL) [18:03:21.096] } [18:03:21.096] base::close(...future.stdout) [18:03:21.096] ...future.stdout <- NULL [18:03:21.096] } [18:03:21.096] ...future.result$conditions <- ...future.conditions [18:03:21.096] ...future.result$finished <- base::Sys.time() [18:03:21.096] ...future.result [18:03:21.096] } [18:03:21.102] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:21.102] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:21.102] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:21.103] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:21.103] MultisessionFuture started [18:03:21.103] - Launch lazy future ... done [18:03:21.104] run() for 'MultisessionFuture' ... done [18:03:21.104] getGlobalsAndPackages() ... [18:03:21.104] Searching for globals... [18:03:21.105] - globals found: [3] '{', 'sample', 'x' [18:03:21.106] Searching for globals ... DONE [18:03:21.106] Resolving globals: FALSE [18:03:21.106] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.107] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.107] - globals: [1] 'x' [18:03:21.107] [18:03:21.107] getGlobalsAndPackages() ... DONE [18:03:21.108] run() for 'Future' ... [18:03:21.108] - state: 'created' [18:03:21.108] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.122] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.122] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.122] - Field: 'node' [18:03:21.122] - Field: 'label' [18:03:21.123] - Field: 'local' [18:03:21.123] - Field: 'owner' [18:03:21.123] - Field: 'envir' [18:03:21.123] - Field: 'workers' [18:03:21.123] - Field: 'packages' [18:03:21.124] - Field: 'gc' [18:03:21.124] - Field: 'conditions' [18:03:21.124] - Field: 'persistent' [18:03:21.124] - Field: 'expr' [18:03:21.124] - Field: 'uuid' [18:03:21.124] - Field: 'seed' [18:03:21.125] - Field: 'version' [18:03:21.125] - Field: 'result' [18:03:21.125] - Field: 'asynchronous' [18:03:21.125] - Field: 'calls' [18:03:21.125] - Field: 'globals' [18:03:21.125] - Field: 'stdout' [18:03:21.126] - Field: 'earlySignal' [18:03:21.126] - Field: 'lazy' [18:03:21.126] - Field: 'state' [18:03:21.126] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.126] - Launch lazy future ... [18:03:21.127] Packages needed by the future expression (n = 0): [18:03:21.127] Packages needed by future strategies (n = 0): [18:03:21.127] { [18:03:21.127] { [18:03:21.127] { [18:03:21.127] ...future.startTime <- base::Sys.time() [18:03:21.127] { [18:03:21.127] { [18:03:21.127] { [18:03:21.127] { [18:03:21.127] base::local({ [18:03:21.127] has_future <- base::requireNamespace("future", [18:03:21.127] quietly = TRUE) [18:03:21.127] if (has_future) { [18:03:21.127] ns <- base::getNamespace("future") [18:03:21.127] version <- ns[[".package"]][["version"]] [18:03:21.127] if (is.null(version)) [18:03:21.127] version <- utils::packageVersion("future") [18:03:21.127] } [18:03:21.127] else { [18:03:21.127] version <- NULL [18:03:21.127] } [18:03:21.127] if (!has_future || version < "1.8.0") { [18:03:21.127] info <- base::c(r_version = base::gsub("R version ", [18:03:21.127] "", base::R.version$version.string), [18:03:21.127] platform = base::sprintf("%s (%s-bit)", [18:03:21.127] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.127] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.127] "release", "version")], collapse = " "), [18:03:21.127] hostname = base::Sys.info()[["nodename"]]) [18:03:21.127] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.127] info) [18:03:21.127] info <- base::paste(info, collapse = "; ") [18:03:21.127] if (!has_future) { [18:03:21.127] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.127] info) [18:03:21.127] } [18:03:21.127] else { [18:03:21.127] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.127] info, version) [18:03:21.127] } [18:03:21.127] base::stop(msg) [18:03:21.127] } [18:03:21.127] }) [18:03:21.127] } [18:03:21.127] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.127] base::options(mc.cores = 1L) [18:03:21.127] } [18:03:21.127] options(future.plan = NULL) [18:03:21.127] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.127] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.127] } [18:03:21.127] ...future.workdir <- getwd() [18:03:21.127] } [18:03:21.127] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.127] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.127] } [18:03:21.127] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.127] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.127] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.127] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.127] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.127] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.127] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.127] base::names(...future.oldOptions)) [18:03:21.127] } [18:03:21.127] if (FALSE) { [18:03:21.127] } [18:03:21.127] else { [18:03:21.127] if (TRUE) { [18:03:21.127] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.127] open = "w") [18:03:21.127] } [18:03:21.127] else { [18:03:21.127] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.127] windows = "NUL", "/dev/null"), open = "w") [18:03:21.127] } [18:03:21.127] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.127] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.127] base::sink(type = "output", split = FALSE) [18:03:21.127] base::close(...future.stdout) [18:03:21.127] }, add = TRUE) [18:03:21.127] } [18:03:21.127] ...future.frame <- base::sys.nframe() [18:03:21.127] ...future.conditions <- base::list() [18:03:21.127] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.127] if (FALSE) { [18:03:21.127] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.127] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.127] } [18:03:21.127] ...future.result <- base::tryCatch({ [18:03:21.127] base::withCallingHandlers({ [18:03:21.127] ...future.value <- base::withVisible(base::local({ [18:03:21.127] ...future.makeSendCondition <- local({ [18:03:21.127] sendCondition <- NULL [18:03:21.127] function(frame = 1L) { [18:03:21.127] if (is.function(sendCondition)) [18:03:21.127] return(sendCondition) [18:03:21.127] ns <- getNamespace("parallel") [18:03:21.127] if (exists("sendData", mode = "function", [18:03:21.127] envir = ns)) { [18:03:21.127] parallel_sendData <- get("sendData", mode = "function", [18:03:21.127] envir = ns) [18:03:21.127] envir <- sys.frame(frame) [18:03:21.127] master <- NULL [18:03:21.127] while (!identical(envir, .GlobalEnv) && [18:03:21.127] !identical(envir, emptyenv())) { [18:03:21.127] if (exists("master", mode = "list", envir = envir, [18:03:21.127] inherits = FALSE)) { [18:03:21.127] master <- get("master", mode = "list", [18:03:21.127] envir = envir, inherits = FALSE) [18:03:21.127] if (inherits(master, c("SOCKnode", [18:03:21.127] "SOCK0node"))) { [18:03:21.127] sendCondition <<- function(cond) { [18:03:21.127] data <- list(type = "VALUE", value = cond, [18:03:21.127] success = TRUE) [18:03:21.127] parallel_sendData(master, data) [18:03:21.127] } [18:03:21.127] return(sendCondition) [18:03:21.127] } [18:03:21.127] } [18:03:21.127] frame <- frame + 1L [18:03:21.127] envir <- sys.frame(frame) [18:03:21.127] } [18:03:21.127] } [18:03:21.127] sendCondition <<- function(cond) NULL [18:03:21.127] } [18:03:21.127] }) [18:03:21.127] withCallingHandlers({ [18:03:21.127] { [18:03:21.127] sample(x, size = 1L) [18:03:21.127] } [18:03:21.127] }, immediateCondition = function(cond) { [18:03:21.127] sendCondition <- ...future.makeSendCondition() [18:03:21.127] sendCondition(cond) [18:03:21.127] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.127] { [18:03:21.127] inherits <- base::inherits [18:03:21.127] invokeRestart <- base::invokeRestart [18:03:21.127] is.null <- base::is.null [18:03:21.127] muffled <- FALSE [18:03:21.127] if (inherits(cond, "message")) { [18:03:21.127] muffled <- grepl(pattern, "muffleMessage") [18:03:21.127] if (muffled) [18:03:21.127] invokeRestart("muffleMessage") [18:03:21.127] } [18:03:21.127] else if (inherits(cond, "warning")) { [18:03:21.127] muffled <- grepl(pattern, "muffleWarning") [18:03:21.127] if (muffled) [18:03:21.127] invokeRestart("muffleWarning") [18:03:21.127] } [18:03:21.127] else if (inherits(cond, "condition")) { [18:03:21.127] if (!is.null(pattern)) { [18:03:21.127] computeRestarts <- base::computeRestarts [18:03:21.127] grepl <- base::grepl [18:03:21.127] restarts <- computeRestarts(cond) [18:03:21.127] for (restart in restarts) { [18:03:21.127] name <- restart$name [18:03:21.127] if (is.null(name)) [18:03:21.127] next [18:03:21.127] if (!grepl(pattern, name)) [18:03:21.127] next [18:03:21.127] invokeRestart(restart) [18:03:21.127] muffled <- TRUE [18:03:21.127] break [18:03:21.127] } [18:03:21.127] } [18:03:21.127] } [18:03:21.127] invisible(muffled) [18:03:21.127] } [18:03:21.127] muffleCondition(cond) [18:03:21.127] }) [18:03:21.127] })) [18:03:21.127] future::FutureResult(value = ...future.value$value, [18:03:21.127] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.127] ...future.rng), globalenv = if (FALSE) [18:03:21.127] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.127] ...future.globalenv.names)) [18:03:21.127] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.127] }, condition = base::local({ [18:03:21.127] c <- base::c [18:03:21.127] inherits <- base::inherits [18:03:21.127] invokeRestart <- base::invokeRestart [18:03:21.127] length <- base::length [18:03:21.127] list <- base::list [18:03:21.127] seq.int <- base::seq.int [18:03:21.127] signalCondition <- base::signalCondition [18:03:21.127] sys.calls <- base::sys.calls [18:03:21.127] `[[` <- base::`[[` [18:03:21.127] `+` <- base::`+` [18:03:21.127] `<<-` <- base::`<<-` [18:03:21.127] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.127] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.127] 3L)] [18:03:21.127] } [18:03:21.127] function(cond) { [18:03:21.127] is_error <- inherits(cond, "error") [18:03:21.127] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.127] NULL) [18:03:21.127] if (is_error) { [18:03:21.127] sessionInformation <- function() { [18:03:21.127] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.127] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.127] search = base::search(), system = base::Sys.info()) [18:03:21.127] } [18:03:21.127] ...future.conditions[[length(...future.conditions) + [18:03:21.127] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.127] cond$call), session = sessionInformation(), [18:03:21.127] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.127] signalCondition(cond) [18:03:21.127] } [18:03:21.127] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.127] "immediateCondition"))) { [18:03:21.127] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.127] ...future.conditions[[length(...future.conditions) + [18:03:21.127] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.127] if (TRUE && !signal) { [18:03:21.127] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.127] { [18:03:21.127] inherits <- base::inherits [18:03:21.127] invokeRestart <- base::invokeRestart [18:03:21.127] is.null <- base::is.null [18:03:21.127] muffled <- FALSE [18:03:21.127] if (inherits(cond, "message")) { [18:03:21.127] muffled <- grepl(pattern, "muffleMessage") [18:03:21.127] if (muffled) [18:03:21.127] invokeRestart("muffleMessage") [18:03:21.127] } [18:03:21.127] else if (inherits(cond, "warning")) { [18:03:21.127] muffled <- grepl(pattern, "muffleWarning") [18:03:21.127] if (muffled) [18:03:21.127] invokeRestart("muffleWarning") [18:03:21.127] } [18:03:21.127] else if (inherits(cond, "condition")) { [18:03:21.127] if (!is.null(pattern)) { [18:03:21.127] computeRestarts <- base::computeRestarts [18:03:21.127] grepl <- base::grepl [18:03:21.127] restarts <- computeRestarts(cond) [18:03:21.127] for (restart in restarts) { [18:03:21.127] name <- restart$name [18:03:21.127] if (is.null(name)) [18:03:21.127] next [18:03:21.127] if (!grepl(pattern, name)) [18:03:21.127] next [18:03:21.127] invokeRestart(restart) [18:03:21.127] muffled <- TRUE [18:03:21.127] break [18:03:21.127] } [18:03:21.127] } [18:03:21.127] } [18:03:21.127] invisible(muffled) [18:03:21.127] } [18:03:21.127] muffleCondition(cond, pattern = "^muffle") [18:03:21.127] } [18:03:21.127] } [18:03:21.127] else { [18:03:21.127] if (TRUE) { [18:03:21.127] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.127] { [18:03:21.127] inherits <- base::inherits [18:03:21.127] invokeRestart <- base::invokeRestart [18:03:21.127] is.null <- base::is.null [18:03:21.127] muffled <- FALSE [18:03:21.127] if (inherits(cond, "message")) { [18:03:21.127] muffled <- grepl(pattern, "muffleMessage") [18:03:21.127] if (muffled) [18:03:21.127] invokeRestart("muffleMessage") [18:03:21.127] } [18:03:21.127] else if (inherits(cond, "warning")) { [18:03:21.127] muffled <- grepl(pattern, "muffleWarning") [18:03:21.127] if (muffled) [18:03:21.127] invokeRestart("muffleWarning") [18:03:21.127] } [18:03:21.127] else if (inherits(cond, "condition")) { [18:03:21.127] if (!is.null(pattern)) { [18:03:21.127] computeRestarts <- base::computeRestarts [18:03:21.127] grepl <- base::grepl [18:03:21.127] restarts <- computeRestarts(cond) [18:03:21.127] for (restart in restarts) { [18:03:21.127] name <- restart$name [18:03:21.127] if (is.null(name)) [18:03:21.127] next [18:03:21.127] if (!grepl(pattern, name)) [18:03:21.127] next [18:03:21.127] invokeRestart(restart) [18:03:21.127] muffled <- TRUE [18:03:21.127] break [18:03:21.127] } [18:03:21.127] } [18:03:21.127] } [18:03:21.127] invisible(muffled) [18:03:21.127] } [18:03:21.127] muffleCondition(cond, pattern = "^muffle") [18:03:21.127] } [18:03:21.127] } [18:03:21.127] } [18:03:21.127] })) [18:03:21.127] }, error = function(ex) { [18:03:21.127] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.127] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.127] ...future.rng), started = ...future.startTime, [18:03:21.127] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.127] version = "1.8"), class = "FutureResult") [18:03:21.127] }, finally = { [18:03:21.127] if (!identical(...future.workdir, getwd())) [18:03:21.127] setwd(...future.workdir) [18:03:21.127] { [18:03:21.127] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.127] ...future.oldOptions$nwarnings <- NULL [18:03:21.127] } [18:03:21.127] base::options(...future.oldOptions) [18:03:21.127] if (.Platform$OS.type == "windows") { [18:03:21.127] old_names <- names(...future.oldEnvVars) [18:03:21.127] envs <- base::Sys.getenv() [18:03:21.127] names <- names(envs) [18:03:21.127] common <- intersect(names, old_names) [18:03:21.127] added <- setdiff(names, old_names) [18:03:21.127] removed <- setdiff(old_names, names) [18:03:21.127] changed <- common[...future.oldEnvVars[common] != [18:03:21.127] envs[common]] [18:03:21.127] NAMES <- toupper(changed) [18:03:21.127] args <- list() [18:03:21.127] for (kk in seq_along(NAMES)) { [18:03:21.127] name <- changed[[kk]] [18:03:21.127] NAME <- NAMES[[kk]] [18:03:21.127] if (name != NAME && is.element(NAME, old_names)) [18:03:21.127] next [18:03:21.127] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.127] } [18:03:21.127] NAMES <- toupper(added) [18:03:21.127] for (kk in seq_along(NAMES)) { [18:03:21.127] name <- added[[kk]] [18:03:21.127] NAME <- NAMES[[kk]] [18:03:21.127] if (name != NAME && is.element(NAME, old_names)) [18:03:21.127] next [18:03:21.127] args[[name]] <- "" [18:03:21.127] } [18:03:21.127] NAMES <- toupper(removed) [18:03:21.127] for (kk in seq_along(NAMES)) { [18:03:21.127] name <- removed[[kk]] [18:03:21.127] NAME <- NAMES[[kk]] [18:03:21.127] if (name != NAME && is.element(NAME, old_names)) [18:03:21.127] next [18:03:21.127] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.127] } [18:03:21.127] if (length(args) > 0) [18:03:21.127] base::do.call(base::Sys.setenv, args = args) [18:03:21.127] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.127] } [18:03:21.127] else { [18:03:21.127] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.127] } [18:03:21.127] { [18:03:21.127] if (base::length(...future.futureOptionsAdded) > [18:03:21.127] 0L) { [18:03:21.127] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.127] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.127] base::options(opts) [18:03:21.127] } [18:03:21.127] { [18:03:21.127] { [18:03:21.127] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.127] NULL [18:03:21.127] } [18:03:21.127] options(future.plan = NULL) [18:03:21.127] if (is.na(NA_character_)) [18:03:21.127] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.127] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.127] future::plan(list(function (..., workers = availableCores(), [18:03:21.127] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.127] envir = parent.frame()) [18:03:21.127] { [18:03:21.127] if (is.function(workers)) [18:03:21.127] workers <- workers() [18:03:21.127] workers <- structure(as.integer(workers), [18:03:21.127] class = class(workers)) [18:03:21.127] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.127] workers >= 1) [18:03:21.127] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.127] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.127] } [18:03:21.127] future <- MultisessionFuture(..., workers = workers, [18:03:21.127] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.127] envir = envir) [18:03:21.127] if (!future$lazy) [18:03:21.127] future <- run(future) [18:03:21.127] invisible(future) [18:03:21.127] }), .cleanup = FALSE, .init = FALSE) [18:03:21.127] } [18:03:21.127] } [18:03:21.127] } [18:03:21.127] }) [18:03:21.127] if (TRUE) { [18:03:21.127] base::sink(type = "output", split = FALSE) [18:03:21.127] if (TRUE) { [18:03:21.127] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.127] } [18:03:21.127] else { [18:03:21.127] ...future.result["stdout"] <- base::list(NULL) [18:03:21.127] } [18:03:21.127] base::close(...future.stdout) [18:03:21.127] ...future.stdout <- NULL [18:03:21.127] } [18:03:21.127] ...future.result$conditions <- ...future.conditions [18:03:21.127] ...future.result$finished <- base::Sys.time() [18:03:21.127] ...future.result [18:03:21.127] } [18:03:21.133] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:21.133] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:21.134] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:21.134] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:21.135] MultisessionFuture started [18:03:21.135] - Launch lazy future ... done [18:03:21.135] run() for 'MultisessionFuture' ... done [18:03:21.135] getGlobalsAndPackages() ... [18:03:21.136] Searching for globals... [18:03:21.137] - globals found: [3] '{', 'sample', 'x' [18:03:21.137] Searching for globals ... DONE [18:03:21.137] Resolving globals: FALSE [18:03:21.138] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.138] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.138] - globals: [1] 'x' [18:03:21.138] [18:03:21.139] getGlobalsAndPackages() ... DONE [18:03:21.139] run() for 'Future' ... [18:03:21.139] - state: 'created' [18:03:21.139] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.153] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.153] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.154] - Field: 'node' [18:03:21.154] - Field: 'label' [18:03:21.154] - Field: 'local' [18:03:21.154] - Field: 'owner' [18:03:21.154] - Field: 'envir' [18:03:21.155] - Field: 'workers' [18:03:21.155] - Field: 'packages' [18:03:21.155] - Field: 'gc' [18:03:21.155] - Field: 'conditions' [18:03:21.155] - Field: 'persistent' [18:03:21.155] - Field: 'expr' [18:03:21.156] - Field: 'uuid' [18:03:21.156] - Field: 'seed' [18:03:21.156] - Field: 'version' [18:03:21.156] - Field: 'result' [18:03:21.156] - Field: 'asynchronous' [18:03:21.156] - Field: 'calls' [18:03:21.157] - Field: 'globals' [18:03:21.157] - Field: 'stdout' [18:03:21.157] - Field: 'earlySignal' [18:03:21.157] - Field: 'lazy' [18:03:21.157] - Field: 'state' [18:03:21.158] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.158] - Launch lazy future ... [18:03:21.158] Packages needed by the future expression (n = 0): [18:03:21.158] Packages needed by future strategies (n = 0): [18:03:21.159] { [18:03:21.159] { [18:03:21.159] { [18:03:21.159] ...future.startTime <- base::Sys.time() [18:03:21.159] { [18:03:21.159] { [18:03:21.159] { [18:03:21.159] { [18:03:21.159] base::local({ [18:03:21.159] has_future <- base::requireNamespace("future", [18:03:21.159] quietly = TRUE) [18:03:21.159] if (has_future) { [18:03:21.159] ns <- base::getNamespace("future") [18:03:21.159] version <- ns[[".package"]][["version"]] [18:03:21.159] if (is.null(version)) [18:03:21.159] version <- utils::packageVersion("future") [18:03:21.159] } [18:03:21.159] else { [18:03:21.159] version <- NULL [18:03:21.159] } [18:03:21.159] if (!has_future || version < "1.8.0") { [18:03:21.159] info <- base::c(r_version = base::gsub("R version ", [18:03:21.159] "", base::R.version$version.string), [18:03:21.159] platform = base::sprintf("%s (%s-bit)", [18:03:21.159] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.159] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.159] "release", "version")], collapse = " "), [18:03:21.159] hostname = base::Sys.info()[["nodename"]]) [18:03:21.159] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.159] info) [18:03:21.159] info <- base::paste(info, collapse = "; ") [18:03:21.159] if (!has_future) { [18:03:21.159] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.159] info) [18:03:21.159] } [18:03:21.159] else { [18:03:21.159] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.159] info, version) [18:03:21.159] } [18:03:21.159] base::stop(msg) [18:03:21.159] } [18:03:21.159] }) [18:03:21.159] } [18:03:21.159] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.159] base::options(mc.cores = 1L) [18:03:21.159] } [18:03:21.159] options(future.plan = NULL) [18:03:21.159] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.159] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.159] } [18:03:21.159] ...future.workdir <- getwd() [18:03:21.159] } [18:03:21.159] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.159] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.159] } [18:03:21.159] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.159] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.159] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.159] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.159] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.159] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.159] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.159] base::names(...future.oldOptions)) [18:03:21.159] } [18:03:21.159] if (FALSE) { [18:03:21.159] } [18:03:21.159] else { [18:03:21.159] if (TRUE) { [18:03:21.159] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.159] open = "w") [18:03:21.159] } [18:03:21.159] else { [18:03:21.159] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.159] windows = "NUL", "/dev/null"), open = "w") [18:03:21.159] } [18:03:21.159] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.159] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.159] base::sink(type = "output", split = FALSE) [18:03:21.159] base::close(...future.stdout) [18:03:21.159] }, add = TRUE) [18:03:21.159] } [18:03:21.159] ...future.frame <- base::sys.nframe() [18:03:21.159] ...future.conditions <- base::list() [18:03:21.159] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.159] if (FALSE) { [18:03:21.159] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.159] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.159] } [18:03:21.159] ...future.result <- base::tryCatch({ [18:03:21.159] base::withCallingHandlers({ [18:03:21.159] ...future.value <- base::withVisible(base::local({ [18:03:21.159] ...future.makeSendCondition <- local({ [18:03:21.159] sendCondition <- NULL [18:03:21.159] function(frame = 1L) { [18:03:21.159] if (is.function(sendCondition)) [18:03:21.159] return(sendCondition) [18:03:21.159] ns <- getNamespace("parallel") [18:03:21.159] if (exists("sendData", mode = "function", [18:03:21.159] envir = ns)) { [18:03:21.159] parallel_sendData <- get("sendData", mode = "function", [18:03:21.159] envir = ns) [18:03:21.159] envir <- sys.frame(frame) [18:03:21.159] master <- NULL [18:03:21.159] while (!identical(envir, .GlobalEnv) && [18:03:21.159] !identical(envir, emptyenv())) { [18:03:21.159] if (exists("master", mode = "list", envir = envir, [18:03:21.159] inherits = FALSE)) { [18:03:21.159] master <- get("master", mode = "list", [18:03:21.159] envir = envir, inherits = FALSE) [18:03:21.159] if (inherits(master, c("SOCKnode", [18:03:21.159] "SOCK0node"))) { [18:03:21.159] sendCondition <<- function(cond) { [18:03:21.159] data <- list(type = "VALUE", value = cond, [18:03:21.159] success = TRUE) [18:03:21.159] parallel_sendData(master, data) [18:03:21.159] } [18:03:21.159] return(sendCondition) [18:03:21.159] } [18:03:21.159] } [18:03:21.159] frame <- frame + 1L [18:03:21.159] envir <- sys.frame(frame) [18:03:21.159] } [18:03:21.159] } [18:03:21.159] sendCondition <<- function(cond) NULL [18:03:21.159] } [18:03:21.159] }) [18:03:21.159] withCallingHandlers({ [18:03:21.159] { [18:03:21.159] sample(x, size = 1L) [18:03:21.159] } [18:03:21.159] }, immediateCondition = function(cond) { [18:03:21.159] sendCondition <- ...future.makeSendCondition() [18:03:21.159] sendCondition(cond) [18:03:21.159] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.159] { [18:03:21.159] inherits <- base::inherits [18:03:21.159] invokeRestart <- base::invokeRestart [18:03:21.159] is.null <- base::is.null [18:03:21.159] muffled <- FALSE [18:03:21.159] if (inherits(cond, "message")) { [18:03:21.159] muffled <- grepl(pattern, "muffleMessage") [18:03:21.159] if (muffled) [18:03:21.159] invokeRestart("muffleMessage") [18:03:21.159] } [18:03:21.159] else if (inherits(cond, "warning")) { [18:03:21.159] muffled <- grepl(pattern, "muffleWarning") [18:03:21.159] if (muffled) [18:03:21.159] invokeRestart("muffleWarning") [18:03:21.159] } [18:03:21.159] else if (inherits(cond, "condition")) { [18:03:21.159] if (!is.null(pattern)) { [18:03:21.159] computeRestarts <- base::computeRestarts [18:03:21.159] grepl <- base::grepl [18:03:21.159] restarts <- computeRestarts(cond) [18:03:21.159] for (restart in restarts) { [18:03:21.159] name <- restart$name [18:03:21.159] if (is.null(name)) [18:03:21.159] next [18:03:21.159] if (!grepl(pattern, name)) [18:03:21.159] next [18:03:21.159] invokeRestart(restart) [18:03:21.159] muffled <- TRUE [18:03:21.159] break [18:03:21.159] } [18:03:21.159] } [18:03:21.159] } [18:03:21.159] invisible(muffled) [18:03:21.159] } [18:03:21.159] muffleCondition(cond) [18:03:21.159] }) [18:03:21.159] })) [18:03:21.159] future::FutureResult(value = ...future.value$value, [18:03:21.159] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.159] ...future.rng), globalenv = if (FALSE) [18:03:21.159] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.159] ...future.globalenv.names)) [18:03:21.159] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.159] }, condition = base::local({ [18:03:21.159] c <- base::c [18:03:21.159] inherits <- base::inherits [18:03:21.159] invokeRestart <- base::invokeRestart [18:03:21.159] length <- base::length [18:03:21.159] list <- base::list [18:03:21.159] seq.int <- base::seq.int [18:03:21.159] signalCondition <- base::signalCondition [18:03:21.159] sys.calls <- base::sys.calls [18:03:21.159] `[[` <- base::`[[` [18:03:21.159] `+` <- base::`+` [18:03:21.159] `<<-` <- base::`<<-` [18:03:21.159] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.159] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.159] 3L)] [18:03:21.159] } [18:03:21.159] function(cond) { [18:03:21.159] is_error <- inherits(cond, "error") [18:03:21.159] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.159] NULL) [18:03:21.159] if (is_error) { [18:03:21.159] sessionInformation <- function() { [18:03:21.159] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.159] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.159] search = base::search(), system = base::Sys.info()) [18:03:21.159] } [18:03:21.159] ...future.conditions[[length(...future.conditions) + [18:03:21.159] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.159] cond$call), session = sessionInformation(), [18:03:21.159] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.159] signalCondition(cond) [18:03:21.159] } [18:03:21.159] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.159] "immediateCondition"))) { [18:03:21.159] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.159] ...future.conditions[[length(...future.conditions) + [18:03:21.159] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.159] if (TRUE && !signal) { [18:03:21.159] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.159] { [18:03:21.159] inherits <- base::inherits [18:03:21.159] invokeRestart <- base::invokeRestart [18:03:21.159] is.null <- base::is.null [18:03:21.159] muffled <- FALSE [18:03:21.159] if (inherits(cond, "message")) { [18:03:21.159] muffled <- grepl(pattern, "muffleMessage") [18:03:21.159] if (muffled) [18:03:21.159] invokeRestart("muffleMessage") [18:03:21.159] } [18:03:21.159] else if (inherits(cond, "warning")) { [18:03:21.159] muffled <- grepl(pattern, "muffleWarning") [18:03:21.159] if (muffled) [18:03:21.159] invokeRestart("muffleWarning") [18:03:21.159] } [18:03:21.159] else if (inherits(cond, "condition")) { [18:03:21.159] if (!is.null(pattern)) { [18:03:21.159] computeRestarts <- base::computeRestarts [18:03:21.159] grepl <- base::grepl [18:03:21.159] restarts <- computeRestarts(cond) [18:03:21.159] for (restart in restarts) { [18:03:21.159] name <- restart$name [18:03:21.159] if (is.null(name)) [18:03:21.159] next [18:03:21.159] if (!grepl(pattern, name)) [18:03:21.159] next [18:03:21.159] invokeRestart(restart) [18:03:21.159] muffled <- TRUE [18:03:21.159] break [18:03:21.159] } [18:03:21.159] } [18:03:21.159] } [18:03:21.159] invisible(muffled) [18:03:21.159] } [18:03:21.159] muffleCondition(cond, pattern = "^muffle") [18:03:21.159] } [18:03:21.159] } [18:03:21.159] else { [18:03:21.159] if (TRUE) { [18:03:21.159] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.159] { [18:03:21.159] inherits <- base::inherits [18:03:21.159] invokeRestart <- base::invokeRestart [18:03:21.159] is.null <- base::is.null [18:03:21.159] muffled <- FALSE [18:03:21.159] if (inherits(cond, "message")) { [18:03:21.159] muffled <- grepl(pattern, "muffleMessage") [18:03:21.159] if (muffled) [18:03:21.159] invokeRestart("muffleMessage") [18:03:21.159] } [18:03:21.159] else if (inherits(cond, "warning")) { [18:03:21.159] muffled <- grepl(pattern, "muffleWarning") [18:03:21.159] if (muffled) [18:03:21.159] invokeRestart("muffleWarning") [18:03:21.159] } [18:03:21.159] else if (inherits(cond, "condition")) { [18:03:21.159] if (!is.null(pattern)) { [18:03:21.159] computeRestarts <- base::computeRestarts [18:03:21.159] grepl <- base::grepl [18:03:21.159] restarts <- computeRestarts(cond) [18:03:21.159] for (restart in restarts) { [18:03:21.159] name <- restart$name [18:03:21.159] if (is.null(name)) [18:03:21.159] next [18:03:21.159] if (!grepl(pattern, name)) [18:03:21.159] next [18:03:21.159] invokeRestart(restart) [18:03:21.159] muffled <- TRUE [18:03:21.159] break [18:03:21.159] } [18:03:21.159] } [18:03:21.159] } [18:03:21.159] invisible(muffled) [18:03:21.159] } [18:03:21.159] muffleCondition(cond, pattern = "^muffle") [18:03:21.159] } [18:03:21.159] } [18:03:21.159] } [18:03:21.159] })) [18:03:21.159] }, error = function(ex) { [18:03:21.159] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.159] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.159] ...future.rng), started = ...future.startTime, [18:03:21.159] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.159] version = "1.8"), class = "FutureResult") [18:03:21.159] }, finally = { [18:03:21.159] if (!identical(...future.workdir, getwd())) [18:03:21.159] setwd(...future.workdir) [18:03:21.159] { [18:03:21.159] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.159] ...future.oldOptions$nwarnings <- NULL [18:03:21.159] } [18:03:21.159] base::options(...future.oldOptions) [18:03:21.159] if (.Platform$OS.type == "windows") { [18:03:21.159] old_names <- names(...future.oldEnvVars) [18:03:21.159] envs <- base::Sys.getenv() [18:03:21.159] names <- names(envs) [18:03:21.159] common <- intersect(names, old_names) [18:03:21.159] added <- setdiff(names, old_names) [18:03:21.159] removed <- setdiff(old_names, names) [18:03:21.159] changed <- common[...future.oldEnvVars[common] != [18:03:21.159] envs[common]] [18:03:21.159] NAMES <- toupper(changed) [18:03:21.159] args <- list() [18:03:21.159] for (kk in seq_along(NAMES)) { [18:03:21.159] name <- changed[[kk]] [18:03:21.159] NAME <- NAMES[[kk]] [18:03:21.159] if (name != NAME && is.element(NAME, old_names)) [18:03:21.159] next [18:03:21.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.159] } [18:03:21.159] NAMES <- toupper(added) [18:03:21.159] for (kk in seq_along(NAMES)) { [18:03:21.159] name <- added[[kk]] [18:03:21.159] NAME <- NAMES[[kk]] [18:03:21.159] if (name != NAME && is.element(NAME, old_names)) [18:03:21.159] next [18:03:21.159] args[[name]] <- "" [18:03:21.159] } [18:03:21.159] NAMES <- toupper(removed) [18:03:21.159] for (kk in seq_along(NAMES)) { [18:03:21.159] name <- removed[[kk]] [18:03:21.159] NAME <- NAMES[[kk]] [18:03:21.159] if (name != NAME && is.element(NAME, old_names)) [18:03:21.159] next [18:03:21.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.159] } [18:03:21.159] if (length(args) > 0) [18:03:21.159] base::do.call(base::Sys.setenv, args = args) [18:03:21.159] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.159] } [18:03:21.159] else { [18:03:21.159] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.159] } [18:03:21.159] { [18:03:21.159] if (base::length(...future.futureOptionsAdded) > [18:03:21.159] 0L) { [18:03:21.159] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.159] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.159] base::options(opts) [18:03:21.159] } [18:03:21.159] { [18:03:21.159] { [18:03:21.159] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.159] NULL [18:03:21.159] } [18:03:21.159] options(future.plan = NULL) [18:03:21.159] if (is.na(NA_character_)) [18:03:21.159] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.159] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.159] future::plan(list(function (..., workers = availableCores(), [18:03:21.159] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.159] envir = parent.frame()) [18:03:21.159] { [18:03:21.159] if (is.function(workers)) [18:03:21.159] workers <- workers() [18:03:21.159] workers <- structure(as.integer(workers), [18:03:21.159] class = class(workers)) [18:03:21.159] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.159] workers >= 1) [18:03:21.159] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.159] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.159] } [18:03:21.159] future <- MultisessionFuture(..., workers = workers, [18:03:21.159] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.159] envir = envir) [18:03:21.159] if (!future$lazy) [18:03:21.159] future <- run(future) [18:03:21.159] invisible(future) [18:03:21.159] }), .cleanup = FALSE, .init = FALSE) [18:03:21.159] } [18:03:21.159] } [18:03:21.159] } [18:03:21.159] }) [18:03:21.159] if (TRUE) { [18:03:21.159] base::sink(type = "output", split = FALSE) [18:03:21.159] if (TRUE) { [18:03:21.159] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.159] } [18:03:21.159] else { [18:03:21.159] ...future.result["stdout"] <- base::list(NULL) [18:03:21.159] } [18:03:21.159] base::close(...future.stdout) [18:03:21.159] ...future.stdout <- NULL [18:03:21.159] } [18:03:21.159] ...future.result$conditions <- ...future.conditions [18:03:21.159] ...future.result$finished <- base::Sys.time() [18:03:21.159] ...future.result [18:03:21.159] } [18:03:21.164] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.189] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.190] - Validating connection of MultisessionFuture [18:03:21.190] - received message: FutureResult [18:03:21.190] - Received FutureResult [18:03:21.190] - Erased future from FutureRegistry [18:03:21.190] result() for ClusterFuture ... [18:03:21.191] - result already collected: FutureResult [18:03:21.191] result() for ClusterFuture ... done [18:03:21.191] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.191] result() for ClusterFuture ... [18:03:21.191] - result already collected: FutureResult [18:03:21.191] result() for ClusterFuture ... done [18:03:21.192] result() for ClusterFuture ... [18:03:21.192] - result already collected: FutureResult [18:03:21.192] result() for ClusterFuture ... done [18:03:21.193] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:21.193] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:21.193] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:21.194] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:21.194] MultisessionFuture started [18:03:21.194] - Launch lazy future ... done [18:03:21.195] run() for 'MultisessionFuture' ... done [18:03:21.198] getGlobalsAndPackages() ... [18:03:21.198] Searching for globals... [18:03:21.199] - globals found: [3] '{', 'sample', 'x' [18:03:21.199] Searching for globals ... DONE [18:03:21.200] Resolving globals: FALSE [18:03:21.200] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.201] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.201] - globals: [1] 'x' [18:03:21.201] [18:03:21.201] getGlobalsAndPackages() ... DONE [18:03:21.201] run() for 'Future' ... [18:03:21.202] - state: 'created' [18:03:21.202] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.215] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.216] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.216] - Field: 'node' [18:03:21.216] - Field: 'label' [18:03:21.216] - Field: 'local' [18:03:21.216] - Field: 'owner' [18:03:21.217] - Field: 'envir' [18:03:21.217] - Field: 'workers' [18:03:21.217] - Field: 'packages' [18:03:21.217] - Field: 'gc' [18:03:21.217] - Field: 'conditions' [18:03:21.218] - Field: 'persistent' [18:03:21.218] - Field: 'expr' [18:03:21.218] - Field: 'uuid' [18:03:21.218] - Field: 'seed' [18:03:21.218] - Field: 'version' [18:03:21.218] - Field: 'result' [18:03:21.219] - Field: 'asynchronous' [18:03:21.219] - Field: 'calls' [18:03:21.219] - Field: 'globals' [18:03:21.219] - Field: 'stdout' [18:03:21.219] - Field: 'earlySignal' [18:03:21.219] - Field: 'lazy' [18:03:21.220] - Field: 'state' [18:03:21.220] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.220] - Launch lazy future ... [18:03:21.220] Packages needed by the future expression (n = 0): [18:03:21.220] Packages needed by future strategies (n = 0): [18:03:21.221] { [18:03:21.221] { [18:03:21.221] { [18:03:21.221] ...future.startTime <- base::Sys.time() [18:03:21.221] { [18:03:21.221] { [18:03:21.221] { [18:03:21.221] { [18:03:21.221] base::local({ [18:03:21.221] has_future <- base::requireNamespace("future", [18:03:21.221] quietly = TRUE) [18:03:21.221] if (has_future) { [18:03:21.221] ns <- base::getNamespace("future") [18:03:21.221] version <- ns[[".package"]][["version"]] [18:03:21.221] if (is.null(version)) [18:03:21.221] version <- utils::packageVersion("future") [18:03:21.221] } [18:03:21.221] else { [18:03:21.221] version <- NULL [18:03:21.221] } [18:03:21.221] if (!has_future || version < "1.8.0") { [18:03:21.221] info <- base::c(r_version = base::gsub("R version ", [18:03:21.221] "", base::R.version$version.string), [18:03:21.221] platform = base::sprintf("%s (%s-bit)", [18:03:21.221] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.221] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.221] "release", "version")], collapse = " "), [18:03:21.221] hostname = base::Sys.info()[["nodename"]]) [18:03:21.221] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.221] info) [18:03:21.221] info <- base::paste(info, collapse = "; ") [18:03:21.221] if (!has_future) { [18:03:21.221] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.221] info) [18:03:21.221] } [18:03:21.221] else { [18:03:21.221] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.221] info, version) [18:03:21.221] } [18:03:21.221] base::stop(msg) [18:03:21.221] } [18:03:21.221] }) [18:03:21.221] } [18:03:21.221] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.221] base::options(mc.cores = 1L) [18:03:21.221] } [18:03:21.221] options(future.plan = NULL) [18:03:21.221] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.221] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.221] } [18:03:21.221] ...future.workdir <- getwd() [18:03:21.221] } [18:03:21.221] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.221] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.221] } [18:03:21.221] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.221] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.221] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.221] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.221] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.221] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.221] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.221] base::names(...future.oldOptions)) [18:03:21.221] } [18:03:21.221] if (FALSE) { [18:03:21.221] } [18:03:21.221] else { [18:03:21.221] if (TRUE) { [18:03:21.221] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.221] open = "w") [18:03:21.221] } [18:03:21.221] else { [18:03:21.221] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.221] windows = "NUL", "/dev/null"), open = "w") [18:03:21.221] } [18:03:21.221] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.221] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.221] base::sink(type = "output", split = FALSE) [18:03:21.221] base::close(...future.stdout) [18:03:21.221] }, add = TRUE) [18:03:21.221] } [18:03:21.221] ...future.frame <- base::sys.nframe() [18:03:21.221] ...future.conditions <- base::list() [18:03:21.221] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.221] if (FALSE) { [18:03:21.221] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.221] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.221] } [18:03:21.221] ...future.result <- base::tryCatch({ [18:03:21.221] base::withCallingHandlers({ [18:03:21.221] ...future.value <- base::withVisible(base::local({ [18:03:21.221] ...future.makeSendCondition <- local({ [18:03:21.221] sendCondition <- NULL [18:03:21.221] function(frame = 1L) { [18:03:21.221] if (is.function(sendCondition)) [18:03:21.221] return(sendCondition) [18:03:21.221] ns <- getNamespace("parallel") [18:03:21.221] if (exists("sendData", mode = "function", [18:03:21.221] envir = ns)) { [18:03:21.221] parallel_sendData <- get("sendData", mode = "function", [18:03:21.221] envir = ns) [18:03:21.221] envir <- sys.frame(frame) [18:03:21.221] master <- NULL [18:03:21.221] while (!identical(envir, .GlobalEnv) && [18:03:21.221] !identical(envir, emptyenv())) { [18:03:21.221] if (exists("master", mode = "list", envir = envir, [18:03:21.221] inherits = FALSE)) { [18:03:21.221] master <- get("master", mode = "list", [18:03:21.221] envir = envir, inherits = FALSE) [18:03:21.221] if (inherits(master, c("SOCKnode", [18:03:21.221] "SOCK0node"))) { [18:03:21.221] sendCondition <<- function(cond) { [18:03:21.221] data <- list(type = "VALUE", value = cond, [18:03:21.221] success = TRUE) [18:03:21.221] parallel_sendData(master, data) [18:03:21.221] } [18:03:21.221] return(sendCondition) [18:03:21.221] } [18:03:21.221] } [18:03:21.221] frame <- frame + 1L [18:03:21.221] envir <- sys.frame(frame) [18:03:21.221] } [18:03:21.221] } [18:03:21.221] sendCondition <<- function(cond) NULL [18:03:21.221] } [18:03:21.221] }) [18:03:21.221] withCallingHandlers({ [18:03:21.221] { [18:03:21.221] sample(x, size = 1L) [18:03:21.221] } [18:03:21.221] }, immediateCondition = function(cond) { [18:03:21.221] sendCondition <- ...future.makeSendCondition() [18:03:21.221] sendCondition(cond) [18:03:21.221] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.221] { [18:03:21.221] inherits <- base::inherits [18:03:21.221] invokeRestart <- base::invokeRestart [18:03:21.221] is.null <- base::is.null [18:03:21.221] muffled <- FALSE [18:03:21.221] if (inherits(cond, "message")) { [18:03:21.221] muffled <- grepl(pattern, "muffleMessage") [18:03:21.221] if (muffled) [18:03:21.221] invokeRestart("muffleMessage") [18:03:21.221] } [18:03:21.221] else if (inherits(cond, "warning")) { [18:03:21.221] muffled <- grepl(pattern, "muffleWarning") [18:03:21.221] if (muffled) [18:03:21.221] invokeRestart("muffleWarning") [18:03:21.221] } [18:03:21.221] else if (inherits(cond, "condition")) { [18:03:21.221] if (!is.null(pattern)) { [18:03:21.221] computeRestarts <- base::computeRestarts [18:03:21.221] grepl <- base::grepl [18:03:21.221] restarts <- computeRestarts(cond) [18:03:21.221] for (restart in restarts) { [18:03:21.221] name <- restart$name [18:03:21.221] if (is.null(name)) [18:03:21.221] next [18:03:21.221] if (!grepl(pattern, name)) [18:03:21.221] next [18:03:21.221] invokeRestart(restart) [18:03:21.221] muffled <- TRUE [18:03:21.221] break [18:03:21.221] } [18:03:21.221] } [18:03:21.221] } [18:03:21.221] invisible(muffled) [18:03:21.221] } [18:03:21.221] muffleCondition(cond) [18:03:21.221] }) [18:03:21.221] })) [18:03:21.221] future::FutureResult(value = ...future.value$value, [18:03:21.221] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.221] ...future.rng), globalenv = if (FALSE) [18:03:21.221] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.221] ...future.globalenv.names)) [18:03:21.221] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.221] }, condition = base::local({ [18:03:21.221] c <- base::c [18:03:21.221] inherits <- base::inherits [18:03:21.221] invokeRestart <- base::invokeRestart [18:03:21.221] length <- base::length [18:03:21.221] list <- base::list [18:03:21.221] seq.int <- base::seq.int [18:03:21.221] signalCondition <- base::signalCondition [18:03:21.221] sys.calls <- base::sys.calls [18:03:21.221] `[[` <- base::`[[` [18:03:21.221] `+` <- base::`+` [18:03:21.221] `<<-` <- base::`<<-` [18:03:21.221] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.221] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.221] 3L)] [18:03:21.221] } [18:03:21.221] function(cond) { [18:03:21.221] is_error <- inherits(cond, "error") [18:03:21.221] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.221] NULL) [18:03:21.221] if (is_error) { [18:03:21.221] sessionInformation <- function() { [18:03:21.221] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.221] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.221] search = base::search(), system = base::Sys.info()) [18:03:21.221] } [18:03:21.221] ...future.conditions[[length(...future.conditions) + [18:03:21.221] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.221] cond$call), session = sessionInformation(), [18:03:21.221] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.221] signalCondition(cond) [18:03:21.221] } [18:03:21.221] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.221] "immediateCondition"))) { [18:03:21.221] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.221] ...future.conditions[[length(...future.conditions) + [18:03:21.221] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.221] if (TRUE && !signal) { [18:03:21.221] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.221] { [18:03:21.221] inherits <- base::inherits [18:03:21.221] invokeRestart <- base::invokeRestart [18:03:21.221] is.null <- base::is.null [18:03:21.221] muffled <- FALSE [18:03:21.221] if (inherits(cond, "message")) { [18:03:21.221] muffled <- grepl(pattern, "muffleMessage") [18:03:21.221] if (muffled) [18:03:21.221] invokeRestart("muffleMessage") [18:03:21.221] } [18:03:21.221] else if (inherits(cond, "warning")) { [18:03:21.221] muffled <- grepl(pattern, "muffleWarning") [18:03:21.221] if (muffled) [18:03:21.221] invokeRestart("muffleWarning") [18:03:21.221] } [18:03:21.221] else if (inherits(cond, "condition")) { [18:03:21.221] if (!is.null(pattern)) { [18:03:21.221] computeRestarts <- base::computeRestarts [18:03:21.221] grepl <- base::grepl [18:03:21.221] restarts <- computeRestarts(cond) [18:03:21.221] for (restart in restarts) { [18:03:21.221] name <- restart$name [18:03:21.221] if (is.null(name)) [18:03:21.221] next [18:03:21.221] if (!grepl(pattern, name)) [18:03:21.221] next [18:03:21.221] invokeRestart(restart) [18:03:21.221] muffled <- TRUE [18:03:21.221] break [18:03:21.221] } [18:03:21.221] } [18:03:21.221] } [18:03:21.221] invisible(muffled) [18:03:21.221] } [18:03:21.221] muffleCondition(cond, pattern = "^muffle") [18:03:21.221] } [18:03:21.221] } [18:03:21.221] else { [18:03:21.221] if (TRUE) { [18:03:21.221] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.221] { [18:03:21.221] inherits <- base::inherits [18:03:21.221] invokeRestart <- base::invokeRestart [18:03:21.221] is.null <- base::is.null [18:03:21.221] muffled <- FALSE [18:03:21.221] if (inherits(cond, "message")) { [18:03:21.221] muffled <- grepl(pattern, "muffleMessage") [18:03:21.221] if (muffled) [18:03:21.221] invokeRestart("muffleMessage") [18:03:21.221] } [18:03:21.221] else if (inherits(cond, "warning")) { [18:03:21.221] muffled <- grepl(pattern, "muffleWarning") [18:03:21.221] if (muffled) [18:03:21.221] invokeRestart("muffleWarning") [18:03:21.221] } [18:03:21.221] else if (inherits(cond, "condition")) { [18:03:21.221] if (!is.null(pattern)) { [18:03:21.221] computeRestarts <- base::computeRestarts [18:03:21.221] grepl <- base::grepl [18:03:21.221] restarts <- computeRestarts(cond) [18:03:21.221] for (restart in restarts) { [18:03:21.221] name <- restart$name [18:03:21.221] if (is.null(name)) [18:03:21.221] next [18:03:21.221] if (!grepl(pattern, name)) [18:03:21.221] next [18:03:21.221] invokeRestart(restart) [18:03:21.221] muffled <- TRUE [18:03:21.221] break [18:03:21.221] } [18:03:21.221] } [18:03:21.221] } [18:03:21.221] invisible(muffled) [18:03:21.221] } [18:03:21.221] muffleCondition(cond, pattern = "^muffle") [18:03:21.221] } [18:03:21.221] } [18:03:21.221] } [18:03:21.221] })) [18:03:21.221] }, error = function(ex) { [18:03:21.221] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.221] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.221] ...future.rng), started = ...future.startTime, [18:03:21.221] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.221] version = "1.8"), class = "FutureResult") [18:03:21.221] }, finally = { [18:03:21.221] if (!identical(...future.workdir, getwd())) [18:03:21.221] setwd(...future.workdir) [18:03:21.221] { [18:03:21.221] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.221] ...future.oldOptions$nwarnings <- NULL [18:03:21.221] } [18:03:21.221] base::options(...future.oldOptions) [18:03:21.221] if (.Platform$OS.type == "windows") { [18:03:21.221] old_names <- names(...future.oldEnvVars) [18:03:21.221] envs <- base::Sys.getenv() [18:03:21.221] names <- names(envs) [18:03:21.221] common <- intersect(names, old_names) [18:03:21.221] added <- setdiff(names, old_names) [18:03:21.221] removed <- setdiff(old_names, names) [18:03:21.221] changed <- common[...future.oldEnvVars[common] != [18:03:21.221] envs[common]] [18:03:21.221] NAMES <- toupper(changed) [18:03:21.221] args <- list() [18:03:21.221] for (kk in seq_along(NAMES)) { [18:03:21.221] name <- changed[[kk]] [18:03:21.221] NAME <- NAMES[[kk]] [18:03:21.221] if (name != NAME && is.element(NAME, old_names)) [18:03:21.221] next [18:03:21.221] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.221] } [18:03:21.221] NAMES <- toupper(added) [18:03:21.221] for (kk in seq_along(NAMES)) { [18:03:21.221] name <- added[[kk]] [18:03:21.221] NAME <- NAMES[[kk]] [18:03:21.221] if (name != NAME && is.element(NAME, old_names)) [18:03:21.221] next [18:03:21.221] args[[name]] <- "" [18:03:21.221] } [18:03:21.221] NAMES <- toupper(removed) [18:03:21.221] for (kk in seq_along(NAMES)) { [18:03:21.221] name <- removed[[kk]] [18:03:21.221] NAME <- NAMES[[kk]] [18:03:21.221] if (name != NAME && is.element(NAME, old_names)) [18:03:21.221] next [18:03:21.221] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.221] } [18:03:21.221] if (length(args) > 0) [18:03:21.221] base::do.call(base::Sys.setenv, args = args) [18:03:21.221] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.221] } [18:03:21.221] else { [18:03:21.221] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.221] } [18:03:21.221] { [18:03:21.221] if (base::length(...future.futureOptionsAdded) > [18:03:21.221] 0L) { [18:03:21.221] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.221] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.221] base::options(opts) [18:03:21.221] } [18:03:21.221] { [18:03:21.221] { [18:03:21.221] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.221] NULL [18:03:21.221] } [18:03:21.221] options(future.plan = NULL) [18:03:21.221] if (is.na(NA_character_)) [18:03:21.221] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.221] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.221] future::plan(list(function (..., workers = availableCores(), [18:03:21.221] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.221] envir = parent.frame()) [18:03:21.221] { [18:03:21.221] if (is.function(workers)) [18:03:21.221] workers <- workers() [18:03:21.221] workers <- structure(as.integer(workers), [18:03:21.221] class = class(workers)) [18:03:21.221] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.221] workers >= 1) [18:03:21.221] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.221] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.221] } [18:03:21.221] future <- MultisessionFuture(..., workers = workers, [18:03:21.221] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.221] envir = envir) [18:03:21.221] if (!future$lazy) [18:03:21.221] future <- run(future) [18:03:21.221] invisible(future) [18:03:21.221] }), .cleanup = FALSE, .init = FALSE) [18:03:21.221] } [18:03:21.221] } [18:03:21.221] } [18:03:21.221] }) [18:03:21.221] if (TRUE) { [18:03:21.221] base::sink(type = "output", split = FALSE) [18:03:21.221] if (TRUE) { [18:03:21.221] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.221] } [18:03:21.221] else { [18:03:21.221] ...future.result["stdout"] <- base::list(NULL) [18:03:21.221] } [18:03:21.221] base::close(...future.stdout) [18:03:21.221] ...future.stdout <- NULL [18:03:21.221] } [18:03:21.221] ...future.result$conditions <- ...future.conditions [18:03:21.221] ...future.result$finished <- base::Sys.time() [18:03:21.221] ...future.result [18:03:21.221] } [18:03:21.226] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.252] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.252] - Validating connection of MultisessionFuture [18:03:21.253] - received message: FutureResult [18:03:21.253] - Received FutureResult [18:03:21.253] - Erased future from FutureRegistry [18:03:21.253] result() for ClusterFuture ... [18:03:21.253] - result already collected: FutureResult [18:03:21.253] result() for ClusterFuture ... done [18:03:21.254] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.254] result() for ClusterFuture ... [18:03:21.254] - result already collected: FutureResult [18:03:21.254] result() for ClusterFuture ... done [18:03:21.254] result() for ClusterFuture ... [18:03:21.254] - result already collected: FutureResult [18:03:21.255] result() for ClusterFuture ... done [18:03:21.255] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:21.256] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:21.256] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:21.256] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:21.257] MultisessionFuture started [18:03:21.257] - Launch lazy future ... done [18:03:21.257] run() for 'MultisessionFuture' ... done [18:03:21.258] result() for ClusterFuture ... [18:03:21.258] - result already collected: FutureResult [18:03:21.258] result() for ClusterFuture ... done [18:03:21.258] result() for ClusterFuture ... [18:03:21.258] - result already collected: FutureResult [18:03:21.258] result() for ClusterFuture ... done [18:03:21.259] signalConditions() ... [18:03:21.259] - include = 'immediateCondition' [18:03:21.259] - exclude = [18:03:21.259] - resignal = FALSE [18:03:21.259] - Number of conditions: 1 [18:03:21.259] signalConditions() ... done [18:03:21.260] Future state: 'finished' [18:03:21.260] result() for ClusterFuture ... [18:03:21.260] - result already collected: FutureResult [18:03:21.260] result() for ClusterFuture ... done [18:03:21.260] signalConditions() ... [18:03:21.260] - include = 'condition' [18:03:21.260] - exclude = 'immediateCondition' [18:03:21.261] - resignal = TRUE [18:03:21.261] - Number of conditions: 1 [18:03:21.261] - Condition #1: 'RngFutureError', 'FutureError', 'error', 'RngFutureCondition', 'FutureCondition', 'condition' [18:03:21.261] signalConditions() ... done Future UUID: d6e64427-6384-ba4f-10b8-cb25ee475c86 DEBUG: BEGIN TROUBLESHOOTING HELP Future involved: MultisessionFuture: Label: 'fsample_1-460976' Expression: { sample(x, size = 1L) } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: 0x00000235f5c05e28 Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: 1 objects totaling 64 bytes (integer 'x' of 64 bytes) Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) Resolved: TRUE Value: 56 bytes of class 'integer' Conditions captured: [n=1] 'RngFutureError' Early signaling: FALSE Owner process: ea240974-a9f9-fb3a-d557-cdd413244745 Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' DEBUG: END TROUBLESHOOTING HELP [18:03:21.263] getGlobalsAndPackages() ... [18:03:21.263] Searching for globals... [18:03:21.264] - globals found: [3] '{', 'sample', 'x' [18:03:21.264] Searching for globals ... DONE [18:03:21.264] Resolving globals: FALSE [18:03:21.265] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.265] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.266] - globals: [1] 'x' [18:03:21.266] [18:03:21.266] getGlobalsAndPackages() ... DONE [18:03:21.266] run() for 'Future' ... [18:03:21.267] - state: 'created' [18:03:21.267] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.281] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.281] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.281] - Field: 'node' [18:03:21.282] - Field: 'label' [18:03:21.282] - Field: 'local' [18:03:21.282] - Field: 'owner' [18:03:21.282] - Field: 'envir' [18:03:21.282] - Field: 'workers' [18:03:21.283] - Field: 'packages' [18:03:21.283] - Field: 'gc' [18:03:21.283] - Field: 'conditions' [18:03:21.283] - Field: 'persistent' [18:03:21.283] - Field: 'expr' [18:03:21.283] - Field: 'uuid' [18:03:21.284] - Field: 'seed' [18:03:21.284] - Field: 'version' [18:03:21.284] - Field: 'result' [18:03:21.284] - Field: 'asynchronous' [18:03:21.284] - Field: 'calls' [18:03:21.285] - Field: 'globals' [18:03:21.285] - Field: 'stdout' [18:03:21.285] - Field: 'earlySignal' [18:03:21.285] - Field: 'lazy' [18:03:21.285] - Field: 'state' [18:03:21.285] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.286] - Launch lazy future ... [18:03:21.286] Packages needed by the future expression (n = 0): [18:03:21.286] Packages needed by future strategies (n = 0): [18:03:21.287] { [18:03:21.287] { [18:03:21.287] { [18:03:21.287] ...future.startTime <- base::Sys.time() [18:03:21.287] { [18:03:21.287] { [18:03:21.287] { [18:03:21.287] { [18:03:21.287] base::local({ [18:03:21.287] has_future <- base::requireNamespace("future", [18:03:21.287] quietly = TRUE) [18:03:21.287] if (has_future) { [18:03:21.287] ns <- base::getNamespace("future") [18:03:21.287] version <- ns[[".package"]][["version"]] [18:03:21.287] if (is.null(version)) [18:03:21.287] version <- utils::packageVersion("future") [18:03:21.287] } [18:03:21.287] else { [18:03:21.287] version <- NULL [18:03:21.287] } [18:03:21.287] if (!has_future || version < "1.8.0") { [18:03:21.287] info <- base::c(r_version = base::gsub("R version ", [18:03:21.287] "", base::R.version$version.string), [18:03:21.287] platform = base::sprintf("%s (%s-bit)", [18:03:21.287] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.287] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.287] "release", "version")], collapse = " "), [18:03:21.287] hostname = base::Sys.info()[["nodename"]]) [18:03:21.287] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.287] info) [18:03:21.287] info <- base::paste(info, collapse = "; ") [18:03:21.287] if (!has_future) { [18:03:21.287] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.287] info) [18:03:21.287] } [18:03:21.287] else { [18:03:21.287] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.287] info, version) [18:03:21.287] } [18:03:21.287] base::stop(msg) [18:03:21.287] } [18:03:21.287] }) [18:03:21.287] } [18:03:21.287] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.287] base::options(mc.cores = 1L) [18:03:21.287] } [18:03:21.287] options(future.plan = NULL) [18:03:21.287] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.287] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.287] } [18:03:21.287] ...future.workdir <- getwd() [18:03:21.287] } [18:03:21.287] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.287] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.287] } [18:03:21.287] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.287] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.287] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.287] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.287] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.287] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.287] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.287] base::names(...future.oldOptions)) [18:03:21.287] } [18:03:21.287] if (FALSE) { [18:03:21.287] } [18:03:21.287] else { [18:03:21.287] if (TRUE) { [18:03:21.287] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.287] open = "w") [18:03:21.287] } [18:03:21.287] else { [18:03:21.287] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.287] windows = "NUL", "/dev/null"), open = "w") [18:03:21.287] } [18:03:21.287] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.287] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.287] base::sink(type = "output", split = FALSE) [18:03:21.287] base::close(...future.stdout) [18:03:21.287] }, add = TRUE) [18:03:21.287] } [18:03:21.287] ...future.frame <- base::sys.nframe() [18:03:21.287] ...future.conditions <- base::list() [18:03:21.287] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.287] if (FALSE) { [18:03:21.287] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.287] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.287] } [18:03:21.287] ...future.result <- base::tryCatch({ [18:03:21.287] base::withCallingHandlers({ [18:03:21.287] ...future.value <- base::withVisible(base::local({ [18:03:21.287] ...future.makeSendCondition <- local({ [18:03:21.287] sendCondition <- NULL [18:03:21.287] function(frame = 1L) { [18:03:21.287] if (is.function(sendCondition)) [18:03:21.287] return(sendCondition) [18:03:21.287] ns <- getNamespace("parallel") [18:03:21.287] if (exists("sendData", mode = "function", [18:03:21.287] envir = ns)) { [18:03:21.287] parallel_sendData <- get("sendData", mode = "function", [18:03:21.287] envir = ns) [18:03:21.287] envir <- sys.frame(frame) [18:03:21.287] master <- NULL [18:03:21.287] while (!identical(envir, .GlobalEnv) && [18:03:21.287] !identical(envir, emptyenv())) { [18:03:21.287] if (exists("master", mode = "list", envir = envir, [18:03:21.287] inherits = FALSE)) { [18:03:21.287] master <- get("master", mode = "list", [18:03:21.287] envir = envir, inherits = FALSE) [18:03:21.287] if (inherits(master, c("SOCKnode", [18:03:21.287] "SOCK0node"))) { [18:03:21.287] sendCondition <<- function(cond) { [18:03:21.287] data <- list(type = "VALUE", value = cond, [18:03:21.287] success = TRUE) [18:03:21.287] parallel_sendData(master, data) [18:03:21.287] } [18:03:21.287] return(sendCondition) [18:03:21.287] } [18:03:21.287] } [18:03:21.287] frame <- frame + 1L [18:03:21.287] envir <- sys.frame(frame) [18:03:21.287] } [18:03:21.287] } [18:03:21.287] sendCondition <<- function(cond) NULL [18:03:21.287] } [18:03:21.287] }) [18:03:21.287] withCallingHandlers({ [18:03:21.287] { [18:03:21.287] sample(x, size = 1L) [18:03:21.287] } [18:03:21.287] }, immediateCondition = function(cond) { [18:03:21.287] sendCondition <- ...future.makeSendCondition() [18:03:21.287] sendCondition(cond) [18:03:21.287] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.287] { [18:03:21.287] inherits <- base::inherits [18:03:21.287] invokeRestart <- base::invokeRestart [18:03:21.287] is.null <- base::is.null [18:03:21.287] muffled <- FALSE [18:03:21.287] if (inherits(cond, "message")) { [18:03:21.287] muffled <- grepl(pattern, "muffleMessage") [18:03:21.287] if (muffled) [18:03:21.287] invokeRestart("muffleMessage") [18:03:21.287] } [18:03:21.287] else if (inherits(cond, "warning")) { [18:03:21.287] muffled <- grepl(pattern, "muffleWarning") [18:03:21.287] if (muffled) [18:03:21.287] invokeRestart("muffleWarning") [18:03:21.287] } [18:03:21.287] else if (inherits(cond, "condition")) { [18:03:21.287] if (!is.null(pattern)) { [18:03:21.287] computeRestarts <- base::computeRestarts [18:03:21.287] grepl <- base::grepl [18:03:21.287] restarts <- computeRestarts(cond) [18:03:21.287] for (restart in restarts) { [18:03:21.287] name <- restart$name [18:03:21.287] if (is.null(name)) [18:03:21.287] next [18:03:21.287] if (!grepl(pattern, name)) [18:03:21.287] next [18:03:21.287] invokeRestart(restart) [18:03:21.287] muffled <- TRUE [18:03:21.287] break [18:03:21.287] } [18:03:21.287] } [18:03:21.287] } [18:03:21.287] invisible(muffled) [18:03:21.287] } [18:03:21.287] muffleCondition(cond) [18:03:21.287] }) [18:03:21.287] })) [18:03:21.287] future::FutureResult(value = ...future.value$value, [18:03:21.287] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.287] ...future.rng), globalenv = if (FALSE) [18:03:21.287] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.287] ...future.globalenv.names)) [18:03:21.287] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.287] }, condition = base::local({ [18:03:21.287] c <- base::c [18:03:21.287] inherits <- base::inherits [18:03:21.287] invokeRestart <- base::invokeRestart [18:03:21.287] length <- base::length [18:03:21.287] list <- base::list [18:03:21.287] seq.int <- base::seq.int [18:03:21.287] signalCondition <- base::signalCondition [18:03:21.287] sys.calls <- base::sys.calls [18:03:21.287] `[[` <- base::`[[` [18:03:21.287] `+` <- base::`+` [18:03:21.287] `<<-` <- base::`<<-` [18:03:21.287] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.287] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.287] 3L)] [18:03:21.287] } [18:03:21.287] function(cond) { [18:03:21.287] is_error <- inherits(cond, "error") [18:03:21.287] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.287] NULL) [18:03:21.287] if (is_error) { [18:03:21.287] sessionInformation <- function() { [18:03:21.287] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.287] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.287] search = base::search(), system = base::Sys.info()) [18:03:21.287] } [18:03:21.287] ...future.conditions[[length(...future.conditions) + [18:03:21.287] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.287] cond$call), session = sessionInformation(), [18:03:21.287] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.287] signalCondition(cond) [18:03:21.287] } [18:03:21.287] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.287] "immediateCondition"))) { [18:03:21.287] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.287] ...future.conditions[[length(...future.conditions) + [18:03:21.287] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.287] if (TRUE && !signal) { [18:03:21.287] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.287] { [18:03:21.287] inherits <- base::inherits [18:03:21.287] invokeRestart <- base::invokeRestart [18:03:21.287] is.null <- base::is.null [18:03:21.287] muffled <- FALSE [18:03:21.287] if (inherits(cond, "message")) { [18:03:21.287] muffled <- grepl(pattern, "muffleMessage") [18:03:21.287] if (muffled) [18:03:21.287] invokeRestart("muffleMessage") [18:03:21.287] } [18:03:21.287] else if (inherits(cond, "warning")) { [18:03:21.287] muffled <- grepl(pattern, "muffleWarning") [18:03:21.287] if (muffled) [18:03:21.287] invokeRestart("muffleWarning") [18:03:21.287] } [18:03:21.287] else if (inherits(cond, "condition")) { [18:03:21.287] if (!is.null(pattern)) { [18:03:21.287] computeRestarts <- base::computeRestarts [18:03:21.287] grepl <- base::grepl [18:03:21.287] restarts <- computeRestarts(cond) [18:03:21.287] for (restart in restarts) { [18:03:21.287] name <- restart$name [18:03:21.287] if (is.null(name)) [18:03:21.287] next [18:03:21.287] if (!grepl(pattern, name)) [18:03:21.287] next [18:03:21.287] invokeRestart(restart) [18:03:21.287] muffled <- TRUE [18:03:21.287] break [18:03:21.287] } [18:03:21.287] } [18:03:21.287] } [18:03:21.287] invisible(muffled) [18:03:21.287] } [18:03:21.287] muffleCondition(cond, pattern = "^muffle") [18:03:21.287] } [18:03:21.287] } [18:03:21.287] else { [18:03:21.287] if (TRUE) { [18:03:21.287] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.287] { [18:03:21.287] inherits <- base::inherits [18:03:21.287] invokeRestart <- base::invokeRestart [18:03:21.287] is.null <- base::is.null [18:03:21.287] muffled <- FALSE [18:03:21.287] if (inherits(cond, "message")) { [18:03:21.287] muffled <- grepl(pattern, "muffleMessage") [18:03:21.287] if (muffled) [18:03:21.287] invokeRestart("muffleMessage") [18:03:21.287] } [18:03:21.287] else if (inherits(cond, "warning")) { [18:03:21.287] muffled <- grepl(pattern, "muffleWarning") [18:03:21.287] if (muffled) [18:03:21.287] invokeRestart("muffleWarning") [18:03:21.287] } [18:03:21.287] else if (inherits(cond, "condition")) { [18:03:21.287] if (!is.null(pattern)) { [18:03:21.287] computeRestarts <- base::computeRestarts [18:03:21.287] grepl <- base::grepl [18:03:21.287] restarts <- computeRestarts(cond) [18:03:21.287] for (restart in restarts) { [18:03:21.287] name <- restart$name [18:03:21.287] if (is.null(name)) [18:03:21.287] next [18:03:21.287] if (!grepl(pattern, name)) [18:03:21.287] next [18:03:21.287] invokeRestart(restart) [18:03:21.287] muffled <- TRUE [18:03:21.287] break [18:03:21.287] } [18:03:21.287] } [18:03:21.287] } [18:03:21.287] invisible(muffled) [18:03:21.287] } [18:03:21.287] muffleCondition(cond, pattern = "^muffle") [18:03:21.287] } [18:03:21.287] } [18:03:21.287] } [18:03:21.287] })) [18:03:21.287] }, error = function(ex) { [18:03:21.287] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.287] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.287] ...future.rng), started = ...future.startTime, [18:03:21.287] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.287] version = "1.8"), class = "FutureResult") [18:03:21.287] }, finally = { [18:03:21.287] if (!identical(...future.workdir, getwd())) [18:03:21.287] setwd(...future.workdir) [18:03:21.287] { [18:03:21.287] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.287] ...future.oldOptions$nwarnings <- NULL [18:03:21.287] } [18:03:21.287] base::options(...future.oldOptions) [18:03:21.287] if (.Platform$OS.type == "windows") { [18:03:21.287] old_names <- names(...future.oldEnvVars) [18:03:21.287] envs <- base::Sys.getenv() [18:03:21.287] names <- names(envs) [18:03:21.287] common <- intersect(names, old_names) [18:03:21.287] added <- setdiff(names, old_names) [18:03:21.287] removed <- setdiff(old_names, names) [18:03:21.287] changed <- common[...future.oldEnvVars[common] != [18:03:21.287] envs[common]] [18:03:21.287] NAMES <- toupper(changed) [18:03:21.287] args <- list() [18:03:21.287] for (kk in seq_along(NAMES)) { [18:03:21.287] name <- changed[[kk]] [18:03:21.287] NAME <- NAMES[[kk]] [18:03:21.287] if (name != NAME && is.element(NAME, old_names)) [18:03:21.287] next [18:03:21.287] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.287] } [18:03:21.287] NAMES <- toupper(added) [18:03:21.287] for (kk in seq_along(NAMES)) { [18:03:21.287] name <- added[[kk]] [18:03:21.287] NAME <- NAMES[[kk]] [18:03:21.287] if (name != NAME && is.element(NAME, old_names)) [18:03:21.287] next [18:03:21.287] args[[name]] <- "" [18:03:21.287] } [18:03:21.287] NAMES <- toupper(removed) [18:03:21.287] for (kk in seq_along(NAMES)) { [18:03:21.287] name <- removed[[kk]] [18:03:21.287] NAME <- NAMES[[kk]] [18:03:21.287] if (name != NAME && is.element(NAME, old_names)) [18:03:21.287] next [18:03:21.287] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.287] } [18:03:21.287] if (length(args) > 0) [18:03:21.287] base::do.call(base::Sys.setenv, args = args) [18:03:21.287] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.287] } [18:03:21.287] else { [18:03:21.287] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.287] } [18:03:21.287] { [18:03:21.287] if (base::length(...future.futureOptionsAdded) > [18:03:21.287] 0L) { [18:03:21.287] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.287] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.287] base::options(opts) [18:03:21.287] } [18:03:21.287] { [18:03:21.287] { [18:03:21.287] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.287] NULL [18:03:21.287] } [18:03:21.287] options(future.plan = NULL) [18:03:21.287] if (is.na(NA_character_)) [18:03:21.287] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.287] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.287] future::plan(list(function (..., workers = availableCores(), [18:03:21.287] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.287] envir = parent.frame()) [18:03:21.287] { [18:03:21.287] if (is.function(workers)) [18:03:21.287] workers <- workers() [18:03:21.287] workers <- structure(as.integer(workers), [18:03:21.287] class = class(workers)) [18:03:21.287] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.287] workers >= 1) [18:03:21.287] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.287] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.287] } [18:03:21.287] future <- MultisessionFuture(..., workers = workers, [18:03:21.287] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.287] envir = envir) [18:03:21.287] if (!future$lazy) [18:03:21.287] future <- run(future) [18:03:21.287] invisible(future) [18:03:21.287] }), .cleanup = FALSE, .init = FALSE) [18:03:21.287] } [18:03:21.287] } [18:03:21.287] } [18:03:21.287] }) [18:03:21.287] if (TRUE) { [18:03:21.287] base::sink(type = "output", split = FALSE) [18:03:21.287] if (TRUE) { [18:03:21.287] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.287] } [18:03:21.287] else { [18:03:21.287] ...future.result["stdout"] <- base::list(NULL) [18:03:21.287] } [18:03:21.287] base::close(...future.stdout) [18:03:21.287] ...future.stdout <- NULL [18:03:21.287] } [18:03:21.287] ...future.result$conditions <- ...future.conditions [18:03:21.287] ...future.result$finished <- base::Sys.time() [18:03:21.287] ...future.result [18:03:21.287] } [18:03:21.292] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.314] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.315] - Validating connection of MultisessionFuture [18:03:21.315] - received message: FutureResult [18:03:21.315] - Received FutureResult [18:03:21.315] - Erased future from FutureRegistry [18:03:21.315] result() for ClusterFuture ... [18:03:21.316] - result already collected: FutureResult [18:03:21.316] result() for ClusterFuture ... done [18:03:21.316] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.316] result() for ClusterFuture ... [18:03:21.316] - result already collected: FutureResult [18:03:21.316] result() for ClusterFuture ... done [18:03:21.317] result() for ClusterFuture ... [18:03:21.317] - result already collected: FutureResult [18:03:21.317] result() for ClusterFuture ... done [18:03:21.318] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:21.318] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:21.318] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:21.319] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:21.319] MultisessionFuture started [18:03:21.319] - Launch lazy future ... done [18:03:21.320] run() for 'MultisessionFuture' ... done [18:03:21.320] getGlobalsAndPackages() ... [18:03:21.320] Searching for globals... [18:03:21.321] - globals found: [3] '{', 'sample', 'x' [18:03:21.322] Searching for globals ... DONE [18:03:21.322] Resolving globals: FALSE [18:03:21.322] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.323] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.323] - globals: [1] 'x' [18:03:21.323] [18:03:21.323] getGlobalsAndPackages() ... DONE [18:03:21.324] run() for 'Future' ... [18:03:21.324] - state: 'created' [18:03:21.324] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.338] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.338] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.338] - Field: 'node' [18:03:21.338] - Field: 'label' [18:03:21.338] - Field: 'local' [18:03:21.339] - Field: 'owner' [18:03:21.339] - Field: 'envir' [18:03:21.339] - Field: 'workers' [18:03:21.339] - Field: 'packages' [18:03:21.339] - Field: 'gc' [18:03:21.339] - Field: 'conditions' [18:03:21.340] - Field: 'persistent' [18:03:21.340] - Field: 'expr' [18:03:21.340] - Field: 'uuid' [18:03:21.340] - Field: 'seed' [18:03:21.340] - Field: 'version' [18:03:21.340] - Field: 'result' [18:03:21.341] - Field: 'asynchronous' [18:03:21.341] - Field: 'calls' [18:03:21.341] - Field: 'globals' [18:03:21.341] - Field: 'stdout' [18:03:21.341] - Field: 'earlySignal' [18:03:21.342] - Field: 'lazy' [18:03:21.342] - Field: 'state' [18:03:21.342] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.342] - Launch lazy future ... [18:03:21.342] Packages needed by the future expression (n = 0): [18:03:21.343] Packages needed by future strategies (n = 0): [18:03:21.343] { [18:03:21.343] { [18:03:21.343] { [18:03:21.343] ...future.startTime <- base::Sys.time() [18:03:21.343] { [18:03:21.343] { [18:03:21.343] { [18:03:21.343] { [18:03:21.343] base::local({ [18:03:21.343] has_future <- base::requireNamespace("future", [18:03:21.343] quietly = TRUE) [18:03:21.343] if (has_future) { [18:03:21.343] ns <- base::getNamespace("future") [18:03:21.343] version <- ns[[".package"]][["version"]] [18:03:21.343] if (is.null(version)) [18:03:21.343] version <- utils::packageVersion("future") [18:03:21.343] } [18:03:21.343] else { [18:03:21.343] version <- NULL [18:03:21.343] } [18:03:21.343] if (!has_future || version < "1.8.0") { [18:03:21.343] info <- base::c(r_version = base::gsub("R version ", [18:03:21.343] "", base::R.version$version.string), [18:03:21.343] platform = base::sprintf("%s (%s-bit)", [18:03:21.343] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.343] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.343] "release", "version")], collapse = " "), [18:03:21.343] hostname = base::Sys.info()[["nodename"]]) [18:03:21.343] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.343] info) [18:03:21.343] info <- base::paste(info, collapse = "; ") [18:03:21.343] if (!has_future) { [18:03:21.343] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.343] info) [18:03:21.343] } [18:03:21.343] else { [18:03:21.343] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.343] info, version) [18:03:21.343] } [18:03:21.343] base::stop(msg) [18:03:21.343] } [18:03:21.343] }) [18:03:21.343] } [18:03:21.343] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.343] base::options(mc.cores = 1L) [18:03:21.343] } [18:03:21.343] options(future.plan = NULL) [18:03:21.343] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.343] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.343] } [18:03:21.343] ...future.workdir <- getwd() [18:03:21.343] } [18:03:21.343] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.343] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.343] } [18:03:21.343] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.343] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.343] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.343] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.343] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.343] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.343] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.343] base::names(...future.oldOptions)) [18:03:21.343] } [18:03:21.343] if (FALSE) { [18:03:21.343] } [18:03:21.343] else { [18:03:21.343] if (TRUE) { [18:03:21.343] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.343] open = "w") [18:03:21.343] } [18:03:21.343] else { [18:03:21.343] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.343] windows = "NUL", "/dev/null"), open = "w") [18:03:21.343] } [18:03:21.343] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.343] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.343] base::sink(type = "output", split = FALSE) [18:03:21.343] base::close(...future.stdout) [18:03:21.343] }, add = TRUE) [18:03:21.343] } [18:03:21.343] ...future.frame <- base::sys.nframe() [18:03:21.343] ...future.conditions <- base::list() [18:03:21.343] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.343] if (FALSE) { [18:03:21.343] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.343] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.343] } [18:03:21.343] ...future.result <- base::tryCatch({ [18:03:21.343] base::withCallingHandlers({ [18:03:21.343] ...future.value <- base::withVisible(base::local({ [18:03:21.343] ...future.makeSendCondition <- local({ [18:03:21.343] sendCondition <- NULL [18:03:21.343] function(frame = 1L) { [18:03:21.343] if (is.function(sendCondition)) [18:03:21.343] return(sendCondition) [18:03:21.343] ns <- getNamespace("parallel") [18:03:21.343] if (exists("sendData", mode = "function", [18:03:21.343] envir = ns)) { [18:03:21.343] parallel_sendData <- get("sendData", mode = "function", [18:03:21.343] envir = ns) [18:03:21.343] envir <- sys.frame(frame) [18:03:21.343] master <- NULL [18:03:21.343] while (!identical(envir, .GlobalEnv) && [18:03:21.343] !identical(envir, emptyenv())) { [18:03:21.343] if (exists("master", mode = "list", envir = envir, [18:03:21.343] inherits = FALSE)) { [18:03:21.343] master <- get("master", mode = "list", [18:03:21.343] envir = envir, inherits = FALSE) [18:03:21.343] if (inherits(master, c("SOCKnode", [18:03:21.343] "SOCK0node"))) { [18:03:21.343] sendCondition <<- function(cond) { [18:03:21.343] data <- list(type = "VALUE", value = cond, [18:03:21.343] success = TRUE) [18:03:21.343] parallel_sendData(master, data) [18:03:21.343] } [18:03:21.343] return(sendCondition) [18:03:21.343] } [18:03:21.343] } [18:03:21.343] frame <- frame + 1L [18:03:21.343] envir <- sys.frame(frame) [18:03:21.343] } [18:03:21.343] } [18:03:21.343] sendCondition <<- function(cond) NULL [18:03:21.343] } [18:03:21.343] }) [18:03:21.343] withCallingHandlers({ [18:03:21.343] { [18:03:21.343] sample(x, size = 1L) [18:03:21.343] } [18:03:21.343] }, immediateCondition = function(cond) { [18:03:21.343] sendCondition <- ...future.makeSendCondition() [18:03:21.343] sendCondition(cond) [18:03:21.343] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.343] { [18:03:21.343] inherits <- base::inherits [18:03:21.343] invokeRestart <- base::invokeRestart [18:03:21.343] is.null <- base::is.null [18:03:21.343] muffled <- FALSE [18:03:21.343] if (inherits(cond, "message")) { [18:03:21.343] muffled <- grepl(pattern, "muffleMessage") [18:03:21.343] if (muffled) [18:03:21.343] invokeRestart("muffleMessage") [18:03:21.343] } [18:03:21.343] else if (inherits(cond, "warning")) { [18:03:21.343] muffled <- grepl(pattern, "muffleWarning") [18:03:21.343] if (muffled) [18:03:21.343] invokeRestart("muffleWarning") [18:03:21.343] } [18:03:21.343] else if (inherits(cond, "condition")) { [18:03:21.343] if (!is.null(pattern)) { [18:03:21.343] computeRestarts <- base::computeRestarts [18:03:21.343] grepl <- base::grepl [18:03:21.343] restarts <- computeRestarts(cond) [18:03:21.343] for (restart in restarts) { [18:03:21.343] name <- restart$name [18:03:21.343] if (is.null(name)) [18:03:21.343] next [18:03:21.343] if (!grepl(pattern, name)) [18:03:21.343] next [18:03:21.343] invokeRestart(restart) [18:03:21.343] muffled <- TRUE [18:03:21.343] break [18:03:21.343] } [18:03:21.343] } [18:03:21.343] } [18:03:21.343] invisible(muffled) [18:03:21.343] } [18:03:21.343] muffleCondition(cond) [18:03:21.343] }) [18:03:21.343] })) [18:03:21.343] future::FutureResult(value = ...future.value$value, [18:03:21.343] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.343] ...future.rng), globalenv = if (FALSE) [18:03:21.343] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.343] ...future.globalenv.names)) [18:03:21.343] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.343] }, condition = base::local({ [18:03:21.343] c <- base::c [18:03:21.343] inherits <- base::inherits [18:03:21.343] invokeRestart <- base::invokeRestart [18:03:21.343] length <- base::length [18:03:21.343] list <- base::list [18:03:21.343] seq.int <- base::seq.int [18:03:21.343] signalCondition <- base::signalCondition [18:03:21.343] sys.calls <- base::sys.calls [18:03:21.343] `[[` <- base::`[[` [18:03:21.343] `+` <- base::`+` [18:03:21.343] `<<-` <- base::`<<-` [18:03:21.343] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.343] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.343] 3L)] [18:03:21.343] } [18:03:21.343] function(cond) { [18:03:21.343] is_error <- inherits(cond, "error") [18:03:21.343] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.343] NULL) [18:03:21.343] if (is_error) { [18:03:21.343] sessionInformation <- function() { [18:03:21.343] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.343] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.343] search = base::search(), system = base::Sys.info()) [18:03:21.343] } [18:03:21.343] ...future.conditions[[length(...future.conditions) + [18:03:21.343] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.343] cond$call), session = sessionInformation(), [18:03:21.343] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.343] signalCondition(cond) [18:03:21.343] } [18:03:21.343] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.343] "immediateCondition"))) { [18:03:21.343] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.343] ...future.conditions[[length(...future.conditions) + [18:03:21.343] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.343] if (TRUE && !signal) { [18:03:21.343] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.343] { [18:03:21.343] inherits <- base::inherits [18:03:21.343] invokeRestart <- base::invokeRestart [18:03:21.343] is.null <- base::is.null [18:03:21.343] muffled <- FALSE [18:03:21.343] if (inherits(cond, "message")) { [18:03:21.343] muffled <- grepl(pattern, "muffleMessage") [18:03:21.343] if (muffled) [18:03:21.343] invokeRestart("muffleMessage") [18:03:21.343] } [18:03:21.343] else if (inherits(cond, "warning")) { [18:03:21.343] muffled <- grepl(pattern, "muffleWarning") [18:03:21.343] if (muffled) [18:03:21.343] invokeRestart("muffleWarning") [18:03:21.343] } [18:03:21.343] else if (inherits(cond, "condition")) { [18:03:21.343] if (!is.null(pattern)) { [18:03:21.343] computeRestarts <- base::computeRestarts [18:03:21.343] grepl <- base::grepl [18:03:21.343] restarts <- computeRestarts(cond) [18:03:21.343] for (restart in restarts) { [18:03:21.343] name <- restart$name [18:03:21.343] if (is.null(name)) [18:03:21.343] next [18:03:21.343] if (!grepl(pattern, name)) [18:03:21.343] next [18:03:21.343] invokeRestart(restart) [18:03:21.343] muffled <- TRUE [18:03:21.343] break [18:03:21.343] } [18:03:21.343] } [18:03:21.343] } [18:03:21.343] invisible(muffled) [18:03:21.343] } [18:03:21.343] muffleCondition(cond, pattern = "^muffle") [18:03:21.343] } [18:03:21.343] } [18:03:21.343] else { [18:03:21.343] if (TRUE) { [18:03:21.343] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.343] { [18:03:21.343] inherits <- base::inherits [18:03:21.343] invokeRestart <- base::invokeRestart [18:03:21.343] is.null <- base::is.null [18:03:21.343] muffled <- FALSE [18:03:21.343] if (inherits(cond, "message")) { [18:03:21.343] muffled <- grepl(pattern, "muffleMessage") [18:03:21.343] if (muffled) [18:03:21.343] invokeRestart("muffleMessage") [18:03:21.343] } [18:03:21.343] else if (inherits(cond, "warning")) { [18:03:21.343] muffled <- grepl(pattern, "muffleWarning") [18:03:21.343] if (muffled) [18:03:21.343] invokeRestart("muffleWarning") [18:03:21.343] } [18:03:21.343] else if (inherits(cond, "condition")) { [18:03:21.343] if (!is.null(pattern)) { [18:03:21.343] computeRestarts <- base::computeRestarts [18:03:21.343] grepl <- base::grepl [18:03:21.343] restarts <- computeRestarts(cond) [18:03:21.343] for (restart in restarts) { [18:03:21.343] name <- restart$name [18:03:21.343] if (is.null(name)) [18:03:21.343] next [18:03:21.343] if (!grepl(pattern, name)) [18:03:21.343] next [18:03:21.343] invokeRestart(restart) [18:03:21.343] muffled <- TRUE [18:03:21.343] break [18:03:21.343] } [18:03:21.343] } [18:03:21.343] } [18:03:21.343] invisible(muffled) [18:03:21.343] } [18:03:21.343] muffleCondition(cond, pattern = "^muffle") [18:03:21.343] } [18:03:21.343] } [18:03:21.343] } [18:03:21.343] })) [18:03:21.343] }, error = function(ex) { [18:03:21.343] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.343] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.343] ...future.rng), started = ...future.startTime, [18:03:21.343] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.343] version = "1.8"), class = "FutureResult") [18:03:21.343] }, finally = { [18:03:21.343] if (!identical(...future.workdir, getwd())) [18:03:21.343] setwd(...future.workdir) [18:03:21.343] { [18:03:21.343] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.343] ...future.oldOptions$nwarnings <- NULL [18:03:21.343] } [18:03:21.343] base::options(...future.oldOptions) [18:03:21.343] if (.Platform$OS.type == "windows") { [18:03:21.343] old_names <- names(...future.oldEnvVars) [18:03:21.343] envs <- base::Sys.getenv() [18:03:21.343] names <- names(envs) [18:03:21.343] common <- intersect(names, old_names) [18:03:21.343] added <- setdiff(names, old_names) [18:03:21.343] removed <- setdiff(old_names, names) [18:03:21.343] changed <- common[...future.oldEnvVars[common] != [18:03:21.343] envs[common]] [18:03:21.343] NAMES <- toupper(changed) [18:03:21.343] args <- list() [18:03:21.343] for (kk in seq_along(NAMES)) { [18:03:21.343] name <- changed[[kk]] [18:03:21.343] NAME <- NAMES[[kk]] [18:03:21.343] if (name != NAME && is.element(NAME, old_names)) [18:03:21.343] next [18:03:21.343] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.343] } [18:03:21.343] NAMES <- toupper(added) [18:03:21.343] for (kk in seq_along(NAMES)) { [18:03:21.343] name <- added[[kk]] [18:03:21.343] NAME <- NAMES[[kk]] [18:03:21.343] if (name != NAME && is.element(NAME, old_names)) [18:03:21.343] next [18:03:21.343] args[[name]] <- "" [18:03:21.343] } [18:03:21.343] NAMES <- toupper(removed) [18:03:21.343] for (kk in seq_along(NAMES)) { [18:03:21.343] name <- removed[[kk]] [18:03:21.343] NAME <- NAMES[[kk]] [18:03:21.343] if (name != NAME && is.element(NAME, old_names)) [18:03:21.343] next [18:03:21.343] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.343] } [18:03:21.343] if (length(args) > 0) [18:03:21.343] base::do.call(base::Sys.setenv, args = args) [18:03:21.343] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.343] } [18:03:21.343] else { [18:03:21.343] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.343] } [18:03:21.343] { [18:03:21.343] if (base::length(...future.futureOptionsAdded) > [18:03:21.343] 0L) { [18:03:21.343] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.343] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.343] base::options(opts) [18:03:21.343] } [18:03:21.343] { [18:03:21.343] { [18:03:21.343] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.343] NULL [18:03:21.343] } [18:03:21.343] options(future.plan = NULL) [18:03:21.343] if (is.na(NA_character_)) [18:03:21.343] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.343] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.343] future::plan(list(function (..., workers = availableCores(), [18:03:21.343] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.343] envir = parent.frame()) [18:03:21.343] { [18:03:21.343] if (is.function(workers)) [18:03:21.343] workers <- workers() [18:03:21.343] workers <- structure(as.integer(workers), [18:03:21.343] class = class(workers)) [18:03:21.343] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.343] workers >= 1) [18:03:21.343] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.343] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.343] } [18:03:21.343] future <- MultisessionFuture(..., workers = workers, [18:03:21.343] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.343] envir = envir) [18:03:21.343] if (!future$lazy) [18:03:21.343] future <- run(future) [18:03:21.343] invisible(future) [18:03:21.343] }), .cleanup = FALSE, .init = FALSE) [18:03:21.343] } [18:03:21.343] } [18:03:21.343] } [18:03:21.343] }) [18:03:21.343] if (TRUE) { [18:03:21.343] base::sink(type = "output", split = FALSE) [18:03:21.343] if (TRUE) { [18:03:21.343] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.343] } [18:03:21.343] else { [18:03:21.343] ...future.result["stdout"] <- base::list(NULL) [18:03:21.343] } [18:03:21.343] base::close(...future.stdout) [18:03:21.343] ...future.stdout <- NULL [18:03:21.343] } [18:03:21.343] ...future.result$conditions <- ...future.conditions [18:03:21.343] ...future.result$finished <- base::Sys.time() [18:03:21.343] ...future.result [18:03:21.343] } [18:03:21.348] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.362] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.362] - Validating connection of MultisessionFuture [18:03:21.362] - received message: FutureResult [18:03:21.362] - Received FutureResult [18:03:21.362] - Erased future from FutureRegistry [18:03:21.363] result() for ClusterFuture ... [18:03:21.363] - result already collected: FutureResult [18:03:21.363] result() for ClusterFuture ... done [18:03:21.363] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.363] result() for ClusterFuture ... [18:03:21.363] - result already collected: FutureResult [18:03:21.364] result() for ClusterFuture ... done [18:03:21.364] result() for ClusterFuture ... [18:03:21.364] - result already collected: FutureResult [18:03:21.364] result() for ClusterFuture ... done [18:03:21.365] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:21.365] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:21.366] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:21.366] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:21.367] MultisessionFuture started [18:03:21.367] - Launch lazy future ... done [18:03:21.367] run() for 'MultisessionFuture' ... done [18:03:21.368] getGlobalsAndPackages() ... [18:03:21.368] Searching for globals... [18:03:21.369] - globals found: [3] '{', 'sample', 'x' [18:03:21.369] Searching for globals ... DONE [18:03:21.369] Resolving globals: FALSE [18:03:21.370] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.370] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.370] - globals: [1] 'x' [18:03:21.371] [18:03:21.371] getGlobalsAndPackages() ... DONE [18:03:21.371] run() for 'Future' ... [18:03:21.371] - state: 'created' [18:03:21.372] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.385] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.385] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.385] - Field: 'node' [18:03:21.385] - Field: 'label' [18:03:21.386] - Field: 'local' [18:03:21.386] - Field: 'owner' [18:03:21.386] - Field: 'envir' [18:03:21.386] - Field: 'workers' [18:03:21.386] - Field: 'packages' [18:03:21.387] - Field: 'gc' [18:03:21.387] - Field: 'conditions' [18:03:21.387] - Field: 'persistent' [18:03:21.387] - Field: 'expr' [18:03:21.387] - Field: 'uuid' [18:03:21.387] - Field: 'seed' [18:03:21.388] - Field: 'version' [18:03:21.388] - Field: 'result' [18:03:21.388] - Field: 'asynchronous' [18:03:21.388] - Field: 'calls' [18:03:21.388] - Field: 'globals' [18:03:21.388] - Field: 'stdout' [18:03:21.389] - Field: 'earlySignal' [18:03:21.389] - Field: 'lazy' [18:03:21.389] - Field: 'state' [18:03:21.389] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.389] - Launch lazy future ... [18:03:21.390] Packages needed by the future expression (n = 0): [18:03:21.390] Packages needed by future strategies (n = 0): [18:03:21.390] { [18:03:21.390] { [18:03:21.390] { [18:03:21.390] ...future.startTime <- base::Sys.time() [18:03:21.390] { [18:03:21.390] { [18:03:21.390] { [18:03:21.390] { [18:03:21.390] base::local({ [18:03:21.390] has_future <- base::requireNamespace("future", [18:03:21.390] quietly = TRUE) [18:03:21.390] if (has_future) { [18:03:21.390] ns <- base::getNamespace("future") [18:03:21.390] version <- ns[[".package"]][["version"]] [18:03:21.390] if (is.null(version)) [18:03:21.390] version <- utils::packageVersion("future") [18:03:21.390] } [18:03:21.390] else { [18:03:21.390] version <- NULL [18:03:21.390] } [18:03:21.390] if (!has_future || version < "1.8.0") { [18:03:21.390] info <- base::c(r_version = base::gsub("R version ", [18:03:21.390] "", base::R.version$version.string), [18:03:21.390] platform = base::sprintf("%s (%s-bit)", [18:03:21.390] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.390] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.390] "release", "version")], collapse = " "), [18:03:21.390] hostname = base::Sys.info()[["nodename"]]) [18:03:21.390] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.390] info) [18:03:21.390] info <- base::paste(info, collapse = "; ") [18:03:21.390] if (!has_future) { [18:03:21.390] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.390] info) [18:03:21.390] } [18:03:21.390] else { [18:03:21.390] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.390] info, version) [18:03:21.390] } [18:03:21.390] base::stop(msg) [18:03:21.390] } [18:03:21.390] }) [18:03:21.390] } [18:03:21.390] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.390] base::options(mc.cores = 1L) [18:03:21.390] } [18:03:21.390] options(future.plan = NULL) [18:03:21.390] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.390] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.390] } [18:03:21.390] ...future.workdir <- getwd() [18:03:21.390] } [18:03:21.390] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.390] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.390] } [18:03:21.390] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.390] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.390] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.390] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.390] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.390] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.390] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.390] base::names(...future.oldOptions)) [18:03:21.390] } [18:03:21.390] if (FALSE) { [18:03:21.390] } [18:03:21.390] else { [18:03:21.390] if (TRUE) { [18:03:21.390] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.390] open = "w") [18:03:21.390] } [18:03:21.390] else { [18:03:21.390] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.390] windows = "NUL", "/dev/null"), open = "w") [18:03:21.390] } [18:03:21.390] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.390] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.390] base::sink(type = "output", split = FALSE) [18:03:21.390] base::close(...future.stdout) [18:03:21.390] }, add = TRUE) [18:03:21.390] } [18:03:21.390] ...future.frame <- base::sys.nframe() [18:03:21.390] ...future.conditions <- base::list() [18:03:21.390] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.390] if (FALSE) { [18:03:21.390] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.390] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.390] } [18:03:21.390] ...future.result <- base::tryCatch({ [18:03:21.390] base::withCallingHandlers({ [18:03:21.390] ...future.value <- base::withVisible(base::local({ [18:03:21.390] ...future.makeSendCondition <- local({ [18:03:21.390] sendCondition <- NULL [18:03:21.390] function(frame = 1L) { [18:03:21.390] if (is.function(sendCondition)) [18:03:21.390] return(sendCondition) [18:03:21.390] ns <- getNamespace("parallel") [18:03:21.390] if (exists("sendData", mode = "function", [18:03:21.390] envir = ns)) { [18:03:21.390] parallel_sendData <- get("sendData", mode = "function", [18:03:21.390] envir = ns) [18:03:21.390] envir <- sys.frame(frame) [18:03:21.390] master <- NULL [18:03:21.390] while (!identical(envir, .GlobalEnv) && [18:03:21.390] !identical(envir, emptyenv())) { [18:03:21.390] if (exists("master", mode = "list", envir = envir, [18:03:21.390] inherits = FALSE)) { [18:03:21.390] master <- get("master", mode = "list", [18:03:21.390] envir = envir, inherits = FALSE) [18:03:21.390] if (inherits(master, c("SOCKnode", [18:03:21.390] "SOCK0node"))) { [18:03:21.390] sendCondition <<- function(cond) { [18:03:21.390] data <- list(type = "VALUE", value = cond, [18:03:21.390] success = TRUE) [18:03:21.390] parallel_sendData(master, data) [18:03:21.390] } [18:03:21.390] return(sendCondition) [18:03:21.390] } [18:03:21.390] } [18:03:21.390] frame <- frame + 1L [18:03:21.390] envir <- sys.frame(frame) [18:03:21.390] } [18:03:21.390] } [18:03:21.390] sendCondition <<- function(cond) NULL [18:03:21.390] } [18:03:21.390] }) [18:03:21.390] withCallingHandlers({ [18:03:21.390] { [18:03:21.390] sample(x, size = 1L) [18:03:21.390] } [18:03:21.390] }, immediateCondition = function(cond) { [18:03:21.390] sendCondition <- ...future.makeSendCondition() [18:03:21.390] sendCondition(cond) [18:03:21.390] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.390] { [18:03:21.390] inherits <- base::inherits [18:03:21.390] invokeRestart <- base::invokeRestart [18:03:21.390] is.null <- base::is.null [18:03:21.390] muffled <- FALSE [18:03:21.390] if (inherits(cond, "message")) { [18:03:21.390] muffled <- grepl(pattern, "muffleMessage") [18:03:21.390] if (muffled) [18:03:21.390] invokeRestart("muffleMessage") [18:03:21.390] } [18:03:21.390] else if (inherits(cond, "warning")) { [18:03:21.390] muffled <- grepl(pattern, "muffleWarning") [18:03:21.390] if (muffled) [18:03:21.390] invokeRestart("muffleWarning") [18:03:21.390] } [18:03:21.390] else if (inherits(cond, "condition")) { [18:03:21.390] if (!is.null(pattern)) { [18:03:21.390] computeRestarts <- base::computeRestarts [18:03:21.390] grepl <- base::grepl [18:03:21.390] restarts <- computeRestarts(cond) [18:03:21.390] for (restart in restarts) { [18:03:21.390] name <- restart$name [18:03:21.390] if (is.null(name)) [18:03:21.390] next [18:03:21.390] if (!grepl(pattern, name)) [18:03:21.390] next [18:03:21.390] invokeRestart(restart) [18:03:21.390] muffled <- TRUE [18:03:21.390] break [18:03:21.390] } [18:03:21.390] } [18:03:21.390] } [18:03:21.390] invisible(muffled) [18:03:21.390] } [18:03:21.390] muffleCondition(cond) [18:03:21.390] }) [18:03:21.390] })) [18:03:21.390] future::FutureResult(value = ...future.value$value, [18:03:21.390] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.390] ...future.rng), globalenv = if (FALSE) [18:03:21.390] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.390] ...future.globalenv.names)) [18:03:21.390] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.390] }, condition = base::local({ [18:03:21.390] c <- base::c [18:03:21.390] inherits <- base::inherits [18:03:21.390] invokeRestart <- base::invokeRestart [18:03:21.390] length <- base::length [18:03:21.390] list <- base::list [18:03:21.390] seq.int <- base::seq.int [18:03:21.390] signalCondition <- base::signalCondition [18:03:21.390] sys.calls <- base::sys.calls [18:03:21.390] `[[` <- base::`[[` [18:03:21.390] `+` <- base::`+` [18:03:21.390] `<<-` <- base::`<<-` [18:03:21.390] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.390] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.390] 3L)] [18:03:21.390] } [18:03:21.390] function(cond) { [18:03:21.390] is_error <- inherits(cond, "error") [18:03:21.390] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.390] NULL) [18:03:21.390] if (is_error) { [18:03:21.390] sessionInformation <- function() { [18:03:21.390] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.390] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.390] search = base::search(), system = base::Sys.info()) [18:03:21.390] } [18:03:21.390] ...future.conditions[[length(...future.conditions) + [18:03:21.390] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.390] cond$call), session = sessionInformation(), [18:03:21.390] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.390] signalCondition(cond) [18:03:21.390] } [18:03:21.390] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.390] "immediateCondition"))) { [18:03:21.390] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.390] ...future.conditions[[length(...future.conditions) + [18:03:21.390] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.390] if (TRUE && !signal) { [18:03:21.390] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.390] { [18:03:21.390] inherits <- base::inherits [18:03:21.390] invokeRestart <- base::invokeRestart [18:03:21.390] is.null <- base::is.null [18:03:21.390] muffled <- FALSE [18:03:21.390] if (inherits(cond, "message")) { [18:03:21.390] muffled <- grepl(pattern, "muffleMessage") [18:03:21.390] if (muffled) [18:03:21.390] invokeRestart("muffleMessage") [18:03:21.390] } [18:03:21.390] else if (inherits(cond, "warning")) { [18:03:21.390] muffled <- grepl(pattern, "muffleWarning") [18:03:21.390] if (muffled) [18:03:21.390] invokeRestart("muffleWarning") [18:03:21.390] } [18:03:21.390] else if (inherits(cond, "condition")) { [18:03:21.390] if (!is.null(pattern)) { [18:03:21.390] computeRestarts <- base::computeRestarts [18:03:21.390] grepl <- base::grepl [18:03:21.390] restarts <- computeRestarts(cond) [18:03:21.390] for (restart in restarts) { [18:03:21.390] name <- restart$name [18:03:21.390] if (is.null(name)) [18:03:21.390] next [18:03:21.390] if (!grepl(pattern, name)) [18:03:21.390] next [18:03:21.390] invokeRestart(restart) [18:03:21.390] muffled <- TRUE [18:03:21.390] break [18:03:21.390] } [18:03:21.390] } [18:03:21.390] } [18:03:21.390] invisible(muffled) [18:03:21.390] } [18:03:21.390] muffleCondition(cond, pattern = "^muffle") [18:03:21.390] } [18:03:21.390] } [18:03:21.390] else { [18:03:21.390] if (TRUE) { [18:03:21.390] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.390] { [18:03:21.390] inherits <- base::inherits [18:03:21.390] invokeRestart <- base::invokeRestart [18:03:21.390] is.null <- base::is.null [18:03:21.390] muffled <- FALSE [18:03:21.390] if (inherits(cond, "message")) { [18:03:21.390] muffled <- grepl(pattern, "muffleMessage") [18:03:21.390] if (muffled) [18:03:21.390] invokeRestart("muffleMessage") [18:03:21.390] } [18:03:21.390] else if (inherits(cond, "warning")) { [18:03:21.390] muffled <- grepl(pattern, "muffleWarning") [18:03:21.390] if (muffled) [18:03:21.390] invokeRestart("muffleWarning") [18:03:21.390] } [18:03:21.390] else if (inherits(cond, "condition")) { [18:03:21.390] if (!is.null(pattern)) { [18:03:21.390] computeRestarts <- base::computeRestarts [18:03:21.390] grepl <- base::grepl [18:03:21.390] restarts <- computeRestarts(cond) [18:03:21.390] for (restart in restarts) { [18:03:21.390] name <- restart$name [18:03:21.390] if (is.null(name)) [18:03:21.390] next [18:03:21.390] if (!grepl(pattern, name)) [18:03:21.390] next [18:03:21.390] invokeRestart(restart) [18:03:21.390] muffled <- TRUE [18:03:21.390] break [18:03:21.390] } [18:03:21.390] } [18:03:21.390] } [18:03:21.390] invisible(muffled) [18:03:21.390] } [18:03:21.390] muffleCondition(cond, pattern = "^muffle") [18:03:21.390] } [18:03:21.390] } [18:03:21.390] } [18:03:21.390] })) [18:03:21.390] }, error = function(ex) { [18:03:21.390] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.390] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.390] ...future.rng), started = ...future.startTime, [18:03:21.390] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.390] version = "1.8"), class = "FutureResult") [18:03:21.390] }, finally = { [18:03:21.390] if (!identical(...future.workdir, getwd())) [18:03:21.390] setwd(...future.workdir) [18:03:21.390] { [18:03:21.390] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.390] ...future.oldOptions$nwarnings <- NULL [18:03:21.390] } [18:03:21.390] base::options(...future.oldOptions) [18:03:21.390] if (.Platform$OS.type == "windows") { [18:03:21.390] old_names <- names(...future.oldEnvVars) [18:03:21.390] envs <- base::Sys.getenv() [18:03:21.390] names <- names(envs) [18:03:21.390] common <- intersect(names, old_names) [18:03:21.390] added <- setdiff(names, old_names) [18:03:21.390] removed <- setdiff(old_names, names) [18:03:21.390] changed <- common[...future.oldEnvVars[common] != [18:03:21.390] envs[common]] [18:03:21.390] NAMES <- toupper(changed) [18:03:21.390] args <- list() [18:03:21.390] for (kk in seq_along(NAMES)) { [18:03:21.390] name <- changed[[kk]] [18:03:21.390] NAME <- NAMES[[kk]] [18:03:21.390] if (name != NAME && is.element(NAME, old_names)) [18:03:21.390] next [18:03:21.390] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.390] } [18:03:21.390] NAMES <- toupper(added) [18:03:21.390] for (kk in seq_along(NAMES)) { [18:03:21.390] name <- added[[kk]] [18:03:21.390] NAME <- NAMES[[kk]] [18:03:21.390] if (name != NAME && is.element(NAME, old_names)) [18:03:21.390] next [18:03:21.390] args[[name]] <- "" [18:03:21.390] } [18:03:21.390] NAMES <- toupper(removed) [18:03:21.390] for (kk in seq_along(NAMES)) { [18:03:21.390] name <- removed[[kk]] [18:03:21.390] NAME <- NAMES[[kk]] [18:03:21.390] if (name != NAME && is.element(NAME, old_names)) [18:03:21.390] next [18:03:21.390] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.390] } [18:03:21.390] if (length(args) > 0) [18:03:21.390] base::do.call(base::Sys.setenv, args = args) [18:03:21.390] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.390] } [18:03:21.390] else { [18:03:21.390] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.390] } [18:03:21.390] { [18:03:21.390] if (base::length(...future.futureOptionsAdded) > [18:03:21.390] 0L) { [18:03:21.390] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.390] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.390] base::options(opts) [18:03:21.390] } [18:03:21.390] { [18:03:21.390] { [18:03:21.390] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.390] NULL [18:03:21.390] } [18:03:21.390] options(future.plan = NULL) [18:03:21.390] if (is.na(NA_character_)) [18:03:21.390] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.390] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.390] future::plan(list(function (..., workers = availableCores(), [18:03:21.390] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.390] envir = parent.frame()) [18:03:21.390] { [18:03:21.390] if (is.function(workers)) [18:03:21.390] workers <- workers() [18:03:21.390] workers <- structure(as.integer(workers), [18:03:21.390] class = class(workers)) [18:03:21.390] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.390] workers >= 1) [18:03:21.390] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.390] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.390] } [18:03:21.390] future <- MultisessionFuture(..., workers = workers, [18:03:21.390] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.390] envir = envir) [18:03:21.390] if (!future$lazy) [18:03:21.390] future <- run(future) [18:03:21.390] invisible(future) [18:03:21.390] }), .cleanup = FALSE, .init = FALSE) [18:03:21.390] } [18:03:21.390] } [18:03:21.390] } [18:03:21.390] }) [18:03:21.390] if (TRUE) { [18:03:21.390] base::sink(type = "output", split = FALSE) [18:03:21.390] if (TRUE) { [18:03:21.390] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.390] } [18:03:21.390] else { [18:03:21.390] ...future.result["stdout"] <- base::list(NULL) [18:03:21.390] } [18:03:21.390] base::close(...future.stdout) [18:03:21.390] ...future.stdout <- NULL [18:03:21.390] } [18:03:21.390] ...future.result$conditions <- ...future.conditions [18:03:21.390] ...future.result$finished <- base::Sys.time() [18:03:21.390] ...future.result [18:03:21.390] } [18:03:21.395] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.408] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.408] - Validating connection of MultisessionFuture [18:03:21.409] - received message: FutureResult [18:03:21.409] - Received FutureResult [18:03:21.409] - Erased future from FutureRegistry [18:03:21.409] result() for ClusterFuture ... [18:03:21.409] - result already collected: FutureResult [18:03:21.409] result() for ClusterFuture ... done [18:03:21.410] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.410] result() for ClusterFuture ... [18:03:21.410] - result already collected: FutureResult [18:03:21.410] result() for ClusterFuture ... done [18:03:21.410] result() for ClusterFuture ... [18:03:21.410] - result already collected: FutureResult [18:03:21.411] result() for ClusterFuture ... done [18:03:21.411] Exporting 1 global objects (64 bytes) to cluster node #1 ... [18:03:21.412] Exporting 'x' (64 bytes) to cluster node #1 ... [18:03:21.412] Exporting 'x' (64 bytes) to cluster node #1 ... DONE [18:03:21.412] Exporting 1 global objects (64 bytes) to cluster node #1 ... DONE [18:03:21.413] MultisessionFuture started [18:03:21.413] - Launch lazy future ... done [18:03:21.413] run() for 'MultisessionFuture' ... done [18:03:21.414] getGlobalsAndPackages() ... [18:03:21.414] Searching for globals... [18:03:21.415] - globals found: [3] '{', 'sample', 'x' [18:03:21.415] Searching for globals ... DONE [18:03:21.415] Resolving globals: FALSE [18:03:21.416] The total size of the 1 globals is 64 bytes (64 bytes) [18:03:21.416] The total size of the 1 globals exported for future expression ('{; sample(x, size = 1L); }') is 64 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (64 bytes of class 'numeric') [18:03:21.417] - globals: [1] 'x' [18:03:21.417] [18:03:21.417] getGlobalsAndPackages() ... DONE [18:03:21.417] run() for 'Future' ... [18:03:21.417] - state: 'created' [18:03:21.418] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:03:21.431] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:03:21.432] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:03:21.432] - Field: 'node' [18:03:21.432] - Field: 'label' [18:03:21.432] - Field: 'local' [18:03:21.432] - Field: 'owner' [18:03:21.432] - Field: 'envir' [18:03:21.433] - Field: 'workers' [18:03:21.433] - Field: 'packages' [18:03:21.433] - Field: 'gc' [18:03:21.433] - Field: 'conditions' [18:03:21.433] - Field: 'persistent' [18:03:21.434] - Field: 'expr' [18:03:21.434] - Field: 'uuid' [18:03:21.434] - Field: 'seed' [18:03:21.434] - Field: 'version' [18:03:21.434] - Field: 'result' [18:03:21.434] - Field: 'asynchronous' [18:03:21.435] - Field: 'calls' [18:03:21.435] - Field: 'globals' [18:03:21.435] - Field: 'stdout' [18:03:21.435] - Field: 'earlySignal' [18:03:21.435] - Field: 'lazy' [18:03:21.435] - Field: 'state' [18:03:21.436] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:03:21.436] - Launch lazy future ... [18:03:21.436] Packages needed by the future expression (n = 0): [18:03:21.436] Packages needed by future strategies (n = 0): [18:03:21.437] { [18:03:21.437] { [18:03:21.437] { [18:03:21.437] ...future.startTime <- base::Sys.time() [18:03:21.437] { [18:03:21.437] { [18:03:21.437] { [18:03:21.437] { [18:03:21.437] base::local({ [18:03:21.437] has_future <- base::requireNamespace("future", [18:03:21.437] quietly = TRUE) [18:03:21.437] if (has_future) { [18:03:21.437] ns <- base::getNamespace("future") [18:03:21.437] version <- ns[[".package"]][["version"]] [18:03:21.437] if (is.null(version)) [18:03:21.437] version <- utils::packageVersion("future") [18:03:21.437] } [18:03:21.437] else { [18:03:21.437] version <- NULL [18:03:21.437] } [18:03:21.437] if (!has_future || version < "1.8.0") { [18:03:21.437] info <- base::c(r_version = base::gsub("R version ", [18:03:21.437] "", base::R.version$version.string), [18:03:21.437] platform = base::sprintf("%s (%s-bit)", [18:03:21.437] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:03:21.437] os = base::paste(base::Sys.info()[base::c("sysname", [18:03:21.437] "release", "version")], collapse = " "), [18:03:21.437] hostname = base::Sys.info()[["nodename"]]) [18:03:21.437] info <- base::sprintf("%s: %s", base::names(info), [18:03:21.437] info) [18:03:21.437] info <- base::paste(info, collapse = "; ") [18:03:21.437] if (!has_future) { [18:03:21.437] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:03:21.437] info) [18:03:21.437] } [18:03:21.437] else { [18:03:21.437] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:03:21.437] info, version) [18:03:21.437] } [18:03:21.437] base::stop(msg) [18:03:21.437] } [18:03:21.437] }) [18:03:21.437] } [18:03:21.437] ...future.mc.cores.old <- base::getOption("mc.cores") [18:03:21.437] base::options(mc.cores = 1L) [18:03:21.437] } [18:03:21.437] options(future.plan = NULL) [18:03:21.437] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.437] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:03:21.437] } [18:03:21.437] ...future.workdir <- getwd() [18:03:21.437] } [18:03:21.437] ...future.oldOptions <- base::as.list(base::.Options) [18:03:21.437] ...future.oldEnvVars <- base::Sys.getenv() [18:03:21.437] } [18:03:21.437] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:03:21.437] future.globals.maxSize = NULL, future.globals.method = NULL, [18:03:21.437] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:03:21.437] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:03:21.437] future.rng.onMisuse = "error", future.rng.onMisuse.keepFuture = NULL, [18:03:21.437] future.stdout.windows.reencode = NULL, width = 80L) [18:03:21.437] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:03:21.437] base::names(...future.oldOptions)) [18:03:21.437] } [18:03:21.437] if (FALSE) { [18:03:21.437] } [18:03:21.437] else { [18:03:21.437] if (TRUE) { [18:03:21.437] ...future.stdout <- base::rawConnection(base::raw(0L), [18:03:21.437] open = "w") [18:03:21.437] } [18:03:21.437] else { [18:03:21.437] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:03:21.437] windows = "NUL", "/dev/null"), open = "w") [18:03:21.437] } [18:03:21.437] base::sink(...future.stdout, type = "output", split = FALSE) [18:03:21.437] base::on.exit(if (!base::is.null(...future.stdout)) { [18:03:21.437] base::sink(type = "output", split = FALSE) [18:03:21.437] base::close(...future.stdout) [18:03:21.437] }, add = TRUE) [18:03:21.437] } [18:03:21.437] ...future.frame <- base::sys.nframe() [18:03:21.437] ...future.conditions <- base::list() [18:03:21.437] ...future.rng <- base::globalenv()$.Random.seed [18:03:21.437] if (FALSE) { [18:03:21.437] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:03:21.437] "...future.value", "...future.globalenv.names", ".Random.seed") [18:03:21.437] } [18:03:21.437] ...future.result <- base::tryCatch({ [18:03:21.437] base::withCallingHandlers({ [18:03:21.437] ...future.value <- base::withVisible(base::local({ [18:03:21.437] ...future.makeSendCondition <- local({ [18:03:21.437] sendCondition <- NULL [18:03:21.437] function(frame = 1L) { [18:03:21.437] if (is.function(sendCondition)) [18:03:21.437] return(sendCondition) [18:03:21.437] ns <- getNamespace("parallel") [18:03:21.437] if (exists("sendData", mode = "function", [18:03:21.437] envir = ns)) { [18:03:21.437] parallel_sendData <- get("sendData", mode = "function", [18:03:21.437] envir = ns) [18:03:21.437] envir <- sys.frame(frame) [18:03:21.437] master <- NULL [18:03:21.437] while (!identical(envir, .GlobalEnv) && [18:03:21.437] !identical(envir, emptyenv())) { [18:03:21.437] if (exists("master", mode = "list", envir = envir, [18:03:21.437] inherits = FALSE)) { [18:03:21.437] master <- get("master", mode = "list", [18:03:21.437] envir = envir, inherits = FALSE) [18:03:21.437] if (inherits(master, c("SOCKnode", [18:03:21.437] "SOCK0node"))) { [18:03:21.437] sendCondition <<- function(cond) { [18:03:21.437] data <- list(type = "VALUE", value = cond, [18:03:21.437] success = TRUE) [18:03:21.437] parallel_sendData(master, data) [18:03:21.437] } [18:03:21.437] return(sendCondition) [18:03:21.437] } [18:03:21.437] } [18:03:21.437] frame <- frame + 1L [18:03:21.437] envir <- sys.frame(frame) [18:03:21.437] } [18:03:21.437] } [18:03:21.437] sendCondition <<- function(cond) NULL [18:03:21.437] } [18:03:21.437] }) [18:03:21.437] withCallingHandlers({ [18:03:21.437] { [18:03:21.437] sample(x, size = 1L) [18:03:21.437] } [18:03:21.437] }, immediateCondition = function(cond) { [18:03:21.437] sendCondition <- ...future.makeSendCondition() [18:03:21.437] sendCondition(cond) [18:03:21.437] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.437] { [18:03:21.437] inherits <- base::inherits [18:03:21.437] invokeRestart <- base::invokeRestart [18:03:21.437] is.null <- base::is.null [18:03:21.437] muffled <- FALSE [18:03:21.437] if (inherits(cond, "message")) { [18:03:21.437] muffled <- grepl(pattern, "muffleMessage") [18:03:21.437] if (muffled) [18:03:21.437] invokeRestart("muffleMessage") [18:03:21.437] } [18:03:21.437] else if (inherits(cond, "warning")) { [18:03:21.437] muffled <- grepl(pattern, "muffleWarning") [18:03:21.437] if (muffled) [18:03:21.437] invokeRestart("muffleWarning") [18:03:21.437] } [18:03:21.437] else if (inherits(cond, "condition")) { [18:03:21.437] if (!is.null(pattern)) { [18:03:21.437] computeRestarts <- base::computeRestarts [18:03:21.437] grepl <- base::grepl [18:03:21.437] restarts <- computeRestarts(cond) [18:03:21.437] for (restart in restarts) { [18:03:21.437] name <- restart$name [18:03:21.437] if (is.null(name)) [18:03:21.437] next [18:03:21.437] if (!grepl(pattern, name)) [18:03:21.437] next [18:03:21.437] invokeRestart(restart) [18:03:21.437] muffled <- TRUE [18:03:21.437] break [18:03:21.437] } [18:03:21.437] } [18:03:21.437] } [18:03:21.437] invisible(muffled) [18:03:21.437] } [18:03:21.437] muffleCondition(cond) [18:03:21.437] }) [18:03:21.437] })) [18:03:21.437] future::FutureResult(value = ...future.value$value, [18:03:21.437] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.437] ...future.rng), globalenv = if (FALSE) [18:03:21.437] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:03:21.437] ...future.globalenv.names)) [18:03:21.437] else NULL, started = ...future.startTime, version = "1.8") [18:03:21.437] }, condition = base::local({ [18:03:21.437] c <- base::c [18:03:21.437] inherits <- base::inherits [18:03:21.437] invokeRestart <- base::invokeRestart [18:03:21.437] length <- base::length [18:03:21.437] list <- base::list [18:03:21.437] seq.int <- base::seq.int [18:03:21.437] signalCondition <- base::signalCondition [18:03:21.437] sys.calls <- base::sys.calls [18:03:21.437] `[[` <- base::`[[` [18:03:21.437] `+` <- base::`+` [18:03:21.437] `<<-` <- base::`<<-` [18:03:21.437] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:03:21.437] calls[seq.int(from = from + 12L, to = length(calls) - [18:03:21.437] 3L)] [18:03:21.437] } [18:03:21.437] function(cond) { [18:03:21.437] is_error <- inherits(cond, "error") [18:03:21.437] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:03:21.437] NULL) [18:03:21.437] if (is_error) { [18:03:21.437] sessionInformation <- function() { [18:03:21.437] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:03:21.437] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:03:21.437] search = base::search(), system = base::Sys.info()) [18:03:21.437] } [18:03:21.437] ...future.conditions[[length(...future.conditions) + [18:03:21.437] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:03:21.437] cond$call), session = sessionInformation(), [18:03:21.437] timestamp = base::Sys.time(), signaled = 0L) [18:03:21.437] signalCondition(cond) [18:03:21.437] } [18:03:21.437] else if (!ignore && TRUE && inherits(cond, c("condition", [18:03:21.437] "immediateCondition"))) { [18:03:21.437] signal <- TRUE && inherits(cond, "immediateCondition") [18:03:21.437] ...future.conditions[[length(...future.conditions) + [18:03:21.437] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:03:21.437] if (TRUE && !signal) { [18:03:21.437] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.437] { [18:03:21.437] inherits <- base::inherits [18:03:21.437] invokeRestart <- base::invokeRestart [18:03:21.437] is.null <- base::is.null [18:03:21.437] muffled <- FALSE [18:03:21.437] if (inherits(cond, "message")) { [18:03:21.437] muffled <- grepl(pattern, "muffleMessage") [18:03:21.437] if (muffled) [18:03:21.437] invokeRestart("muffleMessage") [18:03:21.437] } [18:03:21.437] else if (inherits(cond, "warning")) { [18:03:21.437] muffled <- grepl(pattern, "muffleWarning") [18:03:21.437] if (muffled) [18:03:21.437] invokeRestart("muffleWarning") [18:03:21.437] } [18:03:21.437] else if (inherits(cond, "condition")) { [18:03:21.437] if (!is.null(pattern)) { [18:03:21.437] computeRestarts <- base::computeRestarts [18:03:21.437] grepl <- base::grepl [18:03:21.437] restarts <- computeRestarts(cond) [18:03:21.437] for (restart in restarts) { [18:03:21.437] name <- restart$name [18:03:21.437] if (is.null(name)) [18:03:21.437] next [18:03:21.437] if (!grepl(pattern, name)) [18:03:21.437] next [18:03:21.437] invokeRestart(restart) [18:03:21.437] muffled <- TRUE [18:03:21.437] break [18:03:21.437] } [18:03:21.437] } [18:03:21.437] } [18:03:21.437] invisible(muffled) [18:03:21.437] } [18:03:21.437] muffleCondition(cond, pattern = "^muffle") [18:03:21.437] } [18:03:21.437] } [18:03:21.437] else { [18:03:21.437] if (TRUE) { [18:03:21.437] muffleCondition <- function (cond, pattern = "^muffle") [18:03:21.437] { [18:03:21.437] inherits <- base::inherits [18:03:21.437] invokeRestart <- base::invokeRestart [18:03:21.437] is.null <- base::is.null [18:03:21.437] muffled <- FALSE [18:03:21.437] if (inherits(cond, "message")) { [18:03:21.437] muffled <- grepl(pattern, "muffleMessage") [18:03:21.437] if (muffled) [18:03:21.437] invokeRestart("muffleMessage") [18:03:21.437] } [18:03:21.437] else if (inherits(cond, "warning")) { [18:03:21.437] muffled <- grepl(pattern, "muffleWarning") [18:03:21.437] if (muffled) [18:03:21.437] invokeRestart("muffleWarning") [18:03:21.437] } [18:03:21.437] else if (inherits(cond, "condition")) { [18:03:21.437] if (!is.null(pattern)) { [18:03:21.437] computeRestarts <- base::computeRestarts [18:03:21.437] grepl <- base::grepl [18:03:21.437] restarts <- computeRestarts(cond) [18:03:21.437] for (restart in restarts) { [18:03:21.437] name <- restart$name [18:03:21.437] if (is.null(name)) [18:03:21.437] next [18:03:21.437] if (!grepl(pattern, name)) [18:03:21.437] next [18:03:21.437] invokeRestart(restart) [18:03:21.437] muffled <- TRUE [18:03:21.437] break [18:03:21.437] } [18:03:21.437] } [18:03:21.437] } [18:03:21.437] invisible(muffled) [18:03:21.437] } [18:03:21.437] muffleCondition(cond, pattern = "^muffle") [18:03:21.437] } [18:03:21.437] } [18:03:21.437] } [18:03:21.437] })) [18:03:21.437] }, error = function(ex) { [18:03:21.437] base::structure(base::list(value = NULL, visible = NULL, [18:03:21.437] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:03:21.437] ...future.rng), started = ...future.startTime, [18:03:21.437] finished = Sys.time(), session_uuid = NA_character_, [18:03:21.437] version = "1.8"), class = "FutureResult") [18:03:21.437] }, finally = { [18:03:21.437] if (!identical(...future.workdir, getwd())) [18:03:21.437] setwd(...future.workdir) [18:03:21.437] { [18:03:21.437] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:03:21.437] ...future.oldOptions$nwarnings <- NULL [18:03:21.437] } [18:03:21.437] base::options(...future.oldOptions) [18:03:21.437] if (.Platform$OS.type == "windows") { [18:03:21.437] old_names <- names(...future.oldEnvVars) [18:03:21.437] envs <- base::Sys.getenv() [18:03:21.437] names <- names(envs) [18:03:21.437] common <- intersect(names, old_names) [18:03:21.437] added <- setdiff(names, old_names) [18:03:21.437] removed <- setdiff(old_names, names) [18:03:21.437] changed <- common[...future.oldEnvVars[common] != [18:03:21.437] envs[common]] [18:03:21.437] NAMES <- toupper(changed) [18:03:21.437] args <- list() [18:03:21.437] for (kk in seq_along(NAMES)) { [18:03:21.437] name <- changed[[kk]] [18:03:21.437] NAME <- NAMES[[kk]] [18:03:21.437] if (name != NAME && is.element(NAME, old_names)) [18:03:21.437] next [18:03:21.437] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.437] } [18:03:21.437] NAMES <- toupper(added) [18:03:21.437] for (kk in seq_along(NAMES)) { [18:03:21.437] name <- added[[kk]] [18:03:21.437] NAME <- NAMES[[kk]] [18:03:21.437] if (name != NAME && is.element(NAME, old_names)) [18:03:21.437] next [18:03:21.437] args[[name]] <- "" [18:03:21.437] } [18:03:21.437] NAMES <- toupper(removed) [18:03:21.437] for (kk in seq_along(NAMES)) { [18:03:21.437] name <- removed[[kk]] [18:03:21.437] NAME <- NAMES[[kk]] [18:03:21.437] if (name != NAME && is.element(NAME, old_names)) [18:03:21.437] next [18:03:21.437] args[[name]] <- ...future.oldEnvVars[[name]] [18:03:21.437] } [18:03:21.437] if (length(args) > 0) [18:03:21.437] base::do.call(base::Sys.setenv, args = args) [18:03:21.437] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:03:21.437] } [18:03:21.437] else { [18:03:21.437] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:03:21.437] } [18:03:21.437] { [18:03:21.437] if (base::length(...future.futureOptionsAdded) > [18:03:21.437] 0L) { [18:03:21.437] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:03:21.437] base::names(opts) <- ...future.futureOptionsAdded [18:03:21.437] base::options(opts) [18:03:21.437] } [18:03:21.437] { [18:03:21.437] { [18:03:21.437] base::options(mc.cores = ...future.mc.cores.old) [18:03:21.437] NULL [18:03:21.437] } [18:03:21.437] options(future.plan = NULL) [18:03:21.437] if (is.na(NA_character_)) [18:03:21.437] Sys.unsetenv("R_FUTURE_PLAN") [18:03:21.437] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:03:21.437] future::plan(list(function (..., workers = availableCores(), [18:03:21.437] lazy = FALSE, rscript_libs = .libPaths(), [18:03:21.437] envir = parent.frame()) [18:03:21.437] { [18:03:21.437] if (is.function(workers)) [18:03:21.437] workers <- workers() [18:03:21.437] workers <- structure(as.integer(workers), [18:03:21.437] class = class(workers)) [18:03:21.437] stop_if_not(length(workers) == 1, is.finite(workers), [18:03:21.437] workers >= 1) [18:03:21.437] if (workers == 1L && !inherits(workers, "AsIs")) { [18:03:21.437] return(sequential(..., lazy = TRUE, envir = envir)) [18:03:21.437] } [18:03:21.437] future <- MultisessionFuture(..., workers = workers, [18:03:21.437] lazy = lazy, rscript_libs = rscript_libs, [18:03:21.437] envir = envir) [18:03:21.437] if (!future$lazy) [18:03:21.437] future <- run(future) [18:03:21.437] invisible(future) [18:03:21.437] }), .cleanup = FALSE, .init = FALSE) [18:03:21.437] } [18:03:21.437] } [18:03:21.437] } [18:03:21.437] }) [18:03:21.437] if (TRUE) { [18:03:21.437] base::sink(type = "output", split = FALSE) [18:03:21.437] if (TRUE) { [18:03:21.437] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:03:21.437] } [18:03:21.437] else { [18:03:21.437] ...future.result["stdout"] <- base::list(NULL) [18:03:21.437] } [18:03:21.437] base::close(...future.stdout) [18:03:21.437] ...future.stdout <- NULL [18:03:21.437] } [18:03:21.437] ...future.result$conditions <- ...future.conditions [18:03:21.437] ...future.result$finished <- base::Sys.time() [18:03:21.437] ...future.result [18:03:21.437] } [18:03:21.442] Poll #1 (0): usedNodes() = 2, workers = 2 [18:03:21.455] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.455] - Validating connection of MultisessionFuture [18:03:21.455] - received message: FutureResult [18:03:21.456] - Received FutureResult [18:03:21.456] - Erased future from FutureRegistry [18:03:21.456] result() for ClusterFuture ... [18:03:21.456] - result already collected: FutureResult [18:03:21.456] result() for ClusterFuture ... done [18:03:21.456] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.457] result() for ClusterFuture ... [18:03:21.457] - result already collected: FutureResult [18:03:21.457] result() for ClusterFuture ... done [18:03:21.457] result() for ClusterFuture ... [18:03:21.460] - result already collected: FutureResult [18:03:21.460] result() for ClusterFuture ... done [18:03:21.461] Exporting 1 global objects (64 bytes) to cluster node #2 ... [18:03:21.461] Exporting 'x' (64 bytes) to cluster node #2 ... [18:03:21.462] Exporting 'x' (64 bytes) to cluster node #2 ... DONE [18:03:21.462] Exporting 1 global objects (64 bytes) to cluster node #2 ... DONE [18:03:21.462] MultisessionFuture started [18:03:21.463] - Launch lazy future ... done [18:03:21.463] run() for 'MultisessionFuture' ... done [18:03:21.463] result() for ClusterFuture ... [18:03:21.463] - result already collected: FutureResult [18:03:21.463] result() for ClusterFuture ... done [18:03:21.464] result() for ClusterFuture ... [18:03:21.464] - result already collected: FutureResult [18:03:21.464] result() for ClusterFuture ... done [18:03:21.464] result() for ClusterFuture ... [18:03:21.464] - result already collected: FutureResult [18:03:21.464] result() for ClusterFuture ... done [18:03:21.465] result() for ClusterFuture ... [18:03:21.465] - result already collected: FutureResult [18:03:21.465] result() for ClusterFuture ... done [18:03:21.465] result() for ClusterFuture ... [18:03:21.465] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.465] - Validating connection of MultisessionFuture [18:03:21.466] - received message: FutureResult [18:03:21.466] - Received FutureResult [18:03:21.466] - Erased future from FutureRegistry [18:03:21.466] result() for ClusterFuture ... [18:03:21.466] - result already collected: FutureResult [18:03:21.467] result() for ClusterFuture ... done [18:03:21.467] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.467] result() for ClusterFuture ... done [18:03:21.467] result() for ClusterFuture ... [18:03:21.467] - result already collected: FutureResult [18:03:21.467] result() for ClusterFuture ... done [18:03:21.468] result() for ClusterFuture ... [18:03:21.468] receiveMessageFromWorker() for ClusterFuture ... [18:03:21.468] - Validating connection of MultisessionFuture [18:03:21.480] - received message: FutureResult [18:03:21.480] - Received FutureResult [18:03:21.480] - Erased future from FutureRegistry [18:03:21.480] result() for ClusterFuture ... [18:03:21.480] - result already collected: FutureResult [18:03:21.481] result() for ClusterFuture ... done [18:03:21.481] receiveMessageFromWorker() for ClusterFuture ... done [18:03:21.481] result() for ClusterFuture ... done [18:03:21.481] result() for ClusterFuture ... [18:03:21.481] - result already collected: FutureResult [18:03:21.481] result() for ClusterFuture ... done [[1]] [1] 0 [[2]] [1] 0 [[3]] [1] 2 [[4]] [1] 3 multisession ... done Testing with 2 cores ... DONE > > message("- Assert that RNG mistakes does not muffle run-time errors") - Assert that RNG mistakes does not muffle run-time errors > > options( + future.debug = FALSE, + future.rng.onMisuse = "warning" + ) > for (signal in c(TRUE, FALSE)) { + message("signal=", signal) + f <- future({ sample.int(2L); log("a") }, seed = FALSE) + r <- result(f) + print(r) + res <- tryCatch(value(f, signal = signal), error = identity) + print(res) + stopifnot(inherits(res, "error")) + } signal=TRUE FutureResult: value: 'NULL' stdout: character conditions: [n = 1] simpleError RNG used: TRUE duration: 0.01711416 secs (started 2023-07-01 18:03:21.50557) version: 1.8 Warning: UNRELIABLE VALUE: Future ('') unexpectedly generated random numbers without specifying argument 'seed'. There is a risk that those random numbers are not statistically sound and the overall results might be invalid. To fix this, specify 'seed=TRUE'. This ensures that proper, parallel-safe random numbers are produced via the L'Ecuyer-CMRG method. To disable this check, use 'seed=NULL', or set option 'future.rng.onMisuse' to "ignore". signal=FALSE FutureResult: value: 'NULL' stdout: character conditions: [n = 1] simpleError RNG used: TRUE duration: 0.01815605 secs (started 2023-07-01 18:03:21.541763) version: 1.8 > > stopifnot(identical(RNGkind(), okind)) > > message("*** rng ... DONE") *** rng ... DONE > > source("incl/end.R") Failed to undo environment variables: - Expected environment variables: [n=201] '!ExitCode', 'ALLUSERSPROFILE', 'APPDATA', 'BIBINPUTS', 'BINDIR', 'BSTINPUTS', 'COMMONPROGRAMFILES', 'COMPUTERNAME', 'COMSPEC', 'CURL_CA_BUNDLE', 'CYGWIN', 'CommonProgramFiles(x86)', 'CommonProgramW6432', 'DriverData', 'HOME', 'HOMEDRIVE', 'HOMEPATH', 'JAGS_ROOT', 'JAVA_HOME', 'LANGUAGE', 'LC_COLLATE', 'LC_MONETARY', 'LC_TIME', 'LOCALAPPDATA', 'LOGONSERVER', 'LS_HOME', 'LS_LICENSE_PATH', 'MAKE', 'MAKEFLAGS', 'MAKELEVEL', 'MFLAGS', 'MSMPI_BENCHMARKS', 'MSMPI_BIN', 'MSYS2_ENV_CONV_EXCL', 'NUMBER_OF_PROCESSORS', 'OMP_THREAD_LIMIT', 'OS', 'PATH', 'PATHEXT', 'PROCESSOR_ARCHITECTURE', 'PROCESSOR_IDENTIFIER', 'PROCESSOR_LEVEL', 'PROCESSOR_REVISION', 'PROGRAMFILES', 'PROMPT', 'PSModulePath', 'PUBLIC', 'PWD', 'ProgramData', 'ProgramFiles(x86)', 'ProgramW6432', 'RETICULATE_AUTOCONFIGURE', 'RTOOLS43_HOME', 'R_ARCH', 'R_BROWSER', 'R_BZIPCMD', 'R_CMD', 'R_COMPILED_BY', 'R_CRAN_WEB', 'R_CUSTOM_TOOLS_PATH', 'R_CUSTOM_TOOLS_SOFT', 'R_DOC_DIR', 'R_ENVIRON_USER', 'R_GSCMD', 'R_GZIPCMD', 'R_HOME', 'R_INCLUDE_DIR', 'R_INSTALL_TAR', 'R_LIBS', 'R_LIBS_SITE', 'R_LIBS_USER', 'R_MAX_NUM_DLLS', 'R_OSTYPE', 'R_PAPERSIZE', 'R_PAPERSIZE_USER', 'R_PARALLELLY_MAKENODEPSOCK_AUTOKILL', 'R_PARALLELLY_MAKENODEPSOCK_CONNECTTIMEOUT', 'R_PARALLELLY_MAKENODEPSOCK_RSCRIPT_LABEL', 'R_PARALLELLY_MAKENODEPSOCK_SESSIONINFO_PKGS', 'R_PARALLELLY_MAKENODEPSOCK_TIMEOUT', 'R_PARALLELLY_RANDOM_PORTS', 'R_PARALLEL_PORT', 'R_RD4PDF', 'R_RTOOLS43_PATH', 'R_SCRIPT_LEGACY', 'R_SHARE_DIR', 'R_TESTS', 'R_UNZIPCMD', 'R_USER', 'R_VERSION', 'R_ZIPCMD', 'SED', 'SHLVL', 'SYSTEMDRIVE', 'SYSTEMROOT', 'TAR', 'TAR_OPTIONS', 'TEMP', 'TERM', 'TEXINPUTS', 'TMP', 'TMPDIR', 'USERDOMAIN', 'USERDOMAIN_ROAMINGPROFILE', 'USERNAME', 'USERPROFILE', 'WINDIR', '_', '_R_CHECK_AUTOCONF_', '_R_CHECK_BOGUS_RETURN_', '_R_CHECK_BROWSER_NONINTERACTIVE_', '_R_CHECK_BUILD_VIGNETTES_SEPARATELY_', '_R_CHECK_CODETOOLS_PROFILE_', '_R_CHECK_CODE_ASSIGN_TO_GLOBALENV_', '_R_CHECK_CODE_ATTACH_', '_R_CHECK_CODE_CLASS_IS_STRING_', '_R_CHECK_CODE_DATA_INTO_GLOBALENV_', '_R_CHECK_CODE_USAGE_VIA_NAMESPACES_', '_R_CHECK_CODE_USAGE_WITHOUT_LOADING_', '_R_CHECK_CODE_USAGE_WITH_ONLY_BASE_ATTACHED_', '_R_CHECK_CODOC_VARIABLES_IN_USAGES_', '_R_CHECK_COMPACT_DATA2_', '_R_CHECK_COMPILATION_FLAGS_', '_R_CHECK_CONNECTIONS_LEFT_OPEN_', '_R_CHECK_CRAN_INCOMING_', '_R_CHECK_CRAN_INCOMING_CHECK_FILE_URIS_', '_R_CHECK_CRAN_INCOMING_CHECK_URLS_IN_PARALLEL_', '_R_CHECK_CRAN_INCOMING_NOTE_GNU_MAKE_', '_R_CHECK_CRAN_INCOMING_REMOTE_', '_R_CHECK_CRAN_INCOMING_USE_ASPELL_', '_R_CHECK_DATALIST_', '_R_CHECK_DEPRECATED_DEFUNCT_', '_R_CHECK_DOC_SIZES2_', '_R_CHECK_DOT_FIRSTLIB_', '_R_CHECK_DOT_INTERNAL_', '_R_CHECK_EXAMPLE_TIMING_THRESHOLD_', '_R_CHECK_EXECUTABLES_', '_R_CHECK_EXECUTABLES_EXCLUSIONS_', '_R_CHECK_FF_CALLS_', '_R_CHECK_FF_DUP_', '_R_CHECK_FORCE_SUGGESTS_', '_R_CHECK_FUTURE_FILE_TIMESTAMPS_', '_R_CHECK_FUTURE_FILE_TIMESTAMPS_LEEWAY_', '_R_CHECK_HAVE_MYSQL_', '_R_CHECK_HAVE_ODBC_', '_R_CHECK_HAVE_PERL_', '_R_CHECK_HAVE_POSTGRES_', '_R_CHECK_INSTALL_DEPENDS_', '_R_CHECK_INTERNALS2_', '_R_CHECK_LENGTH_1_CONDITION_', '_R_CHECK_LICENSE_', '_R_CHECK_LIMIT_CORES_', '_R_CHECK_MATRIX_DATA_', '_R_CHECK_NATIVE_ROUTINE_REGISTRATION_', '_R_CHECK_NEWS_IN_PLAIN_TEXT_', '_R_CHECK_NO_RECOMMENDED_', '_R_CHECK_NO_STOP_ON_TEST_ERROR_', '_R_CHECK_ORPHANED_', '_R_CHECK_OVERWRITE_REGISTERED_S3_METHODS_', '_R_CHECK_PACKAGES_USED_IGNORE_UNUSED_IMPORTS_', '_R_CHECK_PACKAGES_USED_IN_TESTS_USE_SUBDIRS_', '_R_CHECK_PACKAGE_DATASETS_SUPPRESS_NOTES_', '_R_CHECK_PACKAGE_NAME_', '_R_CHECK_PKG_SIZES_', '_R_CHECK_PKG_SIZES_THRESHOLD_', '_R_CHECK_PRAGMAS_', '_R_CHECK_RD_EXAMPLES_T_AND_F_', '_R_CHECK_RD_LINE_WIDTHS_', '_R_CHECK_RD_MATH_RENDERING_', '_R_CHECK_RD_VALIDATE_RD2HTML_', '_R_CHECK_REPLACING_IMPORTS_', '_R_CHECK_R_DEPENDS_', '_R_CHECK_S3_METHODS_SHOW_POSSIBLE_ISSUES_', '_R_CHECK_SCREEN_DEVICE_', '_R_CHECK_SERIALIZATION_', '_R_CHECK_SHLIB_OPENMP_FLAGS_', '_R_CHECK_SRC_MINUS_W_IMPLICIT_', '_R_CHECK_SUBDIRS_NOCASE_', '_R_CHECK_SUBDIRS_STRICT_', '_R_CHECK_SUGGESTS_ONLY_', '_R_CHECK_SYSTEM_CLOCK_', '_R_CHECK_TESTS_NLINES_', '_R_CHECK_TEST_TIMING_', '_R_CHECK_TIMINGS_', '_R_CHECK_TOPLEVEL_FILES_', '_R_CHECK_UNDOC_USE_ALL_NAMES_', '_R_CHECK_UNSAFE_CALLS_', '_R_CHECK_URLS_SHOW_301_STATUS_', '_R_CHECK_VC_DIRS_', '_R_CHECK_VIGNETTES_NLINES_', '_R_CHECK_VIGNETTES_SKIP_RUN_MAYBE_', '_R_CHECK_VIGNETTE_TIMING_', '_R_CHECK_VIGNETTE_TITLES_', '_R_CHECK_WINDOWS_DEVICE_', '_R_CHECK_XREFS_USE_ALIASES_FROM_CRAN_', '_R_CLASS_MATRIX_ARRAY_', '_R_INSTALL_TIME_PATCHES_', '_R_S3_METHOD_LOOKUP_BASEENV_AFTER_GLOBALENV_', '_R_SHLIB_BUILD_OBJECTS_SYMBOL_TABLES_', 'maj.version', 'nextArg--timingsnextArg--install' - Environment variables still there: [n=0] - Environment variables missing: [n=1] 'MAKEFLAGS' Differences environment variable by environment variable: List of 3 $ name : chr "MAKEFLAGS" $ expected: 'Dlist' chr "" $ actual : 'Dlist' chr NA > > proc.time() user system elapsed 4.28 0.21 6.32