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:01:47.454] plan(): Setting new future strategy stack: [18:01:47.456] List of future strategies: [18:01:47.456] 1. sequential: [18:01:47.456] - args: function (..., envir = parent.frame()) [18:01:47.456] - tweaked: FALSE [18:01:47.456] - call: future::plan("sequential") [18:01:47.471] plan(): nbrOfWorkers() = 1 > > library("datasets") ## cars data set > library("stats") ## lm(), poly(), xtabs() > > message("*** Globals - formulas ...") *** Globals - formulas ... > > ## (i) lm(): > ## From example("lm", package = "stats") > ctl <- c(4.17, 5.58, 5.18, 6.11, 4.50, 4.61, 5.17, 4.53, 5.33, 5.14) > trt <- c(4.81, 4.17, 4.41, 3.59, 5.87, 3.83, 6.03, 4.89, 4.32, 4.69) > group <- gl(2, 10, 20, labels = c("Ctl", "Trt")) > weight <- c(ctl, trt) > ctl <- trt <- NULL > ## Truth: > fit_i <- lm(weight ~ group - 1) > print(fit_i) Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 > > ## (ii) xtabs(~ x): > x <- c(1, 1, 2, 2, 2) > ## Truth: > tbl_ii <- xtabs(~ x) > print(tbl_ii) x 1 2 2 3 > > ## (iii) lm(, data = cars): > exprs <- list( + # "remove-intercept-term" form of no-intercept + a = substitute({ lm(dist ~ . -1, data = cars) }), + # "make-intercept-zero" form of no-intercept + b = substitute({ lm(dist ~ . +0, data = cars) }), + # doesn't do what we want here + c = substitute({ lm(dist ~ speed + speed ^ 2, data = cars) }), + # gets us a quadratic term + d = substitute({ lm(dist ~ speed + I(speed ^ 2), data = cars) }), + # avoid potential multicollinearity + e = substitute({ lm(dist ~ poly(speed, 2), data = cars) }) + ) > > ## (iv) Globals - map(x, ~ expr): > ## A fake purrr::map() function with limited functionality > map <- function(.x, .f, ...) { + if (inherits(.f, "formula")) { + expr <- .f[[-1]] + .f <- eval(bquote(function(...) { + .(expr) + })) + } + eval(lapply(.x, FUN = .f, ...)) + } > > inner_function <- function(x) { x + 1 } > > outer_function <- function(x) { + map(1:2, ~ inner_function(.x)) + } > > y_iv <- outer_function(1L) > str(y_iv) List of 2 $ : num [1:2] 2 3 $ : num [1:2] 2 3 > > > 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) + + message("availableCores(): ", availableCores()) + + for (strategy in supportedStrategies(cores)) { + message(sprintf("- plan('%s') ...", strategy)) + plan(strategy) + + message("- lm() ...") + + ## Explicit future + f <- future({ lm(weight ~ group - 1) }) + fit <- value(f) + print(fit) + stopifnot(all.equal(fit, fit_i)) + + ## Explicit future (lazy) + f <- future({ lm(weight ~ group - 1) }, lazy = TRUE) + fit <- value(f) + print(fit) + stopifnot(all.equal(fit, fit_i)) + + ## Future assignment + fit %<-% { lm(weight ~ group - 1) } + print(fit) + stopifnot(all.equal(fit, fit_i)) + + ## Future assignment (non-lazy) + fit %<-% { lm(weight ~ group - 1) } %lazy% FALSE + print(fit) + stopifnot(all.equal(fit, fit_i)) + + ## Future assignment (lazy) + fit %<-% { lm(weight ~ group - 1) } %lazy% TRUE + print(fit) + stopifnot(all.equal(fit, fit_i)) + + message("- Globals - one-side formulas, e.g. xtabs(~ x) ...") + ## Explicit future + f <- future({ xtabs(~ x) }) + tbl <- value(f) + print(tbl) + stopifnot(all.equal(tbl, tbl_ii)) + + ## Future assignment + tbl %<-% { xtabs(~ x) } + print(tbl) + stopifnot(all.equal(tbl, tbl_ii)) + + message("- Globals - lm(, data = cars) ...") + for (kk in seq_along(exprs)) { + expr <- exprs[[kk]] + name <- names(exprs)[kk] + message(sprintf("- Globals - lm(, data = cars) ...", + kk, sQuote(name))) + + fit_iii <- eval(expr) + print(fit_iii) + + f <- future(expr, substitute = FALSE) + fit <- value(f) + print(fit) + + stopifnot(all.equal(fit, fit_iii)) + } ## for (kk ...) + + message("- Globals - map(x, ~ expr) ...") + f <- future({ outer_function(1L) }) + y <- value(f) + str(y) + stopifnot(all.equal(y, y_iv)) + + y %<-% { outer_function(1L) } + str(y) + stopifnot(all.equal(y, y_iv)) + } ## for (strategy ...) + message(sprintf("Testing with %d cores ... DONE", cores)) + } ## for (cores ...) Testing with 1 cores ... availableCores(): 1 - plan('sequential') ... [18:01:47.537] plan(): Setting new future strategy stack: [18:01:47.537] List of future strategies: [18:01:47.537] 1. sequential: [18:01:47.537] - args: function (..., envir = parent.frame()) [18:01:47.537] - tweaked: FALSE [18:01:47.537] - call: plan(strategy) [18:01:47.550] plan(): nbrOfWorkers() = 1 - lm() ... [18:01:47.551] getGlobalsAndPackages() ... [18:01:47.551] Searching for globals... [18:01:47.559] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:47.560] Searching for globals ... DONE [18:01:47.560] Resolving globals: FALSE [18:01:47.561] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:47.562] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:47.562] - globals: [2] 'weight', 'group' [18:01:47.562] - packages: [1] 'stats' [18:01:47.562] getGlobalsAndPackages() ... DONE [18:01:47.563] run() for 'Future' ... [18:01:47.563] - state: 'created' [18:01:47.564] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.564] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.565] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.565] - Field: 'label' [18:01:47.565] - Field: 'local' [18:01:47.565] - Field: 'owner' [18:01:47.565] - Field: 'envir' [18:01:47.566] - Field: 'packages' [18:01:47.566] - Field: 'gc' [18:01:47.566] - Field: 'conditions' [18:01:47.566] - Field: 'expr' [18:01:47.566] - Field: 'uuid' [18:01:47.566] - Field: 'seed' [18:01:47.567] - Field: 'version' [18:01:47.567] - Field: 'result' [18:01:47.567] - Field: 'asynchronous' [18:01:47.567] - Field: 'calls' [18:01:47.567] - Field: 'globals' [18:01:47.567] - Field: 'stdout' [18:01:47.568] - Field: 'earlySignal' [18:01:47.568] - Field: 'lazy' [18:01:47.568] - Field: 'state' [18:01:47.568] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.568] - Launch lazy future ... [18:01:47.569] Packages needed by the future expression (n = 1): 'stats' [18:01:47.569] Packages needed by future strategies (n = 0): [18:01:47.572] { [18:01:47.572] { [18:01:47.572] { [18:01:47.572] ...future.startTime <- base::Sys.time() [18:01:47.572] { [18:01:47.572] { [18:01:47.572] { [18:01:47.572] { [18:01:47.572] base::local({ [18:01:47.572] has_future <- base::requireNamespace("future", [18:01:47.572] quietly = TRUE) [18:01:47.572] if (has_future) { [18:01:47.572] ns <- base::getNamespace("future") [18:01:47.572] version <- ns[[".package"]][["version"]] [18:01:47.572] if (is.null(version)) [18:01:47.572] version <- utils::packageVersion("future") [18:01:47.572] } [18:01:47.572] else { [18:01:47.572] version <- NULL [18:01:47.572] } [18:01:47.572] if (!has_future || version < "1.8.0") { [18:01:47.572] info <- base::c(r_version = base::gsub("R version ", [18:01:47.572] "", base::R.version$version.string), [18:01:47.572] platform = base::sprintf("%s (%s-bit)", [18:01:47.572] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.572] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.572] "release", "version")], collapse = " "), [18:01:47.572] hostname = base::Sys.info()[["nodename"]]) [18:01:47.572] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.572] info) [18:01:47.572] info <- base::paste(info, collapse = "; ") [18:01:47.572] if (!has_future) { [18:01:47.572] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.572] info) [18:01:47.572] } [18:01:47.572] else { [18:01:47.572] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.572] info, version) [18:01:47.572] } [18:01:47.572] base::stop(msg) [18:01:47.572] } [18:01:47.572] }) [18:01:47.572] } [18:01:47.572] base::local({ [18:01:47.572] for (pkg in "stats") { [18:01:47.572] base::loadNamespace(pkg) [18:01:47.572] base::library(pkg, character.only = TRUE) [18:01:47.572] } [18:01:47.572] }) [18:01:47.572] } [18:01:47.572] options(future.plan = NULL) [18:01:47.572] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.572] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.572] } [18:01:47.572] ...future.workdir <- getwd() [18:01:47.572] } [18:01:47.572] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.572] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.572] } [18:01:47.572] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.572] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.572] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.572] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.572] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.572] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.572] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.572] base::names(...future.oldOptions)) [18:01:47.572] } [18:01:47.572] if (FALSE) { [18:01:47.572] } [18:01:47.572] else { [18:01:47.572] if (TRUE) { [18:01:47.572] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.572] open = "w") [18:01:47.572] } [18:01:47.572] else { [18:01:47.572] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.572] windows = "NUL", "/dev/null"), open = "w") [18:01:47.572] } [18:01:47.572] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.572] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.572] base::sink(type = "output", split = FALSE) [18:01:47.572] base::close(...future.stdout) [18:01:47.572] }, add = TRUE) [18:01:47.572] } [18:01:47.572] ...future.frame <- base::sys.nframe() [18:01:47.572] ...future.conditions <- base::list() [18:01:47.572] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.572] if (FALSE) { [18:01:47.572] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.572] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.572] } [18:01:47.572] ...future.result <- base::tryCatch({ [18:01:47.572] base::withCallingHandlers({ [18:01:47.572] ...future.value <- base::withVisible(base::local({ [18:01:47.572] lm(weight ~ group - 1) [18:01:47.572] })) [18:01:47.572] future::FutureResult(value = ...future.value$value, [18:01:47.572] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.572] ...future.rng), globalenv = if (FALSE) [18:01:47.572] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.572] ...future.globalenv.names)) [18:01:47.572] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.572] }, condition = base::local({ [18:01:47.572] c <- base::c [18:01:47.572] inherits <- base::inherits [18:01:47.572] invokeRestart <- base::invokeRestart [18:01:47.572] length <- base::length [18:01:47.572] list <- base::list [18:01:47.572] seq.int <- base::seq.int [18:01:47.572] signalCondition <- base::signalCondition [18:01:47.572] sys.calls <- base::sys.calls [18:01:47.572] `[[` <- base::`[[` [18:01:47.572] `+` <- base::`+` [18:01:47.572] `<<-` <- base::`<<-` [18:01:47.572] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.572] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.572] 3L)] [18:01:47.572] } [18:01:47.572] function(cond) { [18:01:47.572] is_error <- inherits(cond, "error") [18:01:47.572] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.572] NULL) [18:01:47.572] if (is_error) { [18:01:47.572] sessionInformation <- function() { [18:01:47.572] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.572] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.572] search = base::search(), system = base::Sys.info()) [18:01:47.572] } [18:01:47.572] ...future.conditions[[length(...future.conditions) + [18:01:47.572] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.572] cond$call), session = sessionInformation(), [18:01:47.572] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.572] signalCondition(cond) [18:01:47.572] } [18:01:47.572] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.572] "immediateCondition"))) { [18:01:47.572] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.572] ...future.conditions[[length(...future.conditions) + [18:01:47.572] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.572] if (TRUE && !signal) { [18:01:47.572] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.572] { [18:01:47.572] inherits <- base::inherits [18:01:47.572] invokeRestart <- base::invokeRestart [18:01:47.572] is.null <- base::is.null [18:01:47.572] muffled <- FALSE [18:01:47.572] if (inherits(cond, "message")) { [18:01:47.572] muffled <- grepl(pattern, "muffleMessage") [18:01:47.572] if (muffled) [18:01:47.572] invokeRestart("muffleMessage") [18:01:47.572] } [18:01:47.572] else if (inherits(cond, "warning")) { [18:01:47.572] muffled <- grepl(pattern, "muffleWarning") [18:01:47.572] if (muffled) [18:01:47.572] invokeRestart("muffleWarning") [18:01:47.572] } [18:01:47.572] else if (inherits(cond, "condition")) { [18:01:47.572] if (!is.null(pattern)) { [18:01:47.572] computeRestarts <- base::computeRestarts [18:01:47.572] grepl <- base::grepl [18:01:47.572] restarts <- computeRestarts(cond) [18:01:47.572] for (restart in restarts) { [18:01:47.572] name <- restart$name [18:01:47.572] if (is.null(name)) [18:01:47.572] next [18:01:47.572] if (!grepl(pattern, name)) [18:01:47.572] next [18:01:47.572] invokeRestart(restart) [18:01:47.572] muffled <- TRUE [18:01:47.572] break [18:01:47.572] } [18:01:47.572] } [18:01:47.572] } [18:01:47.572] invisible(muffled) [18:01:47.572] } [18:01:47.572] muffleCondition(cond, pattern = "^muffle") [18:01:47.572] } [18:01:47.572] } [18:01:47.572] else { [18:01:47.572] if (TRUE) { [18:01:47.572] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.572] { [18:01:47.572] inherits <- base::inherits [18:01:47.572] invokeRestart <- base::invokeRestart [18:01:47.572] is.null <- base::is.null [18:01:47.572] muffled <- FALSE [18:01:47.572] if (inherits(cond, "message")) { [18:01:47.572] muffled <- grepl(pattern, "muffleMessage") [18:01:47.572] if (muffled) [18:01:47.572] invokeRestart("muffleMessage") [18:01:47.572] } [18:01:47.572] else if (inherits(cond, "warning")) { [18:01:47.572] muffled <- grepl(pattern, "muffleWarning") [18:01:47.572] if (muffled) [18:01:47.572] invokeRestart("muffleWarning") [18:01:47.572] } [18:01:47.572] else if (inherits(cond, "condition")) { [18:01:47.572] if (!is.null(pattern)) { [18:01:47.572] computeRestarts <- base::computeRestarts [18:01:47.572] grepl <- base::grepl [18:01:47.572] restarts <- computeRestarts(cond) [18:01:47.572] for (restart in restarts) { [18:01:47.572] name <- restart$name [18:01:47.572] if (is.null(name)) [18:01:47.572] next [18:01:47.572] if (!grepl(pattern, name)) [18:01:47.572] next [18:01:47.572] invokeRestart(restart) [18:01:47.572] muffled <- TRUE [18:01:47.572] break [18:01:47.572] } [18:01:47.572] } [18:01:47.572] } [18:01:47.572] invisible(muffled) [18:01:47.572] } [18:01:47.572] muffleCondition(cond, pattern = "^muffle") [18:01:47.572] } [18:01:47.572] } [18:01:47.572] } [18:01:47.572] })) [18:01:47.572] }, error = function(ex) { [18:01:47.572] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.572] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.572] ...future.rng), started = ...future.startTime, [18:01:47.572] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.572] version = "1.8"), class = "FutureResult") [18:01:47.572] }, finally = { [18:01:47.572] if (!identical(...future.workdir, getwd())) [18:01:47.572] setwd(...future.workdir) [18:01:47.572] { [18:01:47.572] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.572] ...future.oldOptions$nwarnings <- NULL [18:01:47.572] } [18:01:47.572] base::options(...future.oldOptions) [18:01:47.572] if (.Platform$OS.type == "windows") { [18:01:47.572] old_names <- names(...future.oldEnvVars) [18:01:47.572] envs <- base::Sys.getenv() [18:01:47.572] names <- names(envs) [18:01:47.572] common <- intersect(names, old_names) [18:01:47.572] added <- setdiff(names, old_names) [18:01:47.572] removed <- setdiff(old_names, names) [18:01:47.572] changed <- common[...future.oldEnvVars[common] != [18:01:47.572] envs[common]] [18:01:47.572] NAMES <- toupper(changed) [18:01:47.572] args <- list() [18:01:47.572] for (kk in seq_along(NAMES)) { [18:01:47.572] name <- changed[[kk]] [18:01:47.572] NAME <- NAMES[[kk]] [18:01:47.572] if (name != NAME && is.element(NAME, old_names)) [18:01:47.572] next [18:01:47.572] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.572] } [18:01:47.572] NAMES <- toupper(added) [18:01:47.572] for (kk in seq_along(NAMES)) { [18:01:47.572] name <- added[[kk]] [18:01:47.572] NAME <- NAMES[[kk]] [18:01:47.572] if (name != NAME && is.element(NAME, old_names)) [18:01:47.572] next [18:01:47.572] args[[name]] <- "" [18:01:47.572] } [18:01:47.572] NAMES <- toupper(removed) [18:01:47.572] for (kk in seq_along(NAMES)) { [18:01:47.572] name <- removed[[kk]] [18:01:47.572] NAME <- NAMES[[kk]] [18:01:47.572] if (name != NAME && is.element(NAME, old_names)) [18:01:47.572] next [18:01:47.572] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.572] } [18:01:47.572] if (length(args) > 0) [18:01:47.572] base::do.call(base::Sys.setenv, args = args) [18:01:47.572] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.572] } [18:01:47.572] else { [18:01:47.572] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.572] } [18:01:47.572] { [18:01:47.572] if (base::length(...future.futureOptionsAdded) > [18:01:47.572] 0L) { [18:01:47.572] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.572] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.572] base::options(opts) [18:01:47.572] } [18:01:47.572] { [18:01:47.572] { [18:01:47.572] NULL [18:01:47.572] RNGkind("Mersenne-Twister") [18:01:47.572] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.572] inherits = FALSE) [18:01:47.572] } [18:01:47.572] options(future.plan = NULL) [18:01:47.572] if (is.na(NA_character_)) [18:01:47.572] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.572] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.572] future::plan(list(function (..., envir = parent.frame()) [18:01:47.572] { [18:01:47.572] future <- SequentialFuture(..., envir = envir) [18:01:47.572] if (!future$lazy) [18:01:47.572] future <- run(future) [18:01:47.572] invisible(future) [18:01:47.572] }), .cleanup = FALSE, .init = FALSE) [18:01:47.572] } [18:01:47.572] } [18:01:47.572] } [18:01:47.572] }) [18:01:47.572] if (TRUE) { [18:01:47.572] base::sink(type = "output", split = FALSE) [18:01:47.572] if (TRUE) { [18:01:47.572] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.572] } [18:01:47.572] else { [18:01:47.572] ...future.result["stdout"] <- base::list(NULL) [18:01:47.572] } [18:01:47.572] base::close(...future.stdout) [18:01:47.572] ...future.stdout <- NULL [18:01:47.572] } [18:01:47.572] ...future.result$conditions <- ...future.conditions [18:01:47.572] ...future.result$finished <- base::Sys.time() [18:01:47.572] ...future.result [18:01:47.572] } [18:01:47.576] assign_globals() ... [18:01:47.576] List of 2 [18:01:47.576] $ weight: num [1:20] 4.17 5.58 5.18 6.11 4.5 4.61 5.17 4.53 5.33 5.14 ... [18:01:47.576] $ group : Factor w/ 2 levels "Ctl","Trt": 1 1 1 1 1 1 1 1 1 1 ... [18:01:47.576] - attr(*, "where")=List of 2 [18:01:47.576] ..$ weight: [18:01:47.576] ..$ group : [18:01:47.576] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.576] - attr(*, "resolved")= logi FALSE [18:01:47.576] - attr(*, "total_size")= num 896 [18:01:47.576] - attr(*, "already-done")= logi TRUE [18:01:47.580] - copied 'weight' to environment [18:01:47.580] - copied 'group' to environment [18:01:47.580] assign_globals() ... done [18:01:47.581] plan(): Setting new future strategy stack: [18:01:47.581] List of future strategies: [18:01:47.581] 1. sequential: [18:01:47.581] - args: function (..., envir = parent.frame()) [18:01:47.581] - tweaked: FALSE [18:01:47.581] - call: NULL [18:01:47.582] plan(): nbrOfWorkers() = 1 [18:01:47.585] plan(): Setting new future strategy stack: [18:01:47.585] List of future strategies: [18:01:47.585] 1. sequential: [18:01:47.585] - args: function (..., envir = parent.frame()) [18:01:47.585] - tweaked: FALSE [18:01:47.585] - call: plan(strategy) [18:01:47.585] plan(): nbrOfWorkers() = 1 [18:01:47.586] SequentialFuture started (and completed) [18:01:47.586] - Launch lazy future ... done [18:01:47.586] run() for 'SequentialFuture' ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:47.590] getGlobalsAndPackages() ... [18:01:47.590] Searching for globals... [18:01:47.592] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:47.592] Searching for globals ... DONE [18:01:47.592] Resolving globals: FALSE [18:01:47.593] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:47.593] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:47.593] - globals: [2] 'weight', 'group' [18:01:47.594] - packages: [1] 'stats' [18:01:47.594] getGlobalsAndPackages() ... DONE [18:01:47.594] run() for 'Future' ... [18:01:47.594] - state: 'created' [18:01:47.595] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.595] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.595] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.595] - Field: 'label' [18:01:47.595] - Field: 'local' [18:01:47.596] - Field: 'owner' [18:01:47.596] - Field: 'envir' [18:01:47.596] - Field: 'packages' [18:01:47.596] - Field: 'gc' [18:01:47.596] - Field: 'conditions' [18:01:47.596] - Field: 'expr' [18:01:47.597] - Field: 'uuid' [18:01:47.597] - Field: 'seed' [18:01:47.597] - Field: 'version' [18:01:47.597] - Field: 'result' [18:01:47.597] - Field: 'asynchronous' [18:01:47.598] - Field: 'calls' [18:01:47.598] - Field: 'globals' [18:01:47.598] - Field: 'stdout' [18:01:47.598] - Field: 'earlySignal' [18:01:47.598] - Field: 'lazy' [18:01:47.598] - Field: 'state' [18:01:47.599] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.599] - Launch lazy future ... [18:01:47.599] Packages needed by the future expression (n = 1): 'stats' [18:01:47.599] Packages needed by future strategies (n = 0): [18:01:47.600] { [18:01:47.600] { [18:01:47.600] { [18:01:47.600] ...future.startTime <- base::Sys.time() [18:01:47.600] { [18:01:47.600] { [18:01:47.600] { [18:01:47.600] { [18:01:47.600] base::local({ [18:01:47.600] has_future <- base::requireNamespace("future", [18:01:47.600] quietly = TRUE) [18:01:47.600] if (has_future) { [18:01:47.600] ns <- base::getNamespace("future") [18:01:47.600] version <- ns[[".package"]][["version"]] [18:01:47.600] if (is.null(version)) [18:01:47.600] version <- utils::packageVersion("future") [18:01:47.600] } [18:01:47.600] else { [18:01:47.600] version <- NULL [18:01:47.600] } [18:01:47.600] if (!has_future || version < "1.8.0") { [18:01:47.600] info <- base::c(r_version = base::gsub("R version ", [18:01:47.600] "", base::R.version$version.string), [18:01:47.600] platform = base::sprintf("%s (%s-bit)", [18:01:47.600] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.600] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.600] "release", "version")], collapse = " "), [18:01:47.600] hostname = base::Sys.info()[["nodename"]]) [18:01:47.600] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.600] info) [18:01:47.600] info <- base::paste(info, collapse = "; ") [18:01:47.600] if (!has_future) { [18:01:47.600] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.600] info) [18:01:47.600] } [18:01:47.600] else { [18:01:47.600] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.600] info, version) [18:01:47.600] } [18:01:47.600] base::stop(msg) [18:01:47.600] } [18:01:47.600] }) [18:01:47.600] } [18:01:47.600] base::local({ [18:01:47.600] for (pkg in "stats") { [18:01:47.600] base::loadNamespace(pkg) [18:01:47.600] base::library(pkg, character.only = TRUE) [18:01:47.600] } [18:01:47.600] }) [18:01:47.600] } [18:01:47.600] options(future.plan = NULL) [18:01:47.600] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.600] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.600] } [18:01:47.600] ...future.workdir <- getwd() [18:01:47.600] } [18:01:47.600] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.600] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.600] } [18:01:47.600] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.600] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.600] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.600] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.600] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.600] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.600] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.600] base::names(...future.oldOptions)) [18:01:47.600] } [18:01:47.600] if (FALSE) { [18:01:47.600] } [18:01:47.600] else { [18:01:47.600] if (TRUE) { [18:01:47.600] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.600] open = "w") [18:01:47.600] } [18:01:47.600] else { [18:01:47.600] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.600] windows = "NUL", "/dev/null"), open = "w") [18:01:47.600] } [18:01:47.600] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.600] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.600] base::sink(type = "output", split = FALSE) [18:01:47.600] base::close(...future.stdout) [18:01:47.600] }, add = TRUE) [18:01:47.600] } [18:01:47.600] ...future.frame <- base::sys.nframe() [18:01:47.600] ...future.conditions <- base::list() [18:01:47.600] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.600] if (FALSE) { [18:01:47.600] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.600] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.600] } [18:01:47.600] ...future.result <- base::tryCatch({ [18:01:47.600] base::withCallingHandlers({ [18:01:47.600] ...future.value <- base::withVisible(base::local({ [18:01:47.600] lm(weight ~ group - 1) [18:01:47.600] })) [18:01:47.600] future::FutureResult(value = ...future.value$value, [18:01:47.600] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.600] ...future.rng), globalenv = if (FALSE) [18:01:47.600] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.600] ...future.globalenv.names)) [18:01:47.600] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.600] }, condition = base::local({ [18:01:47.600] c <- base::c [18:01:47.600] inherits <- base::inherits [18:01:47.600] invokeRestart <- base::invokeRestart [18:01:47.600] length <- base::length [18:01:47.600] list <- base::list [18:01:47.600] seq.int <- base::seq.int [18:01:47.600] signalCondition <- base::signalCondition [18:01:47.600] sys.calls <- base::sys.calls [18:01:47.600] `[[` <- base::`[[` [18:01:47.600] `+` <- base::`+` [18:01:47.600] `<<-` <- base::`<<-` [18:01:47.600] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.600] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.600] 3L)] [18:01:47.600] } [18:01:47.600] function(cond) { [18:01:47.600] is_error <- inherits(cond, "error") [18:01:47.600] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.600] NULL) [18:01:47.600] if (is_error) { [18:01:47.600] sessionInformation <- function() { [18:01:47.600] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.600] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.600] search = base::search(), system = base::Sys.info()) [18:01:47.600] } [18:01:47.600] ...future.conditions[[length(...future.conditions) + [18:01:47.600] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.600] cond$call), session = sessionInformation(), [18:01:47.600] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.600] signalCondition(cond) [18:01:47.600] } [18:01:47.600] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.600] "immediateCondition"))) { [18:01:47.600] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.600] ...future.conditions[[length(...future.conditions) + [18:01:47.600] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.600] if (TRUE && !signal) { [18:01:47.600] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.600] { [18:01:47.600] inherits <- base::inherits [18:01:47.600] invokeRestart <- base::invokeRestart [18:01:47.600] is.null <- base::is.null [18:01:47.600] muffled <- FALSE [18:01:47.600] if (inherits(cond, "message")) { [18:01:47.600] muffled <- grepl(pattern, "muffleMessage") [18:01:47.600] if (muffled) [18:01:47.600] invokeRestart("muffleMessage") [18:01:47.600] } [18:01:47.600] else if (inherits(cond, "warning")) { [18:01:47.600] muffled <- grepl(pattern, "muffleWarning") [18:01:47.600] if (muffled) [18:01:47.600] invokeRestart("muffleWarning") [18:01:47.600] } [18:01:47.600] else if (inherits(cond, "condition")) { [18:01:47.600] if (!is.null(pattern)) { [18:01:47.600] computeRestarts <- base::computeRestarts [18:01:47.600] grepl <- base::grepl [18:01:47.600] restarts <- computeRestarts(cond) [18:01:47.600] for (restart in restarts) { [18:01:47.600] name <- restart$name [18:01:47.600] if (is.null(name)) [18:01:47.600] next [18:01:47.600] if (!grepl(pattern, name)) [18:01:47.600] next [18:01:47.600] invokeRestart(restart) [18:01:47.600] muffled <- TRUE [18:01:47.600] break [18:01:47.600] } [18:01:47.600] } [18:01:47.600] } [18:01:47.600] invisible(muffled) [18:01:47.600] } [18:01:47.600] muffleCondition(cond, pattern = "^muffle") [18:01:47.600] } [18:01:47.600] } [18:01:47.600] else { [18:01:47.600] if (TRUE) { [18:01:47.600] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.600] { [18:01:47.600] inherits <- base::inherits [18:01:47.600] invokeRestart <- base::invokeRestart [18:01:47.600] is.null <- base::is.null [18:01:47.600] muffled <- FALSE [18:01:47.600] if (inherits(cond, "message")) { [18:01:47.600] muffled <- grepl(pattern, "muffleMessage") [18:01:47.600] if (muffled) [18:01:47.600] invokeRestart("muffleMessage") [18:01:47.600] } [18:01:47.600] else if (inherits(cond, "warning")) { [18:01:47.600] muffled <- grepl(pattern, "muffleWarning") [18:01:47.600] if (muffled) [18:01:47.600] invokeRestart("muffleWarning") [18:01:47.600] } [18:01:47.600] else if (inherits(cond, "condition")) { [18:01:47.600] if (!is.null(pattern)) { [18:01:47.600] computeRestarts <- base::computeRestarts [18:01:47.600] grepl <- base::grepl [18:01:47.600] restarts <- computeRestarts(cond) [18:01:47.600] for (restart in restarts) { [18:01:47.600] name <- restart$name [18:01:47.600] if (is.null(name)) [18:01:47.600] next [18:01:47.600] if (!grepl(pattern, name)) [18:01:47.600] next [18:01:47.600] invokeRestart(restart) [18:01:47.600] muffled <- TRUE [18:01:47.600] break [18:01:47.600] } [18:01:47.600] } [18:01:47.600] } [18:01:47.600] invisible(muffled) [18:01:47.600] } [18:01:47.600] muffleCondition(cond, pattern = "^muffle") [18:01:47.600] } [18:01:47.600] } [18:01:47.600] } [18:01:47.600] })) [18:01:47.600] }, error = function(ex) { [18:01:47.600] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.600] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.600] ...future.rng), started = ...future.startTime, [18:01:47.600] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.600] version = "1.8"), class = "FutureResult") [18:01:47.600] }, finally = { [18:01:47.600] if (!identical(...future.workdir, getwd())) [18:01:47.600] setwd(...future.workdir) [18:01:47.600] { [18:01:47.600] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.600] ...future.oldOptions$nwarnings <- NULL [18:01:47.600] } [18:01:47.600] base::options(...future.oldOptions) [18:01:47.600] if (.Platform$OS.type == "windows") { [18:01:47.600] old_names <- names(...future.oldEnvVars) [18:01:47.600] envs <- base::Sys.getenv() [18:01:47.600] names <- names(envs) [18:01:47.600] common <- intersect(names, old_names) [18:01:47.600] added <- setdiff(names, old_names) [18:01:47.600] removed <- setdiff(old_names, names) [18:01:47.600] changed <- common[...future.oldEnvVars[common] != [18:01:47.600] envs[common]] [18:01:47.600] NAMES <- toupper(changed) [18:01:47.600] args <- list() [18:01:47.600] for (kk in seq_along(NAMES)) { [18:01:47.600] name <- changed[[kk]] [18:01:47.600] NAME <- NAMES[[kk]] [18:01:47.600] if (name != NAME && is.element(NAME, old_names)) [18:01:47.600] next [18:01:47.600] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.600] } [18:01:47.600] NAMES <- toupper(added) [18:01:47.600] for (kk in seq_along(NAMES)) { [18:01:47.600] name <- added[[kk]] [18:01:47.600] NAME <- NAMES[[kk]] [18:01:47.600] if (name != NAME && is.element(NAME, old_names)) [18:01:47.600] next [18:01:47.600] args[[name]] <- "" [18:01:47.600] } [18:01:47.600] NAMES <- toupper(removed) [18:01:47.600] for (kk in seq_along(NAMES)) { [18:01:47.600] name <- removed[[kk]] [18:01:47.600] NAME <- NAMES[[kk]] [18:01:47.600] if (name != NAME && is.element(NAME, old_names)) [18:01:47.600] next [18:01:47.600] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.600] } [18:01:47.600] if (length(args) > 0) [18:01:47.600] base::do.call(base::Sys.setenv, args = args) [18:01:47.600] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.600] } [18:01:47.600] else { [18:01:47.600] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.600] } [18:01:47.600] { [18:01:47.600] if (base::length(...future.futureOptionsAdded) > [18:01:47.600] 0L) { [18:01:47.600] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.600] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.600] base::options(opts) [18:01:47.600] } [18:01:47.600] { [18:01:47.600] { [18:01:47.600] NULL [18:01:47.600] RNGkind("Mersenne-Twister") [18:01:47.600] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.600] inherits = FALSE) [18:01:47.600] } [18:01:47.600] options(future.plan = NULL) [18:01:47.600] if (is.na(NA_character_)) [18:01:47.600] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.600] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.600] future::plan(list(function (..., envir = parent.frame()) [18:01:47.600] { [18:01:47.600] future <- SequentialFuture(..., envir = envir) [18:01:47.600] if (!future$lazy) [18:01:47.600] future <- run(future) [18:01:47.600] invisible(future) [18:01:47.600] }), .cleanup = FALSE, .init = FALSE) [18:01:47.600] } [18:01:47.600] } [18:01:47.600] } [18:01:47.600] }) [18:01:47.600] if (TRUE) { [18:01:47.600] base::sink(type = "output", split = FALSE) [18:01:47.600] if (TRUE) { [18:01:47.600] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.600] } [18:01:47.600] else { [18:01:47.600] ...future.result["stdout"] <- base::list(NULL) [18:01:47.600] } [18:01:47.600] base::close(...future.stdout) [18:01:47.600] ...future.stdout <- NULL [18:01:47.600] } [18:01:47.600] ...future.result$conditions <- ...future.conditions [18:01:47.600] ...future.result$finished <- base::Sys.time() [18:01:47.600] ...future.result [18:01:47.600] } [18:01:47.604] assign_globals() ... [18:01:47.604] List of 2 [18:01:47.604] $ weight: num [1:20] 4.17 5.58 5.18 6.11 4.5 4.61 5.17 4.53 5.33 5.14 ... [18:01:47.604] $ group : Factor w/ 2 levels "Ctl","Trt": 1 1 1 1 1 1 1 1 1 1 ... [18:01:47.604] - attr(*, "where")=List of 2 [18:01:47.604] ..$ weight: [18:01:47.604] ..$ group : [18:01:47.604] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.604] - attr(*, "resolved")= logi FALSE [18:01:47.604] - attr(*, "total_size")= num 896 [18:01:47.604] - attr(*, "already-done")= logi TRUE [18:01:47.608] - copied 'weight' to environment [18:01:47.608] - copied 'group' to environment [18:01:47.608] assign_globals() ... done [18:01:47.609] plan(): Setting new future strategy stack: [18:01:47.609] List of future strategies: [18:01:47.609] 1. sequential: [18:01:47.609] - args: function (..., envir = parent.frame()) [18:01:47.609] - tweaked: FALSE [18:01:47.609] - call: NULL [18:01:47.609] plan(): nbrOfWorkers() = 1 [18:01:47.613] plan(): Setting new future strategy stack: [18:01:47.613] List of future strategies: [18:01:47.613] 1. sequential: [18:01:47.613] - args: function (..., envir = parent.frame()) [18:01:47.613] - tweaked: FALSE [18:01:47.613] - call: plan(strategy) [18:01:47.613] plan(): nbrOfWorkers() = 1 [18:01:47.613] SequentialFuture started (and completed) [18:01:47.614] - Launch lazy future ... done [18:01:47.614] run() for 'SequentialFuture' ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:47.617] getGlobalsAndPackages() ... [18:01:47.617] Searching for globals... [18:01:47.619] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:47.619] Searching for globals ... DONE [18:01:47.619] Resolving globals: FALSE [18:01:47.620] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:47.620] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:47.620] - globals: [2] 'weight', 'group' [18:01:47.621] - packages: [1] 'stats' [18:01:47.621] getGlobalsAndPackages() ... DONE [18:01:47.621] run() for 'Future' ... [18:01:47.621] - state: 'created' [18:01:47.622] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.622] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.622] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.622] - Field: 'label' [18:01:47.622] - Field: 'local' [18:01:47.623] - Field: 'owner' [18:01:47.623] - Field: 'envir' [18:01:47.623] - Field: 'packages' [18:01:47.623] - Field: 'gc' [18:01:47.623] - Field: 'conditions' [18:01:47.624] - Field: 'expr' [18:01:47.624] - Field: 'uuid' [18:01:47.624] - Field: 'seed' [18:01:47.624] - Field: 'version' [18:01:47.624] - Field: 'result' [18:01:47.624] - Field: 'asynchronous' [18:01:47.625] - Field: 'calls' [18:01:47.625] - Field: 'globals' [18:01:47.625] - Field: 'stdout' [18:01:47.625] - Field: 'earlySignal' [18:01:47.625] - Field: 'lazy' [18:01:47.625] - Field: 'state' [18:01:47.626] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.626] - Launch lazy future ... [18:01:47.626] Packages needed by the future expression (n = 1): 'stats' [18:01:47.626] Packages needed by future strategies (n = 0): [18:01:47.627] { [18:01:47.627] { [18:01:47.627] { [18:01:47.627] ...future.startTime <- base::Sys.time() [18:01:47.627] { [18:01:47.627] { [18:01:47.627] { [18:01:47.627] { [18:01:47.627] base::local({ [18:01:47.627] has_future <- base::requireNamespace("future", [18:01:47.627] quietly = TRUE) [18:01:47.627] if (has_future) { [18:01:47.627] ns <- base::getNamespace("future") [18:01:47.627] version <- ns[[".package"]][["version"]] [18:01:47.627] if (is.null(version)) [18:01:47.627] version <- utils::packageVersion("future") [18:01:47.627] } [18:01:47.627] else { [18:01:47.627] version <- NULL [18:01:47.627] } [18:01:47.627] if (!has_future || version < "1.8.0") { [18:01:47.627] info <- base::c(r_version = base::gsub("R version ", [18:01:47.627] "", base::R.version$version.string), [18:01:47.627] platform = base::sprintf("%s (%s-bit)", [18:01:47.627] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.627] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.627] "release", "version")], collapse = " "), [18:01:47.627] hostname = base::Sys.info()[["nodename"]]) [18:01:47.627] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.627] info) [18:01:47.627] info <- base::paste(info, collapse = "; ") [18:01:47.627] if (!has_future) { [18:01:47.627] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.627] info) [18:01:47.627] } [18:01:47.627] else { [18:01:47.627] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.627] info, version) [18:01:47.627] } [18:01:47.627] base::stop(msg) [18:01:47.627] } [18:01:47.627] }) [18:01:47.627] } [18:01:47.627] base::local({ [18:01:47.627] for (pkg in "stats") { [18:01:47.627] base::loadNamespace(pkg) [18:01:47.627] base::library(pkg, character.only = TRUE) [18:01:47.627] } [18:01:47.627] }) [18:01:47.627] } [18:01:47.627] options(future.plan = NULL) [18:01:47.627] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.627] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.627] } [18:01:47.627] ...future.workdir <- getwd() [18:01:47.627] } [18:01:47.627] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.627] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.627] } [18:01:47.627] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.627] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.627] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.627] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.627] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.627] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.627] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.627] base::names(...future.oldOptions)) [18:01:47.627] } [18:01:47.627] if (FALSE) { [18:01:47.627] } [18:01:47.627] else { [18:01:47.627] if (TRUE) { [18:01:47.627] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.627] open = "w") [18:01:47.627] } [18:01:47.627] else { [18:01:47.627] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.627] windows = "NUL", "/dev/null"), open = "w") [18:01:47.627] } [18:01:47.627] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.627] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.627] base::sink(type = "output", split = FALSE) [18:01:47.627] base::close(...future.stdout) [18:01:47.627] }, add = TRUE) [18:01:47.627] } [18:01:47.627] ...future.frame <- base::sys.nframe() [18:01:47.627] ...future.conditions <- base::list() [18:01:47.627] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.627] if (FALSE) { [18:01:47.627] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.627] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.627] } [18:01:47.627] ...future.result <- base::tryCatch({ [18:01:47.627] base::withCallingHandlers({ [18:01:47.627] ...future.value <- base::withVisible(base::local({ [18:01:47.627] lm(weight ~ group - 1) [18:01:47.627] })) [18:01:47.627] future::FutureResult(value = ...future.value$value, [18:01:47.627] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.627] ...future.rng), globalenv = if (FALSE) [18:01:47.627] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.627] ...future.globalenv.names)) [18:01:47.627] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.627] }, condition = base::local({ [18:01:47.627] c <- base::c [18:01:47.627] inherits <- base::inherits [18:01:47.627] invokeRestart <- base::invokeRestart [18:01:47.627] length <- base::length [18:01:47.627] list <- base::list [18:01:47.627] seq.int <- base::seq.int [18:01:47.627] signalCondition <- base::signalCondition [18:01:47.627] sys.calls <- base::sys.calls [18:01:47.627] `[[` <- base::`[[` [18:01:47.627] `+` <- base::`+` [18:01:47.627] `<<-` <- base::`<<-` [18:01:47.627] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.627] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.627] 3L)] [18:01:47.627] } [18:01:47.627] function(cond) { [18:01:47.627] is_error <- inherits(cond, "error") [18:01:47.627] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.627] NULL) [18:01:47.627] if (is_error) { [18:01:47.627] sessionInformation <- function() { [18:01:47.627] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.627] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.627] search = base::search(), system = base::Sys.info()) [18:01:47.627] } [18:01:47.627] ...future.conditions[[length(...future.conditions) + [18:01:47.627] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.627] cond$call), session = sessionInformation(), [18:01:47.627] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.627] signalCondition(cond) [18:01:47.627] } [18:01:47.627] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.627] "immediateCondition"))) { [18:01:47.627] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.627] ...future.conditions[[length(...future.conditions) + [18:01:47.627] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.627] if (TRUE && !signal) { [18:01:47.627] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.627] { [18:01:47.627] inherits <- base::inherits [18:01:47.627] invokeRestart <- base::invokeRestart [18:01:47.627] is.null <- base::is.null [18:01:47.627] muffled <- FALSE [18:01:47.627] if (inherits(cond, "message")) { [18:01:47.627] muffled <- grepl(pattern, "muffleMessage") [18:01:47.627] if (muffled) [18:01:47.627] invokeRestart("muffleMessage") [18:01:47.627] } [18:01:47.627] else if (inherits(cond, "warning")) { [18:01:47.627] muffled <- grepl(pattern, "muffleWarning") [18:01:47.627] if (muffled) [18:01:47.627] invokeRestart("muffleWarning") [18:01:47.627] } [18:01:47.627] else if (inherits(cond, "condition")) { [18:01:47.627] if (!is.null(pattern)) { [18:01:47.627] computeRestarts <- base::computeRestarts [18:01:47.627] grepl <- base::grepl [18:01:47.627] restarts <- computeRestarts(cond) [18:01:47.627] for (restart in restarts) { [18:01:47.627] name <- restart$name [18:01:47.627] if (is.null(name)) [18:01:47.627] next [18:01:47.627] if (!grepl(pattern, name)) [18:01:47.627] next [18:01:47.627] invokeRestart(restart) [18:01:47.627] muffled <- TRUE [18:01:47.627] break [18:01:47.627] } [18:01:47.627] } [18:01:47.627] } [18:01:47.627] invisible(muffled) [18:01:47.627] } [18:01:47.627] muffleCondition(cond, pattern = "^muffle") [18:01:47.627] } [18:01:47.627] } [18:01:47.627] else { [18:01:47.627] if (TRUE) { [18:01:47.627] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.627] { [18:01:47.627] inherits <- base::inherits [18:01:47.627] invokeRestart <- base::invokeRestart [18:01:47.627] is.null <- base::is.null [18:01:47.627] muffled <- FALSE [18:01:47.627] if (inherits(cond, "message")) { [18:01:47.627] muffled <- grepl(pattern, "muffleMessage") [18:01:47.627] if (muffled) [18:01:47.627] invokeRestart("muffleMessage") [18:01:47.627] } [18:01:47.627] else if (inherits(cond, "warning")) { [18:01:47.627] muffled <- grepl(pattern, "muffleWarning") [18:01:47.627] if (muffled) [18:01:47.627] invokeRestart("muffleWarning") [18:01:47.627] } [18:01:47.627] else if (inherits(cond, "condition")) { [18:01:47.627] if (!is.null(pattern)) { [18:01:47.627] computeRestarts <- base::computeRestarts [18:01:47.627] grepl <- base::grepl [18:01:47.627] restarts <- computeRestarts(cond) [18:01:47.627] for (restart in restarts) { [18:01:47.627] name <- restart$name [18:01:47.627] if (is.null(name)) [18:01:47.627] next [18:01:47.627] if (!grepl(pattern, name)) [18:01:47.627] next [18:01:47.627] invokeRestart(restart) [18:01:47.627] muffled <- TRUE [18:01:47.627] break [18:01:47.627] } [18:01:47.627] } [18:01:47.627] } [18:01:47.627] invisible(muffled) [18:01:47.627] } [18:01:47.627] muffleCondition(cond, pattern = "^muffle") [18:01:47.627] } [18:01:47.627] } [18:01:47.627] } [18:01:47.627] })) [18:01:47.627] }, error = function(ex) { [18:01:47.627] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.627] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.627] ...future.rng), started = ...future.startTime, [18:01:47.627] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.627] version = "1.8"), class = "FutureResult") [18:01:47.627] }, finally = { [18:01:47.627] if (!identical(...future.workdir, getwd())) [18:01:47.627] setwd(...future.workdir) [18:01:47.627] { [18:01:47.627] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.627] ...future.oldOptions$nwarnings <- NULL [18:01:47.627] } [18:01:47.627] base::options(...future.oldOptions) [18:01:47.627] if (.Platform$OS.type == "windows") { [18:01:47.627] old_names <- names(...future.oldEnvVars) [18:01:47.627] envs <- base::Sys.getenv() [18:01:47.627] names <- names(envs) [18:01:47.627] common <- intersect(names, old_names) [18:01:47.627] added <- setdiff(names, old_names) [18:01:47.627] removed <- setdiff(old_names, names) [18:01:47.627] changed <- common[...future.oldEnvVars[common] != [18:01:47.627] envs[common]] [18:01:47.627] NAMES <- toupper(changed) [18:01:47.627] args <- list() [18:01:47.627] for (kk in seq_along(NAMES)) { [18:01:47.627] name <- changed[[kk]] [18:01:47.627] NAME <- NAMES[[kk]] [18:01:47.627] if (name != NAME && is.element(NAME, old_names)) [18:01:47.627] next [18:01:47.627] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.627] } [18:01:47.627] NAMES <- toupper(added) [18:01:47.627] for (kk in seq_along(NAMES)) { [18:01:47.627] name <- added[[kk]] [18:01:47.627] NAME <- NAMES[[kk]] [18:01:47.627] if (name != NAME && is.element(NAME, old_names)) [18:01:47.627] next [18:01:47.627] args[[name]] <- "" [18:01:47.627] } [18:01:47.627] NAMES <- toupper(removed) [18:01:47.627] for (kk in seq_along(NAMES)) { [18:01:47.627] name <- removed[[kk]] [18:01:47.627] NAME <- NAMES[[kk]] [18:01:47.627] if (name != NAME && is.element(NAME, old_names)) [18:01:47.627] next [18:01:47.627] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.627] } [18:01:47.627] if (length(args) > 0) [18:01:47.627] base::do.call(base::Sys.setenv, args = args) [18:01:47.627] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.627] } [18:01:47.627] else { [18:01:47.627] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.627] } [18:01:47.627] { [18:01:47.627] if (base::length(...future.futureOptionsAdded) > [18:01:47.627] 0L) { [18:01:47.627] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.627] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.627] base::options(opts) [18:01:47.627] } [18:01:47.627] { [18:01:47.627] { [18:01:47.627] NULL [18:01:47.627] RNGkind("Mersenne-Twister") [18:01:47.627] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.627] inherits = FALSE) [18:01:47.627] } [18:01:47.627] options(future.plan = NULL) [18:01:47.627] if (is.na(NA_character_)) [18:01:47.627] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.627] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.627] future::plan(list(function (..., envir = parent.frame()) [18:01:47.627] { [18:01:47.627] future <- SequentialFuture(..., envir = envir) [18:01:47.627] if (!future$lazy) [18:01:47.627] future <- run(future) [18:01:47.627] invisible(future) [18:01:47.627] }), .cleanup = FALSE, .init = FALSE) [18:01:47.627] } [18:01:47.627] } [18:01:47.627] } [18:01:47.627] }) [18:01:47.627] if (TRUE) { [18:01:47.627] base::sink(type = "output", split = FALSE) [18:01:47.627] if (TRUE) { [18:01:47.627] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.627] } [18:01:47.627] else { [18:01:47.627] ...future.result["stdout"] <- base::list(NULL) [18:01:47.627] } [18:01:47.627] base::close(...future.stdout) [18:01:47.627] ...future.stdout <- NULL [18:01:47.627] } [18:01:47.627] ...future.result$conditions <- ...future.conditions [18:01:47.627] ...future.result$finished <- base::Sys.time() [18:01:47.627] ...future.result [18:01:47.627] } [18:01:47.631] assign_globals() ... [18:01:47.631] List of 2 [18:01:47.631] $ weight: num [1:20] 4.17 5.58 5.18 6.11 4.5 4.61 5.17 4.53 5.33 5.14 ... [18:01:47.631] $ group : Factor w/ 2 levels "Ctl","Trt": 1 1 1 1 1 1 1 1 1 1 ... [18:01:47.631] - attr(*, "where")=List of 2 [18:01:47.631] ..$ weight: [18:01:47.631] ..$ group : [18:01:47.631] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.631] - attr(*, "resolved")= logi FALSE [18:01:47.631] - attr(*, "total_size")= num 896 [18:01:47.631] - attr(*, "already-done")= logi TRUE [18:01:47.635] - copied 'weight' to environment [18:01:47.635] - copied 'group' to environment [18:01:47.635] assign_globals() ... done [18:01:47.635] plan(): Setting new future strategy stack: [18:01:47.636] List of future strategies: [18:01:47.636] 1. sequential: [18:01:47.636] - args: function (..., envir = parent.frame()) [18:01:47.636] - tweaked: FALSE [18:01:47.636] - call: NULL [18:01:47.636] plan(): nbrOfWorkers() = 1 [18:01:47.638] plan(): Setting new future strategy stack: [18:01:47.638] List of future strategies: [18:01:47.638] 1. sequential: [18:01:47.638] - args: function (..., envir = parent.frame()) [18:01:47.638] - tweaked: FALSE [18:01:47.638] - call: plan(strategy) [18:01:47.639] plan(): nbrOfWorkers() = 1 [18:01:47.639] SequentialFuture started (and completed) [18:01:47.639] - Launch lazy future ... done [18:01:47.639] run() for 'SequentialFuture' ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:47.642] getGlobalsAndPackages() ... [18:01:47.642] Searching for globals... [18:01:47.644] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:47.645] Searching for globals ... DONE [18:01:47.645] Resolving globals: FALSE [18:01:47.645] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:47.646] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:47.646] - globals: [2] 'weight', 'group' [18:01:47.646] - packages: [1] 'stats' [18:01:47.647] getGlobalsAndPackages() ... DONE [18:01:47.647] run() for 'Future' ... [18:01:47.647] - state: 'created' [18:01:47.647] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.648] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.648] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.648] - Field: 'label' [18:01:47.648] - Field: 'local' [18:01:47.648] - Field: 'owner' [18:01:47.649] - Field: 'envir' [18:01:47.649] - Field: 'packages' [18:01:47.649] - Field: 'gc' [18:01:47.649] - Field: 'conditions' [18:01:47.649] - Field: 'expr' [18:01:47.649] - Field: 'uuid' [18:01:47.650] - Field: 'seed' [18:01:47.650] - Field: 'version' [18:01:47.650] - Field: 'result' [18:01:47.650] - Field: 'asynchronous' [18:01:47.650] - Field: 'calls' [18:01:47.650] - Field: 'globals' [18:01:47.651] - Field: 'stdout' [18:01:47.651] - Field: 'earlySignal' [18:01:47.651] - Field: 'lazy' [18:01:47.651] - Field: 'state' [18:01:47.651] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.651] - Launch lazy future ... [18:01:47.652] Packages needed by the future expression (n = 1): 'stats' [18:01:47.652] Packages needed by future strategies (n = 0): [18:01:47.653] { [18:01:47.653] { [18:01:47.653] { [18:01:47.653] ...future.startTime <- base::Sys.time() [18:01:47.653] { [18:01:47.653] { [18:01:47.653] { [18:01:47.653] { [18:01:47.653] base::local({ [18:01:47.653] has_future <- base::requireNamespace("future", [18:01:47.653] quietly = TRUE) [18:01:47.653] if (has_future) { [18:01:47.653] ns <- base::getNamespace("future") [18:01:47.653] version <- ns[[".package"]][["version"]] [18:01:47.653] if (is.null(version)) [18:01:47.653] version <- utils::packageVersion("future") [18:01:47.653] } [18:01:47.653] else { [18:01:47.653] version <- NULL [18:01:47.653] } [18:01:47.653] if (!has_future || version < "1.8.0") { [18:01:47.653] info <- base::c(r_version = base::gsub("R version ", [18:01:47.653] "", base::R.version$version.string), [18:01:47.653] platform = base::sprintf("%s (%s-bit)", [18:01:47.653] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.653] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.653] "release", "version")], collapse = " "), [18:01:47.653] hostname = base::Sys.info()[["nodename"]]) [18:01:47.653] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.653] info) [18:01:47.653] info <- base::paste(info, collapse = "; ") [18:01:47.653] if (!has_future) { [18:01:47.653] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.653] info) [18:01:47.653] } [18:01:47.653] else { [18:01:47.653] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.653] info, version) [18:01:47.653] } [18:01:47.653] base::stop(msg) [18:01:47.653] } [18:01:47.653] }) [18:01:47.653] } [18:01:47.653] base::local({ [18:01:47.653] for (pkg in "stats") { [18:01:47.653] base::loadNamespace(pkg) [18:01:47.653] base::library(pkg, character.only = TRUE) [18:01:47.653] } [18:01:47.653] }) [18:01:47.653] } [18:01:47.653] options(future.plan = NULL) [18:01:47.653] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.653] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.653] } [18:01:47.653] ...future.workdir <- getwd() [18:01:47.653] } [18:01:47.653] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.653] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.653] } [18:01:47.653] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.653] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.653] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.653] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.653] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.653] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.653] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.653] base::names(...future.oldOptions)) [18:01:47.653] } [18:01:47.653] if (FALSE) { [18:01:47.653] } [18:01:47.653] else { [18:01:47.653] if (TRUE) { [18:01:47.653] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.653] open = "w") [18:01:47.653] } [18:01:47.653] else { [18:01:47.653] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.653] windows = "NUL", "/dev/null"), open = "w") [18:01:47.653] } [18:01:47.653] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.653] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.653] base::sink(type = "output", split = FALSE) [18:01:47.653] base::close(...future.stdout) [18:01:47.653] }, add = TRUE) [18:01:47.653] } [18:01:47.653] ...future.frame <- base::sys.nframe() [18:01:47.653] ...future.conditions <- base::list() [18:01:47.653] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.653] if (FALSE) { [18:01:47.653] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.653] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.653] } [18:01:47.653] ...future.result <- base::tryCatch({ [18:01:47.653] base::withCallingHandlers({ [18:01:47.653] ...future.value <- base::withVisible(base::local({ [18:01:47.653] lm(weight ~ group - 1) [18:01:47.653] })) [18:01:47.653] future::FutureResult(value = ...future.value$value, [18:01:47.653] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.653] ...future.rng), globalenv = if (FALSE) [18:01:47.653] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.653] ...future.globalenv.names)) [18:01:47.653] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.653] }, condition = base::local({ [18:01:47.653] c <- base::c [18:01:47.653] inherits <- base::inherits [18:01:47.653] invokeRestart <- base::invokeRestart [18:01:47.653] length <- base::length [18:01:47.653] list <- base::list [18:01:47.653] seq.int <- base::seq.int [18:01:47.653] signalCondition <- base::signalCondition [18:01:47.653] sys.calls <- base::sys.calls [18:01:47.653] `[[` <- base::`[[` [18:01:47.653] `+` <- base::`+` [18:01:47.653] `<<-` <- base::`<<-` [18:01:47.653] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.653] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.653] 3L)] [18:01:47.653] } [18:01:47.653] function(cond) { [18:01:47.653] is_error <- inherits(cond, "error") [18:01:47.653] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.653] NULL) [18:01:47.653] if (is_error) { [18:01:47.653] sessionInformation <- function() { [18:01:47.653] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.653] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.653] search = base::search(), system = base::Sys.info()) [18:01:47.653] } [18:01:47.653] ...future.conditions[[length(...future.conditions) + [18:01:47.653] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.653] cond$call), session = sessionInformation(), [18:01:47.653] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.653] signalCondition(cond) [18:01:47.653] } [18:01:47.653] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.653] "immediateCondition"))) { [18:01:47.653] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.653] ...future.conditions[[length(...future.conditions) + [18:01:47.653] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.653] if (TRUE && !signal) { [18:01:47.653] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.653] { [18:01:47.653] inherits <- base::inherits [18:01:47.653] invokeRestart <- base::invokeRestart [18:01:47.653] is.null <- base::is.null [18:01:47.653] muffled <- FALSE [18:01:47.653] if (inherits(cond, "message")) { [18:01:47.653] muffled <- grepl(pattern, "muffleMessage") [18:01:47.653] if (muffled) [18:01:47.653] invokeRestart("muffleMessage") [18:01:47.653] } [18:01:47.653] else if (inherits(cond, "warning")) { [18:01:47.653] muffled <- grepl(pattern, "muffleWarning") [18:01:47.653] if (muffled) [18:01:47.653] invokeRestart("muffleWarning") [18:01:47.653] } [18:01:47.653] else if (inherits(cond, "condition")) { [18:01:47.653] if (!is.null(pattern)) { [18:01:47.653] computeRestarts <- base::computeRestarts [18:01:47.653] grepl <- base::grepl [18:01:47.653] restarts <- computeRestarts(cond) [18:01:47.653] for (restart in restarts) { [18:01:47.653] name <- restart$name [18:01:47.653] if (is.null(name)) [18:01:47.653] next [18:01:47.653] if (!grepl(pattern, name)) [18:01:47.653] next [18:01:47.653] invokeRestart(restart) [18:01:47.653] muffled <- TRUE [18:01:47.653] break [18:01:47.653] } [18:01:47.653] } [18:01:47.653] } [18:01:47.653] invisible(muffled) [18:01:47.653] } [18:01:47.653] muffleCondition(cond, pattern = "^muffle") [18:01:47.653] } [18:01:47.653] } [18:01:47.653] else { [18:01:47.653] if (TRUE) { [18:01:47.653] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.653] { [18:01:47.653] inherits <- base::inherits [18:01:47.653] invokeRestart <- base::invokeRestart [18:01:47.653] is.null <- base::is.null [18:01:47.653] muffled <- FALSE [18:01:47.653] if (inherits(cond, "message")) { [18:01:47.653] muffled <- grepl(pattern, "muffleMessage") [18:01:47.653] if (muffled) [18:01:47.653] invokeRestart("muffleMessage") [18:01:47.653] } [18:01:47.653] else if (inherits(cond, "warning")) { [18:01:47.653] muffled <- grepl(pattern, "muffleWarning") [18:01:47.653] if (muffled) [18:01:47.653] invokeRestart("muffleWarning") [18:01:47.653] } [18:01:47.653] else if (inherits(cond, "condition")) { [18:01:47.653] if (!is.null(pattern)) { [18:01:47.653] computeRestarts <- base::computeRestarts [18:01:47.653] grepl <- base::grepl [18:01:47.653] restarts <- computeRestarts(cond) [18:01:47.653] for (restart in restarts) { [18:01:47.653] name <- restart$name [18:01:47.653] if (is.null(name)) [18:01:47.653] next [18:01:47.653] if (!grepl(pattern, name)) [18:01:47.653] next [18:01:47.653] invokeRestart(restart) [18:01:47.653] muffled <- TRUE [18:01:47.653] break [18:01:47.653] } [18:01:47.653] } [18:01:47.653] } [18:01:47.653] invisible(muffled) [18:01:47.653] } [18:01:47.653] muffleCondition(cond, pattern = "^muffle") [18:01:47.653] } [18:01:47.653] } [18:01:47.653] } [18:01:47.653] })) [18:01:47.653] }, error = function(ex) { [18:01:47.653] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.653] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.653] ...future.rng), started = ...future.startTime, [18:01:47.653] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.653] version = "1.8"), class = "FutureResult") [18:01:47.653] }, finally = { [18:01:47.653] if (!identical(...future.workdir, getwd())) [18:01:47.653] setwd(...future.workdir) [18:01:47.653] { [18:01:47.653] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.653] ...future.oldOptions$nwarnings <- NULL [18:01:47.653] } [18:01:47.653] base::options(...future.oldOptions) [18:01:47.653] if (.Platform$OS.type == "windows") { [18:01:47.653] old_names <- names(...future.oldEnvVars) [18:01:47.653] envs <- base::Sys.getenv() [18:01:47.653] names <- names(envs) [18:01:47.653] common <- intersect(names, old_names) [18:01:47.653] added <- setdiff(names, old_names) [18:01:47.653] removed <- setdiff(old_names, names) [18:01:47.653] changed <- common[...future.oldEnvVars[common] != [18:01:47.653] envs[common]] [18:01:47.653] NAMES <- toupper(changed) [18:01:47.653] args <- list() [18:01:47.653] for (kk in seq_along(NAMES)) { [18:01:47.653] name <- changed[[kk]] [18:01:47.653] NAME <- NAMES[[kk]] [18:01:47.653] if (name != NAME && is.element(NAME, old_names)) [18:01:47.653] next [18:01:47.653] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.653] } [18:01:47.653] NAMES <- toupper(added) [18:01:47.653] for (kk in seq_along(NAMES)) { [18:01:47.653] name <- added[[kk]] [18:01:47.653] NAME <- NAMES[[kk]] [18:01:47.653] if (name != NAME && is.element(NAME, old_names)) [18:01:47.653] next [18:01:47.653] args[[name]] <- "" [18:01:47.653] } [18:01:47.653] NAMES <- toupper(removed) [18:01:47.653] for (kk in seq_along(NAMES)) { [18:01:47.653] name <- removed[[kk]] [18:01:47.653] NAME <- NAMES[[kk]] [18:01:47.653] if (name != NAME && is.element(NAME, old_names)) [18:01:47.653] next [18:01:47.653] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.653] } [18:01:47.653] if (length(args) > 0) [18:01:47.653] base::do.call(base::Sys.setenv, args = args) [18:01:47.653] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.653] } [18:01:47.653] else { [18:01:47.653] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.653] } [18:01:47.653] { [18:01:47.653] if (base::length(...future.futureOptionsAdded) > [18:01:47.653] 0L) { [18:01:47.653] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.653] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.653] base::options(opts) [18:01:47.653] } [18:01:47.653] { [18:01:47.653] { [18:01:47.653] NULL [18:01:47.653] RNGkind("Mersenne-Twister") [18:01:47.653] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.653] inherits = FALSE) [18:01:47.653] } [18:01:47.653] options(future.plan = NULL) [18:01:47.653] if (is.na(NA_character_)) [18:01:47.653] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.653] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.653] future::plan(list(function (..., envir = parent.frame()) [18:01:47.653] { [18:01:47.653] future <- SequentialFuture(..., envir = envir) [18:01:47.653] if (!future$lazy) [18:01:47.653] future <- run(future) [18:01:47.653] invisible(future) [18:01:47.653] }), .cleanup = FALSE, .init = FALSE) [18:01:47.653] } [18:01:47.653] } [18:01:47.653] } [18:01:47.653] }) [18:01:47.653] if (TRUE) { [18:01:47.653] base::sink(type = "output", split = FALSE) [18:01:47.653] if (TRUE) { [18:01:47.653] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.653] } [18:01:47.653] else { [18:01:47.653] ...future.result["stdout"] <- base::list(NULL) [18:01:47.653] } [18:01:47.653] base::close(...future.stdout) [18:01:47.653] ...future.stdout <- NULL [18:01:47.653] } [18:01:47.653] ...future.result$conditions <- ...future.conditions [18:01:47.653] ...future.result$finished <- base::Sys.time() [18:01:47.653] ...future.result [18:01:47.653] } [18:01:47.656] assign_globals() ... [18:01:47.656] List of 2 [18:01:47.656] $ weight: num [1:20] 4.17 5.58 5.18 6.11 4.5 4.61 5.17 4.53 5.33 5.14 ... [18:01:47.656] $ group : Factor w/ 2 levels "Ctl","Trt": 1 1 1 1 1 1 1 1 1 1 ... [18:01:47.656] - attr(*, "where")=List of 2 [18:01:47.656] ..$ weight: [18:01:47.656] ..$ group : [18:01:47.656] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.656] - attr(*, "resolved")= logi FALSE [18:01:47.656] - attr(*, "total_size")= num 896 [18:01:47.656] - attr(*, "already-done")= logi TRUE [18:01:47.660] - copied 'weight' to environment [18:01:47.660] - copied 'group' to environment [18:01:47.661] assign_globals() ... done [18:01:47.661] plan(): Setting new future strategy stack: [18:01:47.661] List of future strategies: [18:01:47.661] 1. sequential: [18:01:47.661] - args: function (..., envir = parent.frame()) [18:01:47.661] - tweaked: FALSE [18:01:47.661] - call: NULL [18:01:47.662] plan(): nbrOfWorkers() = 1 [18:01:47.664] plan(): Setting new future strategy stack: [18:01:47.664] List of future strategies: [18:01:47.664] 1. sequential: [18:01:47.664] - args: function (..., envir = parent.frame()) [18:01:47.664] - tweaked: FALSE [18:01:47.664] - call: plan(strategy) [18:01:47.664] plan(): nbrOfWorkers() = 1 [18:01:47.665] SequentialFuture started (and completed) [18:01:47.665] - Launch lazy future ... done [18:01:47.665] run() for 'SequentialFuture' ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:47.667] getGlobalsAndPackages() ... [18:01:47.667] Searching for globals... [18:01:47.669] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:47.669] Searching for globals ... DONE [18:01:47.669] Resolving globals: FALSE [18:01:47.670] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:47.671] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:47.671] - globals: [2] 'weight', 'group' [18:01:47.671] - packages: [1] 'stats' [18:01:47.671] getGlobalsAndPackages() ... DONE [18:01:47.672] run() for 'Future' ... [18:01:47.672] - state: 'created' [18:01:47.672] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.672] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.673] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.673] - Field: 'label' [18:01:47.673] - Field: 'local' [18:01:47.673] - Field: 'owner' [18:01:47.673] - Field: 'envir' [18:01:47.673] - Field: 'packages' [18:01:47.674] - Field: 'gc' [18:01:47.674] - Field: 'conditions' [18:01:47.674] - Field: 'expr' [18:01:47.674] - Field: 'uuid' [18:01:47.674] - Field: 'seed' [18:01:47.674] - Field: 'version' [18:01:47.675] - Field: 'result' [18:01:47.676] - Field: 'asynchronous' [18:01:47.676] - Field: 'calls' [18:01:47.676] - Field: 'globals' [18:01:47.676] - Field: 'stdout' [18:01:47.676] - Field: 'earlySignal' [18:01:47.676] - Field: 'lazy' [18:01:47.677] - Field: 'state' [18:01:47.677] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.677] - Launch lazy future ... [18:01:47.677] Packages needed by the future expression (n = 1): 'stats' [18:01:47.677] Packages needed by future strategies (n = 0): [18:01:47.678] { [18:01:47.678] { [18:01:47.678] { [18:01:47.678] ...future.startTime <- base::Sys.time() [18:01:47.678] { [18:01:47.678] { [18:01:47.678] { [18:01:47.678] { [18:01:47.678] base::local({ [18:01:47.678] has_future <- base::requireNamespace("future", [18:01:47.678] quietly = TRUE) [18:01:47.678] if (has_future) { [18:01:47.678] ns <- base::getNamespace("future") [18:01:47.678] version <- ns[[".package"]][["version"]] [18:01:47.678] if (is.null(version)) [18:01:47.678] version <- utils::packageVersion("future") [18:01:47.678] } [18:01:47.678] else { [18:01:47.678] version <- NULL [18:01:47.678] } [18:01:47.678] if (!has_future || version < "1.8.0") { [18:01:47.678] info <- base::c(r_version = base::gsub("R version ", [18:01:47.678] "", base::R.version$version.string), [18:01:47.678] platform = base::sprintf("%s (%s-bit)", [18:01:47.678] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.678] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.678] "release", "version")], collapse = " "), [18:01:47.678] hostname = base::Sys.info()[["nodename"]]) [18:01:47.678] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.678] info) [18:01:47.678] info <- base::paste(info, collapse = "; ") [18:01:47.678] if (!has_future) { [18:01:47.678] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.678] info) [18:01:47.678] } [18:01:47.678] else { [18:01:47.678] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.678] info, version) [18:01:47.678] } [18:01:47.678] base::stop(msg) [18:01:47.678] } [18:01:47.678] }) [18:01:47.678] } [18:01:47.678] base::local({ [18:01:47.678] for (pkg in "stats") { [18:01:47.678] base::loadNamespace(pkg) [18:01:47.678] base::library(pkg, character.only = TRUE) [18:01:47.678] } [18:01:47.678] }) [18:01:47.678] } [18:01:47.678] options(future.plan = NULL) [18:01:47.678] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.678] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.678] } [18:01:47.678] ...future.workdir <- getwd() [18:01:47.678] } [18:01:47.678] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.678] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.678] } [18:01:47.678] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.678] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.678] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.678] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.678] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.678] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.678] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.678] base::names(...future.oldOptions)) [18:01:47.678] } [18:01:47.678] if (FALSE) { [18:01:47.678] } [18:01:47.678] else { [18:01:47.678] if (TRUE) { [18:01:47.678] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.678] open = "w") [18:01:47.678] } [18:01:47.678] else { [18:01:47.678] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.678] windows = "NUL", "/dev/null"), open = "w") [18:01:47.678] } [18:01:47.678] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.678] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.678] base::sink(type = "output", split = FALSE) [18:01:47.678] base::close(...future.stdout) [18:01:47.678] }, add = TRUE) [18:01:47.678] } [18:01:47.678] ...future.frame <- base::sys.nframe() [18:01:47.678] ...future.conditions <- base::list() [18:01:47.678] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.678] if (FALSE) { [18:01:47.678] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.678] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.678] } [18:01:47.678] ...future.result <- base::tryCatch({ [18:01:47.678] base::withCallingHandlers({ [18:01:47.678] ...future.value <- base::withVisible(base::local({ [18:01:47.678] lm(weight ~ group - 1) [18:01:47.678] })) [18:01:47.678] future::FutureResult(value = ...future.value$value, [18:01:47.678] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.678] ...future.rng), globalenv = if (FALSE) [18:01:47.678] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.678] ...future.globalenv.names)) [18:01:47.678] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.678] }, condition = base::local({ [18:01:47.678] c <- base::c [18:01:47.678] inherits <- base::inherits [18:01:47.678] invokeRestart <- base::invokeRestart [18:01:47.678] length <- base::length [18:01:47.678] list <- base::list [18:01:47.678] seq.int <- base::seq.int [18:01:47.678] signalCondition <- base::signalCondition [18:01:47.678] sys.calls <- base::sys.calls [18:01:47.678] `[[` <- base::`[[` [18:01:47.678] `+` <- base::`+` [18:01:47.678] `<<-` <- base::`<<-` [18:01:47.678] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.678] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.678] 3L)] [18:01:47.678] } [18:01:47.678] function(cond) { [18:01:47.678] is_error <- inherits(cond, "error") [18:01:47.678] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.678] NULL) [18:01:47.678] if (is_error) { [18:01:47.678] sessionInformation <- function() { [18:01:47.678] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.678] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.678] search = base::search(), system = base::Sys.info()) [18:01:47.678] } [18:01:47.678] ...future.conditions[[length(...future.conditions) + [18:01:47.678] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.678] cond$call), session = sessionInformation(), [18:01:47.678] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.678] signalCondition(cond) [18:01:47.678] } [18:01:47.678] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.678] "immediateCondition"))) { [18:01:47.678] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.678] ...future.conditions[[length(...future.conditions) + [18:01:47.678] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.678] if (TRUE && !signal) { [18:01:47.678] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.678] { [18:01:47.678] inherits <- base::inherits [18:01:47.678] invokeRestart <- base::invokeRestart [18:01:47.678] is.null <- base::is.null [18:01:47.678] muffled <- FALSE [18:01:47.678] if (inherits(cond, "message")) { [18:01:47.678] muffled <- grepl(pattern, "muffleMessage") [18:01:47.678] if (muffled) [18:01:47.678] invokeRestart("muffleMessage") [18:01:47.678] } [18:01:47.678] else if (inherits(cond, "warning")) { [18:01:47.678] muffled <- grepl(pattern, "muffleWarning") [18:01:47.678] if (muffled) [18:01:47.678] invokeRestart("muffleWarning") [18:01:47.678] } [18:01:47.678] else if (inherits(cond, "condition")) { [18:01:47.678] if (!is.null(pattern)) { [18:01:47.678] computeRestarts <- base::computeRestarts [18:01:47.678] grepl <- base::grepl [18:01:47.678] restarts <- computeRestarts(cond) [18:01:47.678] for (restart in restarts) { [18:01:47.678] name <- restart$name [18:01:47.678] if (is.null(name)) [18:01:47.678] next [18:01:47.678] if (!grepl(pattern, name)) [18:01:47.678] next [18:01:47.678] invokeRestart(restart) [18:01:47.678] muffled <- TRUE [18:01:47.678] break [18:01:47.678] } [18:01:47.678] } [18:01:47.678] } [18:01:47.678] invisible(muffled) [18:01:47.678] } [18:01:47.678] muffleCondition(cond, pattern = "^muffle") [18:01:47.678] } [18:01:47.678] } [18:01:47.678] else { [18:01:47.678] if (TRUE) { [18:01:47.678] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.678] { [18:01:47.678] inherits <- base::inherits [18:01:47.678] invokeRestart <- base::invokeRestart [18:01:47.678] is.null <- base::is.null [18:01:47.678] muffled <- FALSE [18:01:47.678] if (inherits(cond, "message")) { [18:01:47.678] muffled <- grepl(pattern, "muffleMessage") [18:01:47.678] if (muffled) [18:01:47.678] invokeRestart("muffleMessage") [18:01:47.678] } [18:01:47.678] else if (inherits(cond, "warning")) { [18:01:47.678] muffled <- grepl(pattern, "muffleWarning") [18:01:47.678] if (muffled) [18:01:47.678] invokeRestart("muffleWarning") [18:01:47.678] } [18:01:47.678] else if (inherits(cond, "condition")) { [18:01:47.678] if (!is.null(pattern)) { [18:01:47.678] computeRestarts <- base::computeRestarts [18:01:47.678] grepl <- base::grepl [18:01:47.678] restarts <- computeRestarts(cond) [18:01:47.678] for (restart in restarts) { [18:01:47.678] name <- restart$name [18:01:47.678] if (is.null(name)) [18:01:47.678] next [18:01:47.678] if (!grepl(pattern, name)) [18:01:47.678] next [18:01:47.678] invokeRestart(restart) [18:01:47.678] muffled <- TRUE [18:01:47.678] break [18:01:47.678] } [18:01:47.678] } [18:01:47.678] } [18:01:47.678] invisible(muffled) [18:01:47.678] } [18:01:47.678] muffleCondition(cond, pattern = "^muffle") [18:01:47.678] } [18:01:47.678] } [18:01:47.678] } [18:01:47.678] })) [18:01:47.678] }, error = function(ex) { [18:01:47.678] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.678] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.678] ...future.rng), started = ...future.startTime, [18:01:47.678] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.678] version = "1.8"), class = "FutureResult") [18:01:47.678] }, finally = { [18:01:47.678] if (!identical(...future.workdir, getwd())) [18:01:47.678] setwd(...future.workdir) [18:01:47.678] { [18:01:47.678] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.678] ...future.oldOptions$nwarnings <- NULL [18:01:47.678] } [18:01:47.678] base::options(...future.oldOptions) [18:01:47.678] if (.Platform$OS.type == "windows") { [18:01:47.678] old_names <- names(...future.oldEnvVars) [18:01:47.678] envs <- base::Sys.getenv() [18:01:47.678] names <- names(envs) [18:01:47.678] common <- intersect(names, old_names) [18:01:47.678] added <- setdiff(names, old_names) [18:01:47.678] removed <- setdiff(old_names, names) [18:01:47.678] changed <- common[...future.oldEnvVars[common] != [18:01:47.678] envs[common]] [18:01:47.678] NAMES <- toupper(changed) [18:01:47.678] args <- list() [18:01:47.678] for (kk in seq_along(NAMES)) { [18:01:47.678] name <- changed[[kk]] [18:01:47.678] NAME <- NAMES[[kk]] [18:01:47.678] if (name != NAME && is.element(NAME, old_names)) [18:01:47.678] next [18:01:47.678] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.678] } [18:01:47.678] NAMES <- toupper(added) [18:01:47.678] for (kk in seq_along(NAMES)) { [18:01:47.678] name <- added[[kk]] [18:01:47.678] NAME <- NAMES[[kk]] [18:01:47.678] if (name != NAME && is.element(NAME, old_names)) [18:01:47.678] next [18:01:47.678] args[[name]] <- "" [18:01:47.678] } [18:01:47.678] NAMES <- toupper(removed) [18:01:47.678] for (kk in seq_along(NAMES)) { [18:01:47.678] name <- removed[[kk]] [18:01:47.678] NAME <- NAMES[[kk]] [18:01:47.678] if (name != NAME && is.element(NAME, old_names)) [18:01:47.678] next [18:01:47.678] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.678] } [18:01:47.678] if (length(args) > 0) [18:01:47.678] base::do.call(base::Sys.setenv, args = args) [18:01:47.678] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.678] } [18:01:47.678] else { [18:01:47.678] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.678] } [18:01:47.678] { [18:01:47.678] if (base::length(...future.futureOptionsAdded) > [18:01:47.678] 0L) { [18:01:47.678] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.678] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.678] base::options(opts) [18:01:47.678] } [18:01:47.678] { [18:01:47.678] { [18:01:47.678] NULL [18:01:47.678] RNGkind("Mersenne-Twister") [18:01:47.678] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.678] inherits = FALSE) [18:01:47.678] } [18:01:47.678] options(future.plan = NULL) [18:01:47.678] if (is.na(NA_character_)) [18:01:47.678] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.678] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.678] future::plan(list(function (..., envir = parent.frame()) [18:01:47.678] { [18:01:47.678] future <- SequentialFuture(..., envir = envir) [18:01:47.678] if (!future$lazy) [18:01:47.678] future <- run(future) [18:01:47.678] invisible(future) [18:01:47.678] }), .cleanup = FALSE, .init = FALSE) [18:01:47.678] } [18:01:47.678] } [18:01:47.678] } [18:01:47.678] }) [18:01:47.678] if (TRUE) { [18:01:47.678] base::sink(type = "output", split = FALSE) [18:01:47.678] if (TRUE) { [18:01:47.678] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.678] } [18:01:47.678] else { [18:01:47.678] ...future.result["stdout"] <- base::list(NULL) [18:01:47.678] } [18:01:47.678] base::close(...future.stdout) [18:01:47.678] ...future.stdout <- NULL [18:01:47.678] } [18:01:47.678] ...future.result$conditions <- ...future.conditions [18:01:47.678] ...future.result$finished <- base::Sys.time() [18:01:47.678] ...future.result [18:01:47.678] } [18:01:47.682] assign_globals() ... [18:01:47.682] List of 2 [18:01:47.682] $ weight: num [1:20] 4.17 5.58 5.18 6.11 4.5 4.61 5.17 4.53 5.33 5.14 ... [18:01:47.682] $ group : Factor w/ 2 levels "Ctl","Trt": 1 1 1 1 1 1 1 1 1 1 ... [18:01:47.682] - attr(*, "where")=List of 2 [18:01:47.682] ..$ weight: [18:01:47.682] ..$ group : [18:01:47.682] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.682] - attr(*, "resolved")= logi FALSE [18:01:47.682] - attr(*, "total_size")= num 896 [18:01:47.682] - attr(*, "already-done")= logi TRUE [18:01:47.686] - copied 'weight' to environment [18:01:47.686] - copied 'group' to environment [18:01:47.686] assign_globals() ... done [18:01:47.687] plan(): Setting new future strategy stack: [18:01:47.687] List of future strategies: [18:01:47.687] 1. sequential: [18:01:47.687] - args: function (..., envir = parent.frame()) [18:01:47.687] - tweaked: FALSE [18:01:47.687] - call: NULL [18:01:47.687] plan(): nbrOfWorkers() = 1 [18:01:47.689] plan(): Setting new future strategy stack: [18:01:47.689] List of future strategies: [18:01:47.689] 1. sequential: [18:01:47.689] - args: function (..., envir = parent.frame()) [18:01:47.689] - tweaked: FALSE [18:01:47.689] - call: plan(strategy) [18:01:47.690] plan(): nbrOfWorkers() = 1 [18:01:47.690] SequentialFuture started (and completed) [18:01:47.690] - Launch lazy future ... done [18:01:47.690] run() for 'SequentialFuture' ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 - Globals - one-side formulas, e.g. xtabs(~ x) ... [18:01:47.693] getGlobalsAndPackages() ... [18:01:47.693] Searching for globals... [18:01:47.694] - globals found: [4] '{', 'xtabs', 'x', '~' [18:01:47.694] Searching for globals ... DONE [18:01:47.694] Resolving globals: FALSE [18:01:47.695] The total size of the 1 globals is 96 bytes (96 bytes) [18:01:47.695] The total size of the 1 globals exported for future expression ('{; xtabs(~x); }') is 96 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (96 bytes of class 'numeric') [18:01:47.696] - globals: [1] 'x' [18:01:47.696] - packages: [1] 'stats' [18:01:47.696] getGlobalsAndPackages() ... DONE [18:01:47.696] run() for 'Future' ... [18:01:47.696] - state: 'created' [18:01:47.697] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.697] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.697] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.697] - Field: 'label' [18:01:47.698] - Field: 'local' [18:01:47.698] - Field: 'owner' [18:01:47.698] - Field: 'envir' [18:01:47.698] - Field: 'packages' [18:01:47.698] - Field: 'gc' [18:01:47.698] - Field: 'conditions' [18:01:47.699] - Field: 'expr' [18:01:47.699] - Field: 'uuid' [18:01:47.699] - Field: 'seed' [18:01:47.699] - Field: 'version' [18:01:47.699] - Field: 'result' [18:01:47.699] - Field: 'asynchronous' [18:01:47.700] - Field: 'calls' [18:01:47.700] - Field: 'globals' [18:01:47.700] - Field: 'stdout' [18:01:47.700] - Field: 'earlySignal' [18:01:47.700] - Field: 'lazy' [18:01:47.701] - Field: 'state' [18:01:47.701] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.701] - Launch lazy future ... [18:01:47.701] Packages needed by the future expression (n = 1): 'stats' [18:01:47.701] Packages needed by future strategies (n = 0): [18:01:47.702] { [18:01:47.702] { [18:01:47.702] { [18:01:47.702] ...future.startTime <- base::Sys.time() [18:01:47.702] { [18:01:47.702] { [18:01:47.702] { [18:01:47.702] { [18:01:47.702] base::local({ [18:01:47.702] has_future <- base::requireNamespace("future", [18:01:47.702] quietly = TRUE) [18:01:47.702] if (has_future) { [18:01:47.702] ns <- base::getNamespace("future") [18:01:47.702] version <- ns[[".package"]][["version"]] [18:01:47.702] if (is.null(version)) [18:01:47.702] version <- utils::packageVersion("future") [18:01:47.702] } [18:01:47.702] else { [18:01:47.702] version <- NULL [18:01:47.702] } [18:01:47.702] if (!has_future || version < "1.8.0") { [18:01:47.702] info <- base::c(r_version = base::gsub("R version ", [18:01:47.702] "", base::R.version$version.string), [18:01:47.702] platform = base::sprintf("%s (%s-bit)", [18:01:47.702] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.702] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.702] "release", "version")], collapse = " "), [18:01:47.702] hostname = base::Sys.info()[["nodename"]]) [18:01:47.702] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.702] info) [18:01:47.702] info <- base::paste(info, collapse = "; ") [18:01:47.702] if (!has_future) { [18:01:47.702] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.702] info) [18:01:47.702] } [18:01:47.702] else { [18:01:47.702] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.702] info, version) [18:01:47.702] } [18:01:47.702] base::stop(msg) [18:01:47.702] } [18:01:47.702] }) [18:01:47.702] } [18:01:47.702] base::local({ [18:01:47.702] for (pkg in "stats") { [18:01:47.702] base::loadNamespace(pkg) [18:01:47.702] base::library(pkg, character.only = TRUE) [18:01:47.702] } [18:01:47.702] }) [18:01:47.702] } [18:01:47.702] options(future.plan = NULL) [18:01:47.702] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.702] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.702] } [18:01:47.702] ...future.workdir <- getwd() [18:01:47.702] } [18:01:47.702] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.702] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.702] } [18:01:47.702] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.702] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.702] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.702] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.702] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.702] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.702] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.702] base::names(...future.oldOptions)) [18:01:47.702] } [18:01:47.702] if (FALSE) { [18:01:47.702] } [18:01:47.702] else { [18:01:47.702] if (TRUE) { [18:01:47.702] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.702] open = "w") [18:01:47.702] } [18:01:47.702] else { [18:01:47.702] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.702] windows = "NUL", "/dev/null"), open = "w") [18:01:47.702] } [18:01:47.702] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.702] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.702] base::sink(type = "output", split = FALSE) [18:01:47.702] base::close(...future.stdout) [18:01:47.702] }, add = TRUE) [18:01:47.702] } [18:01:47.702] ...future.frame <- base::sys.nframe() [18:01:47.702] ...future.conditions <- base::list() [18:01:47.702] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.702] if (FALSE) { [18:01:47.702] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.702] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.702] } [18:01:47.702] ...future.result <- base::tryCatch({ [18:01:47.702] base::withCallingHandlers({ [18:01:47.702] ...future.value <- base::withVisible(base::local({ [18:01:47.702] xtabs(~x) [18:01:47.702] })) [18:01:47.702] future::FutureResult(value = ...future.value$value, [18:01:47.702] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.702] ...future.rng), globalenv = if (FALSE) [18:01:47.702] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.702] ...future.globalenv.names)) [18:01:47.702] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.702] }, condition = base::local({ [18:01:47.702] c <- base::c [18:01:47.702] inherits <- base::inherits [18:01:47.702] invokeRestart <- base::invokeRestart [18:01:47.702] length <- base::length [18:01:47.702] list <- base::list [18:01:47.702] seq.int <- base::seq.int [18:01:47.702] signalCondition <- base::signalCondition [18:01:47.702] sys.calls <- base::sys.calls [18:01:47.702] `[[` <- base::`[[` [18:01:47.702] `+` <- base::`+` [18:01:47.702] `<<-` <- base::`<<-` [18:01:47.702] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.702] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.702] 3L)] [18:01:47.702] } [18:01:47.702] function(cond) { [18:01:47.702] is_error <- inherits(cond, "error") [18:01:47.702] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.702] NULL) [18:01:47.702] if (is_error) { [18:01:47.702] sessionInformation <- function() { [18:01:47.702] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.702] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.702] search = base::search(), system = base::Sys.info()) [18:01:47.702] } [18:01:47.702] ...future.conditions[[length(...future.conditions) + [18:01:47.702] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.702] cond$call), session = sessionInformation(), [18:01:47.702] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.702] signalCondition(cond) [18:01:47.702] } [18:01:47.702] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.702] "immediateCondition"))) { [18:01:47.702] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.702] ...future.conditions[[length(...future.conditions) + [18:01:47.702] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.702] if (TRUE && !signal) { [18:01:47.702] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.702] { [18:01:47.702] inherits <- base::inherits [18:01:47.702] invokeRestart <- base::invokeRestart [18:01:47.702] is.null <- base::is.null [18:01:47.702] muffled <- FALSE [18:01:47.702] if (inherits(cond, "message")) { [18:01:47.702] muffled <- grepl(pattern, "muffleMessage") [18:01:47.702] if (muffled) [18:01:47.702] invokeRestart("muffleMessage") [18:01:47.702] } [18:01:47.702] else if (inherits(cond, "warning")) { [18:01:47.702] muffled <- grepl(pattern, "muffleWarning") [18:01:47.702] if (muffled) [18:01:47.702] invokeRestart("muffleWarning") [18:01:47.702] } [18:01:47.702] else if (inherits(cond, "condition")) { [18:01:47.702] if (!is.null(pattern)) { [18:01:47.702] computeRestarts <- base::computeRestarts [18:01:47.702] grepl <- base::grepl [18:01:47.702] restarts <- computeRestarts(cond) [18:01:47.702] for (restart in restarts) { [18:01:47.702] name <- restart$name [18:01:47.702] if (is.null(name)) [18:01:47.702] next [18:01:47.702] if (!grepl(pattern, name)) [18:01:47.702] next [18:01:47.702] invokeRestart(restart) [18:01:47.702] muffled <- TRUE [18:01:47.702] break [18:01:47.702] } [18:01:47.702] } [18:01:47.702] } [18:01:47.702] invisible(muffled) [18:01:47.702] } [18:01:47.702] muffleCondition(cond, pattern = "^muffle") [18:01:47.702] } [18:01:47.702] } [18:01:47.702] else { [18:01:47.702] if (TRUE) { [18:01:47.702] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.702] { [18:01:47.702] inherits <- base::inherits [18:01:47.702] invokeRestart <- base::invokeRestart [18:01:47.702] is.null <- base::is.null [18:01:47.702] muffled <- FALSE [18:01:47.702] if (inherits(cond, "message")) { [18:01:47.702] muffled <- grepl(pattern, "muffleMessage") [18:01:47.702] if (muffled) [18:01:47.702] invokeRestart("muffleMessage") [18:01:47.702] } [18:01:47.702] else if (inherits(cond, "warning")) { [18:01:47.702] muffled <- grepl(pattern, "muffleWarning") [18:01:47.702] if (muffled) [18:01:47.702] invokeRestart("muffleWarning") [18:01:47.702] } [18:01:47.702] else if (inherits(cond, "condition")) { [18:01:47.702] if (!is.null(pattern)) { [18:01:47.702] computeRestarts <- base::computeRestarts [18:01:47.702] grepl <- base::grepl [18:01:47.702] restarts <- computeRestarts(cond) [18:01:47.702] for (restart in restarts) { [18:01:47.702] name <- restart$name [18:01:47.702] if (is.null(name)) [18:01:47.702] next [18:01:47.702] if (!grepl(pattern, name)) [18:01:47.702] next [18:01:47.702] invokeRestart(restart) [18:01:47.702] muffled <- TRUE [18:01:47.702] break [18:01:47.702] } [18:01:47.702] } [18:01:47.702] } [18:01:47.702] invisible(muffled) [18:01:47.702] } [18:01:47.702] muffleCondition(cond, pattern = "^muffle") [18:01:47.702] } [18:01:47.702] } [18:01:47.702] } [18:01:47.702] })) [18:01:47.702] }, error = function(ex) { [18:01:47.702] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.702] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.702] ...future.rng), started = ...future.startTime, [18:01:47.702] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.702] version = "1.8"), class = "FutureResult") [18:01:47.702] }, finally = { [18:01:47.702] if (!identical(...future.workdir, getwd())) [18:01:47.702] setwd(...future.workdir) [18:01:47.702] { [18:01:47.702] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.702] ...future.oldOptions$nwarnings <- NULL [18:01:47.702] } [18:01:47.702] base::options(...future.oldOptions) [18:01:47.702] if (.Platform$OS.type == "windows") { [18:01:47.702] old_names <- names(...future.oldEnvVars) [18:01:47.702] envs <- base::Sys.getenv() [18:01:47.702] names <- names(envs) [18:01:47.702] common <- intersect(names, old_names) [18:01:47.702] added <- setdiff(names, old_names) [18:01:47.702] removed <- setdiff(old_names, names) [18:01:47.702] changed <- common[...future.oldEnvVars[common] != [18:01:47.702] envs[common]] [18:01:47.702] NAMES <- toupper(changed) [18:01:47.702] args <- list() [18:01:47.702] for (kk in seq_along(NAMES)) { [18:01:47.702] name <- changed[[kk]] [18:01:47.702] NAME <- NAMES[[kk]] [18:01:47.702] if (name != NAME && is.element(NAME, old_names)) [18:01:47.702] next [18:01:47.702] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.702] } [18:01:47.702] NAMES <- toupper(added) [18:01:47.702] for (kk in seq_along(NAMES)) { [18:01:47.702] name <- added[[kk]] [18:01:47.702] NAME <- NAMES[[kk]] [18:01:47.702] if (name != NAME && is.element(NAME, old_names)) [18:01:47.702] next [18:01:47.702] args[[name]] <- "" [18:01:47.702] } [18:01:47.702] NAMES <- toupper(removed) [18:01:47.702] for (kk in seq_along(NAMES)) { [18:01:47.702] name <- removed[[kk]] [18:01:47.702] NAME <- NAMES[[kk]] [18:01:47.702] if (name != NAME && is.element(NAME, old_names)) [18:01:47.702] next [18:01:47.702] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.702] } [18:01:47.702] if (length(args) > 0) [18:01:47.702] base::do.call(base::Sys.setenv, args = args) [18:01:47.702] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.702] } [18:01:47.702] else { [18:01:47.702] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.702] } [18:01:47.702] { [18:01:47.702] if (base::length(...future.futureOptionsAdded) > [18:01:47.702] 0L) { [18:01:47.702] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.702] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.702] base::options(opts) [18:01:47.702] } [18:01:47.702] { [18:01:47.702] { [18:01:47.702] NULL [18:01:47.702] RNGkind("Mersenne-Twister") [18:01:47.702] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.702] inherits = FALSE) [18:01:47.702] } [18:01:47.702] options(future.plan = NULL) [18:01:47.702] if (is.na(NA_character_)) [18:01:47.702] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.702] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.702] future::plan(list(function (..., envir = parent.frame()) [18:01:47.702] { [18:01:47.702] future <- SequentialFuture(..., envir = envir) [18:01:47.702] if (!future$lazy) [18:01:47.702] future <- run(future) [18:01:47.702] invisible(future) [18:01:47.702] }), .cleanup = FALSE, .init = FALSE) [18:01:47.702] } [18:01:47.702] } [18:01:47.702] } [18:01:47.702] }) [18:01:47.702] if (TRUE) { [18:01:47.702] base::sink(type = "output", split = FALSE) [18:01:47.702] if (TRUE) { [18:01:47.702] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.702] } [18:01:47.702] else { [18:01:47.702] ...future.result["stdout"] <- base::list(NULL) [18:01:47.702] } [18:01:47.702] base::close(...future.stdout) [18:01:47.702] ...future.stdout <- NULL [18:01:47.702] } [18:01:47.702] ...future.result$conditions <- ...future.conditions [18:01:47.702] ...future.result$finished <- base::Sys.time() [18:01:47.702] ...future.result [18:01:47.702] } [18:01:47.706] assign_globals() ... [18:01:47.706] List of 1 [18:01:47.706] $ x: num [1:5] 1 1 2 2 2 [18:01:47.706] - attr(*, "where")=List of 1 [18:01:47.706] ..$ x: [18:01:47.706] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.706] - attr(*, "resolved")= logi FALSE [18:01:47.706] - attr(*, "total_size")= num 96 [18:01:47.706] - attr(*, "already-done")= logi TRUE [18:01:47.709] - copied 'x' to environment [18:01:47.709] assign_globals() ... done [18:01:47.710] plan(): Setting new future strategy stack: [18:01:47.711] List of future strategies: [18:01:47.711] 1. sequential: [18:01:47.711] - args: function (..., envir = parent.frame()) [18:01:47.711] - tweaked: FALSE [18:01:47.711] - call: NULL [18:01:47.711] plan(): nbrOfWorkers() = 1 [18:01:47.713] plan(): Setting new future strategy stack: [18:01:47.713] List of future strategies: [18:01:47.713] 1. sequential: [18:01:47.713] - args: function (..., envir = parent.frame()) [18:01:47.713] - tweaked: FALSE [18:01:47.713] - call: plan(strategy) [18:01:47.713] plan(): nbrOfWorkers() = 1 [18:01:47.714] SequentialFuture started (and completed) [18:01:47.714] - Launch lazy future ... done [18:01:47.714] run() for 'SequentialFuture' ... done x 1 2 2 3 [18:01:47.715] getGlobalsAndPackages() ... [18:01:47.715] Searching for globals... [18:01:47.716] - globals found: [4] '{', 'xtabs', 'x', '~' [18:01:47.717] Searching for globals ... DONE [18:01:47.717] Resolving globals: FALSE [18:01:47.717] The total size of the 1 globals is 96 bytes (96 bytes) [18:01:47.718] The total size of the 1 globals exported for future expression ('{; xtabs(~x); }') is 96 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (96 bytes of class 'numeric') [18:01:47.718] - globals: [1] 'x' [18:01:47.718] - packages: [1] 'stats' [18:01:47.718] getGlobalsAndPackages() ... DONE [18:01:47.719] run() for 'Future' ... [18:01:47.719] - state: 'created' [18:01:47.719] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.719] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.720] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.720] - Field: 'label' [18:01:47.720] - Field: 'local' [18:01:47.720] - Field: 'owner' [18:01:47.720] - Field: 'envir' [18:01:47.721] - Field: 'packages' [18:01:47.721] - Field: 'gc' [18:01:47.721] - Field: 'conditions' [18:01:47.721] - Field: 'expr' [18:01:47.721] - Field: 'uuid' [18:01:47.721] - Field: 'seed' [18:01:47.722] - Field: 'version' [18:01:47.722] - Field: 'result' [18:01:47.722] - Field: 'asynchronous' [18:01:47.722] - Field: 'calls' [18:01:47.722] - Field: 'globals' [18:01:47.723] - Field: 'stdout' [18:01:47.723] - Field: 'earlySignal' [18:01:47.723] - Field: 'lazy' [18:01:47.723] - Field: 'state' [18:01:47.723] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.723] - Launch lazy future ... [18:01:47.724] Packages needed by the future expression (n = 1): 'stats' [18:01:47.724] Packages needed by future strategies (n = 0): [18:01:47.724] { [18:01:47.724] { [18:01:47.724] { [18:01:47.724] ...future.startTime <- base::Sys.time() [18:01:47.724] { [18:01:47.724] { [18:01:47.724] { [18:01:47.724] { [18:01:47.724] base::local({ [18:01:47.724] has_future <- base::requireNamespace("future", [18:01:47.724] quietly = TRUE) [18:01:47.724] if (has_future) { [18:01:47.724] ns <- base::getNamespace("future") [18:01:47.724] version <- ns[[".package"]][["version"]] [18:01:47.724] if (is.null(version)) [18:01:47.724] version <- utils::packageVersion("future") [18:01:47.724] } [18:01:47.724] else { [18:01:47.724] version <- NULL [18:01:47.724] } [18:01:47.724] if (!has_future || version < "1.8.0") { [18:01:47.724] info <- base::c(r_version = base::gsub("R version ", [18:01:47.724] "", base::R.version$version.string), [18:01:47.724] platform = base::sprintf("%s (%s-bit)", [18:01:47.724] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.724] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.724] "release", "version")], collapse = " "), [18:01:47.724] hostname = base::Sys.info()[["nodename"]]) [18:01:47.724] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.724] info) [18:01:47.724] info <- base::paste(info, collapse = "; ") [18:01:47.724] if (!has_future) { [18:01:47.724] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.724] info) [18:01:47.724] } [18:01:47.724] else { [18:01:47.724] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.724] info, version) [18:01:47.724] } [18:01:47.724] base::stop(msg) [18:01:47.724] } [18:01:47.724] }) [18:01:47.724] } [18:01:47.724] base::local({ [18:01:47.724] for (pkg in "stats") { [18:01:47.724] base::loadNamespace(pkg) [18:01:47.724] base::library(pkg, character.only = TRUE) [18:01:47.724] } [18:01:47.724] }) [18:01:47.724] } [18:01:47.724] options(future.plan = NULL) [18:01:47.724] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.724] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.724] } [18:01:47.724] ...future.workdir <- getwd() [18:01:47.724] } [18:01:47.724] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.724] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.724] } [18:01:47.724] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.724] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.724] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.724] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.724] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.724] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.724] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.724] base::names(...future.oldOptions)) [18:01:47.724] } [18:01:47.724] if (FALSE) { [18:01:47.724] } [18:01:47.724] else { [18:01:47.724] if (TRUE) { [18:01:47.724] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.724] open = "w") [18:01:47.724] } [18:01:47.724] else { [18:01:47.724] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.724] windows = "NUL", "/dev/null"), open = "w") [18:01:47.724] } [18:01:47.724] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.724] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.724] base::sink(type = "output", split = FALSE) [18:01:47.724] base::close(...future.stdout) [18:01:47.724] }, add = TRUE) [18:01:47.724] } [18:01:47.724] ...future.frame <- base::sys.nframe() [18:01:47.724] ...future.conditions <- base::list() [18:01:47.724] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.724] if (FALSE) { [18:01:47.724] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.724] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.724] } [18:01:47.724] ...future.result <- base::tryCatch({ [18:01:47.724] base::withCallingHandlers({ [18:01:47.724] ...future.value <- base::withVisible(base::local({ [18:01:47.724] xtabs(~x) [18:01:47.724] })) [18:01:47.724] future::FutureResult(value = ...future.value$value, [18:01:47.724] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.724] ...future.rng), globalenv = if (FALSE) [18:01:47.724] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.724] ...future.globalenv.names)) [18:01:47.724] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.724] }, condition = base::local({ [18:01:47.724] c <- base::c [18:01:47.724] inherits <- base::inherits [18:01:47.724] invokeRestart <- base::invokeRestart [18:01:47.724] length <- base::length [18:01:47.724] list <- base::list [18:01:47.724] seq.int <- base::seq.int [18:01:47.724] signalCondition <- base::signalCondition [18:01:47.724] sys.calls <- base::sys.calls [18:01:47.724] `[[` <- base::`[[` [18:01:47.724] `+` <- base::`+` [18:01:47.724] `<<-` <- base::`<<-` [18:01:47.724] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.724] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.724] 3L)] [18:01:47.724] } [18:01:47.724] function(cond) { [18:01:47.724] is_error <- inherits(cond, "error") [18:01:47.724] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.724] NULL) [18:01:47.724] if (is_error) { [18:01:47.724] sessionInformation <- function() { [18:01:47.724] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.724] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.724] search = base::search(), system = base::Sys.info()) [18:01:47.724] } [18:01:47.724] ...future.conditions[[length(...future.conditions) + [18:01:47.724] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.724] cond$call), session = sessionInformation(), [18:01:47.724] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.724] signalCondition(cond) [18:01:47.724] } [18:01:47.724] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.724] "immediateCondition"))) { [18:01:47.724] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.724] ...future.conditions[[length(...future.conditions) + [18:01:47.724] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.724] if (TRUE && !signal) { [18:01:47.724] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.724] { [18:01:47.724] inherits <- base::inherits [18:01:47.724] invokeRestart <- base::invokeRestart [18:01:47.724] is.null <- base::is.null [18:01:47.724] muffled <- FALSE [18:01:47.724] if (inherits(cond, "message")) { [18:01:47.724] muffled <- grepl(pattern, "muffleMessage") [18:01:47.724] if (muffled) [18:01:47.724] invokeRestart("muffleMessage") [18:01:47.724] } [18:01:47.724] else if (inherits(cond, "warning")) { [18:01:47.724] muffled <- grepl(pattern, "muffleWarning") [18:01:47.724] if (muffled) [18:01:47.724] invokeRestart("muffleWarning") [18:01:47.724] } [18:01:47.724] else if (inherits(cond, "condition")) { [18:01:47.724] if (!is.null(pattern)) { [18:01:47.724] computeRestarts <- base::computeRestarts [18:01:47.724] grepl <- base::grepl [18:01:47.724] restarts <- computeRestarts(cond) [18:01:47.724] for (restart in restarts) { [18:01:47.724] name <- restart$name [18:01:47.724] if (is.null(name)) [18:01:47.724] next [18:01:47.724] if (!grepl(pattern, name)) [18:01:47.724] next [18:01:47.724] invokeRestart(restart) [18:01:47.724] muffled <- TRUE [18:01:47.724] break [18:01:47.724] } [18:01:47.724] } [18:01:47.724] } [18:01:47.724] invisible(muffled) [18:01:47.724] } [18:01:47.724] muffleCondition(cond, pattern = "^muffle") [18:01:47.724] } [18:01:47.724] } [18:01:47.724] else { [18:01:47.724] if (TRUE) { [18:01:47.724] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.724] { [18:01:47.724] inherits <- base::inherits [18:01:47.724] invokeRestart <- base::invokeRestart [18:01:47.724] is.null <- base::is.null [18:01:47.724] muffled <- FALSE [18:01:47.724] if (inherits(cond, "message")) { [18:01:47.724] muffled <- grepl(pattern, "muffleMessage") [18:01:47.724] if (muffled) [18:01:47.724] invokeRestart("muffleMessage") [18:01:47.724] } [18:01:47.724] else if (inherits(cond, "warning")) { [18:01:47.724] muffled <- grepl(pattern, "muffleWarning") [18:01:47.724] if (muffled) [18:01:47.724] invokeRestart("muffleWarning") [18:01:47.724] } [18:01:47.724] else if (inherits(cond, "condition")) { [18:01:47.724] if (!is.null(pattern)) { [18:01:47.724] computeRestarts <- base::computeRestarts [18:01:47.724] grepl <- base::grepl [18:01:47.724] restarts <- computeRestarts(cond) [18:01:47.724] for (restart in restarts) { [18:01:47.724] name <- restart$name [18:01:47.724] if (is.null(name)) [18:01:47.724] next [18:01:47.724] if (!grepl(pattern, name)) [18:01:47.724] next [18:01:47.724] invokeRestart(restart) [18:01:47.724] muffled <- TRUE [18:01:47.724] break [18:01:47.724] } [18:01:47.724] } [18:01:47.724] } [18:01:47.724] invisible(muffled) [18:01:47.724] } [18:01:47.724] muffleCondition(cond, pattern = "^muffle") [18:01:47.724] } [18:01:47.724] } [18:01:47.724] } [18:01:47.724] })) [18:01:47.724] }, error = function(ex) { [18:01:47.724] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.724] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.724] ...future.rng), started = ...future.startTime, [18:01:47.724] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.724] version = "1.8"), class = "FutureResult") [18:01:47.724] }, finally = { [18:01:47.724] if (!identical(...future.workdir, getwd())) [18:01:47.724] setwd(...future.workdir) [18:01:47.724] { [18:01:47.724] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.724] ...future.oldOptions$nwarnings <- NULL [18:01:47.724] } [18:01:47.724] base::options(...future.oldOptions) [18:01:47.724] if (.Platform$OS.type == "windows") { [18:01:47.724] old_names <- names(...future.oldEnvVars) [18:01:47.724] envs <- base::Sys.getenv() [18:01:47.724] names <- names(envs) [18:01:47.724] common <- intersect(names, old_names) [18:01:47.724] added <- setdiff(names, old_names) [18:01:47.724] removed <- setdiff(old_names, names) [18:01:47.724] changed <- common[...future.oldEnvVars[common] != [18:01:47.724] envs[common]] [18:01:47.724] NAMES <- toupper(changed) [18:01:47.724] args <- list() [18:01:47.724] for (kk in seq_along(NAMES)) { [18:01:47.724] name <- changed[[kk]] [18:01:47.724] NAME <- NAMES[[kk]] [18:01:47.724] if (name != NAME && is.element(NAME, old_names)) [18:01:47.724] next [18:01:47.724] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.724] } [18:01:47.724] NAMES <- toupper(added) [18:01:47.724] for (kk in seq_along(NAMES)) { [18:01:47.724] name <- added[[kk]] [18:01:47.724] NAME <- NAMES[[kk]] [18:01:47.724] if (name != NAME && is.element(NAME, old_names)) [18:01:47.724] next [18:01:47.724] args[[name]] <- "" [18:01:47.724] } [18:01:47.724] NAMES <- toupper(removed) [18:01:47.724] for (kk in seq_along(NAMES)) { [18:01:47.724] name <- removed[[kk]] [18:01:47.724] NAME <- NAMES[[kk]] [18:01:47.724] if (name != NAME && is.element(NAME, old_names)) [18:01:47.724] next [18:01:47.724] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.724] } [18:01:47.724] if (length(args) > 0) [18:01:47.724] base::do.call(base::Sys.setenv, args = args) [18:01:47.724] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.724] } [18:01:47.724] else { [18:01:47.724] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.724] } [18:01:47.724] { [18:01:47.724] if (base::length(...future.futureOptionsAdded) > [18:01:47.724] 0L) { [18:01:47.724] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.724] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.724] base::options(opts) [18:01:47.724] } [18:01:47.724] { [18:01:47.724] { [18:01:47.724] NULL [18:01:47.724] RNGkind("Mersenne-Twister") [18:01:47.724] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.724] inherits = FALSE) [18:01:47.724] } [18:01:47.724] options(future.plan = NULL) [18:01:47.724] if (is.na(NA_character_)) [18:01:47.724] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.724] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.724] future::plan(list(function (..., envir = parent.frame()) [18:01:47.724] { [18:01:47.724] future <- SequentialFuture(..., envir = envir) [18:01:47.724] if (!future$lazy) [18:01:47.724] future <- run(future) [18:01:47.724] invisible(future) [18:01:47.724] }), .cleanup = FALSE, .init = FALSE) [18:01:47.724] } [18:01:47.724] } [18:01:47.724] } [18:01:47.724] }) [18:01:47.724] if (TRUE) { [18:01:47.724] base::sink(type = "output", split = FALSE) [18:01:47.724] if (TRUE) { [18:01:47.724] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.724] } [18:01:47.724] else { [18:01:47.724] ...future.result["stdout"] <- base::list(NULL) [18:01:47.724] } [18:01:47.724] base::close(...future.stdout) [18:01:47.724] ...future.stdout <- NULL [18:01:47.724] } [18:01:47.724] ...future.result$conditions <- ...future.conditions [18:01:47.724] ...future.result$finished <- base::Sys.time() [18:01:47.724] ...future.result [18:01:47.724] } [18:01:47.728] assign_globals() ... [18:01:47.728] List of 1 [18:01:47.728] $ x: num [1:5] 1 1 2 2 2 [18:01:47.728] - attr(*, "where")=List of 1 [18:01:47.728] ..$ x: [18:01:47.728] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.728] - attr(*, "resolved")= logi FALSE [18:01:47.728] - attr(*, "total_size")= num 96 [18:01:47.728] - attr(*, "already-done")= logi TRUE [18:01:47.731] - copied 'x' to environment [18:01:47.731] assign_globals() ... done [18:01:47.732] plan(): Setting new future strategy stack: [18:01:47.732] List of future strategies: [18:01:47.732] 1. sequential: [18:01:47.732] - args: function (..., envir = parent.frame()) [18:01:47.732] - tweaked: FALSE [18:01:47.732] - call: NULL [18:01:47.733] plan(): nbrOfWorkers() = 1 [18:01:47.734] plan(): Setting new future strategy stack: [18:01:47.734] List of future strategies: [18:01:47.734] 1. sequential: [18:01:47.734] - args: function (..., envir = parent.frame()) [18:01:47.734] - tweaked: FALSE [18:01:47.734] - call: plan(strategy) [18:01:47.735] plan(): nbrOfWorkers() = 1 [18:01:47.735] SequentialFuture started (and completed) [18:01:47.735] - Launch lazy future ... done [18:01:47.735] run() for 'SequentialFuture' ... done x 1 2 2 3 - Globals - lm(, data = cars) ... - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ . - 1, data = cars) Coefficients: speed 2.909 [18:01:47.738] getGlobalsAndPackages() ... [18:01:47.738] Searching for globals... [18:01:47.740] - globals found: [7] '{', 'lm', 'dist', '-', '.', '~', 'cars' [18:01:47.740] Searching for globals ... DONE [18:01:47.740] Resolving globals: FALSE [18:01:47.741] [18:01:47.741] - packages: [2] 'stats', 'datasets' [18:01:47.741] getGlobalsAndPackages() ... DONE [18:01:47.742] run() for 'Future' ... [18:01:47.742] - state: 'created' [18:01:47.742] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.742] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.743] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.743] - Field: 'label' [18:01:47.744] - Field: 'local' [18:01:47.744] - Field: 'owner' [18:01:47.744] - Field: 'envir' [18:01:47.744] - Field: 'packages' [18:01:47.745] - Field: 'gc' [18:01:47.745] - Field: 'conditions' [18:01:47.745] - Field: 'expr' [18:01:47.745] - Field: 'uuid' [18:01:47.745] - Field: 'seed' [18:01:47.745] - Field: 'version' [18:01:47.746] - Field: 'result' [18:01:47.746] - Field: 'asynchronous' [18:01:47.746] - Field: 'calls' [18:01:47.746] - Field: 'globals' [18:01:47.746] - Field: 'stdout' [18:01:47.747] - Field: 'earlySignal' [18:01:47.747] - Field: 'lazy' [18:01:47.747] - Field: 'state' [18:01:47.747] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.747] - Launch lazy future ... [18:01:47.747] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:47.748] Packages needed by future strategies (n = 0): [18:01:47.748] { [18:01:47.748] { [18:01:47.748] { [18:01:47.748] ...future.startTime <- base::Sys.time() [18:01:47.748] { [18:01:47.748] { [18:01:47.748] { [18:01:47.748] { [18:01:47.748] base::local({ [18:01:47.748] has_future <- base::requireNamespace("future", [18:01:47.748] quietly = TRUE) [18:01:47.748] if (has_future) { [18:01:47.748] ns <- base::getNamespace("future") [18:01:47.748] version <- ns[[".package"]][["version"]] [18:01:47.748] if (is.null(version)) [18:01:47.748] version <- utils::packageVersion("future") [18:01:47.748] } [18:01:47.748] else { [18:01:47.748] version <- NULL [18:01:47.748] } [18:01:47.748] if (!has_future || version < "1.8.0") { [18:01:47.748] info <- base::c(r_version = base::gsub("R version ", [18:01:47.748] "", base::R.version$version.string), [18:01:47.748] platform = base::sprintf("%s (%s-bit)", [18:01:47.748] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.748] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.748] "release", "version")], collapse = " "), [18:01:47.748] hostname = base::Sys.info()[["nodename"]]) [18:01:47.748] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.748] info) [18:01:47.748] info <- base::paste(info, collapse = "; ") [18:01:47.748] if (!has_future) { [18:01:47.748] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.748] info) [18:01:47.748] } [18:01:47.748] else { [18:01:47.748] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.748] info, version) [18:01:47.748] } [18:01:47.748] base::stop(msg) [18:01:47.748] } [18:01:47.748] }) [18:01:47.748] } [18:01:47.748] base::local({ [18:01:47.748] for (pkg in c("stats", "datasets")) { [18:01:47.748] base::loadNamespace(pkg) [18:01:47.748] base::library(pkg, character.only = TRUE) [18:01:47.748] } [18:01:47.748] }) [18:01:47.748] } [18:01:47.748] options(future.plan = NULL) [18:01:47.748] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.748] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.748] } [18:01:47.748] ...future.workdir <- getwd() [18:01:47.748] } [18:01:47.748] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.748] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.748] } [18:01:47.748] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.748] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.748] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.748] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.748] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.748] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.748] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.748] base::names(...future.oldOptions)) [18:01:47.748] } [18:01:47.748] if (FALSE) { [18:01:47.748] } [18:01:47.748] else { [18:01:47.748] if (TRUE) { [18:01:47.748] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.748] open = "w") [18:01:47.748] } [18:01:47.748] else { [18:01:47.748] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.748] windows = "NUL", "/dev/null"), open = "w") [18:01:47.748] } [18:01:47.748] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.748] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.748] base::sink(type = "output", split = FALSE) [18:01:47.748] base::close(...future.stdout) [18:01:47.748] }, add = TRUE) [18:01:47.748] } [18:01:47.748] ...future.frame <- base::sys.nframe() [18:01:47.748] ...future.conditions <- base::list() [18:01:47.748] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.748] if (FALSE) { [18:01:47.748] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.748] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.748] } [18:01:47.748] ...future.result <- base::tryCatch({ [18:01:47.748] base::withCallingHandlers({ [18:01:47.748] ...future.value <- base::withVisible(base::local({ [18:01:47.748] lm(dist ~ . - 1, data = cars) [18:01:47.748] })) [18:01:47.748] future::FutureResult(value = ...future.value$value, [18:01:47.748] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.748] ...future.rng), globalenv = if (FALSE) [18:01:47.748] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.748] ...future.globalenv.names)) [18:01:47.748] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.748] }, condition = base::local({ [18:01:47.748] c <- base::c [18:01:47.748] inherits <- base::inherits [18:01:47.748] invokeRestart <- base::invokeRestart [18:01:47.748] length <- base::length [18:01:47.748] list <- base::list [18:01:47.748] seq.int <- base::seq.int [18:01:47.748] signalCondition <- base::signalCondition [18:01:47.748] sys.calls <- base::sys.calls [18:01:47.748] `[[` <- base::`[[` [18:01:47.748] `+` <- base::`+` [18:01:47.748] `<<-` <- base::`<<-` [18:01:47.748] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.748] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.748] 3L)] [18:01:47.748] } [18:01:47.748] function(cond) { [18:01:47.748] is_error <- inherits(cond, "error") [18:01:47.748] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.748] NULL) [18:01:47.748] if (is_error) { [18:01:47.748] sessionInformation <- function() { [18:01:47.748] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.748] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.748] search = base::search(), system = base::Sys.info()) [18:01:47.748] } [18:01:47.748] ...future.conditions[[length(...future.conditions) + [18:01:47.748] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.748] cond$call), session = sessionInformation(), [18:01:47.748] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.748] signalCondition(cond) [18:01:47.748] } [18:01:47.748] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.748] "immediateCondition"))) { [18:01:47.748] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.748] ...future.conditions[[length(...future.conditions) + [18:01:47.748] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.748] if (TRUE && !signal) { [18:01:47.748] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.748] { [18:01:47.748] inherits <- base::inherits [18:01:47.748] invokeRestart <- base::invokeRestart [18:01:47.748] is.null <- base::is.null [18:01:47.748] muffled <- FALSE [18:01:47.748] if (inherits(cond, "message")) { [18:01:47.748] muffled <- grepl(pattern, "muffleMessage") [18:01:47.748] if (muffled) [18:01:47.748] invokeRestart("muffleMessage") [18:01:47.748] } [18:01:47.748] else if (inherits(cond, "warning")) { [18:01:47.748] muffled <- grepl(pattern, "muffleWarning") [18:01:47.748] if (muffled) [18:01:47.748] invokeRestart("muffleWarning") [18:01:47.748] } [18:01:47.748] else if (inherits(cond, "condition")) { [18:01:47.748] if (!is.null(pattern)) { [18:01:47.748] computeRestarts <- base::computeRestarts [18:01:47.748] grepl <- base::grepl [18:01:47.748] restarts <- computeRestarts(cond) [18:01:47.748] for (restart in restarts) { [18:01:47.748] name <- restart$name [18:01:47.748] if (is.null(name)) [18:01:47.748] next [18:01:47.748] if (!grepl(pattern, name)) [18:01:47.748] next [18:01:47.748] invokeRestart(restart) [18:01:47.748] muffled <- TRUE [18:01:47.748] break [18:01:47.748] } [18:01:47.748] } [18:01:47.748] } [18:01:47.748] invisible(muffled) [18:01:47.748] } [18:01:47.748] muffleCondition(cond, pattern = "^muffle") [18:01:47.748] } [18:01:47.748] } [18:01:47.748] else { [18:01:47.748] if (TRUE) { [18:01:47.748] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.748] { [18:01:47.748] inherits <- base::inherits [18:01:47.748] invokeRestart <- base::invokeRestart [18:01:47.748] is.null <- base::is.null [18:01:47.748] muffled <- FALSE [18:01:47.748] if (inherits(cond, "message")) { [18:01:47.748] muffled <- grepl(pattern, "muffleMessage") [18:01:47.748] if (muffled) [18:01:47.748] invokeRestart("muffleMessage") [18:01:47.748] } [18:01:47.748] else if (inherits(cond, "warning")) { [18:01:47.748] muffled <- grepl(pattern, "muffleWarning") [18:01:47.748] if (muffled) [18:01:47.748] invokeRestart("muffleWarning") [18:01:47.748] } [18:01:47.748] else if (inherits(cond, "condition")) { [18:01:47.748] if (!is.null(pattern)) { [18:01:47.748] computeRestarts <- base::computeRestarts [18:01:47.748] grepl <- base::grepl [18:01:47.748] restarts <- computeRestarts(cond) [18:01:47.748] for (restart in restarts) { [18:01:47.748] name <- restart$name [18:01:47.748] if (is.null(name)) [18:01:47.748] next [18:01:47.748] if (!grepl(pattern, name)) [18:01:47.748] next [18:01:47.748] invokeRestart(restart) [18:01:47.748] muffled <- TRUE [18:01:47.748] break [18:01:47.748] } [18:01:47.748] } [18:01:47.748] } [18:01:47.748] invisible(muffled) [18:01:47.748] } [18:01:47.748] muffleCondition(cond, pattern = "^muffle") [18:01:47.748] } [18:01:47.748] } [18:01:47.748] } [18:01:47.748] })) [18:01:47.748] }, error = function(ex) { [18:01:47.748] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.748] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.748] ...future.rng), started = ...future.startTime, [18:01:47.748] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.748] version = "1.8"), class = "FutureResult") [18:01:47.748] }, finally = { [18:01:47.748] if (!identical(...future.workdir, getwd())) [18:01:47.748] setwd(...future.workdir) [18:01:47.748] { [18:01:47.748] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.748] ...future.oldOptions$nwarnings <- NULL [18:01:47.748] } [18:01:47.748] base::options(...future.oldOptions) [18:01:47.748] if (.Platform$OS.type == "windows") { [18:01:47.748] old_names <- names(...future.oldEnvVars) [18:01:47.748] envs <- base::Sys.getenv() [18:01:47.748] names <- names(envs) [18:01:47.748] common <- intersect(names, old_names) [18:01:47.748] added <- setdiff(names, old_names) [18:01:47.748] removed <- setdiff(old_names, names) [18:01:47.748] changed <- common[...future.oldEnvVars[common] != [18:01:47.748] envs[common]] [18:01:47.748] NAMES <- toupper(changed) [18:01:47.748] args <- list() [18:01:47.748] for (kk in seq_along(NAMES)) { [18:01:47.748] name <- changed[[kk]] [18:01:47.748] NAME <- NAMES[[kk]] [18:01:47.748] if (name != NAME && is.element(NAME, old_names)) [18:01:47.748] next [18:01:47.748] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.748] } [18:01:47.748] NAMES <- toupper(added) [18:01:47.748] for (kk in seq_along(NAMES)) { [18:01:47.748] name <- added[[kk]] [18:01:47.748] NAME <- NAMES[[kk]] [18:01:47.748] if (name != NAME && is.element(NAME, old_names)) [18:01:47.748] next [18:01:47.748] args[[name]] <- "" [18:01:47.748] } [18:01:47.748] NAMES <- toupper(removed) [18:01:47.748] for (kk in seq_along(NAMES)) { [18:01:47.748] name <- removed[[kk]] [18:01:47.748] NAME <- NAMES[[kk]] [18:01:47.748] if (name != NAME && is.element(NAME, old_names)) [18:01:47.748] next [18:01:47.748] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.748] } [18:01:47.748] if (length(args) > 0) [18:01:47.748] base::do.call(base::Sys.setenv, args = args) [18:01:47.748] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.748] } [18:01:47.748] else { [18:01:47.748] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.748] } [18:01:47.748] { [18:01:47.748] if (base::length(...future.futureOptionsAdded) > [18:01:47.748] 0L) { [18:01:47.748] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.748] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.748] base::options(opts) [18:01:47.748] } [18:01:47.748] { [18:01:47.748] { [18:01:47.748] NULL [18:01:47.748] RNGkind("Mersenne-Twister") [18:01:47.748] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.748] inherits = FALSE) [18:01:47.748] } [18:01:47.748] options(future.plan = NULL) [18:01:47.748] if (is.na(NA_character_)) [18:01:47.748] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.748] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.748] future::plan(list(function (..., envir = parent.frame()) [18:01:47.748] { [18:01:47.748] future <- SequentialFuture(..., envir = envir) [18:01:47.748] if (!future$lazy) [18:01:47.748] future <- run(future) [18:01:47.748] invisible(future) [18:01:47.748] }), .cleanup = FALSE, .init = FALSE) [18:01:47.748] } [18:01:47.748] } [18:01:47.748] } [18:01:47.748] }) [18:01:47.748] if (TRUE) { [18:01:47.748] base::sink(type = "output", split = FALSE) [18:01:47.748] if (TRUE) { [18:01:47.748] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.748] } [18:01:47.748] else { [18:01:47.748] ...future.result["stdout"] <- base::list(NULL) [18:01:47.748] } [18:01:47.748] base::close(...future.stdout) [18:01:47.748] ...future.stdout <- NULL [18:01:47.748] } [18:01:47.748] ...future.result$conditions <- ...future.conditions [18:01:47.748] ...future.result$finished <- base::Sys.time() [18:01:47.748] ...future.result [18:01:47.748] } [18:01:47.753] plan(): Setting new future strategy stack: [18:01:47.753] List of future strategies: [18:01:47.753] 1. sequential: [18:01:47.753] - args: function (..., envir = parent.frame()) [18:01:47.753] - tweaked: FALSE [18:01:47.753] - call: NULL [18:01:47.753] plan(): nbrOfWorkers() = 1 [18:01:47.755] plan(): Setting new future strategy stack: [18:01:47.755] List of future strategies: [18:01:47.755] 1. sequential: [18:01:47.755] - args: function (..., envir = parent.frame()) [18:01:47.755] - tweaked: FALSE [18:01:47.755] - call: plan(strategy) [18:01:47.756] plan(): nbrOfWorkers() = 1 [18:01:47.756] SequentialFuture started (and completed) [18:01:47.756] - Launch lazy future ... done [18:01:47.756] run() for 'SequentialFuture' ... done Call: lm(formula = dist ~ . - 1, data = cars) Coefficients: speed 2.909 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ . + 0, data = cars) Coefficients: speed 2.909 [18:01:47.759] getGlobalsAndPackages() ... [18:01:47.759] Searching for globals... [18:01:47.761] - globals found: [7] '{', 'lm', 'dist', '+', '.', '~', 'cars' [18:01:47.761] Searching for globals ... DONE [18:01:47.762] Resolving globals: FALSE [18:01:47.762] [18:01:47.762] - packages: [2] 'stats', 'datasets' [18:01:47.762] getGlobalsAndPackages() ... DONE [18:01:47.763] run() for 'Future' ... [18:01:47.763] - state: 'created' [18:01:47.763] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.764] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.764] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.764] - Field: 'label' [18:01:47.764] - Field: 'local' [18:01:47.764] - Field: 'owner' [18:01:47.764] - Field: 'envir' [18:01:47.765] - Field: 'packages' [18:01:47.765] - Field: 'gc' [18:01:47.765] - Field: 'conditions' [18:01:47.765] - Field: 'expr' [18:01:47.765] - Field: 'uuid' [18:01:47.765] - Field: 'seed' [18:01:47.766] - Field: 'version' [18:01:47.766] - Field: 'result' [18:01:47.766] - Field: 'asynchronous' [18:01:47.766] - Field: 'calls' [18:01:47.766] - Field: 'globals' [18:01:47.767] - Field: 'stdout' [18:01:47.767] - Field: 'earlySignal' [18:01:47.767] - Field: 'lazy' [18:01:47.767] - Field: 'state' [18:01:47.767] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.767] - Launch lazy future ... [18:01:47.768] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:47.768] Packages needed by future strategies (n = 0): [18:01:47.768] { [18:01:47.768] { [18:01:47.768] { [18:01:47.768] ...future.startTime <- base::Sys.time() [18:01:47.768] { [18:01:47.768] { [18:01:47.768] { [18:01:47.768] { [18:01:47.768] base::local({ [18:01:47.768] has_future <- base::requireNamespace("future", [18:01:47.768] quietly = TRUE) [18:01:47.768] if (has_future) { [18:01:47.768] ns <- base::getNamespace("future") [18:01:47.768] version <- ns[[".package"]][["version"]] [18:01:47.768] if (is.null(version)) [18:01:47.768] version <- utils::packageVersion("future") [18:01:47.768] } [18:01:47.768] else { [18:01:47.768] version <- NULL [18:01:47.768] } [18:01:47.768] if (!has_future || version < "1.8.0") { [18:01:47.768] info <- base::c(r_version = base::gsub("R version ", [18:01:47.768] "", base::R.version$version.string), [18:01:47.768] platform = base::sprintf("%s (%s-bit)", [18:01:47.768] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.768] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.768] "release", "version")], collapse = " "), [18:01:47.768] hostname = base::Sys.info()[["nodename"]]) [18:01:47.768] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.768] info) [18:01:47.768] info <- base::paste(info, collapse = "; ") [18:01:47.768] if (!has_future) { [18:01:47.768] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.768] info) [18:01:47.768] } [18:01:47.768] else { [18:01:47.768] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.768] info, version) [18:01:47.768] } [18:01:47.768] base::stop(msg) [18:01:47.768] } [18:01:47.768] }) [18:01:47.768] } [18:01:47.768] base::local({ [18:01:47.768] for (pkg in c("stats", "datasets")) { [18:01:47.768] base::loadNamespace(pkg) [18:01:47.768] base::library(pkg, character.only = TRUE) [18:01:47.768] } [18:01:47.768] }) [18:01:47.768] } [18:01:47.768] options(future.plan = NULL) [18:01:47.768] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.768] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.768] } [18:01:47.768] ...future.workdir <- getwd() [18:01:47.768] } [18:01:47.768] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.768] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.768] } [18:01:47.768] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.768] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.768] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.768] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.768] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.768] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.768] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.768] base::names(...future.oldOptions)) [18:01:47.768] } [18:01:47.768] if (FALSE) { [18:01:47.768] } [18:01:47.768] else { [18:01:47.768] if (TRUE) { [18:01:47.768] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.768] open = "w") [18:01:47.768] } [18:01:47.768] else { [18:01:47.768] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.768] windows = "NUL", "/dev/null"), open = "w") [18:01:47.768] } [18:01:47.768] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.768] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.768] base::sink(type = "output", split = FALSE) [18:01:47.768] base::close(...future.stdout) [18:01:47.768] }, add = TRUE) [18:01:47.768] } [18:01:47.768] ...future.frame <- base::sys.nframe() [18:01:47.768] ...future.conditions <- base::list() [18:01:47.768] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.768] if (FALSE) { [18:01:47.768] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.768] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.768] } [18:01:47.768] ...future.result <- base::tryCatch({ [18:01:47.768] base::withCallingHandlers({ [18:01:47.768] ...future.value <- base::withVisible(base::local({ [18:01:47.768] lm(dist ~ . + 0, data = cars) [18:01:47.768] })) [18:01:47.768] future::FutureResult(value = ...future.value$value, [18:01:47.768] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.768] ...future.rng), globalenv = if (FALSE) [18:01:47.768] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.768] ...future.globalenv.names)) [18:01:47.768] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.768] }, condition = base::local({ [18:01:47.768] c <- base::c [18:01:47.768] inherits <- base::inherits [18:01:47.768] invokeRestart <- base::invokeRestart [18:01:47.768] length <- base::length [18:01:47.768] list <- base::list [18:01:47.768] seq.int <- base::seq.int [18:01:47.768] signalCondition <- base::signalCondition [18:01:47.768] sys.calls <- base::sys.calls [18:01:47.768] `[[` <- base::`[[` [18:01:47.768] `+` <- base::`+` [18:01:47.768] `<<-` <- base::`<<-` [18:01:47.768] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.768] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.768] 3L)] [18:01:47.768] } [18:01:47.768] function(cond) { [18:01:47.768] is_error <- inherits(cond, "error") [18:01:47.768] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.768] NULL) [18:01:47.768] if (is_error) { [18:01:47.768] sessionInformation <- function() { [18:01:47.768] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.768] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.768] search = base::search(), system = base::Sys.info()) [18:01:47.768] } [18:01:47.768] ...future.conditions[[length(...future.conditions) + [18:01:47.768] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.768] cond$call), session = sessionInformation(), [18:01:47.768] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.768] signalCondition(cond) [18:01:47.768] } [18:01:47.768] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.768] "immediateCondition"))) { [18:01:47.768] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.768] ...future.conditions[[length(...future.conditions) + [18:01:47.768] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.768] if (TRUE && !signal) { [18:01:47.768] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.768] { [18:01:47.768] inherits <- base::inherits [18:01:47.768] invokeRestart <- base::invokeRestart [18:01:47.768] is.null <- base::is.null [18:01:47.768] muffled <- FALSE [18:01:47.768] if (inherits(cond, "message")) { [18:01:47.768] muffled <- grepl(pattern, "muffleMessage") [18:01:47.768] if (muffled) [18:01:47.768] invokeRestart("muffleMessage") [18:01:47.768] } [18:01:47.768] else if (inherits(cond, "warning")) { [18:01:47.768] muffled <- grepl(pattern, "muffleWarning") [18:01:47.768] if (muffled) [18:01:47.768] invokeRestart("muffleWarning") [18:01:47.768] } [18:01:47.768] else if (inherits(cond, "condition")) { [18:01:47.768] if (!is.null(pattern)) { [18:01:47.768] computeRestarts <- base::computeRestarts [18:01:47.768] grepl <- base::grepl [18:01:47.768] restarts <- computeRestarts(cond) [18:01:47.768] for (restart in restarts) { [18:01:47.768] name <- restart$name [18:01:47.768] if (is.null(name)) [18:01:47.768] next [18:01:47.768] if (!grepl(pattern, name)) [18:01:47.768] next [18:01:47.768] invokeRestart(restart) [18:01:47.768] muffled <- TRUE [18:01:47.768] break [18:01:47.768] } [18:01:47.768] } [18:01:47.768] } [18:01:47.768] invisible(muffled) [18:01:47.768] } [18:01:47.768] muffleCondition(cond, pattern = "^muffle") [18:01:47.768] } [18:01:47.768] } [18:01:47.768] else { [18:01:47.768] if (TRUE) { [18:01:47.768] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.768] { [18:01:47.768] inherits <- base::inherits [18:01:47.768] invokeRestart <- base::invokeRestart [18:01:47.768] is.null <- base::is.null [18:01:47.768] muffled <- FALSE [18:01:47.768] if (inherits(cond, "message")) { [18:01:47.768] muffled <- grepl(pattern, "muffleMessage") [18:01:47.768] if (muffled) [18:01:47.768] invokeRestart("muffleMessage") [18:01:47.768] } [18:01:47.768] else if (inherits(cond, "warning")) { [18:01:47.768] muffled <- grepl(pattern, "muffleWarning") [18:01:47.768] if (muffled) [18:01:47.768] invokeRestart("muffleWarning") [18:01:47.768] } [18:01:47.768] else if (inherits(cond, "condition")) { [18:01:47.768] if (!is.null(pattern)) { [18:01:47.768] computeRestarts <- base::computeRestarts [18:01:47.768] grepl <- base::grepl [18:01:47.768] restarts <- computeRestarts(cond) [18:01:47.768] for (restart in restarts) { [18:01:47.768] name <- restart$name [18:01:47.768] if (is.null(name)) [18:01:47.768] next [18:01:47.768] if (!grepl(pattern, name)) [18:01:47.768] next [18:01:47.768] invokeRestart(restart) [18:01:47.768] muffled <- TRUE [18:01:47.768] break [18:01:47.768] } [18:01:47.768] } [18:01:47.768] } [18:01:47.768] invisible(muffled) [18:01:47.768] } [18:01:47.768] muffleCondition(cond, pattern = "^muffle") [18:01:47.768] } [18:01:47.768] } [18:01:47.768] } [18:01:47.768] })) [18:01:47.768] }, error = function(ex) { [18:01:47.768] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.768] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.768] ...future.rng), started = ...future.startTime, [18:01:47.768] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.768] version = "1.8"), class = "FutureResult") [18:01:47.768] }, finally = { [18:01:47.768] if (!identical(...future.workdir, getwd())) [18:01:47.768] setwd(...future.workdir) [18:01:47.768] { [18:01:47.768] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.768] ...future.oldOptions$nwarnings <- NULL [18:01:47.768] } [18:01:47.768] base::options(...future.oldOptions) [18:01:47.768] if (.Platform$OS.type == "windows") { [18:01:47.768] old_names <- names(...future.oldEnvVars) [18:01:47.768] envs <- base::Sys.getenv() [18:01:47.768] names <- names(envs) [18:01:47.768] common <- intersect(names, old_names) [18:01:47.768] added <- setdiff(names, old_names) [18:01:47.768] removed <- setdiff(old_names, names) [18:01:47.768] changed <- common[...future.oldEnvVars[common] != [18:01:47.768] envs[common]] [18:01:47.768] NAMES <- toupper(changed) [18:01:47.768] args <- list() [18:01:47.768] for (kk in seq_along(NAMES)) { [18:01:47.768] name <- changed[[kk]] [18:01:47.768] NAME <- NAMES[[kk]] [18:01:47.768] if (name != NAME && is.element(NAME, old_names)) [18:01:47.768] next [18:01:47.768] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.768] } [18:01:47.768] NAMES <- toupper(added) [18:01:47.768] for (kk in seq_along(NAMES)) { [18:01:47.768] name <- added[[kk]] [18:01:47.768] NAME <- NAMES[[kk]] [18:01:47.768] if (name != NAME && is.element(NAME, old_names)) [18:01:47.768] next [18:01:47.768] args[[name]] <- "" [18:01:47.768] } [18:01:47.768] NAMES <- toupper(removed) [18:01:47.768] for (kk in seq_along(NAMES)) { [18:01:47.768] name <- removed[[kk]] [18:01:47.768] NAME <- NAMES[[kk]] [18:01:47.768] if (name != NAME && is.element(NAME, old_names)) [18:01:47.768] next [18:01:47.768] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.768] } [18:01:47.768] if (length(args) > 0) [18:01:47.768] base::do.call(base::Sys.setenv, args = args) [18:01:47.768] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.768] } [18:01:47.768] else { [18:01:47.768] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.768] } [18:01:47.768] { [18:01:47.768] if (base::length(...future.futureOptionsAdded) > [18:01:47.768] 0L) { [18:01:47.768] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.768] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.768] base::options(opts) [18:01:47.768] } [18:01:47.768] { [18:01:47.768] { [18:01:47.768] NULL [18:01:47.768] RNGkind("Mersenne-Twister") [18:01:47.768] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.768] inherits = FALSE) [18:01:47.768] } [18:01:47.768] options(future.plan = NULL) [18:01:47.768] if (is.na(NA_character_)) [18:01:47.768] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.768] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.768] future::plan(list(function (..., envir = parent.frame()) [18:01:47.768] { [18:01:47.768] future <- SequentialFuture(..., envir = envir) [18:01:47.768] if (!future$lazy) [18:01:47.768] future <- run(future) [18:01:47.768] invisible(future) [18:01:47.768] }), .cleanup = FALSE, .init = FALSE) [18:01:47.768] } [18:01:47.768] } [18:01:47.768] } [18:01:47.768] }) [18:01:47.768] if (TRUE) { [18:01:47.768] base::sink(type = "output", split = FALSE) [18:01:47.768] if (TRUE) { [18:01:47.768] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.768] } [18:01:47.768] else { [18:01:47.768] ...future.result["stdout"] <- base::list(NULL) [18:01:47.768] } [18:01:47.768] base::close(...future.stdout) [18:01:47.768] ...future.stdout <- NULL [18:01:47.768] } [18:01:47.768] ...future.result$conditions <- ...future.conditions [18:01:47.768] ...future.result$finished <- base::Sys.time() [18:01:47.768] ...future.result [18:01:47.768] } [18:01:47.773] plan(): Setting new future strategy stack: [18:01:47.773] List of future strategies: [18:01:47.773] 1. sequential: [18:01:47.773] - args: function (..., envir = parent.frame()) [18:01:47.773] - tweaked: FALSE [18:01:47.773] - call: NULL [18:01:47.773] plan(): nbrOfWorkers() = 1 [18:01:47.775] plan(): Setting new future strategy stack: [18:01:47.775] List of future strategies: [18:01:47.775] 1. sequential: [18:01:47.775] - args: function (..., envir = parent.frame()) [18:01:47.775] - tweaked: FALSE [18:01:47.775] - call: plan(strategy) [18:01:47.776] plan(): nbrOfWorkers() = 1 [18:01:47.776] SequentialFuture started (and completed) [18:01:47.776] - Launch lazy future ... done [18:01:47.777] run() for 'SequentialFuture' ... done Call: lm(formula = dist ~ . + 0, data = cars) Coefficients: speed 2.909 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ speed + speed^2, data = cars) Coefficients: (Intercept) speed -17.579 3.932 [18:01:47.780] getGlobalsAndPackages() ... [18:01:47.780] Searching for globals... [18:01:47.783] - globals found: [8] '{', 'lm', 'dist', '+', 'speed', '^', '~', 'cars' [18:01:47.783] Searching for globals ... DONE [18:01:47.783] Resolving globals: FALSE [18:01:47.784] [18:01:47.784] - packages: [2] 'stats', 'datasets' [18:01:47.784] getGlobalsAndPackages() ... DONE [18:01:47.784] run() for 'Future' ... [18:01:47.785] - state: 'created' [18:01:47.785] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.785] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.785] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.785] - Field: 'label' [18:01:47.786] - Field: 'local' [18:01:47.786] - Field: 'owner' [18:01:47.786] - Field: 'envir' [18:01:47.786] - Field: 'packages' [18:01:47.786] - Field: 'gc' [18:01:47.787] - Field: 'conditions' [18:01:47.787] - Field: 'expr' [18:01:47.787] - Field: 'uuid' [18:01:47.787] - Field: 'seed' [18:01:47.787] - Field: 'version' [18:01:47.787] - Field: 'result' [18:01:47.788] - Field: 'asynchronous' [18:01:47.788] - Field: 'calls' [18:01:47.788] - Field: 'globals' [18:01:47.788] - Field: 'stdout' [18:01:47.788] - Field: 'earlySignal' [18:01:47.788] - Field: 'lazy' [18:01:47.789] - Field: 'state' [18:01:47.789] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.789] - Launch lazy future ... [18:01:47.789] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:47.789] Packages needed by future strategies (n = 0): [18:01:47.790] { [18:01:47.790] { [18:01:47.790] { [18:01:47.790] ...future.startTime <- base::Sys.time() [18:01:47.790] { [18:01:47.790] { [18:01:47.790] { [18:01:47.790] { [18:01:47.790] base::local({ [18:01:47.790] has_future <- base::requireNamespace("future", [18:01:47.790] quietly = TRUE) [18:01:47.790] if (has_future) { [18:01:47.790] ns <- base::getNamespace("future") [18:01:47.790] version <- ns[[".package"]][["version"]] [18:01:47.790] if (is.null(version)) [18:01:47.790] version <- utils::packageVersion("future") [18:01:47.790] } [18:01:47.790] else { [18:01:47.790] version <- NULL [18:01:47.790] } [18:01:47.790] if (!has_future || version < "1.8.0") { [18:01:47.790] info <- base::c(r_version = base::gsub("R version ", [18:01:47.790] "", base::R.version$version.string), [18:01:47.790] platform = base::sprintf("%s (%s-bit)", [18:01:47.790] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.790] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.790] "release", "version")], collapse = " "), [18:01:47.790] hostname = base::Sys.info()[["nodename"]]) [18:01:47.790] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.790] info) [18:01:47.790] info <- base::paste(info, collapse = "; ") [18:01:47.790] if (!has_future) { [18:01:47.790] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.790] info) [18:01:47.790] } [18:01:47.790] else { [18:01:47.790] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.790] info, version) [18:01:47.790] } [18:01:47.790] base::stop(msg) [18:01:47.790] } [18:01:47.790] }) [18:01:47.790] } [18:01:47.790] base::local({ [18:01:47.790] for (pkg in c("stats", "datasets")) { [18:01:47.790] base::loadNamespace(pkg) [18:01:47.790] base::library(pkg, character.only = TRUE) [18:01:47.790] } [18:01:47.790] }) [18:01:47.790] } [18:01:47.790] options(future.plan = NULL) [18:01:47.790] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.790] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.790] } [18:01:47.790] ...future.workdir <- getwd() [18:01:47.790] } [18:01:47.790] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.790] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.790] } [18:01:47.790] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.790] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.790] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.790] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.790] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.790] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.790] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.790] base::names(...future.oldOptions)) [18:01:47.790] } [18:01:47.790] if (FALSE) { [18:01:47.790] } [18:01:47.790] else { [18:01:47.790] if (TRUE) { [18:01:47.790] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.790] open = "w") [18:01:47.790] } [18:01:47.790] else { [18:01:47.790] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.790] windows = "NUL", "/dev/null"), open = "w") [18:01:47.790] } [18:01:47.790] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.790] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.790] base::sink(type = "output", split = FALSE) [18:01:47.790] base::close(...future.stdout) [18:01:47.790] }, add = TRUE) [18:01:47.790] } [18:01:47.790] ...future.frame <- base::sys.nframe() [18:01:47.790] ...future.conditions <- base::list() [18:01:47.790] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.790] if (FALSE) { [18:01:47.790] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.790] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.790] } [18:01:47.790] ...future.result <- base::tryCatch({ [18:01:47.790] base::withCallingHandlers({ [18:01:47.790] ...future.value <- base::withVisible(base::local({ [18:01:47.790] lm(dist ~ speed + speed^2, data = cars) [18:01:47.790] })) [18:01:47.790] future::FutureResult(value = ...future.value$value, [18:01:47.790] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.790] ...future.rng), globalenv = if (FALSE) [18:01:47.790] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.790] ...future.globalenv.names)) [18:01:47.790] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.790] }, condition = base::local({ [18:01:47.790] c <- base::c [18:01:47.790] inherits <- base::inherits [18:01:47.790] invokeRestart <- base::invokeRestart [18:01:47.790] length <- base::length [18:01:47.790] list <- base::list [18:01:47.790] seq.int <- base::seq.int [18:01:47.790] signalCondition <- base::signalCondition [18:01:47.790] sys.calls <- base::sys.calls [18:01:47.790] `[[` <- base::`[[` [18:01:47.790] `+` <- base::`+` [18:01:47.790] `<<-` <- base::`<<-` [18:01:47.790] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.790] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.790] 3L)] [18:01:47.790] } [18:01:47.790] function(cond) { [18:01:47.790] is_error <- inherits(cond, "error") [18:01:47.790] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.790] NULL) [18:01:47.790] if (is_error) { [18:01:47.790] sessionInformation <- function() { [18:01:47.790] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.790] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.790] search = base::search(), system = base::Sys.info()) [18:01:47.790] } [18:01:47.790] ...future.conditions[[length(...future.conditions) + [18:01:47.790] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.790] cond$call), session = sessionInformation(), [18:01:47.790] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.790] signalCondition(cond) [18:01:47.790] } [18:01:47.790] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.790] "immediateCondition"))) { [18:01:47.790] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.790] ...future.conditions[[length(...future.conditions) + [18:01:47.790] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.790] if (TRUE && !signal) { [18:01:47.790] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.790] { [18:01:47.790] inherits <- base::inherits [18:01:47.790] invokeRestart <- base::invokeRestart [18:01:47.790] is.null <- base::is.null [18:01:47.790] muffled <- FALSE [18:01:47.790] if (inherits(cond, "message")) { [18:01:47.790] muffled <- grepl(pattern, "muffleMessage") [18:01:47.790] if (muffled) [18:01:47.790] invokeRestart("muffleMessage") [18:01:47.790] } [18:01:47.790] else if (inherits(cond, "warning")) { [18:01:47.790] muffled <- grepl(pattern, "muffleWarning") [18:01:47.790] if (muffled) [18:01:47.790] invokeRestart("muffleWarning") [18:01:47.790] } [18:01:47.790] else if (inherits(cond, "condition")) { [18:01:47.790] if (!is.null(pattern)) { [18:01:47.790] computeRestarts <- base::computeRestarts [18:01:47.790] grepl <- base::grepl [18:01:47.790] restarts <- computeRestarts(cond) [18:01:47.790] for (restart in restarts) { [18:01:47.790] name <- restart$name [18:01:47.790] if (is.null(name)) [18:01:47.790] next [18:01:47.790] if (!grepl(pattern, name)) [18:01:47.790] next [18:01:47.790] invokeRestart(restart) [18:01:47.790] muffled <- TRUE [18:01:47.790] break [18:01:47.790] } [18:01:47.790] } [18:01:47.790] } [18:01:47.790] invisible(muffled) [18:01:47.790] } [18:01:47.790] muffleCondition(cond, pattern = "^muffle") [18:01:47.790] } [18:01:47.790] } [18:01:47.790] else { [18:01:47.790] if (TRUE) { [18:01:47.790] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.790] { [18:01:47.790] inherits <- base::inherits [18:01:47.790] invokeRestart <- base::invokeRestart [18:01:47.790] is.null <- base::is.null [18:01:47.790] muffled <- FALSE [18:01:47.790] if (inherits(cond, "message")) { [18:01:47.790] muffled <- grepl(pattern, "muffleMessage") [18:01:47.790] if (muffled) [18:01:47.790] invokeRestart("muffleMessage") [18:01:47.790] } [18:01:47.790] else if (inherits(cond, "warning")) { [18:01:47.790] muffled <- grepl(pattern, "muffleWarning") [18:01:47.790] if (muffled) [18:01:47.790] invokeRestart("muffleWarning") [18:01:47.790] } [18:01:47.790] else if (inherits(cond, "condition")) { [18:01:47.790] if (!is.null(pattern)) { [18:01:47.790] computeRestarts <- base::computeRestarts [18:01:47.790] grepl <- base::grepl [18:01:47.790] restarts <- computeRestarts(cond) [18:01:47.790] for (restart in restarts) { [18:01:47.790] name <- restart$name [18:01:47.790] if (is.null(name)) [18:01:47.790] next [18:01:47.790] if (!grepl(pattern, name)) [18:01:47.790] next [18:01:47.790] invokeRestart(restart) [18:01:47.790] muffled <- TRUE [18:01:47.790] break [18:01:47.790] } [18:01:47.790] } [18:01:47.790] } [18:01:47.790] invisible(muffled) [18:01:47.790] } [18:01:47.790] muffleCondition(cond, pattern = "^muffle") [18:01:47.790] } [18:01:47.790] } [18:01:47.790] } [18:01:47.790] })) [18:01:47.790] }, error = function(ex) { [18:01:47.790] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.790] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.790] ...future.rng), started = ...future.startTime, [18:01:47.790] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.790] version = "1.8"), class = "FutureResult") [18:01:47.790] }, finally = { [18:01:47.790] if (!identical(...future.workdir, getwd())) [18:01:47.790] setwd(...future.workdir) [18:01:47.790] { [18:01:47.790] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.790] ...future.oldOptions$nwarnings <- NULL [18:01:47.790] } [18:01:47.790] base::options(...future.oldOptions) [18:01:47.790] if (.Platform$OS.type == "windows") { [18:01:47.790] old_names <- names(...future.oldEnvVars) [18:01:47.790] envs <- base::Sys.getenv() [18:01:47.790] names <- names(envs) [18:01:47.790] common <- intersect(names, old_names) [18:01:47.790] added <- setdiff(names, old_names) [18:01:47.790] removed <- setdiff(old_names, names) [18:01:47.790] changed <- common[...future.oldEnvVars[common] != [18:01:47.790] envs[common]] [18:01:47.790] NAMES <- toupper(changed) [18:01:47.790] args <- list() [18:01:47.790] for (kk in seq_along(NAMES)) { [18:01:47.790] name <- changed[[kk]] [18:01:47.790] NAME <- NAMES[[kk]] [18:01:47.790] if (name != NAME && is.element(NAME, old_names)) [18:01:47.790] next [18:01:47.790] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.790] } [18:01:47.790] NAMES <- toupper(added) [18:01:47.790] for (kk in seq_along(NAMES)) { [18:01:47.790] name <- added[[kk]] [18:01:47.790] NAME <- NAMES[[kk]] [18:01:47.790] if (name != NAME && is.element(NAME, old_names)) [18:01:47.790] next [18:01:47.790] args[[name]] <- "" [18:01:47.790] } [18:01:47.790] NAMES <- toupper(removed) [18:01:47.790] for (kk in seq_along(NAMES)) { [18:01:47.790] name <- removed[[kk]] [18:01:47.790] NAME <- NAMES[[kk]] [18:01:47.790] if (name != NAME && is.element(NAME, old_names)) [18:01:47.790] next [18:01:47.790] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.790] } [18:01:47.790] if (length(args) > 0) [18:01:47.790] base::do.call(base::Sys.setenv, args = args) [18:01:47.790] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.790] } [18:01:47.790] else { [18:01:47.790] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.790] } [18:01:47.790] { [18:01:47.790] if (base::length(...future.futureOptionsAdded) > [18:01:47.790] 0L) { [18:01:47.790] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.790] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.790] base::options(opts) [18:01:47.790] } [18:01:47.790] { [18:01:47.790] { [18:01:47.790] NULL [18:01:47.790] RNGkind("Mersenne-Twister") [18:01:47.790] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.790] inherits = FALSE) [18:01:47.790] } [18:01:47.790] options(future.plan = NULL) [18:01:47.790] if (is.na(NA_character_)) [18:01:47.790] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.790] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.790] future::plan(list(function (..., envir = parent.frame()) [18:01:47.790] { [18:01:47.790] future <- SequentialFuture(..., envir = envir) [18:01:47.790] if (!future$lazy) [18:01:47.790] future <- run(future) [18:01:47.790] invisible(future) [18:01:47.790] }), .cleanup = FALSE, .init = FALSE) [18:01:47.790] } [18:01:47.790] } [18:01:47.790] } [18:01:47.790] }) [18:01:47.790] if (TRUE) { [18:01:47.790] base::sink(type = "output", split = FALSE) [18:01:47.790] if (TRUE) { [18:01:47.790] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.790] } [18:01:47.790] else { [18:01:47.790] ...future.result["stdout"] <- base::list(NULL) [18:01:47.790] } [18:01:47.790] base::close(...future.stdout) [18:01:47.790] ...future.stdout <- NULL [18:01:47.790] } [18:01:47.790] ...future.result$conditions <- ...future.conditions [18:01:47.790] ...future.result$finished <- base::Sys.time() [18:01:47.790] ...future.result [18:01:47.790] } [18:01:47.794] plan(): Setting new future strategy stack: [18:01:47.795] List of future strategies: [18:01:47.795] 1. sequential: [18:01:47.795] - args: function (..., envir = parent.frame()) [18:01:47.795] - tweaked: FALSE [18:01:47.795] - call: NULL [18:01:47.795] plan(): nbrOfWorkers() = 1 [18:01:47.797] plan(): Setting new future strategy stack: [18:01:47.797] List of future strategies: [18:01:47.797] 1. sequential: [18:01:47.797] - args: function (..., envir = parent.frame()) [18:01:47.797] - tweaked: FALSE [18:01:47.797] - call: plan(strategy) [18:01:47.797] plan(): nbrOfWorkers() = 1 [18:01:47.798] SequentialFuture started (and completed) [18:01:47.798] - Launch lazy future ... done [18:01:47.798] run() for 'SequentialFuture' ... done Call: lm(formula = dist ~ speed + speed^2, data = cars) Coefficients: (Intercept) speed -17.579 3.932 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ speed + I(speed^2), data = cars) Coefficients: (Intercept) speed I(speed^2) 2.47014 0.91329 0.09996 [18:01:47.801] getGlobalsAndPackages() ... [18:01:47.801] Searching for globals... [18:01:47.804] - globals found: [9] '{', 'lm', 'dist', '+', 'speed', 'I', '^', '~', 'cars' [18:01:47.804] Searching for globals ... DONE [18:01:47.804] Resolving globals: FALSE [18:01:47.805] [18:01:47.805] - packages: [2] 'stats', 'datasets' [18:01:47.805] getGlobalsAndPackages() ... DONE [18:01:47.805] run() for 'Future' ... [18:01:47.806] - state: 'created' [18:01:47.806] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.806] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.806] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.807] - Field: 'label' [18:01:47.807] - Field: 'local' [18:01:47.807] - Field: 'owner' [18:01:47.807] - Field: 'envir' [18:01:47.807] - Field: 'packages' [18:01:47.807] - Field: 'gc' [18:01:47.808] - Field: 'conditions' [18:01:47.808] - Field: 'expr' [18:01:47.808] - Field: 'uuid' [18:01:47.808] - Field: 'seed' [18:01:47.808] - Field: 'version' [18:01:47.808] - Field: 'result' [18:01:47.809] - Field: 'asynchronous' [18:01:47.809] - Field: 'calls' [18:01:47.809] - Field: 'globals' [18:01:47.809] - Field: 'stdout' [18:01:47.810] - Field: 'earlySignal' [18:01:47.810] - Field: 'lazy' [18:01:47.811] - Field: 'state' [18:01:47.811] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.811] - Launch lazy future ... [18:01:47.811] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:47.811] Packages needed by future strategies (n = 0): [18:01:47.812] { [18:01:47.812] { [18:01:47.812] { [18:01:47.812] ...future.startTime <- base::Sys.time() [18:01:47.812] { [18:01:47.812] { [18:01:47.812] { [18:01:47.812] { [18:01:47.812] base::local({ [18:01:47.812] has_future <- base::requireNamespace("future", [18:01:47.812] quietly = TRUE) [18:01:47.812] if (has_future) { [18:01:47.812] ns <- base::getNamespace("future") [18:01:47.812] version <- ns[[".package"]][["version"]] [18:01:47.812] if (is.null(version)) [18:01:47.812] version <- utils::packageVersion("future") [18:01:47.812] } [18:01:47.812] else { [18:01:47.812] version <- NULL [18:01:47.812] } [18:01:47.812] if (!has_future || version < "1.8.0") { [18:01:47.812] info <- base::c(r_version = base::gsub("R version ", [18:01:47.812] "", base::R.version$version.string), [18:01:47.812] platform = base::sprintf("%s (%s-bit)", [18:01:47.812] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.812] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.812] "release", "version")], collapse = " "), [18:01:47.812] hostname = base::Sys.info()[["nodename"]]) [18:01:47.812] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.812] info) [18:01:47.812] info <- base::paste(info, collapse = "; ") [18:01:47.812] if (!has_future) { [18:01:47.812] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.812] info) [18:01:47.812] } [18:01:47.812] else { [18:01:47.812] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.812] info, version) [18:01:47.812] } [18:01:47.812] base::stop(msg) [18:01:47.812] } [18:01:47.812] }) [18:01:47.812] } [18:01:47.812] base::local({ [18:01:47.812] for (pkg in c("stats", "datasets")) { [18:01:47.812] base::loadNamespace(pkg) [18:01:47.812] base::library(pkg, character.only = TRUE) [18:01:47.812] } [18:01:47.812] }) [18:01:47.812] } [18:01:47.812] options(future.plan = NULL) [18:01:47.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.812] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.812] } [18:01:47.812] ...future.workdir <- getwd() [18:01:47.812] } [18:01:47.812] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.812] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.812] } [18:01:47.812] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.812] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.812] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.812] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.812] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.812] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.812] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.812] base::names(...future.oldOptions)) [18:01:47.812] } [18:01:47.812] if (FALSE) { [18:01:47.812] } [18:01:47.812] else { [18:01:47.812] if (TRUE) { [18:01:47.812] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.812] open = "w") [18:01:47.812] } [18:01:47.812] else { [18:01:47.812] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.812] windows = "NUL", "/dev/null"), open = "w") [18:01:47.812] } [18:01:47.812] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.812] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.812] base::sink(type = "output", split = FALSE) [18:01:47.812] base::close(...future.stdout) [18:01:47.812] }, add = TRUE) [18:01:47.812] } [18:01:47.812] ...future.frame <- base::sys.nframe() [18:01:47.812] ...future.conditions <- base::list() [18:01:47.812] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.812] if (FALSE) { [18:01:47.812] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.812] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.812] } [18:01:47.812] ...future.result <- base::tryCatch({ [18:01:47.812] base::withCallingHandlers({ [18:01:47.812] ...future.value <- base::withVisible(base::local({ [18:01:47.812] lm(dist ~ speed + I(speed^2), data = cars) [18:01:47.812] })) [18:01:47.812] future::FutureResult(value = ...future.value$value, [18:01:47.812] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.812] ...future.rng), globalenv = if (FALSE) [18:01:47.812] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.812] ...future.globalenv.names)) [18:01:47.812] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.812] }, condition = base::local({ [18:01:47.812] c <- base::c [18:01:47.812] inherits <- base::inherits [18:01:47.812] invokeRestart <- base::invokeRestart [18:01:47.812] length <- base::length [18:01:47.812] list <- base::list [18:01:47.812] seq.int <- base::seq.int [18:01:47.812] signalCondition <- base::signalCondition [18:01:47.812] sys.calls <- base::sys.calls [18:01:47.812] `[[` <- base::`[[` [18:01:47.812] `+` <- base::`+` [18:01:47.812] `<<-` <- base::`<<-` [18:01:47.812] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.812] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.812] 3L)] [18:01:47.812] } [18:01:47.812] function(cond) { [18:01:47.812] is_error <- inherits(cond, "error") [18:01:47.812] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.812] NULL) [18:01:47.812] if (is_error) { [18:01:47.812] sessionInformation <- function() { [18:01:47.812] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.812] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.812] search = base::search(), system = base::Sys.info()) [18:01:47.812] } [18:01:47.812] ...future.conditions[[length(...future.conditions) + [18:01:47.812] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.812] cond$call), session = sessionInformation(), [18:01:47.812] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.812] signalCondition(cond) [18:01:47.812] } [18:01:47.812] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.812] "immediateCondition"))) { [18:01:47.812] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.812] ...future.conditions[[length(...future.conditions) + [18:01:47.812] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.812] if (TRUE && !signal) { [18:01:47.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.812] { [18:01:47.812] inherits <- base::inherits [18:01:47.812] invokeRestart <- base::invokeRestart [18:01:47.812] is.null <- base::is.null [18:01:47.812] muffled <- FALSE [18:01:47.812] if (inherits(cond, "message")) { [18:01:47.812] muffled <- grepl(pattern, "muffleMessage") [18:01:47.812] if (muffled) [18:01:47.812] invokeRestart("muffleMessage") [18:01:47.812] } [18:01:47.812] else if (inherits(cond, "warning")) { [18:01:47.812] muffled <- grepl(pattern, "muffleWarning") [18:01:47.812] if (muffled) [18:01:47.812] invokeRestart("muffleWarning") [18:01:47.812] } [18:01:47.812] else if (inherits(cond, "condition")) { [18:01:47.812] if (!is.null(pattern)) { [18:01:47.812] computeRestarts <- base::computeRestarts [18:01:47.812] grepl <- base::grepl [18:01:47.812] restarts <- computeRestarts(cond) [18:01:47.812] for (restart in restarts) { [18:01:47.812] name <- restart$name [18:01:47.812] if (is.null(name)) [18:01:47.812] next [18:01:47.812] if (!grepl(pattern, name)) [18:01:47.812] next [18:01:47.812] invokeRestart(restart) [18:01:47.812] muffled <- TRUE [18:01:47.812] break [18:01:47.812] } [18:01:47.812] } [18:01:47.812] } [18:01:47.812] invisible(muffled) [18:01:47.812] } [18:01:47.812] muffleCondition(cond, pattern = "^muffle") [18:01:47.812] } [18:01:47.812] } [18:01:47.812] else { [18:01:47.812] if (TRUE) { [18:01:47.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.812] { [18:01:47.812] inherits <- base::inherits [18:01:47.812] invokeRestart <- base::invokeRestart [18:01:47.812] is.null <- base::is.null [18:01:47.812] muffled <- FALSE [18:01:47.812] if (inherits(cond, "message")) { [18:01:47.812] muffled <- grepl(pattern, "muffleMessage") [18:01:47.812] if (muffled) [18:01:47.812] invokeRestart("muffleMessage") [18:01:47.812] } [18:01:47.812] else if (inherits(cond, "warning")) { [18:01:47.812] muffled <- grepl(pattern, "muffleWarning") [18:01:47.812] if (muffled) [18:01:47.812] invokeRestart("muffleWarning") [18:01:47.812] } [18:01:47.812] else if (inherits(cond, "condition")) { [18:01:47.812] if (!is.null(pattern)) { [18:01:47.812] computeRestarts <- base::computeRestarts [18:01:47.812] grepl <- base::grepl [18:01:47.812] restarts <- computeRestarts(cond) [18:01:47.812] for (restart in restarts) { [18:01:47.812] name <- restart$name [18:01:47.812] if (is.null(name)) [18:01:47.812] next [18:01:47.812] if (!grepl(pattern, name)) [18:01:47.812] next [18:01:47.812] invokeRestart(restart) [18:01:47.812] muffled <- TRUE [18:01:47.812] break [18:01:47.812] } [18:01:47.812] } [18:01:47.812] } [18:01:47.812] invisible(muffled) [18:01:47.812] } [18:01:47.812] muffleCondition(cond, pattern = "^muffle") [18:01:47.812] } [18:01:47.812] } [18:01:47.812] } [18:01:47.812] })) [18:01:47.812] }, error = function(ex) { [18:01:47.812] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.812] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.812] ...future.rng), started = ...future.startTime, [18:01:47.812] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.812] version = "1.8"), class = "FutureResult") [18:01:47.812] }, finally = { [18:01:47.812] if (!identical(...future.workdir, getwd())) [18:01:47.812] setwd(...future.workdir) [18:01:47.812] { [18:01:47.812] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.812] ...future.oldOptions$nwarnings <- NULL [18:01:47.812] } [18:01:47.812] base::options(...future.oldOptions) [18:01:47.812] if (.Platform$OS.type == "windows") { [18:01:47.812] old_names <- names(...future.oldEnvVars) [18:01:47.812] envs <- base::Sys.getenv() [18:01:47.812] names <- names(envs) [18:01:47.812] common <- intersect(names, old_names) [18:01:47.812] added <- setdiff(names, old_names) [18:01:47.812] removed <- setdiff(old_names, names) [18:01:47.812] changed <- common[...future.oldEnvVars[common] != [18:01:47.812] envs[common]] [18:01:47.812] NAMES <- toupper(changed) [18:01:47.812] args <- list() [18:01:47.812] for (kk in seq_along(NAMES)) { [18:01:47.812] name <- changed[[kk]] [18:01:47.812] NAME <- NAMES[[kk]] [18:01:47.812] if (name != NAME && is.element(NAME, old_names)) [18:01:47.812] next [18:01:47.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.812] } [18:01:47.812] NAMES <- toupper(added) [18:01:47.812] for (kk in seq_along(NAMES)) { [18:01:47.812] name <- added[[kk]] [18:01:47.812] NAME <- NAMES[[kk]] [18:01:47.812] if (name != NAME && is.element(NAME, old_names)) [18:01:47.812] next [18:01:47.812] args[[name]] <- "" [18:01:47.812] } [18:01:47.812] NAMES <- toupper(removed) [18:01:47.812] for (kk in seq_along(NAMES)) { [18:01:47.812] name <- removed[[kk]] [18:01:47.812] NAME <- NAMES[[kk]] [18:01:47.812] if (name != NAME && is.element(NAME, old_names)) [18:01:47.812] next [18:01:47.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.812] } [18:01:47.812] if (length(args) > 0) [18:01:47.812] base::do.call(base::Sys.setenv, args = args) [18:01:47.812] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.812] } [18:01:47.812] else { [18:01:47.812] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.812] } [18:01:47.812] { [18:01:47.812] if (base::length(...future.futureOptionsAdded) > [18:01:47.812] 0L) { [18:01:47.812] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.812] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.812] base::options(opts) [18:01:47.812] } [18:01:47.812] { [18:01:47.812] { [18:01:47.812] NULL [18:01:47.812] RNGkind("Mersenne-Twister") [18:01:47.812] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.812] inherits = FALSE) [18:01:47.812] } [18:01:47.812] options(future.plan = NULL) [18:01:47.812] if (is.na(NA_character_)) [18:01:47.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.812] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.812] future::plan(list(function (..., envir = parent.frame()) [18:01:47.812] { [18:01:47.812] future <- SequentialFuture(..., envir = envir) [18:01:47.812] if (!future$lazy) [18:01:47.812] future <- run(future) [18:01:47.812] invisible(future) [18:01:47.812] }), .cleanup = FALSE, .init = FALSE) [18:01:47.812] } [18:01:47.812] } [18:01:47.812] } [18:01:47.812] }) [18:01:47.812] if (TRUE) { [18:01:47.812] base::sink(type = "output", split = FALSE) [18:01:47.812] if (TRUE) { [18:01:47.812] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.812] } [18:01:47.812] else { [18:01:47.812] ...future.result["stdout"] <- base::list(NULL) [18:01:47.812] } [18:01:47.812] base::close(...future.stdout) [18:01:47.812] ...future.stdout <- NULL [18:01:47.812] } [18:01:47.812] ...future.result$conditions <- ...future.conditions [18:01:47.812] ...future.result$finished <- base::Sys.time() [18:01:47.812] ...future.result [18:01:47.812] } [18:01:47.816] plan(): Setting new future strategy stack: [18:01:47.816] List of future strategies: [18:01:47.816] 1. sequential: [18:01:47.816] - args: function (..., envir = parent.frame()) [18:01:47.816] - tweaked: FALSE [18:01:47.816] - call: NULL [18:01:47.817] plan(): nbrOfWorkers() = 1 [18:01:47.819] plan(): Setting new future strategy stack: [18:01:47.819] List of future strategies: [18:01:47.819] 1. sequential: [18:01:47.819] - args: function (..., envir = parent.frame()) [18:01:47.819] - tweaked: FALSE [18:01:47.819] - call: plan(strategy) [18:01:47.820] plan(): nbrOfWorkers() = 1 [18:01:47.820] SequentialFuture started (and completed) [18:01:47.820] - Launch lazy future ... done [18:01:47.820] run() for 'SequentialFuture' ... done Call: lm(formula = dist ~ speed + I(speed^2), data = cars) Coefficients: (Intercept) speed I(speed^2) 2.47014 0.91329 0.09996 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ poly(speed, 2), data = cars) Coefficients: (Intercept) poly(speed, 2)1 poly(speed, 2)2 42.98 145.55 23.00 [18:01:47.824] getGlobalsAndPackages() ... [18:01:47.824] Searching for globals... [18:01:47.826] - globals found: [7] '{', 'lm', 'dist', 'poly', 'speed', '~', 'cars' [18:01:47.827] Searching for globals ... DONE [18:01:47.827] Resolving globals: FALSE [18:01:47.827] [18:01:47.827] - packages: [2] 'stats', 'datasets' [18:01:47.828] getGlobalsAndPackages() ... DONE [18:01:47.828] run() for 'Future' ... [18:01:47.828] - state: 'created' [18:01:47.828] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.829] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.829] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.829] - Field: 'label' [18:01:47.829] - Field: 'local' [18:01:47.829] - Field: 'owner' [18:01:47.830] - Field: 'envir' [18:01:47.830] - Field: 'packages' [18:01:47.830] - Field: 'gc' [18:01:47.830] - Field: 'conditions' [18:01:47.830] - Field: 'expr' [18:01:47.831] - Field: 'uuid' [18:01:47.831] - Field: 'seed' [18:01:47.831] - Field: 'version' [18:01:47.831] - Field: 'result' [18:01:47.831] - Field: 'asynchronous' [18:01:47.831] - Field: 'calls' [18:01:47.832] - Field: 'globals' [18:01:47.832] - Field: 'stdout' [18:01:47.832] - Field: 'earlySignal' [18:01:47.832] - Field: 'lazy' [18:01:47.832] - Field: 'state' [18:01:47.832] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.833] - Launch lazy future ... [18:01:47.833] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:47.833] Packages needed by future strategies (n = 0): [18:01:47.834] { [18:01:47.834] { [18:01:47.834] { [18:01:47.834] ...future.startTime <- base::Sys.time() [18:01:47.834] { [18:01:47.834] { [18:01:47.834] { [18:01:47.834] { [18:01:47.834] base::local({ [18:01:47.834] has_future <- base::requireNamespace("future", [18:01:47.834] quietly = TRUE) [18:01:47.834] if (has_future) { [18:01:47.834] ns <- base::getNamespace("future") [18:01:47.834] version <- ns[[".package"]][["version"]] [18:01:47.834] if (is.null(version)) [18:01:47.834] version <- utils::packageVersion("future") [18:01:47.834] } [18:01:47.834] else { [18:01:47.834] version <- NULL [18:01:47.834] } [18:01:47.834] if (!has_future || version < "1.8.0") { [18:01:47.834] info <- base::c(r_version = base::gsub("R version ", [18:01:47.834] "", base::R.version$version.string), [18:01:47.834] platform = base::sprintf("%s (%s-bit)", [18:01:47.834] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.834] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.834] "release", "version")], collapse = " "), [18:01:47.834] hostname = base::Sys.info()[["nodename"]]) [18:01:47.834] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.834] info) [18:01:47.834] info <- base::paste(info, collapse = "; ") [18:01:47.834] if (!has_future) { [18:01:47.834] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.834] info) [18:01:47.834] } [18:01:47.834] else { [18:01:47.834] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.834] info, version) [18:01:47.834] } [18:01:47.834] base::stop(msg) [18:01:47.834] } [18:01:47.834] }) [18:01:47.834] } [18:01:47.834] base::local({ [18:01:47.834] for (pkg in c("stats", "datasets")) { [18:01:47.834] base::loadNamespace(pkg) [18:01:47.834] base::library(pkg, character.only = TRUE) [18:01:47.834] } [18:01:47.834] }) [18:01:47.834] } [18:01:47.834] options(future.plan = NULL) [18:01:47.834] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.834] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.834] } [18:01:47.834] ...future.workdir <- getwd() [18:01:47.834] } [18:01:47.834] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.834] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.834] } [18:01:47.834] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.834] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.834] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.834] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.834] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.834] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.834] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.834] base::names(...future.oldOptions)) [18:01:47.834] } [18:01:47.834] if (FALSE) { [18:01:47.834] } [18:01:47.834] else { [18:01:47.834] if (TRUE) { [18:01:47.834] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.834] open = "w") [18:01:47.834] } [18:01:47.834] else { [18:01:47.834] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.834] windows = "NUL", "/dev/null"), open = "w") [18:01:47.834] } [18:01:47.834] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.834] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.834] base::sink(type = "output", split = FALSE) [18:01:47.834] base::close(...future.stdout) [18:01:47.834] }, add = TRUE) [18:01:47.834] } [18:01:47.834] ...future.frame <- base::sys.nframe() [18:01:47.834] ...future.conditions <- base::list() [18:01:47.834] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.834] if (FALSE) { [18:01:47.834] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.834] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.834] } [18:01:47.834] ...future.result <- base::tryCatch({ [18:01:47.834] base::withCallingHandlers({ [18:01:47.834] ...future.value <- base::withVisible(base::local({ [18:01:47.834] lm(dist ~ poly(speed, 2), data = cars) [18:01:47.834] })) [18:01:47.834] future::FutureResult(value = ...future.value$value, [18:01:47.834] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.834] ...future.rng), globalenv = if (FALSE) [18:01:47.834] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.834] ...future.globalenv.names)) [18:01:47.834] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.834] }, condition = base::local({ [18:01:47.834] c <- base::c [18:01:47.834] inherits <- base::inherits [18:01:47.834] invokeRestart <- base::invokeRestart [18:01:47.834] length <- base::length [18:01:47.834] list <- base::list [18:01:47.834] seq.int <- base::seq.int [18:01:47.834] signalCondition <- base::signalCondition [18:01:47.834] sys.calls <- base::sys.calls [18:01:47.834] `[[` <- base::`[[` [18:01:47.834] `+` <- base::`+` [18:01:47.834] `<<-` <- base::`<<-` [18:01:47.834] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.834] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.834] 3L)] [18:01:47.834] } [18:01:47.834] function(cond) { [18:01:47.834] is_error <- inherits(cond, "error") [18:01:47.834] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.834] NULL) [18:01:47.834] if (is_error) { [18:01:47.834] sessionInformation <- function() { [18:01:47.834] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.834] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.834] search = base::search(), system = base::Sys.info()) [18:01:47.834] } [18:01:47.834] ...future.conditions[[length(...future.conditions) + [18:01:47.834] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.834] cond$call), session = sessionInformation(), [18:01:47.834] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.834] signalCondition(cond) [18:01:47.834] } [18:01:47.834] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.834] "immediateCondition"))) { [18:01:47.834] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.834] ...future.conditions[[length(...future.conditions) + [18:01:47.834] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.834] if (TRUE && !signal) { [18:01:47.834] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.834] { [18:01:47.834] inherits <- base::inherits [18:01:47.834] invokeRestart <- base::invokeRestart [18:01:47.834] is.null <- base::is.null [18:01:47.834] muffled <- FALSE [18:01:47.834] if (inherits(cond, "message")) { [18:01:47.834] muffled <- grepl(pattern, "muffleMessage") [18:01:47.834] if (muffled) [18:01:47.834] invokeRestart("muffleMessage") [18:01:47.834] } [18:01:47.834] else if (inherits(cond, "warning")) { [18:01:47.834] muffled <- grepl(pattern, "muffleWarning") [18:01:47.834] if (muffled) [18:01:47.834] invokeRestart("muffleWarning") [18:01:47.834] } [18:01:47.834] else if (inherits(cond, "condition")) { [18:01:47.834] if (!is.null(pattern)) { [18:01:47.834] computeRestarts <- base::computeRestarts [18:01:47.834] grepl <- base::grepl [18:01:47.834] restarts <- computeRestarts(cond) [18:01:47.834] for (restart in restarts) { [18:01:47.834] name <- restart$name [18:01:47.834] if (is.null(name)) [18:01:47.834] next [18:01:47.834] if (!grepl(pattern, name)) [18:01:47.834] next [18:01:47.834] invokeRestart(restart) [18:01:47.834] muffled <- TRUE [18:01:47.834] break [18:01:47.834] } [18:01:47.834] } [18:01:47.834] } [18:01:47.834] invisible(muffled) [18:01:47.834] } [18:01:47.834] muffleCondition(cond, pattern = "^muffle") [18:01:47.834] } [18:01:47.834] } [18:01:47.834] else { [18:01:47.834] if (TRUE) { [18:01:47.834] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.834] { [18:01:47.834] inherits <- base::inherits [18:01:47.834] invokeRestart <- base::invokeRestart [18:01:47.834] is.null <- base::is.null [18:01:47.834] muffled <- FALSE [18:01:47.834] if (inherits(cond, "message")) { [18:01:47.834] muffled <- grepl(pattern, "muffleMessage") [18:01:47.834] if (muffled) [18:01:47.834] invokeRestart("muffleMessage") [18:01:47.834] } [18:01:47.834] else if (inherits(cond, "warning")) { [18:01:47.834] muffled <- grepl(pattern, "muffleWarning") [18:01:47.834] if (muffled) [18:01:47.834] invokeRestart("muffleWarning") [18:01:47.834] } [18:01:47.834] else if (inherits(cond, "condition")) { [18:01:47.834] if (!is.null(pattern)) { [18:01:47.834] computeRestarts <- base::computeRestarts [18:01:47.834] grepl <- base::grepl [18:01:47.834] restarts <- computeRestarts(cond) [18:01:47.834] for (restart in restarts) { [18:01:47.834] name <- restart$name [18:01:47.834] if (is.null(name)) [18:01:47.834] next [18:01:47.834] if (!grepl(pattern, name)) [18:01:47.834] next [18:01:47.834] invokeRestart(restart) [18:01:47.834] muffled <- TRUE [18:01:47.834] break [18:01:47.834] } [18:01:47.834] } [18:01:47.834] } [18:01:47.834] invisible(muffled) [18:01:47.834] } [18:01:47.834] muffleCondition(cond, pattern = "^muffle") [18:01:47.834] } [18:01:47.834] } [18:01:47.834] } [18:01:47.834] })) [18:01:47.834] }, error = function(ex) { [18:01:47.834] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.834] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.834] ...future.rng), started = ...future.startTime, [18:01:47.834] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.834] version = "1.8"), class = "FutureResult") [18:01:47.834] }, finally = { [18:01:47.834] if (!identical(...future.workdir, getwd())) [18:01:47.834] setwd(...future.workdir) [18:01:47.834] { [18:01:47.834] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.834] ...future.oldOptions$nwarnings <- NULL [18:01:47.834] } [18:01:47.834] base::options(...future.oldOptions) [18:01:47.834] if (.Platform$OS.type == "windows") { [18:01:47.834] old_names <- names(...future.oldEnvVars) [18:01:47.834] envs <- base::Sys.getenv() [18:01:47.834] names <- names(envs) [18:01:47.834] common <- intersect(names, old_names) [18:01:47.834] added <- setdiff(names, old_names) [18:01:47.834] removed <- setdiff(old_names, names) [18:01:47.834] changed <- common[...future.oldEnvVars[common] != [18:01:47.834] envs[common]] [18:01:47.834] NAMES <- toupper(changed) [18:01:47.834] args <- list() [18:01:47.834] for (kk in seq_along(NAMES)) { [18:01:47.834] name <- changed[[kk]] [18:01:47.834] NAME <- NAMES[[kk]] [18:01:47.834] if (name != NAME && is.element(NAME, old_names)) [18:01:47.834] next [18:01:47.834] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.834] } [18:01:47.834] NAMES <- toupper(added) [18:01:47.834] for (kk in seq_along(NAMES)) { [18:01:47.834] name <- added[[kk]] [18:01:47.834] NAME <- NAMES[[kk]] [18:01:47.834] if (name != NAME && is.element(NAME, old_names)) [18:01:47.834] next [18:01:47.834] args[[name]] <- "" [18:01:47.834] } [18:01:47.834] NAMES <- toupper(removed) [18:01:47.834] for (kk in seq_along(NAMES)) { [18:01:47.834] name <- removed[[kk]] [18:01:47.834] NAME <- NAMES[[kk]] [18:01:47.834] if (name != NAME && is.element(NAME, old_names)) [18:01:47.834] next [18:01:47.834] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.834] } [18:01:47.834] if (length(args) > 0) [18:01:47.834] base::do.call(base::Sys.setenv, args = args) [18:01:47.834] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.834] } [18:01:47.834] else { [18:01:47.834] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.834] } [18:01:47.834] { [18:01:47.834] if (base::length(...future.futureOptionsAdded) > [18:01:47.834] 0L) { [18:01:47.834] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.834] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.834] base::options(opts) [18:01:47.834] } [18:01:47.834] { [18:01:47.834] { [18:01:47.834] NULL [18:01:47.834] RNGkind("Mersenne-Twister") [18:01:47.834] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.834] inherits = FALSE) [18:01:47.834] } [18:01:47.834] options(future.plan = NULL) [18:01:47.834] if (is.na(NA_character_)) [18:01:47.834] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.834] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.834] future::plan(list(function (..., envir = parent.frame()) [18:01:47.834] { [18:01:47.834] future <- SequentialFuture(..., envir = envir) [18:01:47.834] if (!future$lazy) [18:01:47.834] future <- run(future) [18:01:47.834] invisible(future) [18:01:47.834] }), .cleanup = FALSE, .init = FALSE) [18:01:47.834] } [18:01:47.834] } [18:01:47.834] } [18:01:47.834] }) [18:01:47.834] if (TRUE) { [18:01:47.834] base::sink(type = "output", split = FALSE) [18:01:47.834] if (TRUE) { [18:01:47.834] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.834] } [18:01:47.834] else { [18:01:47.834] ...future.result["stdout"] <- base::list(NULL) [18:01:47.834] } [18:01:47.834] base::close(...future.stdout) [18:01:47.834] ...future.stdout <- NULL [18:01:47.834] } [18:01:47.834] ...future.result$conditions <- ...future.conditions [18:01:47.834] ...future.result$finished <- base::Sys.time() [18:01:47.834] ...future.result [18:01:47.834] } [18:01:47.838] plan(): Setting new future strategy stack: [18:01:47.838] List of future strategies: [18:01:47.838] 1. sequential: [18:01:47.838] - args: function (..., envir = parent.frame()) [18:01:47.838] - tweaked: FALSE [18:01:47.838] - call: NULL [18:01:47.839] plan(): nbrOfWorkers() = 1 [18:01:47.841] plan(): Setting new future strategy stack: [18:01:47.841] List of future strategies: [18:01:47.841] 1. sequential: [18:01:47.841] - args: function (..., envir = parent.frame()) [18:01:47.841] - tweaked: FALSE [18:01:47.841] - call: plan(strategy) [18:01:47.842] plan(): nbrOfWorkers() = 1 [18:01:47.842] SequentialFuture started (and completed) [18:01:47.842] - Launch lazy future ... done [18:01:47.842] run() for 'SequentialFuture' ... done Call: lm(formula = dist ~ poly(speed, 2), data = cars) Coefficients: (Intercept) poly(speed, 2)1 poly(speed, 2)2 42.98 145.55 23.00 - Globals - map(x, ~ expr) ... [18:01:47.845] getGlobalsAndPackages() ... [18:01:47.846] Searching for globals... [18:01:47.852] - globals found: [16] '{', 'outer_function', 'map', ':', '~', 'inner_function', '.x', 'if', 'inherits', '<-', '[[', '-', 'eval', 'bquote', 'lapply', '+' [18:01:47.852] Searching for globals ... DONE [18:01:47.852] Resolving globals: FALSE [18:01:47.853] The total size of the 3 globals is 7.52 KiB (7704 bytes) [18:01:47.853] The total size of the 3 globals exported for future expression ('{; outer_function(1L); }') is 7.52 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'map' (4.43 KiB of class 'function'), 'inner_function' (1.78 KiB of class 'function') and 'outer_function' (1.31 KiB of class 'function') [18:01:47.854] - globals: [3] 'outer_function', 'map', 'inner_function' [18:01:47.854] [18:01:47.854] getGlobalsAndPackages() ... DONE [18:01:47.854] run() for 'Future' ... [18:01:47.854] - state: 'created' [18:01:47.855] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.855] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.855] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.855] - Field: 'label' [18:01:47.856] - Field: 'local' [18:01:47.856] - Field: 'owner' [18:01:47.856] - Field: 'envir' [18:01:47.856] - Field: 'packages' [18:01:47.856] - Field: 'gc' [18:01:47.856] - Field: 'conditions' [18:01:47.857] - Field: 'expr' [18:01:47.857] - Field: 'uuid' [18:01:47.857] - Field: 'seed' [18:01:47.857] - Field: 'version' [18:01:47.857] - Field: 'result' [18:01:47.857] - Field: 'asynchronous' [18:01:47.858] - Field: 'calls' [18:01:47.858] - Field: 'globals' [18:01:47.858] - Field: 'stdout' [18:01:47.858] - Field: 'earlySignal' [18:01:47.858] - Field: 'lazy' [18:01:47.859] - Field: 'state' [18:01:47.859] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.859] - Launch lazy future ... [18:01:47.859] Packages needed by the future expression (n = 0): [18:01:47.859] Packages needed by future strategies (n = 0): [18:01:47.860] { [18:01:47.860] { [18:01:47.860] { [18:01:47.860] ...future.startTime <- base::Sys.time() [18:01:47.860] { [18:01:47.860] { [18:01:47.860] { [18:01:47.860] base::local({ [18:01:47.860] has_future <- base::requireNamespace("future", [18:01:47.860] quietly = TRUE) [18:01:47.860] if (has_future) { [18:01:47.860] ns <- base::getNamespace("future") [18:01:47.860] version <- ns[[".package"]][["version"]] [18:01:47.860] if (is.null(version)) [18:01:47.860] version <- utils::packageVersion("future") [18:01:47.860] } [18:01:47.860] else { [18:01:47.860] version <- NULL [18:01:47.860] } [18:01:47.860] if (!has_future || version < "1.8.0") { [18:01:47.860] info <- base::c(r_version = base::gsub("R version ", [18:01:47.860] "", base::R.version$version.string), [18:01:47.860] platform = base::sprintf("%s (%s-bit)", [18:01:47.860] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.860] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.860] "release", "version")], collapse = " "), [18:01:47.860] hostname = base::Sys.info()[["nodename"]]) [18:01:47.860] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.860] info) [18:01:47.860] info <- base::paste(info, collapse = "; ") [18:01:47.860] if (!has_future) { [18:01:47.860] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.860] info) [18:01:47.860] } [18:01:47.860] else { [18:01:47.860] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.860] info, version) [18:01:47.860] } [18:01:47.860] base::stop(msg) [18:01:47.860] } [18:01:47.860] }) [18:01:47.860] } [18:01:47.860] options(future.plan = NULL) [18:01:47.860] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.860] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.860] } [18:01:47.860] ...future.workdir <- getwd() [18:01:47.860] } [18:01:47.860] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.860] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.860] } [18:01:47.860] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.860] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.860] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.860] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.860] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.860] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.860] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.860] base::names(...future.oldOptions)) [18:01:47.860] } [18:01:47.860] if (FALSE) { [18:01:47.860] } [18:01:47.860] else { [18:01:47.860] if (TRUE) { [18:01:47.860] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.860] open = "w") [18:01:47.860] } [18:01:47.860] else { [18:01:47.860] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.860] windows = "NUL", "/dev/null"), open = "w") [18:01:47.860] } [18:01:47.860] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.860] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.860] base::sink(type = "output", split = FALSE) [18:01:47.860] base::close(...future.stdout) [18:01:47.860] }, add = TRUE) [18:01:47.860] } [18:01:47.860] ...future.frame <- base::sys.nframe() [18:01:47.860] ...future.conditions <- base::list() [18:01:47.860] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.860] if (FALSE) { [18:01:47.860] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.860] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.860] } [18:01:47.860] ...future.result <- base::tryCatch({ [18:01:47.860] base::withCallingHandlers({ [18:01:47.860] ...future.value <- base::withVisible(base::local({ [18:01:47.860] outer_function(1L) [18:01:47.860] })) [18:01:47.860] future::FutureResult(value = ...future.value$value, [18:01:47.860] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.860] ...future.rng), globalenv = if (FALSE) [18:01:47.860] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.860] ...future.globalenv.names)) [18:01:47.860] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.860] }, condition = base::local({ [18:01:47.860] c <- base::c [18:01:47.860] inherits <- base::inherits [18:01:47.860] invokeRestart <- base::invokeRestart [18:01:47.860] length <- base::length [18:01:47.860] list <- base::list [18:01:47.860] seq.int <- base::seq.int [18:01:47.860] signalCondition <- base::signalCondition [18:01:47.860] sys.calls <- base::sys.calls [18:01:47.860] `[[` <- base::`[[` [18:01:47.860] `+` <- base::`+` [18:01:47.860] `<<-` <- base::`<<-` [18:01:47.860] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.860] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.860] 3L)] [18:01:47.860] } [18:01:47.860] function(cond) { [18:01:47.860] is_error <- inherits(cond, "error") [18:01:47.860] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.860] NULL) [18:01:47.860] if (is_error) { [18:01:47.860] sessionInformation <- function() { [18:01:47.860] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.860] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.860] search = base::search(), system = base::Sys.info()) [18:01:47.860] } [18:01:47.860] ...future.conditions[[length(...future.conditions) + [18:01:47.860] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.860] cond$call), session = sessionInformation(), [18:01:47.860] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.860] signalCondition(cond) [18:01:47.860] } [18:01:47.860] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.860] "immediateCondition"))) { [18:01:47.860] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.860] ...future.conditions[[length(...future.conditions) + [18:01:47.860] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.860] if (TRUE && !signal) { [18:01:47.860] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.860] { [18:01:47.860] inherits <- base::inherits [18:01:47.860] invokeRestart <- base::invokeRestart [18:01:47.860] is.null <- base::is.null [18:01:47.860] muffled <- FALSE [18:01:47.860] if (inherits(cond, "message")) { [18:01:47.860] muffled <- grepl(pattern, "muffleMessage") [18:01:47.860] if (muffled) [18:01:47.860] invokeRestart("muffleMessage") [18:01:47.860] } [18:01:47.860] else if (inherits(cond, "warning")) { [18:01:47.860] muffled <- grepl(pattern, "muffleWarning") [18:01:47.860] if (muffled) [18:01:47.860] invokeRestart("muffleWarning") [18:01:47.860] } [18:01:47.860] else if (inherits(cond, "condition")) { [18:01:47.860] if (!is.null(pattern)) { [18:01:47.860] computeRestarts <- base::computeRestarts [18:01:47.860] grepl <- base::grepl [18:01:47.860] restarts <- computeRestarts(cond) [18:01:47.860] for (restart in restarts) { [18:01:47.860] name <- restart$name [18:01:47.860] if (is.null(name)) [18:01:47.860] next [18:01:47.860] if (!grepl(pattern, name)) [18:01:47.860] next [18:01:47.860] invokeRestart(restart) [18:01:47.860] muffled <- TRUE [18:01:47.860] break [18:01:47.860] } [18:01:47.860] } [18:01:47.860] } [18:01:47.860] invisible(muffled) [18:01:47.860] } [18:01:47.860] muffleCondition(cond, pattern = "^muffle") [18:01:47.860] } [18:01:47.860] } [18:01:47.860] else { [18:01:47.860] if (TRUE) { [18:01:47.860] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.860] { [18:01:47.860] inherits <- base::inherits [18:01:47.860] invokeRestart <- base::invokeRestart [18:01:47.860] is.null <- base::is.null [18:01:47.860] muffled <- FALSE [18:01:47.860] if (inherits(cond, "message")) { [18:01:47.860] muffled <- grepl(pattern, "muffleMessage") [18:01:47.860] if (muffled) [18:01:47.860] invokeRestart("muffleMessage") [18:01:47.860] } [18:01:47.860] else if (inherits(cond, "warning")) { [18:01:47.860] muffled <- grepl(pattern, "muffleWarning") [18:01:47.860] if (muffled) [18:01:47.860] invokeRestart("muffleWarning") [18:01:47.860] } [18:01:47.860] else if (inherits(cond, "condition")) { [18:01:47.860] if (!is.null(pattern)) { [18:01:47.860] computeRestarts <- base::computeRestarts [18:01:47.860] grepl <- base::grepl [18:01:47.860] restarts <- computeRestarts(cond) [18:01:47.860] for (restart in restarts) { [18:01:47.860] name <- restart$name [18:01:47.860] if (is.null(name)) [18:01:47.860] next [18:01:47.860] if (!grepl(pattern, name)) [18:01:47.860] next [18:01:47.860] invokeRestart(restart) [18:01:47.860] muffled <- TRUE [18:01:47.860] break [18:01:47.860] } [18:01:47.860] } [18:01:47.860] } [18:01:47.860] invisible(muffled) [18:01:47.860] } [18:01:47.860] muffleCondition(cond, pattern = "^muffle") [18:01:47.860] } [18:01:47.860] } [18:01:47.860] } [18:01:47.860] })) [18:01:47.860] }, error = function(ex) { [18:01:47.860] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.860] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.860] ...future.rng), started = ...future.startTime, [18:01:47.860] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.860] version = "1.8"), class = "FutureResult") [18:01:47.860] }, finally = { [18:01:47.860] if (!identical(...future.workdir, getwd())) [18:01:47.860] setwd(...future.workdir) [18:01:47.860] { [18:01:47.860] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.860] ...future.oldOptions$nwarnings <- NULL [18:01:47.860] } [18:01:47.860] base::options(...future.oldOptions) [18:01:47.860] if (.Platform$OS.type == "windows") { [18:01:47.860] old_names <- names(...future.oldEnvVars) [18:01:47.860] envs <- base::Sys.getenv() [18:01:47.860] names <- names(envs) [18:01:47.860] common <- intersect(names, old_names) [18:01:47.860] added <- setdiff(names, old_names) [18:01:47.860] removed <- setdiff(old_names, names) [18:01:47.860] changed <- common[...future.oldEnvVars[common] != [18:01:47.860] envs[common]] [18:01:47.860] NAMES <- toupper(changed) [18:01:47.860] args <- list() [18:01:47.860] for (kk in seq_along(NAMES)) { [18:01:47.860] name <- changed[[kk]] [18:01:47.860] NAME <- NAMES[[kk]] [18:01:47.860] if (name != NAME && is.element(NAME, old_names)) [18:01:47.860] next [18:01:47.860] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.860] } [18:01:47.860] NAMES <- toupper(added) [18:01:47.860] for (kk in seq_along(NAMES)) { [18:01:47.860] name <- added[[kk]] [18:01:47.860] NAME <- NAMES[[kk]] [18:01:47.860] if (name != NAME && is.element(NAME, old_names)) [18:01:47.860] next [18:01:47.860] args[[name]] <- "" [18:01:47.860] } [18:01:47.860] NAMES <- toupper(removed) [18:01:47.860] for (kk in seq_along(NAMES)) { [18:01:47.860] name <- removed[[kk]] [18:01:47.860] NAME <- NAMES[[kk]] [18:01:47.860] if (name != NAME && is.element(NAME, old_names)) [18:01:47.860] next [18:01:47.860] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.860] } [18:01:47.860] if (length(args) > 0) [18:01:47.860] base::do.call(base::Sys.setenv, args = args) [18:01:47.860] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.860] } [18:01:47.860] else { [18:01:47.860] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.860] } [18:01:47.860] { [18:01:47.860] if (base::length(...future.futureOptionsAdded) > [18:01:47.860] 0L) { [18:01:47.860] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.860] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.860] base::options(opts) [18:01:47.860] } [18:01:47.860] { [18:01:47.860] { [18:01:47.860] NULL [18:01:47.860] RNGkind("Mersenne-Twister") [18:01:47.860] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.860] inherits = FALSE) [18:01:47.860] } [18:01:47.860] options(future.plan = NULL) [18:01:47.860] if (is.na(NA_character_)) [18:01:47.860] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.860] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.860] future::plan(list(function (..., envir = parent.frame()) [18:01:47.860] { [18:01:47.860] future <- SequentialFuture(..., envir = envir) [18:01:47.860] if (!future$lazy) [18:01:47.860] future <- run(future) [18:01:47.860] invisible(future) [18:01:47.860] }), .cleanup = FALSE, .init = FALSE) [18:01:47.860] } [18:01:47.860] } [18:01:47.860] } [18:01:47.860] }) [18:01:47.860] if (TRUE) { [18:01:47.860] base::sink(type = "output", split = FALSE) [18:01:47.860] if (TRUE) { [18:01:47.860] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.860] } [18:01:47.860] else { [18:01:47.860] ...future.result["stdout"] <- base::list(NULL) [18:01:47.860] } [18:01:47.860] base::close(...future.stdout) [18:01:47.860] ...future.stdout <- NULL [18:01:47.860] } [18:01:47.860] ...future.result$conditions <- ...future.conditions [18:01:47.860] ...future.result$finished <- base::Sys.time() [18:01:47.860] ...future.result [18:01:47.860] } [18:01:47.864] assign_globals() ... [18:01:47.864] List of 3 [18:01:47.864] $ outer_function:function (x) [18:01:47.864] $ map :function (.x, .f, ...) [18:01:47.864] $ inner_function:function (x) [18:01:47.864] - attr(*, "where")=List of 3 [18:01:47.864] ..$ outer_function: [18:01:47.864] ..$ map : [18:01:47.864] ..$ inner_function: [18:01:47.864] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.864] - attr(*, "resolved")= logi FALSE [18:01:47.864] - attr(*, "total_size")= num 7704 [18:01:47.864] - attr(*, "already-done")= logi TRUE [18:01:47.868] - reassign environment for 'outer_function' [18:01:47.868] - copied 'outer_function' to environment [18:01:47.868] - reassign environment for 'map' [18:01:47.868] - copied 'map' to environment [18:01:47.868] - reassign environment for 'inner_function' [18:01:47.868] - copied 'inner_function' to environment [18:01:47.869] assign_globals() ... done [18:01:47.869] plan(): Setting new future strategy stack: [18:01:47.869] List of future strategies: [18:01:47.869] 1. sequential: [18:01:47.869] - args: function (..., envir = parent.frame()) [18:01:47.869] - tweaked: FALSE [18:01:47.869] - call: NULL [18:01:47.870] plan(): nbrOfWorkers() = 1 [18:01:47.877] plan(): Setting new future strategy stack: [18:01:47.877] List of future strategies: [18:01:47.877] 1. sequential: [18:01:47.877] - args: function (..., envir = parent.frame()) [18:01:47.877] - tweaked: FALSE [18:01:47.877] - call: plan(strategy) [18:01:47.877] plan(): nbrOfWorkers() = 1 [18:01:47.878] SequentialFuture started (and completed) [18:01:47.878] - Launch lazy future ... done [18:01:47.878] run() for 'SequentialFuture' ... done List of 2 $ : num [1:2] 2 3 $ : num [1:2] 2 3 [18:01:47.879] getGlobalsAndPackages() ... [18:01:47.880] Searching for globals... [18:01:47.885] - globals found: [16] '{', 'outer_function', 'map', ':', '~', 'inner_function', '.x', 'if', 'inherits', '<-', '[[', '-', 'eval', 'bquote', 'lapply', '+' [18:01:47.885] Searching for globals ... DONE [18:01:47.885] Resolving globals: FALSE [18:01:47.886] The total size of the 3 globals is 7.52 KiB (7704 bytes) [18:01:47.886] The total size of the 3 globals exported for future expression ('{; outer_function(1L); }') is 7.52 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'map' (4.43 KiB of class 'function'), 'inner_function' (1.78 KiB of class 'function') and 'outer_function' (1.31 KiB of class 'function') [18:01:47.887] - globals: [3] 'outer_function', 'map', 'inner_function' [18:01:47.887] [18:01:47.887] getGlobalsAndPackages() ... DONE [18:01:47.887] run() for 'Future' ... [18:01:47.888] - state: 'created' [18:01:47.888] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:47.888] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:47.888] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:47.888] - Field: 'label' [18:01:47.889] - Field: 'local' [18:01:47.889] - Field: 'owner' [18:01:47.889] - Field: 'envir' [18:01:47.889] - Field: 'packages' [18:01:47.889] - Field: 'gc' [18:01:47.890] - Field: 'conditions' [18:01:47.890] - Field: 'expr' [18:01:47.890] - Field: 'uuid' [18:01:47.890] - Field: 'seed' [18:01:47.890] - Field: 'version' [18:01:47.890] - Field: 'result' [18:01:47.891] - Field: 'asynchronous' [18:01:47.891] - Field: 'calls' [18:01:47.891] - Field: 'globals' [18:01:47.891] - Field: 'stdout' [18:01:47.891] - Field: 'earlySignal' [18:01:47.891] - Field: 'lazy' [18:01:47.892] - Field: 'state' [18:01:47.892] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:47.892] - Launch lazy future ... [18:01:47.892] Packages needed by the future expression (n = 0): [18:01:47.892] Packages needed by future strategies (n = 0): [18:01:47.893] { [18:01:47.893] { [18:01:47.893] { [18:01:47.893] ...future.startTime <- base::Sys.time() [18:01:47.893] { [18:01:47.893] { [18:01:47.893] { [18:01:47.893] base::local({ [18:01:47.893] has_future <- base::requireNamespace("future", [18:01:47.893] quietly = TRUE) [18:01:47.893] if (has_future) { [18:01:47.893] ns <- base::getNamespace("future") [18:01:47.893] version <- ns[[".package"]][["version"]] [18:01:47.893] if (is.null(version)) [18:01:47.893] version <- utils::packageVersion("future") [18:01:47.893] } [18:01:47.893] else { [18:01:47.893] version <- NULL [18:01:47.893] } [18:01:47.893] if (!has_future || version < "1.8.0") { [18:01:47.893] info <- base::c(r_version = base::gsub("R version ", [18:01:47.893] "", base::R.version$version.string), [18:01:47.893] platform = base::sprintf("%s (%s-bit)", [18:01:47.893] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:47.893] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:47.893] "release", "version")], collapse = " "), [18:01:47.893] hostname = base::Sys.info()[["nodename"]]) [18:01:47.893] info <- base::sprintf("%s: %s", base::names(info), [18:01:47.893] info) [18:01:47.893] info <- base::paste(info, collapse = "; ") [18:01:47.893] if (!has_future) { [18:01:47.893] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:47.893] info) [18:01:47.893] } [18:01:47.893] else { [18:01:47.893] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:47.893] info, version) [18:01:47.893] } [18:01:47.893] base::stop(msg) [18:01:47.893] } [18:01:47.893] }) [18:01:47.893] } [18:01:47.893] options(future.plan = NULL) [18:01:47.893] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.893] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:47.893] } [18:01:47.893] ...future.workdir <- getwd() [18:01:47.893] } [18:01:47.893] ...future.oldOptions <- base::as.list(base::.Options) [18:01:47.893] ...future.oldEnvVars <- base::Sys.getenv() [18:01:47.893] } [18:01:47.893] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:47.893] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:47.893] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:47.893] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:47.893] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:47.893] future.stdout.windows.reencode = NULL, width = 80L) [18:01:47.893] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:47.893] base::names(...future.oldOptions)) [18:01:47.893] } [18:01:47.893] if (FALSE) { [18:01:47.893] } [18:01:47.893] else { [18:01:47.893] if (TRUE) { [18:01:47.893] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:47.893] open = "w") [18:01:47.893] } [18:01:47.893] else { [18:01:47.893] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:47.893] windows = "NUL", "/dev/null"), open = "w") [18:01:47.893] } [18:01:47.893] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:47.893] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:47.893] base::sink(type = "output", split = FALSE) [18:01:47.893] base::close(...future.stdout) [18:01:47.893] }, add = TRUE) [18:01:47.893] } [18:01:47.893] ...future.frame <- base::sys.nframe() [18:01:47.893] ...future.conditions <- base::list() [18:01:47.893] ...future.rng <- base::globalenv()$.Random.seed [18:01:47.893] if (FALSE) { [18:01:47.893] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:47.893] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:47.893] } [18:01:47.893] ...future.result <- base::tryCatch({ [18:01:47.893] base::withCallingHandlers({ [18:01:47.893] ...future.value <- base::withVisible(base::local({ [18:01:47.893] outer_function(1L) [18:01:47.893] })) [18:01:47.893] future::FutureResult(value = ...future.value$value, [18:01:47.893] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.893] ...future.rng), globalenv = if (FALSE) [18:01:47.893] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:47.893] ...future.globalenv.names)) [18:01:47.893] else NULL, started = ...future.startTime, version = "1.8") [18:01:47.893] }, condition = base::local({ [18:01:47.893] c <- base::c [18:01:47.893] inherits <- base::inherits [18:01:47.893] invokeRestart <- base::invokeRestart [18:01:47.893] length <- base::length [18:01:47.893] list <- base::list [18:01:47.893] seq.int <- base::seq.int [18:01:47.893] signalCondition <- base::signalCondition [18:01:47.893] sys.calls <- base::sys.calls [18:01:47.893] `[[` <- base::`[[` [18:01:47.893] `+` <- base::`+` [18:01:47.893] `<<-` <- base::`<<-` [18:01:47.893] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:47.893] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:47.893] 3L)] [18:01:47.893] } [18:01:47.893] function(cond) { [18:01:47.893] is_error <- inherits(cond, "error") [18:01:47.893] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:47.893] NULL) [18:01:47.893] if (is_error) { [18:01:47.893] sessionInformation <- function() { [18:01:47.893] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:47.893] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:47.893] search = base::search(), system = base::Sys.info()) [18:01:47.893] } [18:01:47.893] ...future.conditions[[length(...future.conditions) + [18:01:47.893] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:47.893] cond$call), session = sessionInformation(), [18:01:47.893] timestamp = base::Sys.time(), signaled = 0L) [18:01:47.893] signalCondition(cond) [18:01:47.893] } [18:01:47.893] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:47.893] "immediateCondition"))) { [18:01:47.893] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:47.893] ...future.conditions[[length(...future.conditions) + [18:01:47.893] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:47.893] if (TRUE && !signal) { [18:01:47.893] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.893] { [18:01:47.893] inherits <- base::inherits [18:01:47.893] invokeRestart <- base::invokeRestart [18:01:47.893] is.null <- base::is.null [18:01:47.893] muffled <- FALSE [18:01:47.893] if (inherits(cond, "message")) { [18:01:47.893] muffled <- grepl(pattern, "muffleMessage") [18:01:47.893] if (muffled) [18:01:47.893] invokeRestart("muffleMessage") [18:01:47.893] } [18:01:47.893] else if (inherits(cond, "warning")) { [18:01:47.893] muffled <- grepl(pattern, "muffleWarning") [18:01:47.893] if (muffled) [18:01:47.893] invokeRestart("muffleWarning") [18:01:47.893] } [18:01:47.893] else if (inherits(cond, "condition")) { [18:01:47.893] if (!is.null(pattern)) { [18:01:47.893] computeRestarts <- base::computeRestarts [18:01:47.893] grepl <- base::grepl [18:01:47.893] restarts <- computeRestarts(cond) [18:01:47.893] for (restart in restarts) { [18:01:47.893] name <- restart$name [18:01:47.893] if (is.null(name)) [18:01:47.893] next [18:01:47.893] if (!grepl(pattern, name)) [18:01:47.893] next [18:01:47.893] invokeRestart(restart) [18:01:47.893] muffled <- TRUE [18:01:47.893] break [18:01:47.893] } [18:01:47.893] } [18:01:47.893] } [18:01:47.893] invisible(muffled) [18:01:47.893] } [18:01:47.893] muffleCondition(cond, pattern = "^muffle") [18:01:47.893] } [18:01:47.893] } [18:01:47.893] else { [18:01:47.893] if (TRUE) { [18:01:47.893] muffleCondition <- function (cond, pattern = "^muffle") [18:01:47.893] { [18:01:47.893] inherits <- base::inherits [18:01:47.893] invokeRestart <- base::invokeRestart [18:01:47.893] is.null <- base::is.null [18:01:47.893] muffled <- FALSE [18:01:47.893] if (inherits(cond, "message")) { [18:01:47.893] muffled <- grepl(pattern, "muffleMessage") [18:01:47.893] if (muffled) [18:01:47.893] invokeRestart("muffleMessage") [18:01:47.893] } [18:01:47.893] else if (inherits(cond, "warning")) { [18:01:47.893] muffled <- grepl(pattern, "muffleWarning") [18:01:47.893] if (muffled) [18:01:47.893] invokeRestart("muffleWarning") [18:01:47.893] } [18:01:47.893] else if (inherits(cond, "condition")) { [18:01:47.893] if (!is.null(pattern)) { [18:01:47.893] computeRestarts <- base::computeRestarts [18:01:47.893] grepl <- base::grepl [18:01:47.893] restarts <- computeRestarts(cond) [18:01:47.893] for (restart in restarts) { [18:01:47.893] name <- restart$name [18:01:47.893] if (is.null(name)) [18:01:47.893] next [18:01:47.893] if (!grepl(pattern, name)) [18:01:47.893] next [18:01:47.893] invokeRestart(restart) [18:01:47.893] muffled <- TRUE [18:01:47.893] break [18:01:47.893] } [18:01:47.893] } [18:01:47.893] } [18:01:47.893] invisible(muffled) [18:01:47.893] } [18:01:47.893] muffleCondition(cond, pattern = "^muffle") [18:01:47.893] } [18:01:47.893] } [18:01:47.893] } [18:01:47.893] })) [18:01:47.893] }, error = function(ex) { [18:01:47.893] base::structure(base::list(value = NULL, visible = NULL, [18:01:47.893] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:47.893] ...future.rng), started = ...future.startTime, [18:01:47.893] finished = Sys.time(), session_uuid = NA_character_, [18:01:47.893] version = "1.8"), class = "FutureResult") [18:01:47.893] }, finally = { [18:01:47.893] if (!identical(...future.workdir, getwd())) [18:01:47.893] setwd(...future.workdir) [18:01:47.893] { [18:01:47.893] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:47.893] ...future.oldOptions$nwarnings <- NULL [18:01:47.893] } [18:01:47.893] base::options(...future.oldOptions) [18:01:47.893] if (.Platform$OS.type == "windows") { [18:01:47.893] old_names <- names(...future.oldEnvVars) [18:01:47.893] envs <- base::Sys.getenv() [18:01:47.893] names <- names(envs) [18:01:47.893] common <- intersect(names, old_names) [18:01:47.893] added <- setdiff(names, old_names) [18:01:47.893] removed <- setdiff(old_names, names) [18:01:47.893] changed <- common[...future.oldEnvVars[common] != [18:01:47.893] envs[common]] [18:01:47.893] NAMES <- toupper(changed) [18:01:47.893] args <- list() [18:01:47.893] for (kk in seq_along(NAMES)) { [18:01:47.893] name <- changed[[kk]] [18:01:47.893] NAME <- NAMES[[kk]] [18:01:47.893] if (name != NAME && is.element(NAME, old_names)) [18:01:47.893] next [18:01:47.893] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.893] } [18:01:47.893] NAMES <- toupper(added) [18:01:47.893] for (kk in seq_along(NAMES)) { [18:01:47.893] name <- added[[kk]] [18:01:47.893] NAME <- NAMES[[kk]] [18:01:47.893] if (name != NAME && is.element(NAME, old_names)) [18:01:47.893] next [18:01:47.893] args[[name]] <- "" [18:01:47.893] } [18:01:47.893] NAMES <- toupper(removed) [18:01:47.893] for (kk in seq_along(NAMES)) { [18:01:47.893] name <- removed[[kk]] [18:01:47.893] NAME <- NAMES[[kk]] [18:01:47.893] if (name != NAME && is.element(NAME, old_names)) [18:01:47.893] next [18:01:47.893] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:47.893] } [18:01:47.893] if (length(args) > 0) [18:01:47.893] base::do.call(base::Sys.setenv, args = args) [18:01:47.893] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:47.893] } [18:01:47.893] else { [18:01:47.893] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:47.893] } [18:01:47.893] { [18:01:47.893] if (base::length(...future.futureOptionsAdded) > [18:01:47.893] 0L) { [18:01:47.893] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:47.893] base::names(opts) <- ...future.futureOptionsAdded [18:01:47.893] base::options(opts) [18:01:47.893] } [18:01:47.893] { [18:01:47.893] { [18:01:47.893] NULL [18:01:47.893] RNGkind("Mersenne-Twister") [18:01:47.893] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:47.893] inherits = FALSE) [18:01:47.893] } [18:01:47.893] options(future.plan = NULL) [18:01:47.893] if (is.na(NA_character_)) [18:01:47.893] Sys.unsetenv("R_FUTURE_PLAN") [18:01:47.893] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:47.893] future::plan(list(function (..., envir = parent.frame()) [18:01:47.893] { [18:01:47.893] future <- SequentialFuture(..., envir = envir) [18:01:47.893] if (!future$lazy) [18:01:47.893] future <- run(future) [18:01:47.893] invisible(future) [18:01:47.893] }), .cleanup = FALSE, .init = FALSE) [18:01:47.893] } [18:01:47.893] } [18:01:47.893] } [18:01:47.893] }) [18:01:47.893] if (TRUE) { [18:01:47.893] base::sink(type = "output", split = FALSE) [18:01:47.893] if (TRUE) { [18:01:47.893] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:47.893] } [18:01:47.893] else { [18:01:47.893] ...future.result["stdout"] <- base::list(NULL) [18:01:47.893] } [18:01:47.893] base::close(...future.stdout) [18:01:47.893] ...future.stdout <- NULL [18:01:47.893] } [18:01:47.893] ...future.result$conditions <- ...future.conditions [18:01:47.893] ...future.result$finished <- base::Sys.time() [18:01:47.893] ...future.result [18:01:47.893] } [18:01:47.897] assign_globals() ... [18:01:47.897] List of 3 [18:01:47.897] $ outer_function:function (x) [18:01:47.897] $ map :function (.x, .f, ...) [18:01:47.897] $ inner_function:function (x) [18:01:47.897] - attr(*, "where")=List of 3 [18:01:47.897] ..$ outer_function: [18:01:47.897] ..$ map : [18:01:47.897] ..$ inner_function: [18:01:47.897] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:01:47.897] - attr(*, "resolved")= logi FALSE [18:01:47.897] - attr(*, "total_size")= num 7704 [18:01:47.897] - attr(*, "already-done")= logi TRUE [18:01:47.902] - reassign environment for 'outer_function' [18:01:47.902] - copied 'outer_function' to environment [18:01:47.902] - reassign environment for 'map' [18:01:47.902] - copied 'map' to environment [18:01:47.902] - reassign environment for 'inner_function' [18:01:47.902] - copied 'inner_function' to environment [18:01:47.903] assign_globals() ... done [18:01:47.903] plan(): Setting new future strategy stack: [18:01:47.903] List of future strategies: [18:01:47.903] 1. sequential: [18:01:47.903] - args: function (..., envir = parent.frame()) [18:01:47.903] - tweaked: FALSE [18:01:47.903] - call: NULL [18:01:47.904] plan(): nbrOfWorkers() = 1 [18:01:47.905] plan(): Setting new future strategy stack: [18:01:47.905] List of future strategies: [18:01:47.905] 1. sequential: [18:01:47.905] - args: function (..., envir = parent.frame()) [18:01:47.905] - tweaked: FALSE [18:01:47.905] - call: plan(strategy) [18:01:47.905] plan(): nbrOfWorkers() = 1 [18:01:47.906] SequentialFuture started (and completed) [18:01:47.906] - Launch lazy future ... done [18:01:47.906] run() for 'SequentialFuture' ... done List of 2 $ : num [1:2] 2 3 $ : num [1:2] 2 3 Testing with 1 cores ... DONE Testing with 2 cores ... availableCores(): 2 - plan('multisession') ... [18:01:47.918] plan(): Setting new future strategy stack: [18:01:47.918] List of future strategies: [18:01:47.918] 1. multisession: [18:01:47.918] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:47.918] - tweaked: FALSE [18:01:47.918] - call: plan(strategy) [18:01:47.918] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:01:47.919] multisession: [18:01:47.919] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:47.919] - tweaked: FALSE [18:01:47.919] - call: plan(strategy) [18:01:47.925] getGlobalsAndPackages() ... [18:01:47.925] Not searching for globals [18:01:47.925] - globals: [0] [18:01:47.925] getGlobalsAndPackages() ... DONE [18:01:47.926] [local output] makeClusterPSOCK() ... [18:01:47.959] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:01:47.966] [local output] Base port: 26212 [18:01:47.966] [local output] Getting setup options for 2 cluster nodes ... [18:01:47.966] [local output] - Node 1 of 2 ... [18:01:47.967] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:47.968] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpq4akPX/worker.rank=1.parallelly.parent=19584.4c8065b661a8.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/Rtmpq4akPX/worker.rank=1.parallelly.parent=19584.4c8065b661a8.pid\")"' [18:01:48.408] - Possible to infer worker's PID: TRUE [18:01:48.409] [local output] Rscript port: 26212 [18:01:48.410] [local output] - Node 2 of 2 ... [18:01:48.410] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:48.411] [local output] Rscript port: 26212 [18:01:48.412] [local output] Getting setup options for 2 cluster nodes ... done [18:01:48.412] [local output] - Parallel setup requested for some PSOCK nodes [18:01:48.413] [local output] Setting up PSOCK nodes in parallel [18:01:48.413] List of 36 [18:01:48.413] $ worker : chr "localhost" [18:01:48.413] ..- attr(*, "localhost")= logi TRUE [18:01:48.413] $ master : chr "localhost" [18:01:48.413] $ port : int 26212 [18:01:48.413] $ connectTimeout : num 120 [18:01:48.413] $ timeout : num 120 [18:01:48.413] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:01:48.413] $ homogeneous : logi TRUE [18:01:48.413] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=globals,formulas.R:19584:CRANWIN"| __truncated__ [18:01:48.413] $ rscript_envs : NULL [18:01:48.413] $ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:48.413] $ rscript_startup : NULL [18:01:48.413] $ rscript_sh : chr "cmd" [18:01:48.413] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:48.413] $ methods : logi TRUE [18:01:48.413] $ socketOptions : chr "no-delay" [18:01:48.413] $ useXDR : logi FALSE [18:01:48.413] $ outfile : chr "/dev/null" [18:01:48.413] $ renice : int NA [18:01:48.413] $ rshcmd : NULL [18:01:48.413] $ user : chr(0) [18:01:48.413] $ revtunnel : logi FALSE [18:01:48.413] $ rshlogfile : NULL [18:01:48.413] $ rshopts : chr(0) [18:01:48.413] $ rank : int 1 [18:01:48.413] $ manual : logi FALSE [18:01:48.413] $ dryrun : logi FALSE [18:01:48.413] $ quiet : logi FALSE [18:01:48.413] $ setup_strategy : chr "parallel" [18:01:48.413] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:48.413] $ pidfile : chr "D:/temp/Rtmpq4akPX/worker.rank=1.parallelly.parent=19584.4c8065b661a8.pid" [18:01:48.413] $ rshcmd_label : NULL [18:01:48.413] $ rsh_call : NULL [18:01:48.413] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:48.413] $ localMachine : logi TRUE [18:01:48.413] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:01:48.413] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:01:48.413] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:01:48.413] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:01:48.413] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:01:48.413] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [18:01:48.413] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:01:48.413] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:01:48.413] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:01:48.413] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:01:48.413] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:01:48.413] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:01:48.413] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:01:48.413] $ arguments :List of 28 [18:01:48.413] ..$ worker : chr "localhost" [18:01:48.413] ..$ master : NULL [18:01:48.413] ..$ port : int 26212 [18:01:48.413] ..$ connectTimeout : num 120 [18:01:48.413] ..$ timeout : num 120 [18:01:48.413] ..$ rscript : NULL [18:01:48.413] ..$ homogeneous : NULL [18:01:48.413] ..$ rscript_args : NULL [18:01:48.413] ..$ rscript_envs : NULL [18:01:48.413] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:48.413] ..$ rscript_startup : NULL [18:01:48.413] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [18:01:48.413] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:48.413] ..$ methods : logi TRUE [18:01:48.413] ..$ socketOptions : chr "no-delay" [18:01:48.413] ..$ useXDR : logi FALSE [18:01:48.413] ..$ outfile : chr "/dev/null" [18:01:48.413] ..$ renice : int NA [18:01:48.413] ..$ rshcmd : NULL [18:01:48.413] ..$ user : NULL [18:01:48.413] ..$ revtunnel : logi NA [18:01:48.413] ..$ rshlogfile : NULL [18:01:48.413] ..$ rshopts : NULL [18:01:48.413] ..$ rank : int 1 [18:01:48.413] ..$ manual : logi FALSE [18:01:48.413] ..$ dryrun : logi FALSE [18:01:48.413] ..$ quiet : logi FALSE [18:01:48.413] ..$ setup_strategy : chr "parallel" [18:01:48.413] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:01:48.437] [local output] System call to launch all workers: [18:01:48.437] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=globals,formulas.R:19584:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpq4akPX/worker.rank=1.parallelly.parent=19584.4c8065b661a8.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=26212 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:01:48.437] [local output] Starting PSOCK main server [18:01:48.446] [local output] Workers launched [18:01:48.447] [local output] Waiting for workers to connect back [18:01:48.447] - [local output] 0 workers out of 2 ready [18:01:48.620] - [local output] 0 workers out of 2 ready [18:01:48.621] - [local output] 1 workers out of 2 ready [18:01:48.621] - [local output] 2 workers out of 2 ready [18:01:48.621] [local output] Launching of workers completed [18:01:48.621] [local output] Collecting session information from workers [18:01:48.622] [local output] - Worker #1 of 2 [18:01:48.623] [local output] - Worker #2 of 2 [18:01:48.623] [local output] makeClusterPSOCK() ... done [18:01:48.637] Packages needed by the future expression (n = 0): [18:01:48.637] Packages needed by future strategies (n = 0): [18:01:48.638] { [18:01:48.638] { [18:01:48.638] { [18:01:48.638] ...future.startTime <- base::Sys.time() [18:01:48.638] { [18:01:48.638] { [18:01:48.638] { [18:01:48.638] { [18:01:48.638] base::local({ [18:01:48.638] has_future <- base::requireNamespace("future", [18:01:48.638] quietly = TRUE) [18:01:48.638] if (has_future) { [18:01:48.638] ns <- base::getNamespace("future") [18:01:48.638] version <- ns[[".package"]][["version"]] [18:01:48.638] if (is.null(version)) [18:01:48.638] version <- utils::packageVersion("future") [18:01:48.638] } [18:01:48.638] else { [18:01:48.638] version <- NULL [18:01:48.638] } [18:01:48.638] if (!has_future || version < "1.8.0") { [18:01:48.638] info <- base::c(r_version = base::gsub("R version ", [18:01:48.638] "", base::R.version$version.string), [18:01:48.638] platform = base::sprintf("%s (%s-bit)", [18:01:48.638] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:48.638] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:48.638] "release", "version")], collapse = " "), [18:01:48.638] hostname = base::Sys.info()[["nodename"]]) [18:01:48.638] info <- base::sprintf("%s: %s", base::names(info), [18:01:48.638] info) [18:01:48.638] info <- base::paste(info, collapse = "; ") [18:01:48.638] if (!has_future) { [18:01:48.638] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:48.638] info) [18:01:48.638] } [18:01:48.638] else { [18:01:48.638] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:48.638] info, version) [18:01:48.638] } [18:01:48.638] base::stop(msg) [18:01:48.638] } [18:01:48.638] }) [18:01:48.638] } [18:01:48.638] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:48.638] base::options(mc.cores = 1L) [18:01:48.638] } [18:01:48.638] options(future.plan = NULL) [18:01:48.638] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.638] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:48.638] } [18:01:48.638] ...future.workdir <- getwd() [18:01:48.638] } [18:01:48.638] ...future.oldOptions <- base::as.list(base::.Options) [18:01:48.638] ...future.oldEnvVars <- base::Sys.getenv() [18:01:48.638] } [18:01:48.638] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:48.638] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:48.638] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:48.638] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:48.638] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:48.638] future.stdout.windows.reencode = NULL, width = 80L) [18:01:48.638] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:48.638] base::names(...future.oldOptions)) [18:01:48.638] } [18:01:48.638] if (FALSE) { [18:01:48.638] } [18:01:48.638] else { [18:01:48.638] if (TRUE) { [18:01:48.638] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:48.638] open = "w") [18:01:48.638] } [18:01:48.638] else { [18:01:48.638] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:48.638] windows = "NUL", "/dev/null"), open = "w") [18:01:48.638] } [18:01:48.638] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:48.638] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:48.638] base::sink(type = "output", split = FALSE) [18:01:48.638] base::close(...future.stdout) [18:01:48.638] }, add = TRUE) [18:01:48.638] } [18:01:48.638] ...future.frame <- base::sys.nframe() [18:01:48.638] ...future.conditions <- base::list() [18:01:48.638] ...future.rng <- base::globalenv()$.Random.seed [18:01:48.638] if (FALSE) { [18:01:48.638] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:48.638] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:48.638] } [18:01:48.638] ...future.result <- base::tryCatch({ [18:01:48.638] base::withCallingHandlers({ [18:01:48.638] ...future.value <- base::withVisible(base::local({ [18:01:48.638] ...future.makeSendCondition <- local({ [18:01:48.638] sendCondition <- NULL [18:01:48.638] function(frame = 1L) { [18:01:48.638] if (is.function(sendCondition)) [18:01:48.638] return(sendCondition) [18:01:48.638] ns <- getNamespace("parallel") [18:01:48.638] if (exists("sendData", mode = "function", [18:01:48.638] envir = ns)) { [18:01:48.638] parallel_sendData <- get("sendData", mode = "function", [18:01:48.638] envir = ns) [18:01:48.638] envir <- sys.frame(frame) [18:01:48.638] master <- NULL [18:01:48.638] while (!identical(envir, .GlobalEnv) && [18:01:48.638] !identical(envir, emptyenv())) { [18:01:48.638] if (exists("master", mode = "list", envir = envir, [18:01:48.638] inherits = FALSE)) { [18:01:48.638] master <- get("master", mode = "list", [18:01:48.638] envir = envir, inherits = FALSE) [18:01:48.638] if (inherits(master, c("SOCKnode", [18:01:48.638] "SOCK0node"))) { [18:01:48.638] sendCondition <<- function(cond) { [18:01:48.638] data <- list(type = "VALUE", value = cond, [18:01:48.638] success = TRUE) [18:01:48.638] parallel_sendData(master, data) [18:01:48.638] } [18:01:48.638] return(sendCondition) [18:01:48.638] } [18:01:48.638] } [18:01:48.638] frame <- frame + 1L [18:01:48.638] envir <- sys.frame(frame) [18:01:48.638] } [18:01:48.638] } [18:01:48.638] sendCondition <<- function(cond) NULL [18:01:48.638] } [18:01:48.638] }) [18:01:48.638] withCallingHandlers({ [18:01:48.638] NA [18:01:48.638] }, immediateCondition = function(cond) { [18:01:48.638] sendCondition <- ...future.makeSendCondition() [18:01:48.638] sendCondition(cond) [18:01:48.638] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.638] { [18:01:48.638] inherits <- base::inherits [18:01:48.638] invokeRestart <- base::invokeRestart [18:01:48.638] is.null <- base::is.null [18:01:48.638] muffled <- FALSE [18:01:48.638] if (inherits(cond, "message")) { [18:01:48.638] muffled <- grepl(pattern, "muffleMessage") [18:01:48.638] if (muffled) [18:01:48.638] invokeRestart("muffleMessage") [18:01:48.638] } [18:01:48.638] else if (inherits(cond, "warning")) { [18:01:48.638] muffled <- grepl(pattern, "muffleWarning") [18:01:48.638] if (muffled) [18:01:48.638] invokeRestart("muffleWarning") [18:01:48.638] } [18:01:48.638] else if (inherits(cond, "condition")) { [18:01:48.638] if (!is.null(pattern)) { [18:01:48.638] computeRestarts <- base::computeRestarts [18:01:48.638] grepl <- base::grepl [18:01:48.638] restarts <- computeRestarts(cond) [18:01:48.638] for (restart in restarts) { [18:01:48.638] name <- restart$name [18:01:48.638] if (is.null(name)) [18:01:48.638] next [18:01:48.638] if (!grepl(pattern, name)) [18:01:48.638] next [18:01:48.638] invokeRestart(restart) [18:01:48.638] muffled <- TRUE [18:01:48.638] break [18:01:48.638] } [18:01:48.638] } [18:01:48.638] } [18:01:48.638] invisible(muffled) [18:01:48.638] } [18:01:48.638] muffleCondition(cond) [18:01:48.638] }) [18:01:48.638] })) [18:01:48.638] future::FutureResult(value = ...future.value$value, [18:01:48.638] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.638] ...future.rng), globalenv = if (FALSE) [18:01:48.638] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:48.638] ...future.globalenv.names)) [18:01:48.638] else NULL, started = ...future.startTime, version = "1.8") [18:01:48.638] }, condition = base::local({ [18:01:48.638] c <- base::c [18:01:48.638] inherits <- base::inherits [18:01:48.638] invokeRestart <- base::invokeRestart [18:01:48.638] length <- base::length [18:01:48.638] list <- base::list [18:01:48.638] seq.int <- base::seq.int [18:01:48.638] signalCondition <- base::signalCondition [18:01:48.638] sys.calls <- base::sys.calls [18:01:48.638] `[[` <- base::`[[` [18:01:48.638] `+` <- base::`+` [18:01:48.638] `<<-` <- base::`<<-` [18:01:48.638] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:48.638] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:48.638] 3L)] [18:01:48.638] } [18:01:48.638] function(cond) { [18:01:48.638] is_error <- inherits(cond, "error") [18:01:48.638] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:48.638] NULL) [18:01:48.638] if (is_error) { [18:01:48.638] sessionInformation <- function() { [18:01:48.638] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:48.638] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:48.638] search = base::search(), system = base::Sys.info()) [18:01:48.638] } [18:01:48.638] ...future.conditions[[length(...future.conditions) + [18:01:48.638] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:48.638] cond$call), session = sessionInformation(), [18:01:48.638] timestamp = base::Sys.time(), signaled = 0L) [18:01:48.638] signalCondition(cond) [18:01:48.638] } [18:01:48.638] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:48.638] "immediateCondition"))) { [18:01:48.638] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:48.638] ...future.conditions[[length(...future.conditions) + [18:01:48.638] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:48.638] if (TRUE && !signal) { [18:01:48.638] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.638] { [18:01:48.638] inherits <- base::inherits [18:01:48.638] invokeRestart <- base::invokeRestart [18:01:48.638] is.null <- base::is.null [18:01:48.638] muffled <- FALSE [18:01:48.638] if (inherits(cond, "message")) { [18:01:48.638] muffled <- grepl(pattern, "muffleMessage") [18:01:48.638] if (muffled) [18:01:48.638] invokeRestart("muffleMessage") [18:01:48.638] } [18:01:48.638] else if (inherits(cond, "warning")) { [18:01:48.638] muffled <- grepl(pattern, "muffleWarning") [18:01:48.638] if (muffled) [18:01:48.638] invokeRestart("muffleWarning") [18:01:48.638] } [18:01:48.638] else if (inherits(cond, "condition")) { [18:01:48.638] if (!is.null(pattern)) { [18:01:48.638] computeRestarts <- base::computeRestarts [18:01:48.638] grepl <- base::grepl [18:01:48.638] restarts <- computeRestarts(cond) [18:01:48.638] for (restart in restarts) { [18:01:48.638] name <- restart$name [18:01:48.638] if (is.null(name)) [18:01:48.638] next [18:01:48.638] if (!grepl(pattern, name)) [18:01:48.638] next [18:01:48.638] invokeRestart(restart) [18:01:48.638] muffled <- TRUE [18:01:48.638] break [18:01:48.638] } [18:01:48.638] } [18:01:48.638] } [18:01:48.638] invisible(muffled) [18:01:48.638] } [18:01:48.638] muffleCondition(cond, pattern = "^muffle") [18:01:48.638] } [18:01:48.638] } [18:01:48.638] else { [18:01:48.638] if (TRUE) { [18:01:48.638] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.638] { [18:01:48.638] inherits <- base::inherits [18:01:48.638] invokeRestart <- base::invokeRestart [18:01:48.638] is.null <- base::is.null [18:01:48.638] muffled <- FALSE [18:01:48.638] if (inherits(cond, "message")) { [18:01:48.638] muffled <- grepl(pattern, "muffleMessage") [18:01:48.638] if (muffled) [18:01:48.638] invokeRestart("muffleMessage") [18:01:48.638] } [18:01:48.638] else if (inherits(cond, "warning")) { [18:01:48.638] muffled <- grepl(pattern, "muffleWarning") [18:01:48.638] if (muffled) [18:01:48.638] invokeRestart("muffleWarning") [18:01:48.638] } [18:01:48.638] else if (inherits(cond, "condition")) { [18:01:48.638] if (!is.null(pattern)) { [18:01:48.638] computeRestarts <- base::computeRestarts [18:01:48.638] grepl <- base::grepl [18:01:48.638] restarts <- computeRestarts(cond) [18:01:48.638] for (restart in restarts) { [18:01:48.638] name <- restart$name [18:01:48.638] if (is.null(name)) [18:01:48.638] next [18:01:48.638] if (!grepl(pattern, name)) [18:01:48.638] next [18:01:48.638] invokeRestart(restart) [18:01:48.638] muffled <- TRUE [18:01:48.638] break [18:01:48.638] } [18:01:48.638] } [18:01:48.638] } [18:01:48.638] invisible(muffled) [18:01:48.638] } [18:01:48.638] muffleCondition(cond, pattern = "^muffle") [18:01:48.638] } [18:01:48.638] } [18:01:48.638] } [18:01:48.638] })) [18:01:48.638] }, error = function(ex) { [18:01:48.638] base::structure(base::list(value = NULL, visible = NULL, [18:01:48.638] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.638] ...future.rng), started = ...future.startTime, [18:01:48.638] finished = Sys.time(), session_uuid = NA_character_, [18:01:48.638] version = "1.8"), class = "FutureResult") [18:01:48.638] }, finally = { [18:01:48.638] if (!identical(...future.workdir, getwd())) [18:01:48.638] setwd(...future.workdir) [18:01:48.638] { [18:01:48.638] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:48.638] ...future.oldOptions$nwarnings <- NULL [18:01:48.638] } [18:01:48.638] base::options(...future.oldOptions) [18:01:48.638] if (.Platform$OS.type == "windows") { [18:01:48.638] old_names <- names(...future.oldEnvVars) [18:01:48.638] envs <- base::Sys.getenv() [18:01:48.638] names <- names(envs) [18:01:48.638] common <- intersect(names, old_names) [18:01:48.638] added <- setdiff(names, old_names) [18:01:48.638] removed <- setdiff(old_names, names) [18:01:48.638] changed <- common[...future.oldEnvVars[common] != [18:01:48.638] envs[common]] [18:01:48.638] NAMES <- toupper(changed) [18:01:48.638] args <- list() [18:01:48.638] for (kk in seq_along(NAMES)) { [18:01:48.638] name <- changed[[kk]] [18:01:48.638] NAME <- NAMES[[kk]] [18:01:48.638] if (name != NAME && is.element(NAME, old_names)) [18:01:48.638] next [18:01:48.638] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.638] } [18:01:48.638] NAMES <- toupper(added) [18:01:48.638] for (kk in seq_along(NAMES)) { [18:01:48.638] name <- added[[kk]] [18:01:48.638] NAME <- NAMES[[kk]] [18:01:48.638] if (name != NAME && is.element(NAME, old_names)) [18:01:48.638] next [18:01:48.638] args[[name]] <- "" [18:01:48.638] } [18:01:48.638] NAMES <- toupper(removed) [18:01:48.638] for (kk in seq_along(NAMES)) { [18:01:48.638] name <- removed[[kk]] [18:01:48.638] NAME <- NAMES[[kk]] [18:01:48.638] if (name != NAME && is.element(NAME, old_names)) [18:01:48.638] next [18:01:48.638] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.638] } [18:01:48.638] if (length(args) > 0) [18:01:48.638] base::do.call(base::Sys.setenv, args = args) [18:01:48.638] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:48.638] } [18:01:48.638] else { [18:01:48.638] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:48.638] } [18:01:48.638] { [18:01:48.638] if (base::length(...future.futureOptionsAdded) > [18:01:48.638] 0L) { [18:01:48.638] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:48.638] base::names(opts) <- ...future.futureOptionsAdded [18:01:48.638] base::options(opts) [18:01:48.638] } [18:01:48.638] { [18:01:48.638] { [18:01:48.638] base::options(mc.cores = ...future.mc.cores.old) [18:01:48.638] NULL [18:01:48.638] } [18:01:48.638] options(future.plan = NULL) [18:01:48.638] if (is.na(NA_character_)) [18:01:48.638] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.638] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:48.638] future::plan(list(function (..., workers = availableCores(), [18:01:48.638] lazy = FALSE, rscript_libs = .libPaths(), [18:01:48.638] envir = parent.frame()) [18:01:48.638] { [18:01:48.638] if (is.function(workers)) [18:01:48.638] workers <- workers() [18:01:48.638] workers <- structure(as.integer(workers), [18:01:48.638] class = class(workers)) [18:01:48.638] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:48.638] workers >= 1) [18:01:48.638] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:48.638] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:48.638] } [18:01:48.638] future <- MultisessionFuture(..., workers = workers, [18:01:48.638] lazy = lazy, rscript_libs = rscript_libs, [18:01:48.638] envir = envir) [18:01:48.638] if (!future$lazy) [18:01:48.638] future <- run(future) [18:01:48.638] invisible(future) [18:01:48.638] }), .cleanup = FALSE, .init = FALSE) [18:01:48.638] } [18:01:48.638] } [18:01:48.638] } [18:01:48.638] }) [18:01:48.638] if (TRUE) { [18:01:48.638] base::sink(type = "output", split = FALSE) [18:01:48.638] if (TRUE) { [18:01:48.638] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:48.638] } [18:01:48.638] else { [18:01:48.638] ...future.result["stdout"] <- base::list(NULL) [18:01:48.638] } [18:01:48.638] base::close(...future.stdout) [18:01:48.638] ...future.stdout <- NULL [18:01:48.638] } [18:01:48.638] ...future.result$conditions <- ...future.conditions [18:01:48.638] ...future.result$finished <- base::Sys.time() [18:01:48.638] ...future.result [18:01:48.638] } [18:01:48.723] MultisessionFuture started [18:01:48.723] result() for ClusterFuture ... [18:01:48.724] receiveMessageFromWorker() for ClusterFuture ... [18:01:48.724] - Validating connection of MultisessionFuture [18:01:48.780] - received message: FutureResult [18:01:48.781] - Received FutureResult [18:01:48.784] - Erased future from FutureRegistry [18:01:48.785] result() for ClusterFuture ... [18:01:48.785] - result already collected: FutureResult [18:01:48.785] result() for ClusterFuture ... done [18:01:48.785] receiveMessageFromWorker() for ClusterFuture ... done [18:01:48.785] result() for ClusterFuture ... done [18:01:48.786] result() for ClusterFuture ... [18:01:48.786] - result already collected: FutureResult [18:01:48.786] result() for ClusterFuture ... done [18:01:48.786] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:01:48.789] plan(): nbrOfWorkers() = 2 - lm() ... [18:01:48.789] getGlobalsAndPackages() ... [18:01:48.790] Searching for globals... [18:01:48.792] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:48.792] Searching for globals ... DONE [18:01:48.793] Resolving globals: FALSE [18:01:48.793] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:48.794] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:48.794] - globals: [2] 'weight', 'group' [18:01:48.795] - packages: [1] 'stats' [18:01:48.795] getGlobalsAndPackages() ... DONE [18:01:48.795] run() for 'Future' ... [18:01:48.796] - state: 'created' [18:01:48.796] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:48.810] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:48.810] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:48.811] - Field: 'node' [18:01:48.811] - Field: 'label' [18:01:48.811] - Field: 'local' [18:01:48.811] - Field: 'owner' [18:01:48.811] - Field: 'envir' [18:01:48.812] - Field: 'workers' [18:01:48.812] - Field: 'packages' [18:01:48.812] - Field: 'gc' [18:01:48.812] - Field: 'conditions' [18:01:48.812] - Field: 'persistent' [18:01:48.813] - Field: 'expr' [18:01:48.813] - Field: 'uuid' [18:01:48.813] - Field: 'seed' [18:01:48.813] - Field: 'version' [18:01:48.813] - Field: 'result' [18:01:48.814] - Field: 'asynchronous' [18:01:48.814] - Field: 'calls' [18:01:48.814] - Field: 'globals' [18:01:48.814] - Field: 'stdout' [18:01:48.815] - Field: 'earlySignal' [18:01:48.815] - Field: 'lazy' [18:01:48.815] - Field: 'state' [18:01:48.815] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:48.815] - Launch lazy future ... [18:01:48.816] Packages needed by the future expression (n = 1): 'stats' [18:01:48.816] Packages needed by future strategies (n = 0): [18:01:48.817] { [18:01:48.817] { [18:01:48.817] { [18:01:48.817] ...future.startTime <- base::Sys.time() [18:01:48.817] { [18:01:48.817] { [18:01:48.817] { [18:01:48.817] { [18:01:48.817] { [18:01:48.817] base::local({ [18:01:48.817] has_future <- base::requireNamespace("future", [18:01:48.817] quietly = TRUE) [18:01:48.817] if (has_future) { [18:01:48.817] ns <- base::getNamespace("future") [18:01:48.817] version <- ns[[".package"]][["version"]] [18:01:48.817] if (is.null(version)) [18:01:48.817] version <- utils::packageVersion("future") [18:01:48.817] } [18:01:48.817] else { [18:01:48.817] version <- NULL [18:01:48.817] } [18:01:48.817] if (!has_future || version < "1.8.0") { [18:01:48.817] info <- base::c(r_version = base::gsub("R version ", [18:01:48.817] "", base::R.version$version.string), [18:01:48.817] platform = base::sprintf("%s (%s-bit)", [18:01:48.817] base::R.version$platform, 8 * [18:01:48.817] base::.Machine$sizeof.pointer), [18:01:48.817] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:48.817] "release", "version")], collapse = " "), [18:01:48.817] hostname = base::Sys.info()[["nodename"]]) [18:01:48.817] info <- base::sprintf("%s: %s", base::names(info), [18:01:48.817] info) [18:01:48.817] info <- base::paste(info, collapse = "; ") [18:01:48.817] if (!has_future) { [18:01:48.817] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:48.817] info) [18:01:48.817] } [18:01:48.817] else { [18:01:48.817] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:48.817] info, version) [18:01:48.817] } [18:01:48.817] base::stop(msg) [18:01:48.817] } [18:01:48.817] }) [18:01:48.817] } [18:01:48.817] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:48.817] base::options(mc.cores = 1L) [18:01:48.817] } [18:01:48.817] base::local({ [18:01:48.817] for (pkg in "stats") { [18:01:48.817] base::loadNamespace(pkg) [18:01:48.817] base::library(pkg, character.only = TRUE) [18:01:48.817] } [18:01:48.817] }) [18:01:48.817] } [18:01:48.817] options(future.plan = NULL) [18:01:48.817] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.817] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:48.817] } [18:01:48.817] ...future.workdir <- getwd() [18:01:48.817] } [18:01:48.817] ...future.oldOptions <- base::as.list(base::.Options) [18:01:48.817] ...future.oldEnvVars <- base::Sys.getenv() [18:01:48.817] } [18:01:48.817] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:48.817] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:48.817] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:48.817] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:48.817] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:48.817] future.stdout.windows.reencode = NULL, width = 80L) [18:01:48.817] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:48.817] base::names(...future.oldOptions)) [18:01:48.817] } [18:01:48.817] if (FALSE) { [18:01:48.817] } [18:01:48.817] else { [18:01:48.817] if (TRUE) { [18:01:48.817] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:48.817] open = "w") [18:01:48.817] } [18:01:48.817] else { [18:01:48.817] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:48.817] windows = "NUL", "/dev/null"), open = "w") [18:01:48.817] } [18:01:48.817] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:48.817] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:48.817] base::sink(type = "output", split = FALSE) [18:01:48.817] base::close(...future.stdout) [18:01:48.817] }, add = TRUE) [18:01:48.817] } [18:01:48.817] ...future.frame <- base::sys.nframe() [18:01:48.817] ...future.conditions <- base::list() [18:01:48.817] ...future.rng <- base::globalenv()$.Random.seed [18:01:48.817] if (FALSE) { [18:01:48.817] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:48.817] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:48.817] } [18:01:48.817] ...future.result <- base::tryCatch({ [18:01:48.817] base::withCallingHandlers({ [18:01:48.817] ...future.value <- base::withVisible(base::local({ [18:01:48.817] ...future.makeSendCondition <- local({ [18:01:48.817] sendCondition <- NULL [18:01:48.817] function(frame = 1L) { [18:01:48.817] if (is.function(sendCondition)) [18:01:48.817] return(sendCondition) [18:01:48.817] ns <- getNamespace("parallel") [18:01:48.817] if (exists("sendData", mode = "function", [18:01:48.817] envir = ns)) { [18:01:48.817] parallel_sendData <- get("sendData", mode = "function", [18:01:48.817] envir = ns) [18:01:48.817] envir <- sys.frame(frame) [18:01:48.817] master <- NULL [18:01:48.817] while (!identical(envir, .GlobalEnv) && [18:01:48.817] !identical(envir, emptyenv())) { [18:01:48.817] if (exists("master", mode = "list", envir = envir, [18:01:48.817] inherits = FALSE)) { [18:01:48.817] master <- get("master", mode = "list", [18:01:48.817] envir = envir, inherits = FALSE) [18:01:48.817] if (inherits(master, c("SOCKnode", [18:01:48.817] "SOCK0node"))) { [18:01:48.817] sendCondition <<- function(cond) { [18:01:48.817] data <- list(type = "VALUE", value = cond, [18:01:48.817] success = TRUE) [18:01:48.817] parallel_sendData(master, data) [18:01:48.817] } [18:01:48.817] return(sendCondition) [18:01:48.817] } [18:01:48.817] } [18:01:48.817] frame <- frame + 1L [18:01:48.817] envir <- sys.frame(frame) [18:01:48.817] } [18:01:48.817] } [18:01:48.817] sendCondition <<- function(cond) NULL [18:01:48.817] } [18:01:48.817] }) [18:01:48.817] withCallingHandlers({ [18:01:48.817] { [18:01:48.817] lm(weight ~ group - 1) [18:01:48.817] } [18:01:48.817] }, immediateCondition = function(cond) { [18:01:48.817] sendCondition <- ...future.makeSendCondition() [18:01:48.817] sendCondition(cond) [18:01:48.817] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.817] { [18:01:48.817] inherits <- base::inherits [18:01:48.817] invokeRestart <- base::invokeRestart [18:01:48.817] is.null <- base::is.null [18:01:48.817] muffled <- FALSE [18:01:48.817] if (inherits(cond, "message")) { [18:01:48.817] muffled <- grepl(pattern, "muffleMessage") [18:01:48.817] if (muffled) [18:01:48.817] invokeRestart("muffleMessage") [18:01:48.817] } [18:01:48.817] else if (inherits(cond, "warning")) { [18:01:48.817] muffled <- grepl(pattern, "muffleWarning") [18:01:48.817] if (muffled) [18:01:48.817] invokeRestart("muffleWarning") [18:01:48.817] } [18:01:48.817] else if (inherits(cond, "condition")) { [18:01:48.817] if (!is.null(pattern)) { [18:01:48.817] computeRestarts <- base::computeRestarts [18:01:48.817] grepl <- base::grepl [18:01:48.817] restarts <- computeRestarts(cond) [18:01:48.817] for (restart in restarts) { [18:01:48.817] name <- restart$name [18:01:48.817] if (is.null(name)) [18:01:48.817] next [18:01:48.817] if (!grepl(pattern, name)) [18:01:48.817] next [18:01:48.817] invokeRestart(restart) [18:01:48.817] muffled <- TRUE [18:01:48.817] break [18:01:48.817] } [18:01:48.817] } [18:01:48.817] } [18:01:48.817] invisible(muffled) [18:01:48.817] } [18:01:48.817] muffleCondition(cond) [18:01:48.817] }) [18:01:48.817] })) [18:01:48.817] future::FutureResult(value = ...future.value$value, [18:01:48.817] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.817] ...future.rng), globalenv = if (FALSE) [18:01:48.817] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:48.817] ...future.globalenv.names)) [18:01:48.817] else NULL, started = ...future.startTime, version = "1.8") [18:01:48.817] }, condition = base::local({ [18:01:48.817] c <- base::c [18:01:48.817] inherits <- base::inherits [18:01:48.817] invokeRestart <- base::invokeRestart [18:01:48.817] length <- base::length [18:01:48.817] list <- base::list [18:01:48.817] seq.int <- base::seq.int [18:01:48.817] signalCondition <- base::signalCondition [18:01:48.817] sys.calls <- base::sys.calls [18:01:48.817] `[[` <- base::`[[` [18:01:48.817] `+` <- base::`+` [18:01:48.817] `<<-` <- base::`<<-` [18:01:48.817] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:48.817] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:48.817] 3L)] [18:01:48.817] } [18:01:48.817] function(cond) { [18:01:48.817] is_error <- inherits(cond, "error") [18:01:48.817] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:48.817] NULL) [18:01:48.817] if (is_error) { [18:01:48.817] sessionInformation <- function() { [18:01:48.817] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:48.817] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:48.817] search = base::search(), system = base::Sys.info()) [18:01:48.817] } [18:01:48.817] ...future.conditions[[length(...future.conditions) + [18:01:48.817] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:48.817] cond$call), session = sessionInformation(), [18:01:48.817] timestamp = base::Sys.time(), signaled = 0L) [18:01:48.817] signalCondition(cond) [18:01:48.817] } [18:01:48.817] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:48.817] "immediateCondition"))) { [18:01:48.817] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:48.817] ...future.conditions[[length(...future.conditions) + [18:01:48.817] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:48.817] if (TRUE && !signal) { [18:01:48.817] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.817] { [18:01:48.817] inherits <- base::inherits [18:01:48.817] invokeRestart <- base::invokeRestart [18:01:48.817] is.null <- base::is.null [18:01:48.817] muffled <- FALSE [18:01:48.817] if (inherits(cond, "message")) { [18:01:48.817] muffled <- grepl(pattern, "muffleMessage") [18:01:48.817] if (muffled) [18:01:48.817] invokeRestart("muffleMessage") [18:01:48.817] } [18:01:48.817] else if (inherits(cond, "warning")) { [18:01:48.817] muffled <- grepl(pattern, "muffleWarning") [18:01:48.817] if (muffled) [18:01:48.817] invokeRestart("muffleWarning") [18:01:48.817] } [18:01:48.817] else if (inherits(cond, "condition")) { [18:01:48.817] if (!is.null(pattern)) { [18:01:48.817] computeRestarts <- base::computeRestarts [18:01:48.817] grepl <- base::grepl [18:01:48.817] restarts <- computeRestarts(cond) [18:01:48.817] for (restart in restarts) { [18:01:48.817] name <- restart$name [18:01:48.817] if (is.null(name)) [18:01:48.817] next [18:01:48.817] if (!grepl(pattern, name)) [18:01:48.817] next [18:01:48.817] invokeRestart(restart) [18:01:48.817] muffled <- TRUE [18:01:48.817] break [18:01:48.817] } [18:01:48.817] } [18:01:48.817] } [18:01:48.817] invisible(muffled) [18:01:48.817] } [18:01:48.817] muffleCondition(cond, pattern = "^muffle") [18:01:48.817] } [18:01:48.817] } [18:01:48.817] else { [18:01:48.817] if (TRUE) { [18:01:48.817] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.817] { [18:01:48.817] inherits <- base::inherits [18:01:48.817] invokeRestart <- base::invokeRestart [18:01:48.817] is.null <- base::is.null [18:01:48.817] muffled <- FALSE [18:01:48.817] if (inherits(cond, "message")) { [18:01:48.817] muffled <- grepl(pattern, "muffleMessage") [18:01:48.817] if (muffled) [18:01:48.817] invokeRestart("muffleMessage") [18:01:48.817] } [18:01:48.817] else if (inherits(cond, "warning")) { [18:01:48.817] muffled <- grepl(pattern, "muffleWarning") [18:01:48.817] if (muffled) [18:01:48.817] invokeRestart("muffleWarning") [18:01:48.817] } [18:01:48.817] else if (inherits(cond, "condition")) { [18:01:48.817] if (!is.null(pattern)) { [18:01:48.817] computeRestarts <- base::computeRestarts [18:01:48.817] grepl <- base::grepl [18:01:48.817] restarts <- computeRestarts(cond) [18:01:48.817] for (restart in restarts) { [18:01:48.817] name <- restart$name [18:01:48.817] if (is.null(name)) [18:01:48.817] next [18:01:48.817] if (!grepl(pattern, name)) [18:01:48.817] next [18:01:48.817] invokeRestart(restart) [18:01:48.817] muffled <- TRUE [18:01:48.817] break [18:01:48.817] } [18:01:48.817] } [18:01:48.817] } [18:01:48.817] invisible(muffled) [18:01:48.817] } [18:01:48.817] muffleCondition(cond, pattern = "^muffle") [18:01:48.817] } [18:01:48.817] } [18:01:48.817] } [18:01:48.817] })) [18:01:48.817] }, error = function(ex) { [18:01:48.817] base::structure(base::list(value = NULL, visible = NULL, [18:01:48.817] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.817] ...future.rng), started = ...future.startTime, [18:01:48.817] finished = Sys.time(), session_uuid = NA_character_, [18:01:48.817] version = "1.8"), class = "FutureResult") [18:01:48.817] }, finally = { [18:01:48.817] if (!identical(...future.workdir, getwd())) [18:01:48.817] setwd(...future.workdir) [18:01:48.817] { [18:01:48.817] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:48.817] ...future.oldOptions$nwarnings <- NULL [18:01:48.817] } [18:01:48.817] base::options(...future.oldOptions) [18:01:48.817] if (.Platform$OS.type == "windows") { [18:01:48.817] old_names <- names(...future.oldEnvVars) [18:01:48.817] envs <- base::Sys.getenv() [18:01:48.817] names <- names(envs) [18:01:48.817] common <- intersect(names, old_names) [18:01:48.817] added <- setdiff(names, old_names) [18:01:48.817] removed <- setdiff(old_names, names) [18:01:48.817] changed <- common[...future.oldEnvVars[common] != [18:01:48.817] envs[common]] [18:01:48.817] NAMES <- toupper(changed) [18:01:48.817] args <- list() [18:01:48.817] for (kk in seq_along(NAMES)) { [18:01:48.817] name <- changed[[kk]] [18:01:48.817] NAME <- NAMES[[kk]] [18:01:48.817] if (name != NAME && is.element(NAME, old_names)) [18:01:48.817] next [18:01:48.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.817] } [18:01:48.817] NAMES <- toupper(added) [18:01:48.817] for (kk in seq_along(NAMES)) { [18:01:48.817] name <- added[[kk]] [18:01:48.817] NAME <- NAMES[[kk]] [18:01:48.817] if (name != NAME && is.element(NAME, old_names)) [18:01:48.817] next [18:01:48.817] args[[name]] <- "" [18:01:48.817] } [18:01:48.817] NAMES <- toupper(removed) [18:01:48.817] for (kk in seq_along(NAMES)) { [18:01:48.817] name <- removed[[kk]] [18:01:48.817] NAME <- NAMES[[kk]] [18:01:48.817] if (name != NAME && is.element(NAME, old_names)) [18:01:48.817] next [18:01:48.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.817] } [18:01:48.817] if (length(args) > 0) [18:01:48.817] base::do.call(base::Sys.setenv, args = args) [18:01:48.817] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:48.817] } [18:01:48.817] else { [18:01:48.817] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:48.817] } [18:01:48.817] { [18:01:48.817] if (base::length(...future.futureOptionsAdded) > [18:01:48.817] 0L) { [18:01:48.817] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:48.817] base::names(opts) <- ...future.futureOptionsAdded [18:01:48.817] base::options(opts) [18:01:48.817] } [18:01:48.817] { [18:01:48.817] { [18:01:48.817] base::options(mc.cores = ...future.mc.cores.old) [18:01:48.817] NULL [18:01:48.817] } [18:01:48.817] options(future.plan = NULL) [18:01:48.817] if (is.na(NA_character_)) [18:01:48.817] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.817] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:48.817] future::plan(list(function (..., workers = availableCores(), [18:01:48.817] lazy = FALSE, rscript_libs = .libPaths(), [18:01:48.817] envir = parent.frame()) [18:01:48.817] { [18:01:48.817] if (is.function(workers)) [18:01:48.817] workers <- workers() [18:01:48.817] workers <- structure(as.integer(workers), [18:01:48.817] class = class(workers)) [18:01:48.817] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:48.817] workers >= 1) [18:01:48.817] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:48.817] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:48.817] } [18:01:48.817] future <- MultisessionFuture(..., workers = workers, [18:01:48.817] lazy = lazy, rscript_libs = rscript_libs, [18:01:48.817] envir = envir) [18:01:48.817] if (!future$lazy) [18:01:48.817] future <- run(future) [18:01:48.817] invisible(future) [18:01:48.817] }), .cleanup = FALSE, .init = FALSE) [18:01:48.817] } [18:01:48.817] } [18:01:48.817] } [18:01:48.817] }) [18:01:48.817] if (TRUE) { [18:01:48.817] base::sink(type = "output", split = FALSE) [18:01:48.817] if (TRUE) { [18:01:48.817] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:48.817] } [18:01:48.817] else { [18:01:48.817] ...future.result["stdout"] <- base::list(NULL) [18:01:48.817] } [18:01:48.817] base::close(...future.stdout) [18:01:48.817] ...future.stdout <- NULL [18:01:48.817] } [18:01:48.817] ...future.result$conditions <- ...future.conditions [18:01:48.817] ...future.result$finished <- base::Sys.time() [18:01:48.817] ...future.result [18:01:48.817] } [18:01:48.822] Exporting 2 global objects (896 bytes) to cluster node #1 ... [18:01:48.823] Exporting 'weight' (208 bytes) to cluster node #1 ... [18:01:48.823] Exporting 'weight' (208 bytes) to cluster node #1 ... DONE [18:01:48.823] Exporting 'group' (688 bytes) to cluster node #1 ... [18:01:48.824] Exporting 'group' (688 bytes) to cluster node #1 ... DONE [18:01:48.824] Exporting 2 global objects (896 bytes) to cluster node #1 ... DONE [18:01:48.825] MultisessionFuture started [18:01:48.825] - Launch lazy future ... done [18:01:48.825] run() for 'MultisessionFuture' ... done [18:01:48.826] result() for ClusterFuture ... [18:01:48.826] receiveMessageFromWorker() for ClusterFuture ... [18:01:48.826] - Validating connection of MultisessionFuture [18:01:48.846] - received message: FutureResult [18:01:48.846] - Received FutureResult [18:01:48.847] - Erased future from FutureRegistry [18:01:48.847] result() for ClusterFuture ... [18:01:48.847] - result already collected: FutureResult [18:01:48.847] result() for ClusterFuture ... done [18:01:48.847] receiveMessageFromWorker() for ClusterFuture ... done [18:01:48.848] result() for ClusterFuture ... done [18:01:48.848] result() for ClusterFuture ... [18:01:48.848] - result already collected: FutureResult [18:01:48.848] result() for ClusterFuture ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:48.851] getGlobalsAndPackages() ... [18:01:48.851] Searching for globals... [18:01:48.853] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:48.853] Searching for globals ... DONE [18:01:48.854] Resolving globals: FALSE [18:01:48.854] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:48.855] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:48.855] - globals: [2] 'weight', 'group' [18:01:48.855] - packages: [1] 'stats' [18:01:48.856] getGlobalsAndPackages() ... DONE [18:01:48.856] run() for 'Future' ... [18:01:48.856] - state: 'created' [18:01:48.856] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:48.871] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:48.871] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:48.871] - Field: 'node' [18:01:48.872] - Field: 'label' [18:01:48.872] - Field: 'local' [18:01:48.872] - Field: 'owner' [18:01:48.872] - Field: 'envir' [18:01:48.872] - Field: 'workers' [18:01:48.873] - Field: 'packages' [18:01:48.873] - Field: 'gc' [18:01:48.873] - Field: 'conditions' [18:01:48.873] - Field: 'persistent' [18:01:48.873] - Field: 'expr' [18:01:48.874] - Field: 'uuid' [18:01:48.874] - Field: 'seed' [18:01:48.874] - Field: 'version' [18:01:48.874] - Field: 'result' [18:01:48.874] - Field: 'asynchronous' [18:01:48.874] - Field: 'calls' [18:01:48.875] - Field: 'globals' [18:01:48.875] - Field: 'stdout' [18:01:48.875] - Field: 'earlySignal' [18:01:48.875] - Field: 'lazy' [18:01:48.875] - Field: 'state' [18:01:48.876] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:48.876] - Launch lazy future ... [18:01:48.876] Packages needed by the future expression (n = 1): 'stats' [18:01:48.877] Packages needed by future strategies (n = 0): [18:01:48.877] { [18:01:48.877] { [18:01:48.877] { [18:01:48.877] ...future.startTime <- base::Sys.time() [18:01:48.877] { [18:01:48.877] { [18:01:48.877] { [18:01:48.877] { [18:01:48.877] { [18:01:48.877] base::local({ [18:01:48.877] has_future <- base::requireNamespace("future", [18:01:48.877] quietly = TRUE) [18:01:48.877] if (has_future) { [18:01:48.877] ns <- base::getNamespace("future") [18:01:48.877] version <- ns[[".package"]][["version"]] [18:01:48.877] if (is.null(version)) [18:01:48.877] version <- utils::packageVersion("future") [18:01:48.877] } [18:01:48.877] else { [18:01:48.877] version <- NULL [18:01:48.877] } [18:01:48.877] if (!has_future || version < "1.8.0") { [18:01:48.877] info <- base::c(r_version = base::gsub("R version ", [18:01:48.877] "", base::R.version$version.string), [18:01:48.877] platform = base::sprintf("%s (%s-bit)", [18:01:48.877] base::R.version$platform, 8 * [18:01:48.877] base::.Machine$sizeof.pointer), [18:01:48.877] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:48.877] "release", "version")], collapse = " "), [18:01:48.877] hostname = base::Sys.info()[["nodename"]]) [18:01:48.877] info <- base::sprintf("%s: %s", base::names(info), [18:01:48.877] info) [18:01:48.877] info <- base::paste(info, collapse = "; ") [18:01:48.877] if (!has_future) { [18:01:48.877] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:48.877] info) [18:01:48.877] } [18:01:48.877] else { [18:01:48.877] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:48.877] info, version) [18:01:48.877] } [18:01:48.877] base::stop(msg) [18:01:48.877] } [18:01:48.877] }) [18:01:48.877] } [18:01:48.877] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:48.877] base::options(mc.cores = 1L) [18:01:48.877] } [18:01:48.877] base::local({ [18:01:48.877] for (pkg in "stats") { [18:01:48.877] base::loadNamespace(pkg) [18:01:48.877] base::library(pkg, character.only = TRUE) [18:01:48.877] } [18:01:48.877] }) [18:01:48.877] } [18:01:48.877] options(future.plan = NULL) [18:01:48.877] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.877] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:48.877] } [18:01:48.877] ...future.workdir <- getwd() [18:01:48.877] } [18:01:48.877] ...future.oldOptions <- base::as.list(base::.Options) [18:01:48.877] ...future.oldEnvVars <- base::Sys.getenv() [18:01:48.877] } [18:01:48.877] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:48.877] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:48.877] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:48.877] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:48.877] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:48.877] future.stdout.windows.reencode = NULL, width = 80L) [18:01:48.877] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:48.877] base::names(...future.oldOptions)) [18:01:48.877] } [18:01:48.877] if (FALSE) { [18:01:48.877] } [18:01:48.877] else { [18:01:48.877] if (TRUE) { [18:01:48.877] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:48.877] open = "w") [18:01:48.877] } [18:01:48.877] else { [18:01:48.877] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:48.877] windows = "NUL", "/dev/null"), open = "w") [18:01:48.877] } [18:01:48.877] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:48.877] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:48.877] base::sink(type = "output", split = FALSE) [18:01:48.877] base::close(...future.stdout) [18:01:48.877] }, add = TRUE) [18:01:48.877] } [18:01:48.877] ...future.frame <- base::sys.nframe() [18:01:48.877] ...future.conditions <- base::list() [18:01:48.877] ...future.rng <- base::globalenv()$.Random.seed [18:01:48.877] if (FALSE) { [18:01:48.877] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:48.877] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:48.877] } [18:01:48.877] ...future.result <- base::tryCatch({ [18:01:48.877] base::withCallingHandlers({ [18:01:48.877] ...future.value <- base::withVisible(base::local({ [18:01:48.877] ...future.makeSendCondition <- local({ [18:01:48.877] sendCondition <- NULL [18:01:48.877] function(frame = 1L) { [18:01:48.877] if (is.function(sendCondition)) [18:01:48.877] return(sendCondition) [18:01:48.877] ns <- getNamespace("parallel") [18:01:48.877] if (exists("sendData", mode = "function", [18:01:48.877] envir = ns)) { [18:01:48.877] parallel_sendData <- get("sendData", mode = "function", [18:01:48.877] envir = ns) [18:01:48.877] envir <- sys.frame(frame) [18:01:48.877] master <- NULL [18:01:48.877] while (!identical(envir, .GlobalEnv) && [18:01:48.877] !identical(envir, emptyenv())) { [18:01:48.877] if (exists("master", mode = "list", envir = envir, [18:01:48.877] inherits = FALSE)) { [18:01:48.877] master <- get("master", mode = "list", [18:01:48.877] envir = envir, inherits = FALSE) [18:01:48.877] if (inherits(master, c("SOCKnode", [18:01:48.877] "SOCK0node"))) { [18:01:48.877] sendCondition <<- function(cond) { [18:01:48.877] data <- list(type = "VALUE", value = cond, [18:01:48.877] success = TRUE) [18:01:48.877] parallel_sendData(master, data) [18:01:48.877] } [18:01:48.877] return(sendCondition) [18:01:48.877] } [18:01:48.877] } [18:01:48.877] frame <- frame + 1L [18:01:48.877] envir <- sys.frame(frame) [18:01:48.877] } [18:01:48.877] } [18:01:48.877] sendCondition <<- function(cond) NULL [18:01:48.877] } [18:01:48.877] }) [18:01:48.877] withCallingHandlers({ [18:01:48.877] { [18:01:48.877] lm(weight ~ group - 1) [18:01:48.877] } [18:01:48.877] }, immediateCondition = function(cond) { [18:01:48.877] sendCondition <- ...future.makeSendCondition() [18:01:48.877] sendCondition(cond) [18:01:48.877] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.877] { [18:01:48.877] inherits <- base::inherits [18:01:48.877] invokeRestart <- base::invokeRestart [18:01:48.877] is.null <- base::is.null [18:01:48.877] muffled <- FALSE [18:01:48.877] if (inherits(cond, "message")) { [18:01:48.877] muffled <- grepl(pattern, "muffleMessage") [18:01:48.877] if (muffled) [18:01:48.877] invokeRestart("muffleMessage") [18:01:48.877] } [18:01:48.877] else if (inherits(cond, "warning")) { [18:01:48.877] muffled <- grepl(pattern, "muffleWarning") [18:01:48.877] if (muffled) [18:01:48.877] invokeRestart("muffleWarning") [18:01:48.877] } [18:01:48.877] else if (inherits(cond, "condition")) { [18:01:48.877] if (!is.null(pattern)) { [18:01:48.877] computeRestarts <- base::computeRestarts [18:01:48.877] grepl <- base::grepl [18:01:48.877] restarts <- computeRestarts(cond) [18:01:48.877] for (restart in restarts) { [18:01:48.877] name <- restart$name [18:01:48.877] if (is.null(name)) [18:01:48.877] next [18:01:48.877] if (!grepl(pattern, name)) [18:01:48.877] next [18:01:48.877] invokeRestart(restart) [18:01:48.877] muffled <- TRUE [18:01:48.877] break [18:01:48.877] } [18:01:48.877] } [18:01:48.877] } [18:01:48.877] invisible(muffled) [18:01:48.877] } [18:01:48.877] muffleCondition(cond) [18:01:48.877] }) [18:01:48.877] })) [18:01:48.877] future::FutureResult(value = ...future.value$value, [18:01:48.877] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.877] ...future.rng), globalenv = if (FALSE) [18:01:48.877] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:48.877] ...future.globalenv.names)) [18:01:48.877] else NULL, started = ...future.startTime, version = "1.8") [18:01:48.877] }, condition = base::local({ [18:01:48.877] c <- base::c [18:01:48.877] inherits <- base::inherits [18:01:48.877] invokeRestart <- base::invokeRestart [18:01:48.877] length <- base::length [18:01:48.877] list <- base::list [18:01:48.877] seq.int <- base::seq.int [18:01:48.877] signalCondition <- base::signalCondition [18:01:48.877] sys.calls <- base::sys.calls [18:01:48.877] `[[` <- base::`[[` [18:01:48.877] `+` <- base::`+` [18:01:48.877] `<<-` <- base::`<<-` [18:01:48.877] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:48.877] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:48.877] 3L)] [18:01:48.877] } [18:01:48.877] function(cond) { [18:01:48.877] is_error <- inherits(cond, "error") [18:01:48.877] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:48.877] NULL) [18:01:48.877] if (is_error) { [18:01:48.877] sessionInformation <- function() { [18:01:48.877] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:48.877] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:48.877] search = base::search(), system = base::Sys.info()) [18:01:48.877] } [18:01:48.877] ...future.conditions[[length(...future.conditions) + [18:01:48.877] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:48.877] cond$call), session = sessionInformation(), [18:01:48.877] timestamp = base::Sys.time(), signaled = 0L) [18:01:48.877] signalCondition(cond) [18:01:48.877] } [18:01:48.877] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:48.877] "immediateCondition"))) { [18:01:48.877] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:48.877] ...future.conditions[[length(...future.conditions) + [18:01:48.877] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:48.877] if (TRUE && !signal) { [18:01:48.877] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.877] { [18:01:48.877] inherits <- base::inherits [18:01:48.877] invokeRestart <- base::invokeRestart [18:01:48.877] is.null <- base::is.null [18:01:48.877] muffled <- FALSE [18:01:48.877] if (inherits(cond, "message")) { [18:01:48.877] muffled <- grepl(pattern, "muffleMessage") [18:01:48.877] if (muffled) [18:01:48.877] invokeRestart("muffleMessage") [18:01:48.877] } [18:01:48.877] else if (inherits(cond, "warning")) { [18:01:48.877] muffled <- grepl(pattern, "muffleWarning") [18:01:48.877] if (muffled) [18:01:48.877] invokeRestart("muffleWarning") [18:01:48.877] } [18:01:48.877] else if (inherits(cond, "condition")) { [18:01:48.877] if (!is.null(pattern)) { [18:01:48.877] computeRestarts <- base::computeRestarts [18:01:48.877] grepl <- base::grepl [18:01:48.877] restarts <- computeRestarts(cond) [18:01:48.877] for (restart in restarts) { [18:01:48.877] name <- restart$name [18:01:48.877] if (is.null(name)) [18:01:48.877] next [18:01:48.877] if (!grepl(pattern, name)) [18:01:48.877] next [18:01:48.877] invokeRestart(restart) [18:01:48.877] muffled <- TRUE [18:01:48.877] break [18:01:48.877] } [18:01:48.877] } [18:01:48.877] } [18:01:48.877] invisible(muffled) [18:01:48.877] } [18:01:48.877] muffleCondition(cond, pattern = "^muffle") [18:01:48.877] } [18:01:48.877] } [18:01:48.877] else { [18:01:48.877] if (TRUE) { [18:01:48.877] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.877] { [18:01:48.877] inherits <- base::inherits [18:01:48.877] invokeRestart <- base::invokeRestart [18:01:48.877] is.null <- base::is.null [18:01:48.877] muffled <- FALSE [18:01:48.877] if (inherits(cond, "message")) { [18:01:48.877] muffled <- grepl(pattern, "muffleMessage") [18:01:48.877] if (muffled) [18:01:48.877] invokeRestart("muffleMessage") [18:01:48.877] } [18:01:48.877] else if (inherits(cond, "warning")) { [18:01:48.877] muffled <- grepl(pattern, "muffleWarning") [18:01:48.877] if (muffled) [18:01:48.877] invokeRestart("muffleWarning") [18:01:48.877] } [18:01:48.877] else if (inherits(cond, "condition")) { [18:01:48.877] if (!is.null(pattern)) { [18:01:48.877] computeRestarts <- base::computeRestarts [18:01:48.877] grepl <- base::grepl [18:01:48.877] restarts <- computeRestarts(cond) [18:01:48.877] for (restart in restarts) { [18:01:48.877] name <- restart$name [18:01:48.877] if (is.null(name)) [18:01:48.877] next [18:01:48.877] if (!grepl(pattern, name)) [18:01:48.877] next [18:01:48.877] invokeRestart(restart) [18:01:48.877] muffled <- TRUE [18:01:48.877] break [18:01:48.877] } [18:01:48.877] } [18:01:48.877] } [18:01:48.877] invisible(muffled) [18:01:48.877] } [18:01:48.877] muffleCondition(cond, pattern = "^muffle") [18:01:48.877] } [18:01:48.877] } [18:01:48.877] } [18:01:48.877] })) [18:01:48.877] }, error = function(ex) { [18:01:48.877] base::structure(base::list(value = NULL, visible = NULL, [18:01:48.877] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.877] ...future.rng), started = ...future.startTime, [18:01:48.877] finished = Sys.time(), session_uuid = NA_character_, [18:01:48.877] version = "1.8"), class = "FutureResult") [18:01:48.877] }, finally = { [18:01:48.877] if (!identical(...future.workdir, getwd())) [18:01:48.877] setwd(...future.workdir) [18:01:48.877] { [18:01:48.877] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:48.877] ...future.oldOptions$nwarnings <- NULL [18:01:48.877] } [18:01:48.877] base::options(...future.oldOptions) [18:01:48.877] if (.Platform$OS.type == "windows") { [18:01:48.877] old_names <- names(...future.oldEnvVars) [18:01:48.877] envs <- base::Sys.getenv() [18:01:48.877] names <- names(envs) [18:01:48.877] common <- intersect(names, old_names) [18:01:48.877] added <- setdiff(names, old_names) [18:01:48.877] removed <- setdiff(old_names, names) [18:01:48.877] changed <- common[...future.oldEnvVars[common] != [18:01:48.877] envs[common]] [18:01:48.877] NAMES <- toupper(changed) [18:01:48.877] args <- list() [18:01:48.877] for (kk in seq_along(NAMES)) { [18:01:48.877] name <- changed[[kk]] [18:01:48.877] NAME <- NAMES[[kk]] [18:01:48.877] if (name != NAME && is.element(NAME, old_names)) [18:01:48.877] next [18:01:48.877] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.877] } [18:01:48.877] NAMES <- toupper(added) [18:01:48.877] for (kk in seq_along(NAMES)) { [18:01:48.877] name <- added[[kk]] [18:01:48.877] NAME <- NAMES[[kk]] [18:01:48.877] if (name != NAME && is.element(NAME, old_names)) [18:01:48.877] next [18:01:48.877] args[[name]] <- "" [18:01:48.877] } [18:01:48.877] NAMES <- toupper(removed) [18:01:48.877] for (kk in seq_along(NAMES)) { [18:01:48.877] name <- removed[[kk]] [18:01:48.877] NAME <- NAMES[[kk]] [18:01:48.877] if (name != NAME && is.element(NAME, old_names)) [18:01:48.877] next [18:01:48.877] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.877] } [18:01:48.877] if (length(args) > 0) [18:01:48.877] base::do.call(base::Sys.setenv, args = args) [18:01:48.877] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:48.877] } [18:01:48.877] else { [18:01:48.877] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:48.877] } [18:01:48.877] { [18:01:48.877] if (base::length(...future.futureOptionsAdded) > [18:01:48.877] 0L) { [18:01:48.877] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:48.877] base::names(opts) <- ...future.futureOptionsAdded [18:01:48.877] base::options(opts) [18:01:48.877] } [18:01:48.877] { [18:01:48.877] { [18:01:48.877] base::options(mc.cores = ...future.mc.cores.old) [18:01:48.877] NULL [18:01:48.877] } [18:01:48.877] options(future.plan = NULL) [18:01:48.877] if (is.na(NA_character_)) [18:01:48.877] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.877] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:48.877] future::plan(list(function (..., workers = availableCores(), [18:01:48.877] lazy = FALSE, rscript_libs = .libPaths(), [18:01:48.877] envir = parent.frame()) [18:01:48.877] { [18:01:48.877] if (is.function(workers)) [18:01:48.877] workers <- workers() [18:01:48.877] workers <- structure(as.integer(workers), [18:01:48.877] class = class(workers)) [18:01:48.877] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:48.877] workers >= 1) [18:01:48.877] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:48.877] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:48.877] } [18:01:48.877] future <- MultisessionFuture(..., workers = workers, [18:01:48.877] lazy = lazy, rscript_libs = rscript_libs, [18:01:48.877] envir = envir) [18:01:48.877] if (!future$lazy) [18:01:48.877] future <- run(future) [18:01:48.877] invisible(future) [18:01:48.877] }), .cleanup = FALSE, .init = FALSE) [18:01:48.877] } [18:01:48.877] } [18:01:48.877] } [18:01:48.877] }) [18:01:48.877] if (TRUE) { [18:01:48.877] base::sink(type = "output", split = FALSE) [18:01:48.877] if (TRUE) { [18:01:48.877] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:48.877] } [18:01:48.877] else { [18:01:48.877] ...future.result["stdout"] <- base::list(NULL) [18:01:48.877] } [18:01:48.877] base::close(...future.stdout) [18:01:48.877] ...future.stdout <- NULL [18:01:48.877] } [18:01:48.877] ...future.result$conditions <- ...future.conditions [18:01:48.877] ...future.result$finished <- base::Sys.time() [18:01:48.877] ...future.result [18:01:48.877] } [18:01:48.883] Exporting 2 global objects (896 bytes) to cluster node #1 ... [18:01:48.883] Exporting 'weight' (208 bytes) to cluster node #1 ... [18:01:48.884] Exporting 'weight' (208 bytes) to cluster node #1 ... DONE [18:01:48.884] Exporting 'group' (688 bytes) to cluster node #1 ... [18:01:48.884] Exporting 'group' (688 bytes) to cluster node #1 ... DONE [18:01:48.884] Exporting 2 global objects (896 bytes) to cluster node #1 ... DONE [18:01:48.885] MultisessionFuture started [18:01:48.885] - Launch lazy future ... done [18:01:48.886] run() for 'MultisessionFuture' ... done [18:01:48.886] result() for ClusterFuture ... [18:01:48.886] receiveMessageFromWorker() for ClusterFuture ... [18:01:48.886] - Validating connection of MultisessionFuture [18:01:48.902] - received message: FutureResult [18:01:48.902] - Received FutureResult [18:01:48.902] - Erased future from FutureRegistry [18:01:48.903] result() for ClusterFuture ... [18:01:48.903] - result already collected: FutureResult [18:01:48.903] result() for ClusterFuture ... done [18:01:48.903] receiveMessageFromWorker() for ClusterFuture ... done [18:01:48.903] result() for ClusterFuture ... done [18:01:48.903] result() for ClusterFuture ... [18:01:48.904] - result already collected: FutureResult [18:01:48.904] result() for ClusterFuture ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:48.907] getGlobalsAndPackages() ... [18:01:48.907] Searching for globals... [18:01:48.909] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:48.910] Searching for globals ... DONE [18:01:48.910] Resolving globals: FALSE [18:01:48.911] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:48.912] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:48.912] - globals: [2] 'weight', 'group' [18:01:48.913] - packages: [1] 'stats' [18:01:48.913] getGlobalsAndPackages() ... DONE [18:01:48.913] run() for 'Future' ... [18:01:48.914] - state: 'created' [18:01:48.914] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:48.930] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:48.931] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:48.931] - Field: 'node' [18:01:48.931] - Field: 'label' [18:01:48.934] - Field: 'local' [18:01:48.934] - Field: 'owner' [18:01:48.934] - Field: 'envir' [18:01:48.934] - Field: 'workers' [18:01:48.935] - Field: 'packages' [18:01:48.935] - Field: 'gc' [18:01:48.935] - Field: 'conditions' [18:01:48.935] - Field: 'persistent' [18:01:48.935] - Field: 'expr' [18:01:48.935] - Field: 'uuid' [18:01:48.936] - Field: 'seed' [18:01:48.936] - Field: 'version' [18:01:48.936] - Field: 'result' [18:01:48.936] - Field: 'asynchronous' [18:01:48.936] - Field: 'calls' [18:01:48.937] - Field: 'globals' [18:01:48.937] - Field: 'stdout' [18:01:48.937] - Field: 'earlySignal' [18:01:48.937] - Field: 'lazy' [18:01:48.937] - Field: 'state' [18:01:48.937] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:48.938] - Launch lazy future ... [18:01:48.938] Packages needed by the future expression (n = 1): 'stats' [18:01:48.938] Packages needed by future strategies (n = 0): [18:01:48.939] { [18:01:48.939] { [18:01:48.939] { [18:01:48.939] ...future.startTime <- base::Sys.time() [18:01:48.939] { [18:01:48.939] { [18:01:48.939] { [18:01:48.939] { [18:01:48.939] { [18:01:48.939] base::local({ [18:01:48.939] has_future <- base::requireNamespace("future", [18:01:48.939] quietly = TRUE) [18:01:48.939] if (has_future) { [18:01:48.939] ns <- base::getNamespace("future") [18:01:48.939] version <- ns[[".package"]][["version"]] [18:01:48.939] if (is.null(version)) [18:01:48.939] version <- utils::packageVersion("future") [18:01:48.939] } [18:01:48.939] else { [18:01:48.939] version <- NULL [18:01:48.939] } [18:01:48.939] if (!has_future || version < "1.8.0") { [18:01:48.939] info <- base::c(r_version = base::gsub("R version ", [18:01:48.939] "", base::R.version$version.string), [18:01:48.939] platform = base::sprintf("%s (%s-bit)", [18:01:48.939] base::R.version$platform, 8 * [18:01:48.939] base::.Machine$sizeof.pointer), [18:01:48.939] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:48.939] "release", "version")], collapse = " "), [18:01:48.939] hostname = base::Sys.info()[["nodename"]]) [18:01:48.939] info <- base::sprintf("%s: %s", base::names(info), [18:01:48.939] info) [18:01:48.939] info <- base::paste(info, collapse = "; ") [18:01:48.939] if (!has_future) { [18:01:48.939] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:48.939] info) [18:01:48.939] } [18:01:48.939] else { [18:01:48.939] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:48.939] info, version) [18:01:48.939] } [18:01:48.939] base::stop(msg) [18:01:48.939] } [18:01:48.939] }) [18:01:48.939] } [18:01:48.939] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:48.939] base::options(mc.cores = 1L) [18:01:48.939] } [18:01:48.939] base::local({ [18:01:48.939] for (pkg in "stats") { [18:01:48.939] base::loadNamespace(pkg) [18:01:48.939] base::library(pkg, character.only = TRUE) [18:01:48.939] } [18:01:48.939] }) [18:01:48.939] } [18:01:48.939] options(future.plan = NULL) [18:01:48.939] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.939] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:48.939] } [18:01:48.939] ...future.workdir <- getwd() [18:01:48.939] } [18:01:48.939] ...future.oldOptions <- base::as.list(base::.Options) [18:01:48.939] ...future.oldEnvVars <- base::Sys.getenv() [18:01:48.939] } [18:01:48.939] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:48.939] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:48.939] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:48.939] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:48.939] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:48.939] future.stdout.windows.reencode = NULL, width = 80L) [18:01:48.939] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:48.939] base::names(...future.oldOptions)) [18:01:48.939] } [18:01:48.939] if (FALSE) { [18:01:48.939] } [18:01:48.939] else { [18:01:48.939] if (TRUE) { [18:01:48.939] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:48.939] open = "w") [18:01:48.939] } [18:01:48.939] else { [18:01:48.939] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:48.939] windows = "NUL", "/dev/null"), open = "w") [18:01:48.939] } [18:01:48.939] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:48.939] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:48.939] base::sink(type = "output", split = FALSE) [18:01:48.939] base::close(...future.stdout) [18:01:48.939] }, add = TRUE) [18:01:48.939] } [18:01:48.939] ...future.frame <- base::sys.nframe() [18:01:48.939] ...future.conditions <- base::list() [18:01:48.939] ...future.rng <- base::globalenv()$.Random.seed [18:01:48.939] if (FALSE) { [18:01:48.939] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:48.939] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:48.939] } [18:01:48.939] ...future.result <- base::tryCatch({ [18:01:48.939] base::withCallingHandlers({ [18:01:48.939] ...future.value <- base::withVisible(base::local({ [18:01:48.939] ...future.makeSendCondition <- local({ [18:01:48.939] sendCondition <- NULL [18:01:48.939] function(frame = 1L) { [18:01:48.939] if (is.function(sendCondition)) [18:01:48.939] return(sendCondition) [18:01:48.939] ns <- getNamespace("parallel") [18:01:48.939] if (exists("sendData", mode = "function", [18:01:48.939] envir = ns)) { [18:01:48.939] parallel_sendData <- get("sendData", mode = "function", [18:01:48.939] envir = ns) [18:01:48.939] envir <- sys.frame(frame) [18:01:48.939] master <- NULL [18:01:48.939] while (!identical(envir, .GlobalEnv) && [18:01:48.939] !identical(envir, emptyenv())) { [18:01:48.939] if (exists("master", mode = "list", envir = envir, [18:01:48.939] inherits = FALSE)) { [18:01:48.939] master <- get("master", mode = "list", [18:01:48.939] envir = envir, inherits = FALSE) [18:01:48.939] if (inherits(master, c("SOCKnode", [18:01:48.939] "SOCK0node"))) { [18:01:48.939] sendCondition <<- function(cond) { [18:01:48.939] data <- list(type = "VALUE", value = cond, [18:01:48.939] success = TRUE) [18:01:48.939] parallel_sendData(master, data) [18:01:48.939] } [18:01:48.939] return(sendCondition) [18:01:48.939] } [18:01:48.939] } [18:01:48.939] frame <- frame + 1L [18:01:48.939] envir <- sys.frame(frame) [18:01:48.939] } [18:01:48.939] } [18:01:48.939] sendCondition <<- function(cond) NULL [18:01:48.939] } [18:01:48.939] }) [18:01:48.939] withCallingHandlers({ [18:01:48.939] { [18:01:48.939] lm(weight ~ group - 1) [18:01:48.939] } [18:01:48.939] }, immediateCondition = function(cond) { [18:01:48.939] sendCondition <- ...future.makeSendCondition() [18:01:48.939] sendCondition(cond) [18:01:48.939] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.939] { [18:01:48.939] inherits <- base::inherits [18:01:48.939] invokeRestart <- base::invokeRestart [18:01:48.939] is.null <- base::is.null [18:01:48.939] muffled <- FALSE [18:01:48.939] if (inherits(cond, "message")) { [18:01:48.939] muffled <- grepl(pattern, "muffleMessage") [18:01:48.939] if (muffled) [18:01:48.939] invokeRestart("muffleMessage") [18:01:48.939] } [18:01:48.939] else if (inherits(cond, "warning")) { [18:01:48.939] muffled <- grepl(pattern, "muffleWarning") [18:01:48.939] if (muffled) [18:01:48.939] invokeRestart("muffleWarning") [18:01:48.939] } [18:01:48.939] else if (inherits(cond, "condition")) { [18:01:48.939] if (!is.null(pattern)) { [18:01:48.939] computeRestarts <- base::computeRestarts [18:01:48.939] grepl <- base::grepl [18:01:48.939] restarts <- computeRestarts(cond) [18:01:48.939] for (restart in restarts) { [18:01:48.939] name <- restart$name [18:01:48.939] if (is.null(name)) [18:01:48.939] next [18:01:48.939] if (!grepl(pattern, name)) [18:01:48.939] next [18:01:48.939] invokeRestart(restart) [18:01:48.939] muffled <- TRUE [18:01:48.939] break [18:01:48.939] } [18:01:48.939] } [18:01:48.939] } [18:01:48.939] invisible(muffled) [18:01:48.939] } [18:01:48.939] muffleCondition(cond) [18:01:48.939] }) [18:01:48.939] })) [18:01:48.939] future::FutureResult(value = ...future.value$value, [18:01:48.939] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.939] ...future.rng), globalenv = if (FALSE) [18:01:48.939] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:48.939] ...future.globalenv.names)) [18:01:48.939] else NULL, started = ...future.startTime, version = "1.8") [18:01:48.939] }, condition = base::local({ [18:01:48.939] c <- base::c [18:01:48.939] inherits <- base::inherits [18:01:48.939] invokeRestart <- base::invokeRestart [18:01:48.939] length <- base::length [18:01:48.939] list <- base::list [18:01:48.939] seq.int <- base::seq.int [18:01:48.939] signalCondition <- base::signalCondition [18:01:48.939] sys.calls <- base::sys.calls [18:01:48.939] `[[` <- base::`[[` [18:01:48.939] `+` <- base::`+` [18:01:48.939] `<<-` <- base::`<<-` [18:01:48.939] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:48.939] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:48.939] 3L)] [18:01:48.939] } [18:01:48.939] function(cond) { [18:01:48.939] is_error <- inherits(cond, "error") [18:01:48.939] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:48.939] NULL) [18:01:48.939] if (is_error) { [18:01:48.939] sessionInformation <- function() { [18:01:48.939] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:48.939] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:48.939] search = base::search(), system = base::Sys.info()) [18:01:48.939] } [18:01:48.939] ...future.conditions[[length(...future.conditions) + [18:01:48.939] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:48.939] cond$call), session = sessionInformation(), [18:01:48.939] timestamp = base::Sys.time(), signaled = 0L) [18:01:48.939] signalCondition(cond) [18:01:48.939] } [18:01:48.939] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:48.939] "immediateCondition"))) { [18:01:48.939] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:48.939] ...future.conditions[[length(...future.conditions) + [18:01:48.939] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:48.939] if (TRUE && !signal) { [18:01:48.939] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.939] { [18:01:48.939] inherits <- base::inherits [18:01:48.939] invokeRestart <- base::invokeRestart [18:01:48.939] is.null <- base::is.null [18:01:48.939] muffled <- FALSE [18:01:48.939] if (inherits(cond, "message")) { [18:01:48.939] muffled <- grepl(pattern, "muffleMessage") [18:01:48.939] if (muffled) [18:01:48.939] invokeRestart("muffleMessage") [18:01:48.939] } [18:01:48.939] else if (inherits(cond, "warning")) { [18:01:48.939] muffled <- grepl(pattern, "muffleWarning") [18:01:48.939] if (muffled) [18:01:48.939] invokeRestart("muffleWarning") [18:01:48.939] } [18:01:48.939] else if (inherits(cond, "condition")) { [18:01:48.939] if (!is.null(pattern)) { [18:01:48.939] computeRestarts <- base::computeRestarts [18:01:48.939] grepl <- base::grepl [18:01:48.939] restarts <- computeRestarts(cond) [18:01:48.939] for (restart in restarts) { [18:01:48.939] name <- restart$name [18:01:48.939] if (is.null(name)) [18:01:48.939] next [18:01:48.939] if (!grepl(pattern, name)) [18:01:48.939] next [18:01:48.939] invokeRestart(restart) [18:01:48.939] muffled <- TRUE [18:01:48.939] break [18:01:48.939] } [18:01:48.939] } [18:01:48.939] } [18:01:48.939] invisible(muffled) [18:01:48.939] } [18:01:48.939] muffleCondition(cond, pattern = "^muffle") [18:01:48.939] } [18:01:48.939] } [18:01:48.939] else { [18:01:48.939] if (TRUE) { [18:01:48.939] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.939] { [18:01:48.939] inherits <- base::inherits [18:01:48.939] invokeRestart <- base::invokeRestart [18:01:48.939] is.null <- base::is.null [18:01:48.939] muffled <- FALSE [18:01:48.939] if (inherits(cond, "message")) { [18:01:48.939] muffled <- grepl(pattern, "muffleMessage") [18:01:48.939] if (muffled) [18:01:48.939] invokeRestart("muffleMessage") [18:01:48.939] } [18:01:48.939] else if (inherits(cond, "warning")) { [18:01:48.939] muffled <- grepl(pattern, "muffleWarning") [18:01:48.939] if (muffled) [18:01:48.939] invokeRestart("muffleWarning") [18:01:48.939] } [18:01:48.939] else if (inherits(cond, "condition")) { [18:01:48.939] if (!is.null(pattern)) { [18:01:48.939] computeRestarts <- base::computeRestarts [18:01:48.939] grepl <- base::grepl [18:01:48.939] restarts <- computeRestarts(cond) [18:01:48.939] for (restart in restarts) { [18:01:48.939] name <- restart$name [18:01:48.939] if (is.null(name)) [18:01:48.939] next [18:01:48.939] if (!grepl(pattern, name)) [18:01:48.939] next [18:01:48.939] invokeRestart(restart) [18:01:48.939] muffled <- TRUE [18:01:48.939] break [18:01:48.939] } [18:01:48.939] } [18:01:48.939] } [18:01:48.939] invisible(muffled) [18:01:48.939] } [18:01:48.939] muffleCondition(cond, pattern = "^muffle") [18:01:48.939] } [18:01:48.939] } [18:01:48.939] } [18:01:48.939] })) [18:01:48.939] }, error = function(ex) { [18:01:48.939] base::structure(base::list(value = NULL, visible = NULL, [18:01:48.939] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.939] ...future.rng), started = ...future.startTime, [18:01:48.939] finished = Sys.time(), session_uuid = NA_character_, [18:01:48.939] version = "1.8"), class = "FutureResult") [18:01:48.939] }, finally = { [18:01:48.939] if (!identical(...future.workdir, getwd())) [18:01:48.939] setwd(...future.workdir) [18:01:48.939] { [18:01:48.939] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:48.939] ...future.oldOptions$nwarnings <- NULL [18:01:48.939] } [18:01:48.939] base::options(...future.oldOptions) [18:01:48.939] if (.Platform$OS.type == "windows") { [18:01:48.939] old_names <- names(...future.oldEnvVars) [18:01:48.939] envs <- base::Sys.getenv() [18:01:48.939] names <- names(envs) [18:01:48.939] common <- intersect(names, old_names) [18:01:48.939] added <- setdiff(names, old_names) [18:01:48.939] removed <- setdiff(old_names, names) [18:01:48.939] changed <- common[...future.oldEnvVars[common] != [18:01:48.939] envs[common]] [18:01:48.939] NAMES <- toupper(changed) [18:01:48.939] args <- list() [18:01:48.939] for (kk in seq_along(NAMES)) { [18:01:48.939] name <- changed[[kk]] [18:01:48.939] NAME <- NAMES[[kk]] [18:01:48.939] if (name != NAME && is.element(NAME, old_names)) [18:01:48.939] next [18:01:48.939] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.939] } [18:01:48.939] NAMES <- toupper(added) [18:01:48.939] for (kk in seq_along(NAMES)) { [18:01:48.939] name <- added[[kk]] [18:01:48.939] NAME <- NAMES[[kk]] [18:01:48.939] if (name != NAME && is.element(NAME, old_names)) [18:01:48.939] next [18:01:48.939] args[[name]] <- "" [18:01:48.939] } [18:01:48.939] NAMES <- toupper(removed) [18:01:48.939] for (kk in seq_along(NAMES)) { [18:01:48.939] name <- removed[[kk]] [18:01:48.939] NAME <- NAMES[[kk]] [18:01:48.939] if (name != NAME && is.element(NAME, old_names)) [18:01:48.939] next [18:01:48.939] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.939] } [18:01:48.939] if (length(args) > 0) [18:01:48.939] base::do.call(base::Sys.setenv, args = args) [18:01:48.939] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:48.939] } [18:01:48.939] else { [18:01:48.939] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:48.939] } [18:01:48.939] { [18:01:48.939] if (base::length(...future.futureOptionsAdded) > [18:01:48.939] 0L) { [18:01:48.939] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:48.939] base::names(opts) <- ...future.futureOptionsAdded [18:01:48.939] base::options(opts) [18:01:48.939] } [18:01:48.939] { [18:01:48.939] { [18:01:48.939] base::options(mc.cores = ...future.mc.cores.old) [18:01:48.939] NULL [18:01:48.939] } [18:01:48.939] options(future.plan = NULL) [18:01:48.939] if (is.na(NA_character_)) [18:01:48.939] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.939] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:48.939] future::plan(list(function (..., workers = availableCores(), [18:01:48.939] lazy = FALSE, rscript_libs = .libPaths(), [18:01:48.939] envir = parent.frame()) [18:01:48.939] { [18:01:48.939] if (is.function(workers)) [18:01:48.939] workers <- workers() [18:01:48.939] workers <- structure(as.integer(workers), [18:01:48.939] class = class(workers)) [18:01:48.939] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:48.939] workers >= 1) [18:01:48.939] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:48.939] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:48.939] } [18:01:48.939] future <- MultisessionFuture(..., workers = workers, [18:01:48.939] lazy = lazy, rscript_libs = rscript_libs, [18:01:48.939] envir = envir) [18:01:48.939] if (!future$lazy) [18:01:48.939] future <- run(future) [18:01:48.939] invisible(future) [18:01:48.939] }), .cleanup = FALSE, .init = FALSE) [18:01:48.939] } [18:01:48.939] } [18:01:48.939] } [18:01:48.939] }) [18:01:48.939] if (TRUE) { [18:01:48.939] base::sink(type = "output", split = FALSE) [18:01:48.939] if (TRUE) { [18:01:48.939] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:48.939] } [18:01:48.939] else { [18:01:48.939] ...future.result["stdout"] <- base::list(NULL) [18:01:48.939] } [18:01:48.939] base::close(...future.stdout) [18:01:48.939] ...future.stdout <- NULL [18:01:48.939] } [18:01:48.939] ...future.result$conditions <- ...future.conditions [18:01:48.939] ...future.result$finished <- base::Sys.time() [18:01:48.939] ...future.result [18:01:48.939] } [18:01:48.944] Exporting 2 global objects (896 bytes) to cluster node #1 ... [18:01:48.944] Exporting 'weight' (208 bytes) to cluster node #1 ... [18:01:48.945] Exporting 'weight' (208 bytes) to cluster node #1 ... DONE [18:01:48.945] Exporting 'group' (688 bytes) to cluster node #1 ... [18:01:48.945] Exporting 'group' (688 bytes) to cluster node #1 ... DONE [18:01:48.946] Exporting 2 global objects (896 bytes) to cluster node #1 ... DONE [18:01:48.946] MultisessionFuture started [18:01:48.946] - Launch lazy future ... done [18:01:48.947] run() for 'MultisessionFuture' ... done [18:01:48.947] result() for ClusterFuture ... [18:01:48.947] receiveMessageFromWorker() for ClusterFuture ... [18:01:48.947] - Validating connection of MultisessionFuture [18:01:48.964] - received message: FutureResult [18:01:48.964] - Received FutureResult [18:01:48.964] - Erased future from FutureRegistry [18:01:48.964] result() for ClusterFuture ... [18:01:48.964] - result already collected: FutureResult [18:01:48.965] result() for ClusterFuture ... done [18:01:48.965] receiveMessageFromWorker() for ClusterFuture ... done [18:01:48.965] result() for ClusterFuture ... done [18:01:48.965] result() for ClusterFuture ... [18:01:48.965] - result already collected: FutureResult [18:01:48.965] result() for ClusterFuture ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:48.968] getGlobalsAndPackages() ... [18:01:48.968] Searching for globals... [18:01:48.970] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:48.970] Searching for globals ... DONE [18:01:48.970] Resolving globals: FALSE [18:01:48.971] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:48.971] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:48.971] - globals: [2] 'weight', 'group' [18:01:48.972] - packages: [1] 'stats' [18:01:48.972] getGlobalsAndPackages() ... DONE [18:01:48.972] run() for 'Future' ... [18:01:48.972] - state: 'created' [18:01:48.973] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:48.986] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:48.986] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:48.986] - Field: 'node' [18:01:48.987] - Field: 'label' [18:01:48.987] - Field: 'local' [18:01:48.987] - Field: 'owner' [18:01:48.987] - Field: 'envir' [18:01:48.987] - Field: 'workers' [18:01:48.988] - Field: 'packages' [18:01:48.988] - Field: 'gc' [18:01:48.988] - Field: 'conditions' [18:01:48.988] - Field: 'persistent' [18:01:48.988] - Field: 'expr' [18:01:48.988] - Field: 'uuid' [18:01:48.989] - Field: 'seed' [18:01:48.989] - Field: 'version' [18:01:48.989] - Field: 'result' [18:01:48.989] - Field: 'asynchronous' [18:01:48.989] - Field: 'calls' [18:01:48.990] - Field: 'globals' [18:01:48.990] - Field: 'stdout' [18:01:48.990] - Field: 'earlySignal' [18:01:48.990] - Field: 'lazy' [18:01:48.990] - Field: 'state' [18:01:48.990] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:48.991] - Launch lazy future ... [18:01:48.991] Packages needed by the future expression (n = 1): 'stats' [18:01:48.991] Packages needed by future strategies (n = 0): [18:01:48.992] { [18:01:48.992] { [18:01:48.992] { [18:01:48.992] ...future.startTime <- base::Sys.time() [18:01:48.992] { [18:01:48.992] { [18:01:48.992] { [18:01:48.992] { [18:01:48.992] { [18:01:48.992] base::local({ [18:01:48.992] has_future <- base::requireNamespace("future", [18:01:48.992] quietly = TRUE) [18:01:48.992] if (has_future) { [18:01:48.992] ns <- base::getNamespace("future") [18:01:48.992] version <- ns[[".package"]][["version"]] [18:01:48.992] if (is.null(version)) [18:01:48.992] version <- utils::packageVersion("future") [18:01:48.992] } [18:01:48.992] else { [18:01:48.992] version <- NULL [18:01:48.992] } [18:01:48.992] if (!has_future || version < "1.8.0") { [18:01:48.992] info <- base::c(r_version = base::gsub("R version ", [18:01:48.992] "", base::R.version$version.string), [18:01:48.992] platform = base::sprintf("%s (%s-bit)", [18:01:48.992] base::R.version$platform, 8 * [18:01:48.992] base::.Machine$sizeof.pointer), [18:01:48.992] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:48.992] "release", "version")], collapse = " "), [18:01:48.992] hostname = base::Sys.info()[["nodename"]]) [18:01:48.992] info <- base::sprintf("%s: %s", base::names(info), [18:01:48.992] info) [18:01:48.992] info <- base::paste(info, collapse = "; ") [18:01:48.992] if (!has_future) { [18:01:48.992] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:48.992] info) [18:01:48.992] } [18:01:48.992] else { [18:01:48.992] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:48.992] info, version) [18:01:48.992] } [18:01:48.992] base::stop(msg) [18:01:48.992] } [18:01:48.992] }) [18:01:48.992] } [18:01:48.992] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:48.992] base::options(mc.cores = 1L) [18:01:48.992] } [18:01:48.992] base::local({ [18:01:48.992] for (pkg in "stats") { [18:01:48.992] base::loadNamespace(pkg) [18:01:48.992] base::library(pkg, character.only = TRUE) [18:01:48.992] } [18:01:48.992] }) [18:01:48.992] } [18:01:48.992] options(future.plan = NULL) [18:01:48.992] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.992] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:48.992] } [18:01:48.992] ...future.workdir <- getwd() [18:01:48.992] } [18:01:48.992] ...future.oldOptions <- base::as.list(base::.Options) [18:01:48.992] ...future.oldEnvVars <- base::Sys.getenv() [18:01:48.992] } [18:01:48.992] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:48.992] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:48.992] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:48.992] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:48.992] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:48.992] future.stdout.windows.reencode = NULL, width = 80L) [18:01:48.992] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:48.992] base::names(...future.oldOptions)) [18:01:48.992] } [18:01:48.992] if (FALSE) { [18:01:48.992] } [18:01:48.992] else { [18:01:48.992] if (TRUE) { [18:01:48.992] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:48.992] open = "w") [18:01:48.992] } [18:01:48.992] else { [18:01:48.992] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:48.992] windows = "NUL", "/dev/null"), open = "w") [18:01:48.992] } [18:01:48.992] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:48.992] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:48.992] base::sink(type = "output", split = FALSE) [18:01:48.992] base::close(...future.stdout) [18:01:48.992] }, add = TRUE) [18:01:48.992] } [18:01:48.992] ...future.frame <- base::sys.nframe() [18:01:48.992] ...future.conditions <- base::list() [18:01:48.992] ...future.rng <- base::globalenv()$.Random.seed [18:01:48.992] if (FALSE) { [18:01:48.992] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:48.992] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:48.992] } [18:01:48.992] ...future.result <- base::tryCatch({ [18:01:48.992] base::withCallingHandlers({ [18:01:48.992] ...future.value <- base::withVisible(base::local({ [18:01:48.992] ...future.makeSendCondition <- local({ [18:01:48.992] sendCondition <- NULL [18:01:48.992] function(frame = 1L) { [18:01:48.992] if (is.function(sendCondition)) [18:01:48.992] return(sendCondition) [18:01:48.992] ns <- getNamespace("parallel") [18:01:48.992] if (exists("sendData", mode = "function", [18:01:48.992] envir = ns)) { [18:01:48.992] parallel_sendData <- get("sendData", mode = "function", [18:01:48.992] envir = ns) [18:01:48.992] envir <- sys.frame(frame) [18:01:48.992] master <- NULL [18:01:48.992] while (!identical(envir, .GlobalEnv) && [18:01:48.992] !identical(envir, emptyenv())) { [18:01:48.992] if (exists("master", mode = "list", envir = envir, [18:01:48.992] inherits = FALSE)) { [18:01:48.992] master <- get("master", mode = "list", [18:01:48.992] envir = envir, inherits = FALSE) [18:01:48.992] if (inherits(master, c("SOCKnode", [18:01:48.992] "SOCK0node"))) { [18:01:48.992] sendCondition <<- function(cond) { [18:01:48.992] data <- list(type = "VALUE", value = cond, [18:01:48.992] success = TRUE) [18:01:48.992] parallel_sendData(master, data) [18:01:48.992] } [18:01:48.992] return(sendCondition) [18:01:48.992] } [18:01:48.992] } [18:01:48.992] frame <- frame + 1L [18:01:48.992] envir <- sys.frame(frame) [18:01:48.992] } [18:01:48.992] } [18:01:48.992] sendCondition <<- function(cond) NULL [18:01:48.992] } [18:01:48.992] }) [18:01:48.992] withCallingHandlers({ [18:01:48.992] { [18:01:48.992] lm(weight ~ group - 1) [18:01:48.992] } [18:01:48.992] }, immediateCondition = function(cond) { [18:01:48.992] sendCondition <- ...future.makeSendCondition() [18:01:48.992] sendCondition(cond) [18:01:48.992] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.992] { [18:01:48.992] inherits <- base::inherits [18:01:48.992] invokeRestart <- base::invokeRestart [18:01:48.992] is.null <- base::is.null [18:01:48.992] muffled <- FALSE [18:01:48.992] if (inherits(cond, "message")) { [18:01:48.992] muffled <- grepl(pattern, "muffleMessage") [18:01:48.992] if (muffled) [18:01:48.992] invokeRestart("muffleMessage") [18:01:48.992] } [18:01:48.992] else if (inherits(cond, "warning")) { [18:01:48.992] muffled <- grepl(pattern, "muffleWarning") [18:01:48.992] if (muffled) [18:01:48.992] invokeRestart("muffleWarning") [18:01:48.992] } [18:01:48.992] else if (inherits(cond, "condition")) { [18:01:48.992] if (!is.null(pattern)) { [18:01:48.992] computeRestarts <- base::computeRestarts [18:01:48.992] grepl <- base::grepl [18:01:48.992] restarts <- computeRestarts(cond) [18:01:48.992] for (restart in restarts) { [18:01:48.992] name <- restart$name [18:01:48.992] if (is.null(name)) [18:01:48.992] next [18:01:48.992] if (!grepl(pattern, name)) [18:01:48.992] next [18:01:48.992] invokeRestart(restart) [18:01:48.992] muffled <- TRUE [18:01:48.992] break [18:01:48.992] } [18:01:48.992] } [18:01:48.992] } [18:01:48.992] invisible(muffled) [18:01:48.992] } [18:01:48.992] muffleCondition(cond) [18:01:48.992] }) [18:01:48.992] })) [18:01:48.992] future::FutureResult(value = ...future.value$value, [18:01:48.992] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.992] ...future.rng), globalenv = if (FALSE) [18:01:48.992] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:48.992] ...future.globalenv.names)) [18:01:48.992] else NULL, started = ...future.startTime, version = "1.8") [18:01:48.992] }, condition = base::local({ [18:01:48.992] c <- base::c [18:01:48.992] inherits <- base::inherits [18:01:48.992] invokeRestart <- base::invokeRestart [18:01:48.992] length <- base::length [18:01:48.992] list <- base::list [18:01:48.992] seq.int <- base::seq.int [18:01:48.992] signalCondition <- base::signalCondition [18:01:48.992] sys.calls <- base::sys.calls [18:01:48.992] `[[` <- base::`[[` [18:01:48.992] `+` <- base::`+` [18:01:48.992] `<<-` <- base::`<<-` [18:01:48.992] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:48.992] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:48.992] 3L)] [18:01:48.992] } [18:01:48.992] function(cond) { [18:01:48.992] is_error <- inherits(cond, "error") [18:01:48.992] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:48.992] NULL) [18:01:48.992] if (is_error) { [18:01:48.992] sessionInformation <- function() { [18:01:48.992] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:48.992] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:48.992] search = base::search(), system = base::Sys.info()) [18:01:48.992] } [18:01:48.992] ...future.conditions[[length(...future.conditions) + [18:01:48.992] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:48.992] cond$call), session = sessionInformation(), [18:01:48.992] timestamp = base::Sys.time(), signaled = 0L) [18:01:48.992] signalCondition(cond) [18:01:48.992] } [18:01:48.992] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:48.992] "immediateCondition"))) { [18:01:48.992] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:48.992] ...future.conditions[[length(...future.conditions) + [18:01:48.992] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:48.992] if (TRUE && !signal) { [18:01:48.992] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.992] { [18:01:48.992] inherits <- base::inherits [18:01:48.992] invokeRestart <- base::invokeRestart [18:01:48.992] is.null <- base::is.null [18:01:48.992] muffled <- FALSE [18:01:48.992] if (inherits(cond, "message")) { [18:01:48.992] muffled <- grepl(pattern, "muffleMessage") [18:01:48.992] if (muffled) [18:01:48.992] invokeRestart("muffleMessage") [18:01:48.992] } [18:01:48.992] else if (inherits(cond, "warning")) { [18:01:48.992] muffled <- grepl(pattern, "muffleWarning") [18:01:48.992] if (muffled) [18:01:48.992] invokeRestart("muffleWarning") [18:01:48.992] } [18:01:48.992] else if (inherits(cond, "condition")) { [18:01:48.992] if (!is.null(pattern)) { [18:01:48.992] computeRestarts <- base::computeRestarts [18:01:48.992] grepl <- base::grepl [18:01:48.992] restarts <- computeRestarts(cond) [18:01:48.992] for (restart in restarts) { [18:01:48.992] name <- restart$name [18:01:48.992] if (is.null(name)) [18:01:48.992] next [18:01:48.992] if (!grepl(pattern, name)) [18:01:48.992] next [18:01:48.992] invokeRestart(restart) [18:01:48.992] muffled <- TRUE [18:01:48.992] break [18:01:48.992] } [18:01:48.992] } [18:01:48.992] } [18:01:48.992] invisible(muffled) [18:01:48.992] } [18:01:48.992] muffleCondition(cond, pattern = "^muffle") [18:01:48.992] } [18:01:48.992] } [18:01:48.992] else { [18:01:48.992] if (TRUE) { [18:01:48.992] muffleCondition <- function (cond, pattern = "^muffle") [18:01:48.992] { [18:01:48.992] inherits <- base::inherits [18:01:48.992] invokeRestart <- base::invokeRestart [18:01:48.992] is.null <- base::is.null [18:01:48.992] muffled <- FALSE [18:01:48.992] if (inherits(cond, "message")) { [18:01:48.992] muffled <- grepl(pattern, "muffleMessage") [18:01:48.992] if (muffled) [18:01:48.992] invokeRestart("muffleMessage") [18:01:48.992] } [18:01:48.992] else if (inherits(cond, "warning")) { [18:01:48.992] muffled <- grepl(pattern, "muffleWarning") [18:01:48.992] if (muffled) [18:01:48.992] invokeRestart("muffleWarning") [18:01:48.992] } [18:01:48.992] else if (inherits(cond, "condition")) { [18:01:48.992] if (!is.null(pattern)) { [18:01:48.992] computeRestarts <- base::computeRestarts [18:01:48.992] grepl <- base::grepl [18:01:48.992] restarts <- computeRestarts(cond) [18:01:48.992] for (restart in restarts) { [18:01:48.992] name <- restart$name [18:01:48.992] if (is.null(name)) [18:01:48.992] next [18:01:48.992] if (!grepl(pattern, name)) [18:01:48.992] next [18:01:48.992] invokeRestart(restart) [18:01:48.992] muffled <- TRUE [18:01:48.992] break [18:01:48.992] } [18:01:48.992] } [18:01:48.992] } [18:01:48.992] invisible(muffled) [18:01:48.992] } [18:01:48.992] muffleCondition(cond, pattern = "^muffle") [18:01:48.992] } [18:01:48.992] } [18:01:48.992] } [18:01:48.992] })) [18:01:48.992] }, error = function(ex) { [18:01:48.992] base::structure(base::list(value = NULL, visible = NULL, [18:01:48.992] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:48.992] ...future.rng), started = ...future.startTime, [18:01:48.992] finished = Sys.time(), session_uuid = NA_character_, [18:01:48.992] version = "1.8"), class = "FutureResult") [18:01:48.992] }, finally = { [18:01:48.992] if (!identical(...future.workdir, getwd())) [18:01:48.992] setwd(...future.workdir) [18:01:48.992] { [18:01:48.992] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:48.992] ...future.oldOptions$nwarnings <- NULL [18:01:48.992] } [18:01:48.992] base::options(...future.oldOptions) [18:01:48.992] if (.Platform$OS.type == "windows") { [18:01:48.992] old_names <- names(...future.oldEnvVars) [18:01:48.992] envs <- base::Sys.getenv() [18:01:48.992] names <- names(envs) [18:01:48.992] common <- intersect(names, old_names) [18:01:48.992] added <- setdiff(names, old_names) [18:01:48.992] removed <- setdiff(old_names, names) [18:01:48.992] changed <- common[...future.oldEnvVars[common] != [18:01:48.992] envs[common]] [18:01:48.992] NAMES <- toupper(changed) [18:01:48.992] args <- list() [18:01:48.992] for (kk in seq_along(NAMES)) { [18:01:48.992] name <- changed[[kk]] [18:01:48.992] NAME <- NAMES[[kk]] [18:01:48.992] if (name != NAME && is.element(NAME, old_names)) [18:01:48.992] next [18:01:48.992] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.992] } [18:01:48.992] NAMES <- toupper(added) [18:01:48.992] for (kk in seq_along(NAMES)) { [18:01:48.992] name <- added[[kk]] [18:01:48.992] NAME <- NAMES[[kk]] [18:01:48.992] if (name != NAME && is.element(NAME, old_names)) [18:01:48.992] next [18:01:48.992] args[[name]] <- "" [18:01:48.992] } [18:01:48.992] NAMES <- toupper(removed) [18:01:48.992] for (kk in seq_along(NAMES)) { [18:01:48.992] name <- removed[[kk]] [18:01:48.992] NAME <- NAMES[[kk]] [18:01:48.992] if (name != NAME && is.element(NAME, old_names)) [18:01:48.992] next [18:01:48.992] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:48.992] } [18:01:48.992] if (length(args) > 0) [18:01:48.992] base::do.call(base::Sys.setenv, args = args) [18:01:48.992] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:48.992] } [18:01:48.992] else { [18:01:48.992] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:48.992] } [18:01:48.992] { [18:01:48.992] if (base::length(...future.futureOptionsAdded) > [18:01:48.992] 0L) { [18:01:48.992] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:48.992] base::names(opts) <- ...future.futureOptionsAdded [18:01:48.992] base::options(opts) [18:01:48.992] } [18:01:48.992] { [18:01:48.992] { [18:01:48.992] base::options(mc.cores = ...future.mc.cores.old) [18:01:48.992] NULL [18:01:48.992] } [18:01:48.992] options(future.plan = NULL) [18:01:48.992] if (is.na(NA_character_)) [18:01:48.992] Sys.unsetenv("R_FUTURE_PLAN") [18:01:48.992] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:48.992] future::plan(list(function (..., workers = availableCores(), [18:01:48.992] lazy = FALSE, rscript_libs = .libPaths(), [18:01:48.992] envir = parent.frame()) [18:01:48.992] { [18:01:48.992] if (is.function(workers)) [18:01:48.992] workers <- workers() [18:01:48.992] workers <- structure(as.integer(workers), [18:01:48.992] class = class(workers)) [18:01:48.992] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:48.992] workers >= 1) [18:01:48.992] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:48.992] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:48.992] } [18:01:48.992] future <- MultisessionFuture(..., workers = workers, [18:01:48.992] lazy = lazy, rscript_libs = rscript_libs, [18:01:48.992] envir = envir) [18:01:48.992] if (!future$lazy) [18:01:48.992] future <- run(future) [18:01:48.992] invisible(future) [18:01:48.992] }), .cleanup = FALSE, .init = FALSE) [18:01:48.992] } [18:01:48.992] } [18:01:48.992] } [18:01:48.992] }) [18:01:48.992] if (TRUE) { [18:01:48.992] base::sink(type = "output", split = FALSE) [18:01:48.992] if (TRUE) { [18:01:48.992] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:48.992] } [18:01:48.992] else { [18:01:48.992] ...future.result["stdout"] <- base::list(NULL) [18:01:48.992] } [18:01:48.992] base::close(...future.stdout) [18:01:48.992] ...future.stdout <- NULL [18:01:48.992] } [18:01:48.992] ...future.result$conditions <- ...future.conditions [18:01:48.992] ...future.result$finished <- base::Sys.time() [18:01:48.992] ...future.result [18:01:48.992] } [18:01:48.997] Exporting 2 global objects (896 bytes) to cluster node #1 ... [18:01:48.997] Exporting 'weight' (208 bytes) to cluster node #1 ... [18:01:48.998] Exporting 'weight' (208 bytes) to cluster node #1 ... DONE [18:01:48.998] Exporting 'group' (688 bytes) to cluster node #1 ... [18:01:48.998] Exporting 'group' (688 bytes) to cluster node #1 ... DONE [18:01:48.999] Exporting 2 global objects (896 bytes) to cluster node #1 ... DONE [18:01:48.999] MultisessionFuture started [18:01:48.999] - Launch lazy future ... done [18:01:49.000] run() for 'MultisessionFuture' ... done [18:01:49.000] result() for ClusterFuture ... [18:01:49.000] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.000] - Validating connection of MultisessionFuture [18:01:49.017] - received message: FutureResult [18:01:49.017] - Received FutureResult [18:01:49.017] - Erased future from FutureRegistry [18:01:49.018] result() for ClusterFuture ... [18:01:49.018] - result already collected: FutureResult [18:01:49.018] result() for ClusterFuture ... done [18:01:49.018] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.018] result() for ClusterFuture ... done [18:01:49.018] result() for ClusterFuture ... [18:01:49.019] - result already collected: FutureResult [18:01:49.019] result() for ClusterFuture ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 [18:01:49.022] getGlobalsAndPackages() ... [18:01:49.022] Searching for globals... [18:01:49.024] - globals found: [6] '{', 'lm', 'weight', '-', 'group', '~' [18:01:49.024] Searching for globals ... DONE [18:01:49.024] Resolving globals: FALSE [18:01:49.025] The total size of the 2 globals is 896 bytes (896 bytes) [18:01:49.025] The total size of the 2 globals exported for future expression ('{; lm(weight ~ group - 1); }') is 896 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'group' (688 bytes of class 'numeric') and 'weight' (208 bytes of class 'numeric') [18:01:49.026] - globals: [2] 'weight', 'group' [18:01:49.026] - packages: [1] 'stats' [18:01:49.026] getGlobalsAndPackages() ... DONE [18:01:49.026] run() for 'Future' ... [18:01:49.027] - state: 'created' [18:01:49.027] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.041] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.041] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.042] - Field: 'node' [18:01:49.042] - Field: 'label' [18:01:49.042] - Field: 'local' [18:01:49.042] - Field: 'owner' [18:01:49.042] - Field: 'envir' [18:01:49.043] - Field: 'workers' [18:01:49.043] - Field: 'packages' [18:01:49.043] - Field: 'gc' [18:01:49.043] - Field: 'conditions' [18:01:49.043] - Field: 'persistent' [18:01:49.043] - Field: 'expr' [18:01:49.044] - Field: 'uuid' [18:01:49.044] - Field: 'seed' [18:01:49.044] - Field: 'version' [18:01:49.044] - Field: 'result' [18:01:49.044] - Field: 'asynchronous' [18:01:49.045] - Field: 'calls' [18:01:49.045] - Field: 'globals' [18:01:49.045] - Field: 'stdout' [18:01:49.045] - Field: 'earlySignal' [18:01:49.045] - Field: 'lazy' [18:01:49.045] - Field: 'state' [18:01:49.046] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.046] - Launch lazy future ... [18:01:49.046] Packages needed by the future expression (n = 1): 'stats' [18:01:49.046] Packages needed by future strategies (n = 0): [18:01:49.047] { [18:01:49.047] { [18:01:49.047] { [18:01:49.047] ...future.startTime <- base::Sys.time() [18:01:49.047] { [18:01:49.047] { [18:01:49.047] { [18:01:49.047] { [18:01:49.047] { [18:01:49.047] base::local({ [18:01:49.047] has_future <- base::requireNamespace("future", [18:01:49.047] quietly = TRUE) [18:01:49.047] if (has_future) { [18:01:49.047] ns <- base::getNamespace("future") [18:01:49.047] version <- ns[[".package"]][["version"]] [18:01:49.047] if (is.null(version)) [18:01:49.047] version <- utils::packageVersion("future") [18:01:49.047] } [18:01:49.047] else { [18:01:49.047] version <- NULL [18:01:49.047] } [18:01:49.047] if (!has_future || version < "1.8.0") { [18:01:49.047] info <- base::c(r_version = base::gsub("R version ", [18:01:49.047] "", base::R.version$version.string), [18:01:49.047] platform = base::sprintf("%s (%s-bit)", [18:01:49.047] base::R.version$platform, 8 * [18:01:49.047] base::.Machine$sizeof.pointer), [18:01:49.047] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.047] "release", "version")], collapse = " "), [18:01:49.047] hostname = base::Sys.info()[["nodename"]]) [18:01:49.047] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.047] info) [18:01:49.047] info <- base::paste(info, collapse = "; ") [18:01:49.047] if (!has_future) { [18:01:49.047] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.047] info) [18:01:49.047] } [18:01:49.047] else { [18:01:49.047] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.047] info, version) [18:01:49.047] } [18:01:49.047] base::stop(msg) [18:01:49.047] } [18:01:49.047] }) [18:01:49.047] } [18:01:49.047] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.047] base::options(mc.cores = 1L) [18:01:49.047] } [18:01:49.047] base::local({ [18:01:49.047] for (pkg in "stats") { [18:01:49.047] base::loadNamespace(pkg) [18:01:49.047] base::library(pkg, character.only = TRUE) [18:01:49.047] } [18:01:49.047] }) [18:01:49.047] } [18:01:49.047] options(future.plan = NULL) [18:01:49.047] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.047] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.047] } [18:01:49.047] ...future.workdir <- getwd() [18:01:49.047] } [18:01:49.047] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.047] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.047] } [18:01:49.047] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.047] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.047] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.047] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.047] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.047] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.047] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.047] base::names(...future.oldOptions)) [18:01:49.047] } [18:01:49.047] if (FALSE) { [18:01:49.047] } [18:01:49.047] else { [18:01:49.047] if (TRUE) { [18:01:49.047] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.047] open = "w") [18:01:49.047] } [18:01:49.047] else { [18:01:49.047] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.047] windows = "NUL", "/dev/null"), open = "w") [18:01:49.047] } [18:01:49.047] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.047] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.047] base::sink(type = "output", split = FALSE) [18:01:49.047] base::close(...future.stdout) [18:01:49.047] }, add = TRUE) [18:01:49.047] } [18:01:49.047] ...future.frame <- base::sys.nframe() [18:01:49.047] ...future.conditions <- base::list() [18:01:49.047] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.047] if (FALSE) { [18:01:49.047] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.047] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.047] } [18:01:49.047] ...future.result <- base::tryCatch({ [18:01:49.047] base::withCallingHandlers({ [18:01:49.047] ...future.value <- base::withVisible(base::local({ [18:01:49.047] ...future.makeSendCondition <- local({ [18:01:49.047] sendCondition <- NULL [18:01:49.047] function(frame = 1L) { [18:01:49.047] if (is.function(sendCondition)) [18:01:49.047] return(sendCondition) [18:01:49.047] ns <- getNamespace("parallel") [18:01:49.047] if (exists("sendData", mode = "function", [18:01:49.047] envir = ns)) { [18:01:49.047] parallel_sendData <- get("sendData", mode = "function", [18:01:49.047] envir = ns) [18:01:49.047] envir <- sys.frame(frame) [18:01:49.047] master <- NULL [18:01:49.047] while (!identical(envir, .GlobalEnv) && [18:01:49.047] !identical(envir, emptyenv())) { [18:01:49.047] if (exists("master", mode = "list", envir = envir, [18:01:49.047] inherits = FALSE)) { [18:01:49.047] master <- get("master", mode = "list", [18:01:49.047] envir = envir, inherits = FALSE) [18:01:49.047] if (inherits(master, c("SOCKnode", [18:01:49.047] "SOCK0node"))) { [18:01:49.047] sendCondition <<- function(cond) { [18:01:49.047] data <- list(type = "VALUE", value = cond, [18:01:49.047] success = TRUE) [18:01:49.047] parallel_sendData(master, data) [18:01:49.047] } [18:01:49.047] return(sendCondition) [18:01:49.047] } [18:01:49.047] } [18:01:49.047] frame <- frame + 1L [18:01:49.047] envir <- sys.frame(frame) [18:01:49.047] } [18:01:49.047] } [18:01:49.047] sendCondition <<- function(cond) NULL [18:01:49.047] } [18:01:49.047] }) [18:01:49.047] withCallingHandlers({ [18:01:49.047] { [18:01:49.047] lm(weight ~ group - 1) [18:01:49.047] } [18:01:49.047] }, immediateCondition = function(cond) { [18:01:49.047] sendCondition <- ...future.makeSendCondition() [18:01:49.047] sendCondition(cond) [18:01:49.047] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.047] { [18:01:49.047] inherits <- base::inherits [18:01:49.047] invokeRestart <- base::invokeRestart [18:01:49.047] is.null <- base::is.null [18:01:49.047] muffled <- FALSE [18:01:49.047] if (inherits(cond, "message")) { [18:01:49.047] muffled <- grepl(pattern, "muffleMessage") [18:01:49.047] if (muffled) [18:01:49.047] invokeRestart("muffleMessage") [18:01:49.047] } [18:01:49.047] else if (inherits(cond, "warning")) { [18:01:49.047] muffled <- grepl(pattern, "muffleWarning") [18:01:49.047] if (muffled) [18:01:49.047] invokeRestart("muffleWarning") [18:01:49.047] } [18:01:49.047] else if (inherits(cond, "condition")) { [18:01:49.047] if (!is.null(pattern)) { [18:01:49.047] computeRestarts <- base::computeRestarts [18:01:49.047] grepl <- base::grepl [18:01:49.047] restarts <- computeRestarts(cond) [18:01:49.047] for (restart in restarts) { [18:01:49.047] name <- restart$name [18:01:49.047] if (is.null(name)) [18:01:49.047] next [18:01:49.047] if (!grepl(pattern, name)) [18:01:49.047] next [18:01:49.047] invokeRestart(restart) [18:01:49.047] muffled <- TRUE [18:01:49.047] break [18:01:49.047] } [18:01:49.047] } [18:01:49.047] } [18:01:49.047] invisible(muffled) [18:01:49.047] } [18:01:49.047] muffleCondition(cond) [18:01:49.047] }) [18:01:49.047] })) [18:01:49.047] future::FutureResult(value = ...future.value$value, [18:01:49.047] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.047] ...future.rng), globalenv = if (FALSE) [18:01:49.047] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.047] ...future.globalenv.names)) [18:01:49.047] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.047] }, condition = base::local({ [18:01:49.047] c <- base::c [18:01:49.047] inherits <- base::inherits [18:01:49.047] invokeRestart <- base::invokeRestart [18:01:49.047] length <- base::length [18:01:49.047] list <- base::list [18:01:49.047] seq.int <- base::seq.int [18:01:49.047] signalCondition <- base::signalCondition [18:01:49.047] sys.calls <- base::sys.calls [18:01:49.047] `[[` <- base::`[[` [18:01:49.047] `+` <- base::`+` [18:01:49.047] `<<-` <- base::`<<-` [18:01:49.047] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.047] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.047] 3L)] [18:01:49.047] } [18:01:49.047] function(cond) { [18:01:49.047] is_error <- inherits(cond, "error") [18:01:49.047] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.047] NULL) [18:01:49.047] if (is_error) { [18:01:49.047] sessionInformation <- function() { [18:01:49.047] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.047] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.047] search = base::search(), system = base::Sys.info()) [18:01:49.047] } [18:01:49.047] ...future.conditions[[length(...future.conditions) + [18:01:49.047] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.047] cond$call), session = sessionInformation(), [18:01:49.047] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.047] signalCondition(cond) [18:01:49.047] } [18:01:49.047] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.047] "immediateCondition"))) { [18:01:49.047] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.047] ...future.conditions[[length(...future.conditions) + [18:01:49.047] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.047] if (TRUE && !signal) { [18:01:49.047] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.047] { [18:01:49.047] inherits <- base::inherits [18:01:49.047] invokeRestart <- base::invokeRestart [18:01:49.047] is.null <- base::is.null [18:01:49.047] muffled <- FALSE [18:01:49.047] if (inherits(cond, "message")) { [18:01:49.047] muffled <- grepl(pattern, "muffleMessage") [18:01:49.047] if (muffled) [18:01:49.047] invokeRestart("muffleMessage") [18:01:49.047] } [18:01:49.047] else if (inherits(cond, "warning")) { [18:01:49.047] muffled <- grepl(pattern, "muffleWarning") [18:01:49.047] if (muffled) [18:01:49.047] invokeRestart("muffleWarning") [18:01:49.047] } [18:01:49.047] else if (inherits(cond, "condition")) { [18:01:49.047] if (!is.null(pattern)) { [18:01:49.047] computeRestarts <- base::computeRestarts [18:01:49.047] grepl <- base::grepl [18:01:49.047] restarts <- computeRestarts(cond) [18:01:49.047] for (restart in restarts) { [18:01:49.047] name <- restart$name [18:01:49.047] if (is.null(name)) [18:01:49.047] next [18:01:49.047] if (!grepl(pattern, name)) [18:01:49.047] next [18:01:49.047] invokeRestart(restart) [18:01:49.047] muffled <- TRUE [18:01:49.047] break [18:01:49.047] } [18:01:49.047] } [18:01:49.047] } [18:01:49.047] invisible(muffled) [18:01:49.047] } [18:01:49.047] muffleCondition(cond, pattern = "^muffle") [18:01:49.047] } [18:01:49.047] } [18:01:49.047] else { [18:01:49.047] if (TRUE) { [18:01:49.047] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.047] { [18:01:49.047] inherits <- base::inherits [18:01:49.047] invokeRestart <- base::invokeRestart [18:01:49.047] is.null <- base::is.null [18:01:49.047] muffled <- FALSE [18:01:49.047] if (inherits(cond, "message")) { [18:01:49.047] muffled <- grepl(pattern, "muffleMessage") [18:01:49.047] if (muffled) [18:01:49.047] invokeRestart("muffleMessage") [18:01:49.047] } [18:01:49.047] else if (inherits(cond, "warning")) { [18:01:49.047] muffled <- grepl(pattern, "muffleWarning") [18:01:49.047] if (muffled) [18:01:49.047] invokeRestart("muffleWarning") [18:01:49.047] } [18:01:49.047] else if (inherits(cond, "condition")) { [18:01:49.047] if (!is.null(pattern)) { [18:01:49.047] computeRestarts <- base::computeRestarts [18:01:49.047] grepl <- base::grepl [18:01:49.047] restarts <- computeRestarts(cond) [18:01:49.047] for (restart in restarts) { [18:01:49.047] name <- restart$name [18:01:49.047] if (is.null(name)) [18:01:49.047] next [18:01:49.047] if (!grepl(pattern, name)) [18:01:49.047] next [18:01:49.047] invokeRestart(restart) [18:01:49.047] muffled <- TRUE [18:01:49.047] break [18:01:49.047] } [18:01:49.047] } [18:01:49.047] } [18:01:49.047] invisible(muffled) [18:01:49.047] } [18:01:49.047] muffleCondition(cond, pattern = "^muffle") [18:01:49.047] } [18:01:49.047] } [18:01:49.047] } [18:01:49.047] })) [18:01:49.047] }, error = function(ex) { [18:01:49.047] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.047] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.047] ...future.rng), started = ...future.startTime, [18:01:49.047] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.047] version = "1.8"), class = "FutureResult") [18:01:49.047] }, finally = { [18:01:49.047] if (!identical(...future.workdir, getwd())) [18:01:49.047] setwd(...future.workdir) [18:01:49.047] { [18:01:49.047] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.047] ...future.oldOptions$nwarnings <- NULL [18:01:49.047] } [18:01:49.047] base::options(...future.oldOptions) [18:01:49.047] if (.Platform$OS.type == "windows") { [18:01:49.047] old_names <- names(...future.oldEnvVars) [18:01:49.047] envs <- base::Sys.getenv() [18:01:49.047] names <- names(envs) [18:01:49.047] common <- intersect(names, old_names) [18:01:49.047] added <- setdiff(names, old_names) [18:01:49.047] removed <- setdiff(old_names, names) [18:01:49.047] changed <- common[...future.oldEnvVars[common] != [18:01:49.047] envs[common]] [18:01:49.047] NAMES <- toupper(changed) [18:01:49.047] args <- list() [18:01:49.047] for (kk in seq_along(NAMES)) { [18:01:49.047] name <- changed[[kk]] [18:01:49.047] NAME <- NAMES[[kk]] [18:01:49.047] if (name != NAME && is.element(NAME, old_names)) [18:01:49.047] next [18:01:49.047] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.047] } [18:01:49.047] NAMES <- toupper(added) [18:01:49.047] for (kk in seq_along(NAMES)) { [18:01:49.047] name <- added[[kk]] [18:01:49.047] NAME <- NAMES[[kk]] [18:01:49.047] if (name != NAME && is.element(NAME, old_names)) [18:01:49.047] next [18:01:49.047] args[[name]] <- "" [18:01:49.047] } [18:01:49.047] NAMES <- toupper(removed) [18:01:49.047] for (kk in seq_along(NAMES)) { [18:01:49.047] name <- removed[[kk]] [18:01:49.047] NAME <- NAMES[[kk]] [18:01:49.047] if (name != NAME && is.element(NAME, old_names)) [18:01:49.047] next [18:01:49.047] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.047] } [18:01:49.047] if (length(args) > 0) [18:01:49.047] base::do.call(base::Sys.setenv, args = args) [18:01:49.047] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.047] } [18:01:49.047] else { [18:01:49.047] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.047] } [18:01:49.047] { [18:01:49.047] if (base::length(...future.futureOptionsAdded) > [18:01:49.047] 0L) { [18:01:49.047] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.047] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.047] base::options(opts) [18:01:49.047] } [18:01:49.047] { [18:01:49.047] { [18:01:49.047] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.047] NULL [18:01:49.047] } [18:01:49.047] options(future.plan = NULL) [18:01:49.047] if (is.na(NA_character_)) [18:01:49.047] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.047] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.047] future::plan(list(function (..., workers = availableCores(), [18:01:49.047] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.047] envir = parent.frame()) [18:01:49.047] { [18:01:49.047] if (is.function(workers)) [18:01:49.047] workers <- workers() [18:01:49.047] workers <- structure(as.integer(workers), [18:01:49.047] class = class(workers)) [18:01:49.047] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.047] workers >= 1) [18:01:49.047] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.047] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.047] } [18:01:49.047] future <- MultisessionFuture(..., workers = workers, [18:01:49.047] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.047] envir = envir) [18:01:49.047] if (!future$lazy) [18:01:49.047] future <- run(future) [18:01:49.047] invisible(future) [18:01:49.047] }), .cleanup = FALSE, .init = FALSE) [18:01:49.047] } [18:01:49.047] } [18:01:49.047] } [18:01:49.047] }) [18:01:49.047] if (TRUE) { [18:01:49.047] base::sink(type = "output", split = FALSE) [18:01:49.047] if (TRUE) { [18:01:49.047] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.047] } [18:01:49.047] else { [18:01:49.047] ...future.result["stdout"] <- base::list(NULL) [18:01:49.047] } [18:01:49.047] base::close(...future.stdout) [18:01:49.047] ...future.stdout <- NULL [18:01:49.047] } [18:01:49.047] ...future.result$conditions <- ...future.conditions [18:01:49.047] ...future.result$finished <- base::Sys.time() [18:01:49.047] ...future.result [18:01:49.047] } [18:01:49.053] Exporting 2 global objects (896 bytes) to cluster node #1 ... [18:01:49.053] Exporting 'weight' (208 bytes) to cluster node #1 ... [18:01:49.054] Exporting 'weight' (208 bytes) to cluster node #1 ... DONE [18:01:49.054] Exporting 'group' (688 bytes) to cluster node #1 ... [18:01:49.054] Exporting 'group' (688 bytes) to cluster node #1 ... DONE [18:01:49.055] Exporting 2 global objects (896 bytes) to cluster node #1 ... DONE [18:01:49.055] MultisessionFuture started [18:01:49.055] - Launch lazy future ... done [18:01:49.056] run() for 'MultisessionFuture' ... done [18:01:49.056] result() for ClusterFuture ... [18:01:49.056] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.056] - Validating connection of MultisessionFuture [18:01:49.076] - received message: FutureResult [18:01:49.076] - Received FutureResult [18:01:49.076] - Erased future from FutureRegistry [18:01:49.076] result() for ClusterFuture ... [18:01:49.076] - result already collected: FutureResult [18:01:49.076] result() for ClusterFuture ... done [18:01:49.077] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.077] result() for ClusterFuture ... done [18:01:49.077] result() for ClusterFuture ... [18:01:49.077] - result already collected: FutureResult [18:01:49.077] result() for ClusterFuture ... done Call: lm(formula = weight ~ group - 1) Coefficients: groupCtl groupTrt 5.032 4.661 - Globals - one-side formulas, e.g. xtabs(~ x) ... [18:01:49.080] getGlobalsAndPackages() ... [18:01:49.080] Searching for globals... [18:01:49.081] - globals found: [4] '{', 'xtabs', 'x', '~' [18:01:49.081] Searching for globals ... DONE [18:01:49.082] Resolving globals: FALSE [18:01:49.082] The total size of the 1 globals is 96 bytes (96 bytes) [18:01:49.083] The total size of the 1 globals exported for future expression ('{; xtabs(~x); }') is 96 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (96 bytes of class 'numeric') [18:01:49.083] - globals: [1] 'x' [18:01:49.083] - packages: [1] 'stats' [18:01:49.083] getGlobalsAndPackages() ... DONE [18:01:49.084] run() for 'Future' ... [18:01:49.084] - state: 'created' [18:01:49.084] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.098] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.098] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.098] - Field: 'node' [18:01:49.099] - Field: 'label' [18:01:49.099] - Field: 'local' [18:01:49.099] - Field: 'owner' [18:01:49.099] - Field: 'envir' [18:01:49.099] - Field: 'workers' [18:01:49.100] - Field: 'packages' [18:01:49.100] - Field: 'gc' [18:01:49.100] - Field: 'conditions' [18:01:49.100] - Field: 'persistent' [18:01:49.100] - Field: 'expr' [18:01:49.100] - Field: 'uuid' [18:01:49.101] - Field: 'seed' [18:01:49.101] - Field: 'version' [18:01:49.101] - Field: 'result' [18:01:49.101] - Field: 'asynchronous' [18:01:49.101] - Field: 'calls' [18:01:49.102] - Field: 'globals' [18:01:49.102] - Field: 'stdout' [18:01:49.102] - Field: 'earlySignal' [18:01:49.102] - Field: 'lazy' [18:01:49.102] - Field: 'state' [18:01:49.102] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.103] - Launch lazy future ... [18:01:49.103] Packages needed by the future expression (n = 1): 'stats' [18:01:49.103] Packages needed by future strategies (n = 0): [18:01:49.104] { [18:01:49.104] { [18:01:49.104] { [18:01:49.104] ...future.startTime <- base::Sys.time() [18:01:49.104] { [18:01:49.104] { [18:01:49.104] { [18:01:49.104] { [18:01:49.104] { [18:01:49.104] base::local({ [18:01:49.104] has_future <- base::requireNamespace("future", [18:01:49.104] quietly = TRUE) [18:01:49.104] if (has_future) { [18:01:49.104] ns <- base::getNamespace("future") [18:01:49.104] version <- ns[[".package"]][["version"]] [18:01:49.104] if (is.null(version)) [18:01:49.104] version <- utils::packageVersion("future") [18:01:49.104] } [18:01:49.104] else { [18:01:49.104] version <- NULL [18:01:49.104] } [18:01:49.104] if (!has_future || version < "1.8.0") { [18:01:49.104] info <- base::c(r_version = base::gsub("R version ", [18:01:49.104] "", base::R.version$version.string), [18:01:49.104] platform = base::sprintf("%s (%s-bit)", [18:01:49.104] base::R.version$platform, 8 * [18:01:49.104] base::.Machine$sizeof.pointer), [18:01:49.104] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.104] "release", "version")], collapse = " "), [18:01:49.104] hostname = base::Sys.info()[["nodename"]]) [18:01:49.104] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.104] info) [18:01:49.104] info <- base::paste(info, collapse = "; ") [18:01:49.104] if (!has_future) { [18:01:49.104] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.104] info) [18:01:49.104] } [18:01:49.104] else { [18:01:49.104] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.104] info, version) [18:01:49.104] } [18:01:49.104] base::stop(msg) [18:01:49.104] } [18:01:49.104] }) [18:01:49.104] } [18:01:49.104] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.104] base::options(mc.cores = 1L) [18:01:49.104] } [18:01:49.104] base::local({ [18:01:49.104] for (pkg in "stats") { [18:01:49.104] base::loadNamespace(pkg) [18:01:49.104] base::library(pkg, character.only = TRUE) [18:01:49.104] } [18:01:49.104] }) [18:01:49.104] } [18:01:49.104] options(future.plan = NULL) [18:01:49.104] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.104] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.104] } [18:01:49.104] ...future.workdir <- getwd() [18:01:49.104] } [18:01:49.104] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.104] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.104] } [18:01:49.104] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.104] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.104] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.104] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.104] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.104] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.104] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.104] base::names(...future.oldOptions)) [18:01:49.104] } [18:01:49.104] if (FALSE) { [18:01:49.104] } [18:01:49.104] else { [18:01:49.104] if (TRUE) { [18:01:49.104] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.104] open = "w") [18:01:49.104] } [18:01:49.104] else { [18:01:49.104] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.104] windows = "NUL", "/dev/null"), open = "w") [18:01:49.104] } [18:01:49.104] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.104] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.104] base::sink(type = "output", split = FALSE) [18:01:49.104] base::close(...future.stdout) [18:01:49.104] }, add = TRUE) [18:01:49.104] } [18:01:49.104] ...future.frame <- base::sys.nframe() [18:01:49.104] ...future.conditions <- base::list() [18:01:49.104] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.104] if (FALSE) { [18:01:49.104] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.104] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.104] } [18:01:49.104] ...future.result <- base::tryCatch({ [18:01:49.104] base::withCallingHandlers({ [18:01:49.104] ...future.value <- base::withVisible(base::local({ [18:01:49.104] ...future.makeSendCondition <- local({ [18:01:49.104] sendCondition <- NULL [18:01:49.104] function(frame = 1L) { [18:01:49.104] if (is.function(sendCondition)) [18:01:49.104] return(sendCondition) [18:01:49.104] ns <- getNamespace("parallel") [18:01:49.104] if (exists("sendData", mode = "function", [18:01:49.104] envir = ns)) { [18:01:49.104] parallel_sendData <- get("sendData", mode = "function", [18:01:49.104] envir = ns) [18:01:49.104] envir <- sys.frame(frame) [18:01:49.104] master <- NULL [18:01:49.104] while (!identical(envir, .GlobalEnv) && [18:01:49.104] !identical(envir, emptyenv())) { [18:01:49.104] if (exists("master", mode = "list", envir = envir, [18:01:49.104] inherits = FALSE)) { [18:01:49.104] master <- get("master", mode = "list", [18:01:49.104] envir = envir, inherits = FALSE) [18:01:49.104] if (inherits(master, c("SOCKnode", [18:01:49.104] "SOCK0node"))) { [18:01:49.104] sendCondition <<- function(cond) { [18:01:49.104] data <- list(type = "VALUE", value = cond, [18:01:49.104] success = TRUE) [18:01:49.104] parallel_sendData(master, data) [18:01:49.104] } [18:01:49.104] return(sendCondition) [18:01:49.104] } [18:01:49.104] } [18:01:49.104] frame <- frame + 1L [18:01:49.104] envir <- sys.frame(frame) [18:01:49.104] } [18:01:49.104] } [18:01:49.104] sendCondition <<- function(cond) NULL [18:01:49.104] } [18:01:49.104] }) [18:01:49.104] withCallingHandlers({ [18:01:49.104] { [18:01:49.104] xtabs(~x) [18:01:49.104] } [18:01:49.104] }, immediateCondition = function(cond) { [18:01:49.104] sendCondition <- ...future.makeSendCondition() [18:01:49.104] sendCondition(cond) [18:01:49.104] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.104] { [18:01:49.104] inherits <- base::inherits [18:01:49.104] invokeRestart <- base::invokeRestart [18:01:49.104] is.null <- base::is.null [18:01:49.104] muffled <- FALSE [18:01:49.104] if (inherits(cond, "message")) { [18:01:49.104] muffled <- grepl(pattern, "muffleMessage") [18:01:49.104] if (muffled) [18:01:49.104] invokeRestart("muffleMessage") [18:01:49.104] } [18:01:49.104] else if (inherits(cond, "warning")) { [18:01:49.104] muffled <- grepl(pattern, "muffleWarning") [18:01:49.104] if (muffled) [18:01:49.104] invokeRestart("muffleWarning") [18:01:49.104] } [18:01:49.104] else if (inherits(cond, "condition")) { [18:01:49.104] if (!is.null(pattern)) { [18:01:49.104] computeRestarts <- base::computeRestarts [18:01:49.104] grepl <- base::grepl [18:01:49.104] restarts <- computeRestarts(cond) [18:01:49.104] for (restart in restarts) { [18:01:49.104] name <- restart$name [18:01:49.104] if (is.null(name)) [18:01:49.104] next [18:01:49.104] if (!grepl(pattern, name)) [18:01:49.104] next [18:01:49.104] invokeRestart(restart) [18:01:49.104] muffled <- TRUE [18:01:49.104] break [18:01:49.104] } [18:01:49.104] } [18:01:49.104] } [18:01:49.104] invisible(muffled) [18:01:49.104] } [18:01:49.104] muffleCondition(cond) [18:01:49.104] }) [18:01:49.104] })) [18:01:49.104] future::FutureResult(value = ...future.value$value, [18:01:49.104] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.104] ...future.rng), globalenv = if (FALSE) [18:01:49.104] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.104] ...future.globalenv.names)) [18:01:49.104] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.104] }, condition = base::local({ [18:01:49.104] c <- base::c [18:01:49.104] inherits <- base::inherits [18:01:49.104] invokeRestart <- base::invokeRestart [18:01:49.104] length <- base::length [18:01:49.104] list <- base::list [18:01:49.104] seq.int <- base::seq.int [18:01:49.104] signalCondition <- base::signalCondition [18:01:49.104] sys.calls <- base::sys.calls [18:01:49.104] `[[` <- base::`[[` [18:01:49.104] `+` <- base::`+` [18:01:49.104] `<<-` <- base::`<<-` [18:01:49.104] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.104] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.104] 3L)] [18:01:49.104] } [18:01:49.104] function(cond) { [18:01:49.104] is_error <- inherits(cond, "error") [18:01:49.104] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.104] NULL) [18:01:49.104] if (is_error) { [18:01:49.104] sessionInformation <- function() { [18:01:49.104] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.104] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.104] search = base::search(), system = base::Sys.info()) [18:01:49.104] } [18:01:49.104] ...future.conditions[[length(...future.conditions) + [18:01:49.104] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.104] cond$call), session = sessionInformation(), [18:01:49.104] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.104] signalCondition(cond) [18:01:49.104] } [18:01:49.104] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.104] "immediateCondition"))) { [18:01:49.104] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.104] ...future.conditions[[length(...future.conditions) + [18:01:49.104] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.104] if (TRUE && !signal) { [18:01:49.104] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.104] { [18:01:49.104] inherits <- base::inherits [18:01:49.104] invokeRestart <- base::invokeRestart [18:01:49.104] is.null <- base::is.null [18:01:49.104] muffled <- FALSE [18:01:49.104] if (inherits(cond, "message")) { [18:01:49.104] muffled <- grepl(pattern, "muffleMessage") [18:01:49.104] if (muffled) [18:01:49.104] invokeRestart("muffleMessage") [18:01:49.104] } [18:01:49.104] else if (inherits(cond, "warning")) { [18:01:49.104] muffled <- grepl(pattern, "muffleWarning") [18:01:49.104] if (muffled) [18:01:49.104] invokeRestart("muffleWarning") [18:01:49.104] } [18:01:49.104] else if (inherits(cond, "condition")) { [18:01:49.104] if (!is.null(pattern)) { [18:01:49.104] computeRestarts <- base::computeRestarts [18:01:49.104] grepl <- base::grepl [18:01:49.104] restarts <- computeRestarts(cond) [18:01:49.104] for (restart in restarts) { [18:01:49.104] name <- restart$name [18:01:49.104] if (is.null(name)) [18:01:49.104] next [18:01:49.104] if (!grepl(pattern, name)) [18:01:49.104] next [18:01:49.104] invokeRestart(restart) [18:01:49.104] muffled <- TRUE [18:01:49.104] break [18:01:49.104] } [18:01:49.104] } [18:01:49.104] } [18:01:49.104] invisible(muffled) [18:01:49.104] } [18:01:49.104] muffleCondition(cond, pattern = "^muffle") [18:01:49.104] } [18:01:49.104] } [18:01:49.104] else { [18:01:49.104] if (TRUE) { [18:01:49.104] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.104] { [18:01:49.104] inherits <- base::inherits [18:01:49.104] invokeRestart <- base::invokeRestart [18:01:49.104] is.null <- base::is.null [18:01:49.104] muffled <- FALSE [18:01:49.104] if (inherits(cond, "message")) { [18:01:49.104] muffled <- grepl(pattern, "muffleMessage") [18:01:49.104] if (muffled) [18:01:49.104] invokeRestart("muffleMessage") [18:01:49.104] } [18:01:49.104] else if (inherits(cond, "warning")) { [18:01:49.104] muffled <- grepl(pattern, "muffleWarning") [18:01:49.104] if (muffled) [18:01:49.104] invokeRestart("muffleWarning") [18:01:49.104] } [18:01:49.104] else if (inherits(cond, "condition")) { [18:01:49.104] if (!is.null(pattern)) { [18:01:49.104] computeRestarts <- base::computeRestarts [18:01:49.104] grepl <- base::grepl [18:01:49.104] restarts <- computeRestarts(cond) [18:01:49.104] for (restart in restarts) { [18:01:49.104] name <- restart$name [18:01:49.104] if (is.null(name)) [18:01:49.104] next [18:01:49.104] if (!grepl(pattern, name)) [18:01:49.104] next [18:01:49.104] invokeRestart(restart) [18:01:49.104] muffled <- TRUE [18:01:49.104] break [18:01:49.104] } [18:01:49.104] } [18:01:49.104] } [18:01:49.104] invisible(muffled) [18:01:49.104] } [18:01:49.104] muffleCondition(cond, pattern = "^muffle") [18:01:49.104] } [18:01:49.104] } [18:01:49.104] } [18:01:49.104] })) [18:01:49.104] }, error = function(ex) { [18:01:49.104] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.104] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.104] ...future.rng), started = ...future.startTime, [18:01:49.104] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.104] version = "1.8"), class = "FutureResult") [18:01:49.104] }, finally = { [18:01:49.104] if (!identical(...future.workdir, getwd())) [18:01:49.104] setwd(...future.workdir) [18:01:49.104] { [18:01:49.104] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.104] ...future.oldOptions$nwarnings <- NULL [18:01:49.104] } [18:01:49.104] base::options(...future.oldOptions) [18:01:49.104] if (.Platform$OS.type == "windows") { [18:01:49.104] old_names <- names(...future.oldEnvVars) [18:01:49.104] envs <- base::Sys.getenv() [18:01:49.104] names <- names(envs) [18:01:49.104] common <- intersect(names, old_names) [18:01:49.104] added <- setdiff(names, old_names) [18:01:49.104] removed <- setdiff(old_names, names) [18:01:49.104] changed <- common[...future.oldEnvVars[common] != [18:01:49.104] envs[common]] [18:01:49.104] NAMES <- toupper(changed) [18:01:49.104] args <- list() [18:01:49.104] for (kk in seq_along(NAMES)) { [18:01:49.104] name <- changed[[kk]] [18:01:49.104] NAME <- NAMES[[kk]] [18:01:49.104] if (name != NAME && is.element(NAME, old_names)) [18:01:49.104] next [18:01:49.104] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.104] } [18:01:49.104] NAMES <- toupper(added) [18:01:49.104] for (kk in seq_along(NAMES)) { [18:01:49.104] name <- added[[kk]] [18:01:49.104] NAME <- NAMES[[kk]] [18:01:49.104] if (name != NAME && is.element(NAME, old_names)) [18:01:49.104] next [18:01:49.104] args[[name]] <- "" [18:01:49.104] } [18:01:49.104] NAMES <- toupper(removed) [18:01:49.104] for (kk in seq_along(NAMES)) { [18:01:49.104] name <- removed[[kk]] [18:01:49.104] NAME <- NAMES[[kk]] [18:01:49.104] if (name != NAME && is.element(NAME, old_names)) [18:01:49.104] next [18:01:49.104] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.104] } [18:01:49.104] if (length(args) > 0) [18:01:49.104] base::do.call(base::Sys.setenv, args = args) [18:01:49.104] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.104] } [18:01:49.104] else { [18:01:49.104] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.104] } [18:01:49.104] { [18:01:49.104] if (base::length(...future.futureOptionsAdded) > [18:01:49.104] 0L) { [18:01:49.104] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.104] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.104] base::options(opts) [18:01:49.104] } [18:01:49.104] { [18:01:49.104] { [18:01:49.104] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.104] NULL [18:01:49.104] } [18:01:49.104] options(future.plan = NULL) [18:01:49.104] if (is.na(NA_character_)) [18:01:49.104] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.104] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.104] future::plan(list(function (..., workers = availableCores(), [18:01:49.104] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.104] envir = parent.frame()) [18:01:49.104] { [18:01:49.104] if (is.function(workers)) [18:01:49.104] workers <- workers() [18:01:49.104] workers <- structure(as.integer(workers), [18:01:49.104] class = class(workers)) [18:01:49.104] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.104] workers >= 1) [18:01:49.104] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.104] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.104] } [18:01:49.104] future <- MultisessionFuture(..., workers = workers, [18:01:49.104] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.104] envir = envir) [18:01:49.104] if (!future$lazy) [18:01:49.104] future <- run(future) [18:01:49.104] invisible(future) [18:01:49.104] }), .cleanup = FALSE, .init = FALSE) [18:01:49.104] } [18:01:49.104] } [18:01:49.104] } [18:01:49.104] }) [18:01:49.104] if (TRUE) { [18:01:49.104] base::sink(type = "output", split = FALSE) [18:01:49.104] if (TRUE) { [18:01:49.104] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.104] } [18:01:49.104] else { [18:01:49.104] ...future.result["stdout"] <- base::list(NULL) [18:01:49.104] } [18:01:49.104] base::close(...future.stdout) [18:01:49.104] ...future.stdout <- NULL [18:01:49.104] } [18:01:49.104] ...future.result$conditions <- ...future.conditions [18:01:49.104] ...future.result$finished <- base::Sys.time() [18:01:49.104] ...future.result [18:01:49.104] } [18:01:49.110] Exporting 1 global objects (96 bytes) to cluster node #1 ... [18:01:49.110] Exporting 'x' (96 bytes) to cluster node #1 ... [18:01:49.110] Exporting 'x' (96 bytes) to cluster node #1 ... DONE [18:01:49.111] Exporting 1 global objects (96 bytes) to cluster node #1 ... DONE [18:01:49.111] MultisessionFuture started [18:01:49.111] - Launch lazy future ... done [18:01:49.112] run() for 'MultisessionFuture' ... done [18:01:49.112] result() for ClusterFuture ... [18:01:49.112] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.112] - Validating connection of MultisessionFuture [18:01:49.132] - received message: FutureResult [18:01:49.132] - Received FutureResult [18:01:49.132] - Erased future from FutureRegistry [18:01:49.132] result() for ClusterFuture ... [18:01:49.132] - result already collected: FutureResult [18:01:49.133] result() for ClusterFuture ... done [18:01:49.133] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.133] result() for ClusterFuture ... done [18:01:49.133] result() for ClusterFuture ... [18:01:49.133] - result already collected: FutureResult [18:01:49.133] result() for ClusterFuture ... done x 1 2 2 3 [18:01:49.134] getGlobalsAndPackages() ... [18:01:49.134] Searching for globals... [18:01:49.136] - globals found: [4] '{', 'xtabs', 'x', '~' [18:01:49.136] Searching for globals ... DONE [18:01:49.136] Resolving globals: FALSE [18:01:49.137] The total size of the 1 globals is 96 bytes (96 bytes) [18:01:49.137] The total size of the 1 globals exported for future expression ('{; xtabs(~x); }') is 96 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'x' (96 bytes of class 'numeric') [18:01:49.138] - globals: [1] 'x' [18:01:49.138] - packages: [1] 'stats' [18:01:49.138] getGlobalsAndPackages() ... DONE [18:01:49.138] run() for 'Future' ... [18:01:49.139] - state: 'created' [18:01:49.139] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.153] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.153] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.153] - Field: 'node' [18:01:49.153] - Field: 'label' [18:01:49.154] - Field: 'local' [18:01:49.154] - Field: 'owner' [18:01:49.154] - Field: 'envir' [18:01:49.154] - Field: 'workers' [18:01:49.154] - Field: 'packages' [18:01:49.154] - Field: 'gc' [18:01:49.155] - Field: 'conditions' [18:01:49.155] - Field: 'persistent' [18:01:49.155] - Field: 'expr' [18:01:49.155] - Field: 'uuid' [18:01:49.155] - Field: 'seed' [18:01:49.156] - Field: 'version' [18:01:49.156] - Field: 'result' [18:01:49.156] - Field: 'asynchronous' [18:01:49.156] - Field: 'calls' [18:01:49.156] - Field: 'globals' [18:01:49.157] - Field: 'stdout' [18:01:49.157] - Field: 'earlySignal' [18:01:49.157] - Field: 'lazy' [18:01:49.157] - Field: 'state' [18:01:49.157] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.157] - Launch lazy future ... [18:01:49.158] Packages needed by the future expression (n = 1): 'stats' [18:01:49.158] Packages needed by future strategies (n = 0): [18:01:49.159] { [18:01:49.159] { [18:01:49.159] { [18:01:49.159] ...future.startTime <- base::Sys.time() [18:01:49.159] { [18:01:49.159] { [18:01:49.159] { [18:01:49.159] { [18:01:49.159] { [18:01:49.159] base::local({ [18:01:49.159] has_future <- base::requireNamespace("future", [18:01:49.159] quietly = TRUE) [18:01:49.159] if (has_future) { [18:01:49.159] ns <- base::getNamespace("future") [18:01:49.159] version <- ns[[".package"]][["version"]] [18:01:49.159] if (is.null(version)) [18:01:49.159] version <- utils::packageVersion("future") [18:01:49.159] } [18:01:49.159] else { [18:01:49.159] version <- NULL [18:01:49.159] } [18:01:49.159] if (!has_future || version < "1.8.0") { [18:01:49.159] info <- base::c(r_version = base::gsub("R version ", [18:01:49.159] "", base::R.version$version.string), [18:01:49.159] platform = base::sprintf("%s (%s-bit)", [18:01:49.159] base::R.version$platform, 8 * [18:01:49.159] base::.Machine$sizeof.pointer), [18:01:49.159] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.159] "release", "version")], collapse = " "), [18:01:49.159] hostname = base::Sys.info()[["nodename"]]) [18:01:49.159] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.159] info) [18:01:49.159] info <- base::paste(info, collapse = "; ") [18:01:49.159] if (!has_future) { [18:01:49.159] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.159] info) [18:01:49.159] } [18:01:49.159] else { [18:01:49.159] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.159] info, version) [18:01:49.159] } [18:01:49.159] base::stop(msg) [18:01:49.159] } [18:01:49.159] }) [18:01:49.159] } [18:01:49.159] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.159] base::options(mc.cores = 1L) [18:01:49.159] } [18:01:49.159] base::local({ [18:01:49.159] for (pkg in "stats") { [18:01:49.159] base::loadNamespace(pkg) [18:01:49.159] base::library(pkg, character.only = TRUE) [18:01:49.159] } [18:01:49.159] }) [18:01:49.159] } [18:01:49.159] options(future.plan = NULL) [18:01:49.159] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.159] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.159] } [18:01:49.159] ...future.workdir <- getwd() [18:01:49.159] } [18:01:49.159] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.159] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.159] } [18:01:49.159] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.159] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.159] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.159] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.159] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.159] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.159] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.159] base::names(...future.oldOptions)) [18:01:49.159] } [18:01:49.159] if (FALSE) { [18:01:49.159] } [18:01:49.159] else { [18:01:49.159] if (TRUE) { [18:01:49.159] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.159] open = "w") [18:01:49.159] } [18:01:49.159] else { [18:01:49.159] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.159] windows = "NUL", "/dev/null"), open = "w") [18:01:49.159] } [18:01:49.159] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.159] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.159] base::sink(type = "output", split = FALSE) [18:01:49.159] base::close(...future.stdout) [18:01:49.159] }, add = TRUE) [18:01:49.159] } [18:01:49.159] ...future.frame <- base::sys.nframe() [18:01:49.159] ...future.conditions <- base::list() [18:01:49.159] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.159] if (FALSE) { [18:01:49.159] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.159] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.159] } [18:01:49.159] ...future.result <- base::tryCatch({ [18:01:49.159] base::withCallingHandlers({ [18:01:49.159] ...future.value <- base::withVisible(base::local({ [18:01:49.159] ...future.makeSendCondition <- local({ [18:01:49.159] sendCondition <- NULL [18:01:49.159] function(frame = 1L) { [18:01:49.159] if (is.function(sendCondition)) [18:01:49.159] return(sendCondition) [18:01:49.159] ns <- getNamespace("parallel") [18:01:49.159] if (exists("sendData", mode = "function", [18:01:49.159] envir = ns)) { [18:01:49.159] parallel_sendData <- get("sendData", mode = "function", [18:01:49.159] envir = ns) [18:01:49.159] envir <- sys.frame(frame) [18:01:49.159] master <- NULL [18:01:49.159] while (!identical(envir, .GlobalEnv) && [18:01:49.159] !identical(envir, emptyenv())) { [18:01:49.159] if (exists("master", mode = "list", envir = envir, [18:01:49.159] inherits = FALSE)) { [18:01:49.159] master <- get("master", mode = "list", [18:01:49.159] envir = envir, inherits = FALSE) [18:01:49.159] if (inherits(master, c("SOCKnode", [18:01:49.159] "SOCK0node"))) { [18:01:49.159] sendCondition <<- function(cond) { [18:01:49.159] data <- list(type = "VALUE", value = cond, [18:01:49.159] success = TRUE) [18:01:49.159] parallel_sendData(master, data) [18:01:49.159] } [18:01:49.159] return(sendCondition) [18:01:49.159] } [18:01:49.159] } [18:01:49.159] frame <- frame + 1L [18:01:49.159] envir <- sys.frame(frame) [18:01:49.159] } [18:01:49.159] } [18:01:49.159] sendCondition <<- function(cond) NULL [18:01:49.159] } [18:01:49.159] }) [18:01:49.159] withCallingHandlers({ [18:01:49.159] { [18:01:49.159] xtabs(~x) [18:01:49.159] } [18:01:49.159] }, immediateCondition = function(cond) { [18:01:49.159] sendCondition <- ...future.makeSendCondition() [18:01:49.159] sendCondition(cond) [18:01:49.159] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.159] { [18:01:49.159] inherits <- base::inherits [18:01:49.159] invokeRestart <- base::invokeRestart [18:01:49.159] is.null <- base::is.null [18:01:49.159] muffled <- FALSE [18:01:49.159] if (inherits(cond, "message")) { [18:01:49.159] muffled <- grepl(pattern, "muffleMessage") [18:01:49.159] if (muffled) [18:01:49.159] invokeRestart("muffleMessage") [18:01:49.159] } [18:01:49.159] else if (inherits(cond, "warning")) { [18:01:49.159] muffled <- grepl(pattern, "muffleWarning") [18:01:49.159] if (muffled) [18:01:49.159] invokeRestart("muffleWarning") [18:01:49.159] } [18:01:49.159] else if (inherits(cond, "condition")) { [18:01:49.159] if (!is.null(pattern)) { [18:01:49.159] computeRestarts <- base::computeRestarts [18:01:49.159] grepl <- base::grepl [18:01:49.159] restarts <- computeRestarts(cond) [18:01:49.159] for (restart in restarts) { [18:01:49.159] name <- restart$name [18:01:49.159] if (is.null(name)) [18:01:49.159] next [18:01:49.159] if (!grepl(pattern, name)) [18:01:49.159] next [18:01:49.159] invokeRestart(restart) [18:01:49.159] muffled <- TRUE [18:01:49.159] break [18:01:49.159] } [18:01:49.159] } [18:01:49.159] } [18:01:49.159] invisible(muffled) [18:01:49.159] } [18:01:49.159] muffleCondition(cond) [18:01:49.159] }) [18:01:49.159] })) [18:01:49.159] future::FutureResult(value = ...future.value$value, [18:01:49.159] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.159] ...future.rng), globalenv = if (FALSE) [18:01:49.159] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.159] ...future.globalenv.names)) [18:01:49.159] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.159] }, condition = base::local({ [18:01:49.159] c <- base::c [18:01:49.159] inherits <- base::inherits [18:01:49.159] invokeRestart <- base::invokeRestart [18:01:49.159] length <- base::length [18:01:49.159] list <- base::list [18:01:49.159] seq.int <- base::seq.int [18:01:49.159] signalCondition <- base::signalCondition [18:01:49.159] sys.calls <- base::sys.calls [18:01:49.159] `[[` <- base::`[[` [18:01:49.159] `+` <- base::`+` [18:01:49.159] `<<-` <- base::`<<-` [18:01:49.159] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.159] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.159] 3L)] [18:01:49.159] } [18:01:49.159] function(cond) { [18:01:49.159] is_error <- inherits(cond, "error") [18:01:49.159] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.159] NULL) [18:01:49.159] if (is_error) { [18:01:49.159] sessionInformation <- function() { [18:01:49.159] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.159] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.159] search = base::search(), system = base::Sys.info()) [18:01:49.159] } [18:01:49.159] ...future.conditions[[length(...future.conditions) + [18:01:49.159] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.159] cond$call), session = sessionInformation(), [18:01:49.159] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.159] signalCondition(cond) [18:01:49.159] } [18:01:49.159] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.159] "immediateCondition"))) { [18:01:49.159] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.159] ...future.conditions[[length(...future.conditions) + [18:01:49.159] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.159] if (TRUE && !signal) { [18:01:49.159] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.159] { [18:01:49.159] inherits <- base::inherits [18:01:49.159] invokeRestart <- base::invokeRestart [18:01:49.159] is.null <- base::is.null [18:01:49.159] muffled <- FALSE [18:01:49.159] if (inherits(cond, "message")) { [18:01:49.159] muffled <- grepl(pattern, "muffleMessage") [18:01:49.159] if (muffled) [18:01:49.159] invokeRestart("muffleMessage") [18:01:49.159] } [18:01:49.159] else if (inherits(cond, "warning")) { [18:01:49.159] muffled <- grepl(pattern, "muffleWarning") [18:01:49.159] if (muffled) [18:01:49.159] invokeRestart("muffleWarning") [18:01:49.159] } [18:01:49.159] else if (inherits(cond, "condition")) { [18:01:49.159] if (!is.null(pattern)) { [18:01:49.159] computeRestarts <- base::computeRestarts [18:01:49.159] grepl <- base::grepl [18:01:49.159] restarts <- computeRestarts(cond) [18:01:49.159] for (restart in restarts) { [18:01:49.159] name <- restart$name [18:01:49.159] if (is.null(name)) [18:01:49.159] next [18:01:49.159] if (!grepl(pattern, name)) [18:01:49.159] next [18:01:49.159] invokeRestart(restart) [18:01:49.159] muffled <- TRUE [18:01:49.159] break [18:01:49.159] } [18:01:49.159] } [18:01:49.159] } [18:01:49.159] invisible(muffled) [18:01:49.159] } [18:01:49.159] muffleCondition(cond, pattern = "^muffle") [18:01:49.159] } [18:01:49.159] } [18:01:49.159] else { [18:01:49.159] if (TRUE) { [18:01:49.159] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.159] { [18:01:49.159] inherits <- base::inherits [18:01:49.159] invokeRestart <- base::invokeRestart [18:01:49.159] is.null <- base::is.null [18:01:49.159] muffled <- FALSE [18:01:49.159] if (inherits(cond, "message")) { [18:01:49.159] muffled <- grepl(pattern, "muffleMessage") [18:01:49.159] if (muffled) [18:01:49.159] invokeRestart("muffleMessage") [18:01:49.159] } [18:01:49.159] else if (inherits(cond, "warning")) { [18:01:49.159] muffled <- grepl(pattern, "muffleWarning") [18:01:49.159] if (muffled) [18:01:49.159] invokeRestart("muffleWarning") [18:01:49.159] } [18:01:49.159] else if (inherits(cond, "condition")) { [18:01:49.159] if (!is.null(pattern)) { [18:01:49.159] computeRestarts <- base::computeRestarts [18:01:49.159] grepl <- base::grepl [18:01:49.159] restarts <- computeRestarts(cond) [18:01:49.159] for (restart in restarts) { [18:01:49.159] name <- restart$name [18:01:49.159] if (is.null(name)) [18:01:49.159] next [18:01:49.159] if (!grepl(pattern, name)) [18:01:49.159] next [18:01:49.159] invokeRestart(restart) [18:01:49.159] muffled <- TRUE [18:01:49.159] break [18:01:49.159] } [18:01:49.159] } [18:01:49.159] } [18:01:49.159] invisible(muffled) [18:01:49.159] } [18:01:49.159] muffleCondition(cond, pattern = "^muffle") [18:01:49.159] } [18:01:49.159] } [18:01:49.159] } [18:01:49.159] })) [18:01:49.159] }, error = function(ex) { [18:01:49.159] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.159] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.159] ...future.rng), started = ...future.startTime, [18:01:49.159] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.159] version = "1.8"), class = "FutureResult") [18:01:49.159] }, finally = { [18:01:49.159] if (!identical(...future.workdir, getwd())) [18:01:49.159] setwd(...future.workdir) [18:01:49.159] { [18:01:49.159] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.159] ...future.oldOptions$nwarnings <- NULL [18:01:49.159] } [18:01:49.159] base::options(...future.oldOptions) [18:01:49.159] if (.Platform$OS.type == "windows") { [18:01:49.159] old_names <- names(...future.oldEnvVars) [18:01:49.159] envs <- base::Sys.getenv() [18:01:49.159] names <- names(envs) [18:01:49.159] common <- intersect(names, old_names) [18:01:49.159] added <- setdiff(names, old_names) [18:01:49.159] removed <- setdiff(old_names, names) [18:01:49.159] changed <- common[...future.oldEnvVars[common] != [18:01:49.159] envs[common]] [18:01:49.159] NAMES <- toupper(changed) [18:01:49.159] args <- list() [18:01:49.159] for (kk in seq_along(NAMES)) { [18:01:49.159] name <- changed[[kk]] [18:01:49.159] NAME <- NAMES[[kk]] [18:01:49.159] if (name != NAME && is.element(NAME, old_names)) [18:01:49.159] next [18:01:49.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.159] } [18:01:49.159] NAMES <- toupper(added) [18:01:49.159] for (kk in seq_along(NAMES)) { [18:01:49.159] name <- added[[kk]] [18:01:49.159] NAME <- NAMES[[kk]] [18:01:49.159] if (name != NAME && is.element(NAME, old_names)) [18:01:49.159] next [18:01:49.159] args[[name]] <- "" [18:01:49.159] } [18:01:49.159] NAMES <- toupper(removed) [18:01:49.159] for (kk in seq_along(NAMES)) { [18:01:49.159] name <- removed[[kk]] [18:01:49.159] NAME <- NAMES[[kk]] [18:01:49.159] if (name != NAME && is.element(NAME, old_names)) [18:01:49.159] next [18:01:49.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.159] } [18:01:49.159] if (length(args) > 0) [18:01:49.159] base::do.call(base::Sys.setenv, args = args) [18:01:49.159] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.159] } [18:01:49.159] else { [18:01:49.159] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.159] } [18:01:49.159] { [18:01:49.159] if (base::length(...future.futureOptionsAdded) > [18:01:49.159] 0L) { [18:01:49.159] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.159] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.159] base::options(opts) [18:01:49.159] } [18:01:49.159] { [18:01:49.159] { [18:01:49.159] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.159] NULL [18:01:49.159] } [18:01:49.159] options(future.plan = NULL) [18:01:49.159] if (is.na(NA_character_)) [18:01:49.159] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.159] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.159] future::plan(list(function (..., workers = availableCores(), [18:01:49.159] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.159] envir = parent.frame()) [18:01:49.159] { [18:01:49.159] if (is.function(workers)) [18:01:49.159] workers <- workers() [18:01:49.159] workers <- structure(as.integer(workers), [18:01:49.159] class = class(workers)) [18:01:49.159] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.159] workers >= 1) [18:01:49.159] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.159] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.159] } [18:01:49.159] future <- MultisessionFuture(..., workers = workers, [18:01:49.159] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.159] envir = envir) [18:01:49.159] if (!future$lazy) [18:01:49.159] future <- run(future) [18:01:49.159] invisible(future) [18:01:49.159] }), .cleanup = FALSE, .init = FALSE) [18:01:49.159] } [18:01:49.159] } [18:01:49.159] } [18:01:49.159] }) [18:01:49.159] if (TRUE) { [18:01:49.159] base::sink(type = "output", split = FALSE) [18:01:49.159] if (TRUE) { [18:01:49.159] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.159] } [18:01:49.159] else { [18:01:49.159] ...future.result["stdout"] <- base::list(NULL) [18:01:49.159] } [18:01:49.159] base::close(...future.stdout) [18:01:49.159] ...future.stdout <- NULL [18:01:49.159] } [18:01:49.159] ...future.result$conditions <- ...future.conditions [18:01:49.159] ...future.result$finished <- base::Sys.time() [18:01:49.159] ...future.result [18:01:49.159] } [18:01:49.165] Exporting 1 global objects (96 bytes) to cluster node #1 ... [18:01:49.165] Exporting 'x' (96 bytes) to cluster node #1 ... [18:01:49.165] Exporting 'x' (96 bytes) to cluster node #1 ... DONE [18:01:49.165] Exporting 1 global objects (96 bytes) to cluster node #1 ... DONE [18:01:49.166] MultisessionFuture started [18:01:49.166] - Launch lazy future ... done [18:01:49.166] run() for 'MultisessionFuture' ... done [18:01:49.167] result() for ClusterFuture ... [18:01:49.167] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.167] - Validating connection of MultisessionFuture [18:01:49.185] - received message: FutureResult [18:01:49.185] - Received FutureResult [18:01:49.185] - Erased future from FutureRegistry [18:01:49.185] result() for ClusterFuture ... [18:01:49.185] - result already collected: FutureResult [18:01:49.185] result() for ClusterFuture ... done [18:01:49.186] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.186] result() for ClusterFuture ... done [18:01:49.186] result() for ClusterFuture ... [18:01:49.186] - result already collected: FutureResult [18:01:49.186] result() for ClusterFuture ... done x 1 2 2 3 - Globals - lm(, data = cars) ... - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ . - 1, data = cars) Coefficients: speed 2.909 [18:01:49.188] getGlobalsAndPackages() ... [18:01:49.189] Searching for globals... [18:01:49.191] - globals found: [7] '{', 'lm', 'dist', '-', '.', '~', 'cars' [18:01:49.191] Searching for globals ... DONE [18:01:49.191] Resolving globals: FALSE [18:01:49.192] [18:01:49.192] - packages: [2] 'stats', 'datasets' [18:01:49.192] getGlobalsAndPackages() ... DONE [18:01:49.193] run() for 'Future' ... [18:01:49.193] - state: 'created' [18:01:49.193] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.207] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.207] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.207] - Field: 'node' [18:01:49.207] - Field: 'label' [18:01:49.208] - Field: 'local' [18:01:49.208] - Field: 'owner' [18:01:49.208] - Field: 'envir' [18:01:49.208] - Field: 'workers' [18:01:49.208] - Field: 'packages' [18:01:49.209] - Field: 'gc' [18:01:49.209] - Field: 'conditions' [18:01:49.209] - Field: 'persistent' [18:01:49.212] - Field: 'expr' [18:01:49.212] - Field: 'uuid' [18:01:49.212] - Field: 'seed' [18:01:49.212] - Field: 'version' [18:01:49.212] - Field: 'result' [18:01:49.212] - Field: 'asynchronous' [18:01:49.213] - Field: 'calls' [18:01:49.213] - Field: 'globals' [18:01:49.213] - Field: 'stdout' [18:01:49.213] - Field: 'earlySignal' [18:01:49.213] - Field: 'lazy' [18:01:49.214] - Field: 'state' [18:01:49.214] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.214] - Launch lazy future ... [18:01:49.214] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:49.215] Packages needed by future strategies (n = 0): [18:01:49.215] { [18:01:49.215] { [18:01:49.215] { [18:01:49.215] ...future.startTime <- base::Sys.time() [18:01:49.215] { [18:01:49.215] { [18:01:49.215] { [18:01:49.215] { [18:01:49.215] { [18:01:49.215] base::local({ [18:01:49.215] has_future <- base::requireNamespace("future", [18:01:49.215] quietly = TRUE) [18:01:49.215] if (has_future) { [18:01:49.215] ns <- base::getNamespace("future") [18:01:49.215] version <- ns[[".package"]][["version"]] [18:01:49.215] if (is.null(version)) [18:01:49.215] version <- utils::packageVersion("future") [18:01:49.215] } [18:01:49.215] else { [18:01:49.215] version <- NULL [18:01:49.215] } [18:01:49.215] if (!has_future || version < "1.8.0") { [18:01:49.215] info <- base::c(r_version = base::gsub("R version ", [18:01:49.215] "", base::R.version$version.string), [18:01:49.215] platform = base::sprintf("%s (%s-bit)", [18:01:49.215] base::R.version$platform, 8 * [18:01:49.215] base::.Machine$sizeof.pointer), [18:01:49.215] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.215] "release", "version")], collapse = " "), [18:01:49.215] hostname = base::Sys.info()[["nodename"]]) [18:01:49.215] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.215] info) [18:01:49.215] info <- base::paste(info, collapse = "; ") [18:01:49.215] if (!has_future) { [18:01:49.215] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.215] info) [18:01:49.215] } [18:01:49.215] else { [18:01:49.215] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.215] info, version) [18:01:49.215] } [18:01:49.215] base::stop(msg) [18:01:49.215] } [18:01:49.215] }) [18:01:49.215] } [18:01:49.215] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.215] base::options(mc.cores = 1L) [18:01:49.215] } [18:01:49.215] base::local({ [18:01:49.215] for (pkg in c("stats", "datasets")) { [18:01:49.215] base::loadNamespace(pkg) [18:01:49.215] base::library(pkg, character.only = TRUE) [18:01:49.215] } [18:01:49.215] }) [18:01:49.215] } [18:01:49.215] options(future.plan = NULL) [18:01:49.215] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.215] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.215] } [18:01:49.215] ...future.workdir <- getwd() [18:01:49.215] } [18:01:49.215] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.215] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.215] } [18:01:49.215] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.215] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.215] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.215] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.215] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.215] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.215] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.215] base::names(...future.oldOptions)) [18:01:49.215] } [18:01:49.215] if (FALSE) { [18:01:49.215] } [18:01:49.215] else { [18:01:49.215] if (TRUE) { [18:01:49.215] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.215] open = "w") [18:01:49.215] } [18:01:49.215] else { [18:01:49.215] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.215] windows = "NUL", "/dev/null"), open = "w") [18:01:49.215] } [18:01:49.215] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.215] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.215] base::sink(type = "output", split = FALSE) [18:01:49.215] base::close(...future.stdout) [18:01:49.215] }, add = TRUE) [18:01:49.215] } [18:01:49.215] ...future.frame <- base::sys.nframe() [18:01:49.215] ...future.conditions <- base::list() [18:01:49.215] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.215] if (FALSE) { [18:01:49.215] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.215] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.215] } [18:01:49.215] ...future.result <- base::tryCatch({ [18:01:49.215] base::withCallingHandlers({ [18:01:49.215] ...future.value <- base::withVisible(base::local({ [18:01:49.215] ...future.makeSendCondition <- local({ [18:01:49.215] sendCondition <- NULL [18:01:49.215] function(frame = 1L) { [18:01:49.215] if (is.function(sendCondition)) [18:01:49.215] return(sendCondition) [18:01:49.215] ns <- getNamespace("parallel") [18:01:49.215] if (exists("sendData", mode = "function", [18:01:49.215] envir = ns)) { [18:01:49.215] parallel_sendData <- get("sendData", mode = "function", [18:01:49.215] envir = ns) [18:01:49.215] envir <- sys.frame(frame) [18:01:49.215] master <- NULL [18:01:49.215] while (!identical(envir, .GlobalEnv) && [18:01:49.215] !identical(envir, emptyenv())) { [18:01:49.215] if (exists("master", mode = "list", envir = envir, [18:01:49.215] inherits = FALSE)) { [18:01:49.215] master <- get("master", mode = "list", [18:01:49.215] envir = envir, inherits = FALSE) [18:01:49.215] if (inherits(master, c("SOCKnode", [18:01:49.215] "SOCK0node"))) { [18:01:49.215] sendCondition <<- function(cond) { [18:01:49.215] data <- list(type = "VALUE", value = cond, [18:01:49.215] success = TRUE) [18:01:49.215] parallel_sendData(master, data) [18:01:49.215] } [18:01:49.215] return(sendCondition) [18:01:49.215] } [18:01:49.215] } [18:01:49.215] frame <- frame + 1L [18:01:49.215] envir <- sys.frame(frame) [18:01:49.215] } [18:01:49.215] } [18:01:49.215] sendCondition <<- function(cond) NULL [18:01:49.215] } [18:01:49.215] }) [18:01:49.215] withCallingHandlers({ [18:01:49.215] { [18:01:49.215] lm(dist ~ . - 1, data = cars) [18:01:49.215] } [18:01:49.215] }, immediateCondition = function(cond) { [18:01:49.215] sendCondition <- ...future.makeSendCondition() [18:01:49.215] sendCondition(cond) [18:01:49.215] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.215] { [18:01:49.215] inherits <- base::inherits [18:01:49.215] invokeRestart <- base::invokeRestart [18:01:49.215] is.null <- base::is.null [18:01:49.215] muffled <- FALSE [18:01:49.215] if (inherits(cond, "message")) { [18:01:49.215] muffled <- grepl(pattern, "muffleMessage") [18:01:49.215] if (muffled) [18:01:49.215] invokeRestart("muffleMessage") [18:01:49.215] } [18:01:49.215] else if (inherits(cond, "warning")) { [18:01:49.215] muffled <- grepl(pattern, "muffleWarning") [18:01:49.215] if (muffled) [18:01:49.215] invokeRestart("muffleWarning") [18:01:49.215] } [18:01:49.215] else if (inherits(cond, "condition")) { [18:01:49.215] if (!is.null(pattern)) { [18:01:49.215] computeRestarts <- base::computeRestarts [18:01:49.215] grepl <- base::grepl [18:01:49.215] restarts <- computeRestarts(cond) [18:01:49.215] for (restart in restarts) { [18:01:49.215] name <- restart$name [18:01:49.215] if (is.null(name)) [18:01:49.215] next [18:01:49.215] if (!grepl(pattern, name)) [18:01:49.215] next [18:01:49.215] invokeRestart(restart) [18:01:49.215] muffled <- TRUE [18:01:49.215] break [18:01:49.215] } [18:01:49.215] } [18:01:49.215] } [18:01:49.215] invisible(muffled) [18:01:49.215] } [18:01:49.215] muffleCondition(cond) [18:01:49.215] }) [18:01:49.215] })) [18:01:49.215] future::FutureResult(value = ...future.value$value, [18:01:49.215] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.215] ...future.rng), globalenv = if (FALSE) [18:01:49.215] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.215] ...future.globalenv.names)) [18:01:49.215] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.215] }, condition = base::local({ [18:01:49.215] c <- base::c [18:01:49.215] inherits <- base::inherits [18:01:49.215] invokeRestart <- base::invokeRestart [18:01:49.215] length <- base::length [18:01:49.215] list <- base::list [18:01:49.215] seq.int <- base::seq.int [18:01:49.215] signalCondition <- base::signalCondition [18:01:49.215] sys.calls <- base::sys.calls [18:01:49.215] `[[` <- base::`[[` [18:01:49.215] `+` <- base::`+` [18:01:49.215] `<<-` <- base::`<<-` [18:01:49.215] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.215] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.215] 3L)] [18:01:49.215] } [18:01:49.215] function(cond) { [18:01:49.215] is_error <- inherits(cond, "error") [18:01:49.215] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.215] NULL) [18:01:49.215] if (is_error) { [18:01:49.215] sessionInformation <- function() { [18:01:49.215] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.215] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.215] search = base::search(), system = base::Sys.info()) [18:01:49.215] } [18:01:49.215] ...future.conditions[[length(...future.conditions) + [18:01:49.215] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.215] cond$call), session = sessionInformation(), [18:01:49.215] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.215] signalCondition(cond) [18:01:49.215] } [18:01:49.215] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.215] "immediateCondition"))) { [18:01:49.215] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.215] ...future.conditions[[length(...future.conditions) + [18:01:49.215] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.215] if (TRUE && !signal) { [18:01:49.215] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.215] { [18:01:49.215] inherits <- base::inherits [18:01:49.215] invokeRestart <- base::invokeRestart [18:01:49.215] is.null <- base::is.null [18:01:49.215] muffled <- FALSE [18:01:49.215] if (inherits(cond, "message")) { [18:01:49.215] muffled <- grepl(pattern, "muffleMessage") [18:01:49.215] if (muffled) [18:01:49.215] invokeRestart("muffleMessage") [18:01:49.215] } [18:01:49.215] else if (inherits(cond, "warning")) { [18:01:49.215] muffled <- grepl(pattern, "muffleWarning") [18:01:49.215] if (muffled) [18:01:49.215] invokeRestart("muffleWarning") [18:01:49.215] } [18:01:49.215] else if (inherits(cond, "condition")) { [18:01:49.215] if (!is.null(pattern)) { [18:01:49.215] computeRestarts <- base::computeRestarts [18:01:49.215] grepl <- base::grepl [18:01:49.215] restarts <- computeRestarts(cond) [18:01:49.215] for (restart in restarts) { [18:01:49.215] name <- restart$name [18:01:49.215] if (is.null(name)) [18:01:49.215] next [18:01:49.215] if (!grepl(pattern, name)) [18:01:49.215] next [18:01:49.215] invokeRestart(restart) [18:01:49.215] muffled <- TRUE [18:01:49.215] break [18:01:49.215] } [18:01:49.215] } [18:01:49.215] } [18:01:49.215] invisible(muffled) [18:01:49.215] } [18:01:49.215] muffleCondition(cond, pattern = "^muffle") [18:01:49.215] } [18:01:49.215] } [18:01:49.215] else { [18:01:49.215] if (TRUE) { [18:01:49.215] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.215] { [18:01:49.215] inherits <- base::inherits [18:01:49.215] invokeRestart <- base::invokeRestart [18:01:49.215] is.null <- base::is.null [18:01:49.215] muffled <- FALSE [18:01:49.215] if (inherits(cond, "message")) { [18:01:49.215] muffled <- grepl(pattern, "muffleMessage") [18:01:49.215] if (muffled) [18:01:49.215] invokeRestart("muffleMessage") [18:01:49.215] } [18:01:49.215] else if (inherits(cond, "warning")) { [18:01:49.215] muffled <- grepl(pattern, "muffleWarning") [18:01:49.215] if (muffled) [18:01:49.215] invokeRestart("muffleWarning") [18:01:49.215] } [18:01:49.215] else if (inherits(cond, "condition")) { [18:01:49.215] if (!is.null(pattern)) { [18:01:49.215] computeRestarts <- base::computeRestarts [18:01:49.215] grepl <- base::grepl [18:01:49.215] restarts <- computeRestarts(cond) [18:01:49.215] for (restart in restarts) { [18:01:49.215] name <- restart$name [18:01:49.215] if (is.null(name)) [18:01:49.215] next [18:01:49.215] if (!grepl(pattern, name)) [18:01:49.215] next [18:01:49.215] invokeRestart(restart) [18:01:49.215] muffled <- TRUE [18:01:49.215] break [18:01:49.215] } [18:01:49.215] } [18:01:49.215] } [18:01:49.215] invisible(muffled) [18:01:49.215] } [18:01:49.215] muffleCondition(cond, pattern = "^muffle") [18:01:49.215] } [18:01:49.215] } [18:01:49.215] } [18:01:49.215] })) [18:01:49.215] }, error = function(ex) { [18:01:49.215] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.215] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.215] ...future.rng), started = ...future.startTime, [18:01:49.215] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.215] version = "1.8"), class = "FutureResult") [18:01:49.215] }, finally = { [18:01:49.215] if (!identical(...future.workdir, getwd())) [18:01:49.215] setwd(...future.workdir) [18:01:49.215] { [18:01:49.215] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.215] ...future.oldOptions$nwarnings <- NULL [18:01:49.215] } [18:01:49.215] base::options(...future.oldOptions) [18:01:49.215] if (.Platform$OS.type == "windows") { [18:01:49.215] old_names <- names(...future.oldEnvVars) [18:01:49.215] envs <- base::Sys.getenv() [18:01:49.215] names <- names(envs) [18:01:49.215] common <- intersect(names, old_names) [18:01:49.215] added <- setdiff(names, old_names) [18:01:49.215] removed <- setdiff(old_names, names) [18:01:49.215] changed <- common[...future.oldEnvVars[common] != [18:01:49.215] envs[common]] [18:01:49.215] NAMES <- toupper(changed) [18:01:49.215] args <- list() [18:01:49.215] for (kk in seq_along(NAMES)) { [18:01:49.215] name <- changed[[kk]] [18:01:49.215] NAME <- NAMES[[kk]] [18:01:49.215] if (name != NAME && is.element(NAME, old_names)) [18:01:49.215] next [18:01:49.215] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.215] } [18:01:49.215] NAMES <- toupper(added) [18:01:49.215] for (kk in seq_along(NAMES)) { [18:01:49.215] name <- added[[kk]] [18:01:49.215] NAME <- NAMES[[kk]] [18:01:49.215] if (name != NAME && is.element(NAME, old_names)) [18:01:49.215] next [18:01:49.215] args[[name]] <- "" [18:01:49.215] } [18:01:49.215] NAMES <- toupper(removed) [18:01:49.215] for (kk in seq_along(NAMES)) { [18:01:49.215] name <- removed[[kk]] [18:01:49.215] NAME <- NAMES[[kk]] [18:01:49.215] if (name != NAME && is.element(NAME, old_names)) [18:01:49.215] next [18:01:49.215] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.215] } [18:01:49.215] if (length(args) > 0) [18:01:49.215] base::do.call(base::Sys.setenv, args = args) [18:01:49.215] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.215] } [18:01:49.215] else { [18:01:49.215] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.215] } [18:01:49.215] { [18:01:49.215] if (base::length(...future.futureOptionsAdded) > [18:01:49.215] 0L) { [18:01:49.215] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.215] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.215] base::options(opts) [18:01:49.215] } [18:01:49.215] { [18:01:49.215] { [18:01:49.215] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.215] NULL [18:01:49.215] } [18:01:49.215] options(future.plan = NULL) [18:01:49.215] if (is.na(NA_character_)) [18:01:49.215] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.215] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.215] future::plan(list(function (..., workers = availableCores(), [18:01:49.215] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.215] envir = parent.frame()) [18:01:49.215] { [18:01:49.215] if (is.function(workers)) [18:01:49.215] workers <- workers() [18:01:49.215] workers <- structure(as.integer(workers), [18:01:49.215] class = class(workers)) [18:01:49.215] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.215] workers >= 1) [18:01:49.215] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.215] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.215] } [18:01:49.215] future <- MultisessionFuture(..., workers = workers, [18:01:49.215] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.215] envir = envir) [18:01:49.215] if (!future$lazy) [18:01:49.215] future <- run(future) [18:01:49.215] invisible(future) [18:01:49.215] }), .cleanup = FALSE, .init = FALSE) [18:01:49.215] } [18:01:49.215] } [18:01:49.215] } [18:01:49.215] }) [18:01:49.215] if (TRUE) { [18:01:49.215] base::sink(type = "output", split = FALSE) [18:01:49.215] if (TRUE) { [18:01:49.215] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.215] } [18:01:49.215] else { [18:01:49.215] ...future.result["stdout"] <- base::list(NULL) [18:01:49.215] } [18:01:49.215] base::close(...future.stdout) [18:01:49.215] ...future.stdout <- NULL [18:01:49.215] } [18:01:49.215] ...future.result$conditions <- ...future.conditions [18:01:49.215] ...future.result$finished <- base::Sys.time() [18:01:49.215] ...future.result [18:01:49.215] } [18:01:49.221] MultisessionFuture started [18:01:49.222] - Launch lazy future ... done [18:01:49.222] run() for 'MultisessionFuture' ... done [18:01:49.222] result() for ClusterFuture ... [18:01:49.222] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.222] - Validating connection of MultisessionFuture [18:01:49.240] - received message: FutureResult [18:01:49.240] - Received FutureResult [18:01:49.240] - Erased future from FutureRegistry [18:01:49.240] result() for ClusterFuture ... [18:01:49.240] - result already collected: FutureResult [18:01:49.241] result() for ClusterFuture ... done [18:01:49.241] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.241] result() for ClusterFuture ... done [18:01:49.241] result() for ClusterFuture ... [18:01:49.241] - result already collected: FutureResult [18:01:49.241] result() for ClusterFuture ... done Call: lm(formula = dist ~ . - 1, data = cars) Coefficients: speed 2.909 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ . + 0, data = cars) Coefficients: speed 2.909 [18:01:49.244] getGlobalsAndPackages() ... [18:01:49.245] Searching for globals... [18:01:49.247] - globals found: [7] '{', 'lm', 'dist', '+', '.', '~', 'cars' [18:01:49.247] Searching for globals ... DONE [18:01:49.247] Resolving globals: FALSE [18:01:49.248] [18:01:49.248] - packages: [2] 'stats', 'datasets' [18:01:49.248] getGlobalsAndPackages() ... DONE [18:01:49.249] run() for 'Future' ... [18:01:49.249] - state: 'created' [18:01:49.249] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.263] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.263] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.263] - Field: 'node' [18:01:49.263] - Field: 'label' [18:01:49.264] - Field: 'local' [18:01:49.264] - Field: 'owner' [18:01:49.264] - Field: 'envir' [18:01:49.264] - Field: 'workers' [18:01:49.264] - Field: 'packages' [18:01:49.265] - Field: 'gc' [18:01:49.265] - Field: 'conditions' [18:01:49.265] - Field: 'persistent' [18:01:49.265] - Field: 'expr' [18:01:49.265] - Field: 'uuid' [18:01:49.266] - Field: 'seed' [18:01:49.266] - Field: 'version' [18:01:49.266] - Field: 'result' [18:01:49.266] - Field: 'asynchronous' [18:01:49.266] - Field: 'calls' [18:01:49.266] - Field: 'globals' [18:01:49.267] - Field: 'stdout' [18:01:49.267] - Field: 'earlySignal' [18:01:49.267] - Field: 'lazy' [18:01:49.267] - Field: 'state' [18:01:49.267] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.268] - Launch lazy future ... [18:01:49.268] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:49.268] Packages needed by future strategies (n = 0): [18:01:49.269] { [18:01:49.269] { [18:01:49.269] { [18:01:49.269] ...future.startTime <- base::Sys.time() [18:01:49.269] { [18:01:49.269] { [18:01:49.269] { [18:01:49.269] { [18:01:49.269] { [18:01:49.269] base::local({ [18:01:49.269] has_future <- base::requireNamespace("future", [18:01:49.269] quietly = TRUE) [18:01:49.269] if (has_future) { [18:01:49.269] ns <- base::getNamespace("future") [18:01:49.269] version <- ns[[".package"]][["version"]] [18:01:49.269] if (is.null(version)) [18:01:49.269] version <- utils::packageVersion("future") [18:01:49.269] } [18:01:49.269] else { [18:01:49.269] version <- NULL [18:01:49.269] } [18:01:49.269] if (!has_future || version < "1.8.0") { [18:01:49.269] info <- base::c(r_version = base::gsub("R version ", [18:01:49.269] "", base::R.version$version.string), [18:01:49.269] platform = base::sprintf("%s (%s-bit)", [18:01:49.269] base::R.version$platform, 8 * [18:01:49.269] base::.Machine$sizeof.pointer), [18:01:49.269] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.269] "release", "version")], collapse = " "), [18:01:49.269] hostname = base::Sys.info()[["nodename"]]) [18:01:49.269] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.269] info) [18:01:49.269] info <- base::paste(info, collapse = "; ") [18:01:49.269] if (!has_future) { [18:01:49.269] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.269] info) [18:01:49.269] } [18:01:49.269] else { [18:01:49.269] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.269] info, version) [18:01:49.269] } [18:01:49.269] base::stop(msg) [18:01:49.269] } [18:01:49.269] }) [18:01:49.269] } [18:01:49.269] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.269] base::options(mc.cores = 1L) [18:01:49.269] } [18:01:49.269] base::local({ [18:01:49.269] for (pkg in c("stats", "datasets")) { [18:01:49.269] base::loadNamespace(pkg) [18:01:49.269] base::library(pkg, character.only = TRUE) [18:01:49.269] } [18:01:49.269] }) [18:01:49.269] } [18:01:49.269] options(future.plan = NULL) [18:01:49.269] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.269] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.269] } [18:01:49.269] ...future.workdir <- getwd() [18:01:49.269] } [18:01:49.269] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.269] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.269] } [18:01:49.269] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.269] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.269] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.269] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.269] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.269] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.269] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.269] base::names(...future.oldOptions)) [18:01:49.269] } [18:01:49.269] if (FALSE) { [18:01:49.269] } [18:01:49.269] else { [18:01:49.269] if (TRUE) { [18:01:49.269] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.269] open = "w") [18:01:49.269] } [18:01:49.269] else { [18:01:49.269] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.269] windows = "NUL", "/dev/null"), open = "w") [18:01:49.269] } [18:01:49.269] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.269] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.269] base::sink(type = "output", split = FALSE) [18:01:49.269] base::close(...future.stdout) [18:01:49.269] }, add = TRUE) [18:01:49.269] } [18:01:49.269] ...future.frame <- base::sys.nframe() [18:01:49.269] ...future.conditions <- base::list() [18:01:49.269] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.269] if (FALSE) { [18:01:49.269] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.269] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.269] } [18:01:49.269] ...future.result <- base::tryCatch({ [18:01:49.269] base::withCallingHandlers({ [18:01:49.269] ...future.value <- base::withVisible(base::local({ [18:01:49.269] ...future.makeSendCondition <- local({ [18:01:49.269] sendCondition <- NULL [18:01:49.269] function(frame = 1L) { [18:01:49.269] if (is.function(sendCondition)) [18:01:49.269] return(sendCondition) [18:01:49.269] ns <- getNamespace("parallel") [18:01:49.269] if (exists("sendData", mode = "function", [18:01:49.269] envir = ns)) { [18:01:49.269] parallel_sendData <- get("sendData", mode = "function", [18:01:49.269] envir = ns) [18:01:49.269] envir <- sys.frame(frame) [18:01:49.269] master <- NULL [18:01:49.269] while (!identical(envir, .GlobalEnv) && [18:01:49.269] !identical(envir, emptyenv())) { [18:01:49.269] if (exists("master", mode = "list", envir = envir, [18:01:49.269] inherits = FALSE)) { [18:01:49.269] master <- get("master", mode = "list", [18:01:49.269] envir = envir, inherits = FALSE) [18:01:49.269] if (inherits(master, c("SOCKnode", [18:01:49.269] "SOCK0node"))) { [18:01:49.269] sendCondition <<- function(cond) { [18:01:49.269] data <- list(type = "VALUE", value = cond, [18:01:49.269] success = TRUE) [18:01:49.269] parallel_sendData(master, data) [18:01:49.269] } [18:01:49.269] return(sendCondition) [18:01:49.269] } [18:01:49.269] } [18:01:49.269] frame <- frame + 1L [18:01:49.269] envir <- sys.frame(frame) [18:01:49.269] } [18:01:49.269] } [18:01:49.269] sendCondition <<- function(cond) NULL [18:01:49.269] } [18:01:49.269] }) [18:01:49.269] withCallingHandlers({ [18:01:49.269] { [18:01:49.269] lm(dist ~ . + 0, data = cars) [18:01:49.269] } [18:01:49.269] }, immediateCondition = function(cond) { [18:01:49.269] sendCondition <- ...future.makeSendCondition() [18:01:49.269] sendCondition(cond) [18:01:49.269] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.269] { [18:01:49.269] inherits <- base::inherits [18:01:49.269] invokeRestart <- base::invokeRestart [18:01:49.269] is.null <- base::is.null [18:01:49.269] muffled <- FALSE [18:01:49.269] if (inherits(cond, "message")) { [18:01:49.269] muffled <- grepl(pattern, "muffleMessage") [18:01:49.269] if (muffled) [18:01:49.269] invokeRestart("muffleMessage") [18:01:49.269] } [18:01:49.269] else if (inherits(cond, "warning")) { [18:01:49.269] muffled <- grepl(pattern, "muffleWarning") [18:01:49.269] if (muffled) [18:01:49.269] invokeRestart("muffleWarning") [18:01:49.269] } [18:01:49.269] else if (inherits(cond, "condition")) { [18:01:49.269] if (!is.null(pattern)) { [18:01:49.269] computeRestarts <- base::computeRestarts [18:01:49.269] grepl <- base::grepl [18:01:49.269] restarts <- computeRestarts(cond) [18:01:49.269] for (restart in restarts) { [18:01:49.269] name <- restart$name [18:01:49.269] if (is.null(name)) [18:01:49.269] next [18:01:49.269] if (!grepl(pattern, name)) [18:01:49.269] next [18:01:49.269] invokeRestart(restart) [18:01:49.269] muffled <- TRUE [18:01:49.269] break [18:01:49.269] } [18:01:49.269] } [18:01:49.269] } [18:01:49.269] invisible(muffled) [18:01:49.269] } [18:01:49.269] muffleCondition(cond) [18:01:49.269] }) [18:01:49.269] })) [18:01:49.269] future::FutureResult(value = ...future.value$value, [18:01:49.269] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.269] ...future.rng), globalenv = if (FALSE) [18:01:49.269] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.269] ...future.globalenv.names)) [18:01:49.269] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.269] }, condition = base::local({ [18:01:49.269] c <- base::c [18:01:49.269] inherits <- base::inherits [18:01:49.269] invokeRestart <- base::invokeRestart [18:01:49.269] length <- base::length [18:01:49.269] list <- base::list [18:01:49.269] seq.int <- base::seq.int [18:01:49.269] signalCondition <- base::signalCondition [18:01:49.269] sys.calls <- base::sys.calls [18:01:49.269] `[[` <- base::`[[` [18:01:49.269] `+` <- base::`+` [18:01:49.269] `<<-` <- base::`<<-` [18:01:49.269] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.269] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.269] 3L)] [18:01:49.269] } [18:01:49.269] function(cond) { [18:01:49.269] is_error <- inherits(cond, "error") [18:01:49.269] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.269] NULL) [18:01:49.269] if (is_error) { [18:01:49.269] sessionInformation <- function() { [18:01:49.269] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.269] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.269] search = base::search(), system = base::Sys.info()) [18:01:49.269] } [18:01:49.269] ...future.conditions[[length(...future.conditions) + [18:01:49.269] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.269] cond$call), session = sessionInformation(), [18:01:49.269] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.269] signalCondition(cond) [18:01:49.269] } [18:01:49.269] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.269] "immediateCondition"))) { [18:01:49.269] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.269] ...future.conditions[[length(...future.conditions) + [18:01:49.269] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.269] if (TRUE && !signal) { [18:01:49.269] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.269] { [18:01:49.269] inherits <- base::inherits [18:01:49.269] invokeRestart <- base::invokeRestart [18:01:49.269] is.null <- base::is.null [18:01:49.269] muffled <- FALSE [18:01:49.269] if (inherits(cond, "message")) { [18:01:49.269] muffled <- grepl(pattern, "muffleMessage") [18:01:49.269] if (muffled) [18:01:49.269] invokeRestart("muffleMessage") [18:01:49.269] } [18:01:49.269] else if (inherits(cond, "warning")) { [18:01:49.269] muffled <- grepl(pattern, "muffleWarning") [18:01:49.269] if (muffled) [18:01:49.269] invokeRestart("muffleWarning") [18:01:49.269] } [18:01:49.269] else if (inherits(cond, "condition")) { [18:01:49.269] if (!is.null(pattern)) { [18:01:49.269] computeRestarts <- base::computeRestarts [18:01:49.269] grepl <- base::grepl [18:01:49.269] restarts <- computeRestarts(cond) [18:01:49.269] for (restart in restarts) { [18:01:49.269] name <- restart$name [18:01:49.269] if (is.null(name)) [18:01:49.269] next [18:01:49.269] if (!grepl(pattern, name)) [18:01:49.269] next [18:01:49.269] invokeRestart(restart) [18:01:49.269] muffled <- TRUE [18:01:49.269] break [18:01:49.269] } [18:01:49.269] } [18:01:49.269] } [18:01:49.269] invisible(muffled) [18:01:49.269] } [18:01:49.269] muffleCondition(cond, pattern = "^muffle") [18:01:49.269] } [18:01:49.269] } [18:01:49.269] else { [18:01:49.269] if (TRUE) { [18:01:49.269] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.269] { [18:01:49.269] inherits <- base::inherits [18:01:49.269] invokeRestart <- base::invokeRestart [18:01:49.269] is.null <- base::is.null [18:01:49.269] muffled <- FALSE [18:01:49.269] if (inherits(cond, "message")) { [18:01:49.269] muffled <- grepl(pattern, "muffleMessage") [18:01:49.269] if (muffled) [18:01:49.269] invokeRestart("muffleMessage") [18:01:49.269] } [18:01:49.269] else if (inherits(cond, "warning")) { [18:01:49.269] muffled <- grepl(pattern, "muffleWarning") [18:01:49.269] if (muffled) [18:01:49.269] invokeRestart("muffleWarning") [18:01:49.269] } [18:01:49.269] else if (inherits(cond, "condition")) { [18:01:49.269] if (!is.null(pattern)) { [18:01:49.269] computeRestarts <- base::computeRestarts [18:01:49.269] grepl <- base::grepl [18:01:49.269] restarts <- computeRestarts(cond) [18:01:49.269] for (restart in restarts) { [18:01:49.269] name <- restart$name [18:01:49.269] if (is.null(name)) [18:01:49.269] next [18:01:49.269] if (!grepl(pattern, name)) [18:01:49.269] next [18:01:49.269] invokeRestart(restart) [18:01:49.269] muffled <- TRUE [18:01:49.269] break [18:01:49.269] } [18:01:49.269] } [18:01:49.269] } [18:01:49.269] invisible(muffled) [18:01:49.269] } [18:01:49.269] muffleCondition(cond, pattern = "^muffle") [18:01:49.269] } [18:01:49.269] } [18:01:49.269] } [18:01:49.269] })) [18:01:49.269] }, error = function(ex) { [18:01:49.269] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.269] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.269] ...future.rng), started = ...future.startTime, [18:01:49.269] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.269] version = "1.8"), class = "FutureResult") [18:01:49.269] }, finally = { [18:01:49.269] if (!identical(...future.workdir, getwd())) [18:01:49.269] setwd(...future.workdir) [18:01:49.269] { [18:01:49.269] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.269] ...future.oldOptions$nwarnings <- NULL [18:01:49.269] } [18:01:49.269] base::options(...future.oldOptions) [18:01:49.269] if (.Platform$OS.type == "windows") { [18:01:49.269] old_names <- names(...future.oldEnvVars) [18:01:49.269] envs <- base::Sys.getenv() [18:01:49.269] names <- names(envs) [18:01:49.269] common <- intersect(names, old_names) [18:01:49.269] added <- setdiff(names, old_names) [18:01:49.269] removed <- setdiff(old_names, names) [18:01:49.269] changed <- common[...future.oldEnvVars[common] != [18:01:49.269] envs[common]] [18:01:49.269] NAMES <- toupper(changed) [18:01:49.269] args <- list() [18:01:49.269] for (kk in seq_along(NAMES)) { [18:01:49.269] name <- changed[[kk]] [18:01:49.269] NAME <- NAMES[[kk]] [18:01:49.269] if (name != NAME && is.element(NAME, old_names)) [18:01:49.269] next [18:01:49.269] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.269] } [18:01:49.269] NAMES <- toupper(added) [18:01:49.269] for (kk in seq_along(NAMES)) { [18:01:49.269] name <- added[[kk]] [18:01:49.269] NAME <- NAMES[[kk]] [18:01:49.269] if (name != NAME && is.element(NAME, old_names)) [18:01:49.269] next [18:01:49.269] args[[name]] <- "" [18:01:49.269] } [18:01:49.269] NAMES <- toupper(removed) [18:01:49.269] for (kk in seq_along(NAMES)) { [18:01:49.269] name <- removed[[kk]] [18:01:49.269] NAME <- NAMES[[kk]] [18:01:49.269] if (name != NAME && is.element(NAME, old_names)) [18:01:49.269] next [18:01:49.269] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.269] } [18:01:49.269] if (length(args) > 0) [18:01:49.269] base::do.call(base::Sys.setenv, args = args) [18:01:49.269] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.269] } [18:01:49.269] else { [18:01:49.269] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.269] } [18:01:49.269] { [18:01:49.269] if (base::length(...future.futureOptionsAdded) > [18:01:49.269] 0L) { [18:01:49.269] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.269] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.269] base::options(opts) [18:01:49.269] } [18:01:49.269] { [18:01:49.269] { [18:01:49.269] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.269] NULL [18:01:49.269] } [18:01:49.269] options(future.plan = NULL) [18:01:49.269] if (is.na(NA_character_)) [18:01:49.269] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.269] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.269] future::plan(list(function (..., workers = availableCores(), [18:01:49.269] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.269] envir = parent.frame()) [18:01:49.269] { [18:01:49.269] if (is.function(workers)) [18:01:49.269] workers <- workers() [18:01:49.269] workers <- structure(as.integer(workers), [18:01:49.269] class = class(workers)) [18:01:49.269] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.269] workers >= 1) [18:01:49.269] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.269] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.269] } [18:01:49.269] future <- MultisessionFuture(..., workers = workers, [18:01:49.269] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.269] envir = envir) [18:01:49.269] if (!future$lazy) [18:01:49.269] future <- run(future) [18:01:49.269] invisible(future) [18:01:49.269] }), .cleanup = FALSE, .init = FALSE) [18:01:49.269] } [18:01:49.269] } [18:01:49.269] } [18:01:49.269] }) [18:01:49.269] if (TRUE) { [18:01:49.269] base::sink(type = "output", split = FALSE) [18:01:49.269] if (TRUE) { [18:01:49.269] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.269] } [18:01:49.269] else { [18:01:49.269] ...future.result["stdout"] <- base::list(NULL) [18:01:49.269] } [18:01:49.269] base::close(...future.stdout) [18:01:49.269] ...future.stdout <- NULL [18:01:49.269] } [18:01:49.269] ...future.result$conditions <- ...future.conditions [18:01:49.269] ...future.result$finished <- base::Sys.time() [18:01:49.269] ...future.result [18:01:49.269] } [18:01:49.275] MultisessionFuture started [18:01:49.275] - Launch lazy future ... done [18:01:49.275] run() for 'MultisessionFuture' ... done [18:01:49.275] result() for ClusterFuture ... [18:01:49.275] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.276] - Validating connection of MultisessionFuture [18:01:49.294] - received message: FutureResult [18:01:49.294] - Received FutureResult [18:01:49.294] - Erased future from FutureRegistry [18:01:49.295] result() for ClusterFuture ... [18:01:49.295] - result already collected: FutureResult [18:01:49.295] result() for ClusterFuture ... done [18:01:49.295] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.295] result() for ClusterFuture ... done [18:01:49.295] result() for ClusterFuture ... [18:01:49.296] - result already collected: FutureResult [18:01:49.296] result() for ClusterFuture ... done Call: lm(formula = dist ~ . + 0, data = cars) Coefficients: speed 2.909 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ speed + speed^2, data = cars) Coefficients: (Intercept) speed -17.579 3.932 [18:01:49.299] getGlobalsAndPackages() ... [18:01:49.299] Searching for globals... [18:01:49.301] - globals found: [8] '{', 'lm', 'dist', '+', 'speed', '^', '~', 'cars' [18:01:49.302] Searching for globals ... DONE [18:01:49.302] Resolving globals: FALSE [18:01:49.302] [18:01:49.303] - packages: [2] 'stats', 'datasets' [18:01:49.303] getGlobalsAndPackages() ... DONE [18:01:49.303] run() for 'Future' ... [18:01:49.303] - state: 'created' [18:01:49.304] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.318] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.318] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.318] - Field: 'node' [18:01:49.318] - Field: 'label' [18:01:49.318] - Field: 'local' [18:01:49.319] - Field: 'owner' [18:01:49.319] - Field: 'envir' [18:01:49.319] - Field: 'workers' [18:01:49.319] - Field: 'packages' [18:01:49.319] - Field: 'gc' [18:01:49.319] - Field: 'conditions' [18:01:49.320] - Field: 'persistent' [18:01:49.320] - Field: 'expr' [18:01:49.320] - Field: 'uuid' [18:01:49.320] - Field: 'seed' [18:01:49.320] - Field: 'version' [18:01:49.321] - Field: 'result' [18:01:49.321] - Field: 'asynchronous' [18:01:49.321] - Field: 'calls' [18:01:49.321] - Field: 'globals' [18:01:49.321] - Field: 'stdout' [18:01:49.321] - Field: 'earlySignal' [18:01:49.322] - Field: 'lazy' [18:01:49.322] - Field: 'state' [18:01:49.322] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.322] - Launch lazy future ... [18:01:49.323] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:49.323] Packages needed by future strategies (n = 0): [18:01:49.323] { [18:01:49.323] { [18:01:49.323] { [18:01:49.323] ...future.startTime <- base::Sys.time() [18:01:49.323] { [18:01:49.323] { [18:01:49.323] { [18:01:49.323] { [18:01:49.323] { [18:01:49.323] base::local({ [18:01:49.323] has_future <- base::requireNamespace("future", [18:01:49.323] quietly = TRUE) [18:01:49.323] if (has_future) { [18:01:49.323] ns <- base::getNamespace("future") [18:01:49.323] version <- ns[[".package"]][["version"]] [18:01:49.323] if (is.null(version)) [18:01:49.323] version <- utils::packageVersion("future") [18:01:49.323] } [18:01:49.323] else { [18:01:49.323] version <- NULL [18:01:49.323] } [18:01:49.323] if (!has_future || version < "1.8.0") { [18:01:49.323] info <- base::c(r_version = base::gsub("R version ", [18:01:49.323] "", base::R.version$version.string), [18:01:49.323] platform = base::sprintf("%s (%s-bit)", [18:01:49.323] base::R.version$platform, 8 * [18:01:49.323] base::.Machine$sizeof.pointer), [18:01:49.323] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.323] "release", "version")], collapse = " "), [18:01:49.323] hostname = base::Sys.info()[["nodename"]]) [18:01:49.323] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.323] info) [18:01:49.323] info <- base::paste(info, collapse = "; ") [18:01:49.323] if (!has_future) { [18:01:49.323] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.323] info) [18:01:49.323] } [18:01:49.323] else { [18:01:49.323] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.323] info, version) [18:01:49.323] } [18:01:49.323] base::stop(msg) [18:01:49.323] } [18:01:49.323] }) [18:01:49.323] } [18:01:49.323] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.323] base::options(mc.cores = 1L) [18:01:49.323] } [18:01:49.323] base::local({ [18:01:49.323] for (pkg in c("stats", "datasets")) { [18:01:49.323] base::loadNamespace(pkg) [18:01:49.323] base::library(pkg, character.only = TRUE) [18:01:49.323] } [18:01:49.323] }) [18:01:49.323] } [18:01:49.323] options(future.plan = NULL) [18:01:49.323] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.323] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.323] } [18:01:49.323] ...future.workdir <- getwd() [18:01:49.323] } [18:01:49.323] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.323] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.323] } [18:01:49.323] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.323] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.323] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.323] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.323] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.323] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.323] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.323] base::names(...future.oldOptions)) [18:01:49.323] } [18:01:49.323] if (FALSE) { [18:01:49.323] } [18:01:49.323] else { [18:01:49.323] if (TRUE) { [18:01:49.323] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.323] open = "w") [18:01:49.323] } [18:01:49.323] else { [18:01:49.323] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.323] windows = "NUL", "/dev/null"), open = "w") [18:01:49.323] } [18:01:49.323] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.323] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.323] base::sink(type = "output", split = FALSE) [18:01:49.323] base::close(...future.stdout) [18:01:49.323] }, add = TRUE) [18:01:49.323] } [18:01:49.323] ...future.frame <- base::sys.nframe() [18:01:49.323] ...future.conditions <- base::list() [18:01:49.323] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.323] if (FALSE) { [18:01:49.323] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.323] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.323] } [18:01:49.323] ...future.result <- base::tryCatch({ [18:01:49.323] base::withCallingHandlers({ [18:01:49.323] ...future.value <- base::withVisible(base::local({ [18:01:49.323] ...future.makeSendCondition <- local({ [18:01:49.323] sendCondition <- NULL [18:01:49.323] function(frame = 1L) { [18:01:49.323] if (is.function(sendCondition)) [18:01:49.323] return(sendCondition) [18:01:49.323] ns <- getNamespace("parallel") [18:01:49.323] if (exists("sendData", mode = "function", [18:01:49.323] envir = ns)) { [18:01:49.323] parallel_sendData <- get("sendData", mode = "function", [18:01:49.323] envir = ns) [18:01:49.323] envir <- sys.frame(frame) [18:01:49.323] master <- NULL [18:01:49.323] while (!identical(envir, .GlobalEnv) && [18:01:49.323] !identical(envir, emptyenv())) { [18:01:49.323] if (exists("master", mode = "list", envir = envir, [18:01:49.323] inherits = FALSE)) { [18:01:49.323] master <- get("master", mode = "list", [18:01:49.323] envir = envir, inherits = FALSE) [18:01:49.323] if (inherits(master, c("SOCKnode", [18:01:49.323] "SOCK0node"))) { [18:01:49.323] sendCondition <<- function(cond) { [18:01:49.323] data <- list(type = "VALUE", value = cond, [18:01:49.323] success = TRUE) [18:01:49.323] parallel_sendData(master, data) [18:01:49.323] } [18:01:49.323] return(sendCondition) [18:01:49.323] } [18:01:49.323] } [18:01:49.323] frame <- frame + 1L [18:01:49.323] envir <- sys.frame(frame) [18:01:49.323] } [18:01:49.323] } [18:01:49.323] sendCondition <<- function(cond) NULL [18:01:49.323] } [18:01:49.323] }) [18:01:49.323] withCallingHandlers({ [18:01:49.323] { [18:01:49.323] lm(dist ~ speed + speed^2, data = cars) [18:01:49.323] } [18:01:49.323] }, immediateCondition = function(cond) { [18:01:49.323] sendCondition <- ...future.makeSendCondition() [18:01:49.323] sendCondition(cond) [18:01:49.323] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.323] { [18:01:49.323] inherits <- base::inherits [18:01:49.323] invokeRestart <- base::invokeRestart [18:01:49.323] is.null <- base::is.null [18:01:49.323] muffled <- FALSE [18:01:49.323] if (inherits(cond, "message")) { [18:01:49.323] muffled <- grepl(pattern, "muffleMessage") [18:01:49.323] if (muffled) [18:01:49.323] invokeRestart("muffleMessage") [18:01:49.323] } [18:01:49.323] else if (inherits(cond, "warning")) { [18:01:49.323] muffled <- grepl(pattern, "muffleWarning") [18:01:49.323] if (muffled) [18:01:49.323] invokeRestart("muffleWarning") [18:01:49.323] } [18:01:49.323] else if (inherits(cond, "condition")) { [18:01:49.323] if (!is.null(pattern)) { [18:01:49.323] computeRestarts <- base::computeRestarts [18:01:49.323] grepl <- base::grepl [18:01:49.323] restarts <- computeRestarts(cond) [18:01:49.323] for (restart in restarts) { [18:01:49.323] name <- restart$name [18:01:49.323] if (is.null(name)) [18:01:49.323] next [18:01:49.323] if (!grepl(pattern, name)) [18:01:49.323] next [18:01:49.323] invokeRestart(restart) [18:01:49.323] muffled <- TRUE [18:01:49.323] break [18:01:49.323] } [18:01:49.323] } [18:01:49.323] } [18:01:49.323] invisible(muffled) [18:01:49.323] } [18:01:49.323] muffleCondition(cond) [18:01:49.323] }) [18:01:49.323] })) [18:01:49.323] future::FutureResult(value = ...future.value$value, [18:01:49.323] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.323] ...future.rng), globalenv = if (FALSE) [18:01:49.323] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.323] ...future.globalenv.names)) [18:01:49.323] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.323] }, condition = base::local({ [18:01:49.323] c <- base::c [18:01:49.323] inherits <- base::inherits [18:01:49.323] invokeRestart <- base::invokeRestart [18:01:49.323] length <- base::length [18:01:49.323] list <- base::list [18:01:49.323] seq.int <- base::seq.int [18:01:49.323] signalCondition <- base::signalCondition [18:01:49.323] sys.calls <- base::sys.calls [18:01:49.323] `[[` <- base::`[[` [18:01:49.323] `+` <- base::`+` [18:01:49.323] `<<-` <- base::`<<-` [18:01:49.323] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.323] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.323] 3L)] [18:01:49.323] } [18:01:49.323] function(cond) { [18:01:49.323] is_error <- inherits(cond, "error") [18:01:49.323] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.323] NULL) [18:01:49.323] if (is_error) { [18:01:49.323] sessionInformation <- function() { [18:01:49.323] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.323] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.323] search = base::search(), system = base::Sys.info()) [18:01:49.323] } [18:01:49.323] ...future.conditions[[length(...future.conditions) + [18:01:49.323] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.323] cond$call), session = sessionInformation(), [18:01:49.323] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.323] signalCondition(cond) [18:01:49.323] } [18:01:49.323] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.323] "immediateCondition"))) { [18:01:49.323] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.323] ...future.conditions[[length(...future.conditions) + [18:01:49.323] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.323] if (TRUE && !signal) { [18:01:49.323] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.323] { [18:01:49.323] inherits <- base::inherits [18:01:49.323] invokeRestart <- base::invokeRestart [18:01:49.323] is.null <- base::is.null [18:01:49.323] muffled <- FALSE [18:01:49.323] if (inherits(cond, "message")) { [18:01:49.323] muffled <- grepl(pattern, "muffleMessage") [18:01:49.323] if (muffled) [18:01:49.323] invokeRestart("muffleMessage") [18:01:49.323] } [18:01:49.323] else if (inherits(cond, "warning")) { [18:01:49.323] muffled <- grepl(pattern, "muffleWarning") [18:01:49.323] if (muffled) [18:01:49.323] invokeRestart("muffleWarning") [18:01:49.323] } [18:01:49.323] else if (inherits(cond, "condition")) { [18:01:49.323] if (!is.null(pattern)) { [18:01:49.323] computeRestarts <- base::computeRestarts [18:01:49.323] grepl <- base::grepl [18:01:49.323] restarts <- computeRestarts(cond) [18:01:49.323] for (restart in restarts) { [18:01:49.323] name <- restart$name [18:01:49.323] if (is.null(name)) [18:01:49.323] next [18:01:49.323] if (!grepl(pattern, name)) [18:01:49.323] next [18:01:49.323] invokeRestart(restart) [18:01:49.323] muffled <- TRUE [18:01:49.323] break [18:01:49.323] } [18:01:49.323] } [18:01:49.323] } [18:01:49.323] invisible(muffled) [18:01:49.323] } [18:01:49.323] muffleCondition(cond, pattern = "^muffle") [18:01:49.323] } [18:01:49.323] } [18:01:49.323] else { [18:01:49.323] if (TRUE) { [18:01:49.323] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.323] { [18:01:49.323] inherits <- base::inherits [18:01:49.323] invokeRestart <- base::invokeRestart [18:01:49.323] is.null <- base::is.null [18:01:49.323] muffled <- FALSE [18:01:49.323] if (inherits(cond, "message")) { [18:01:49.323] muffled <- grepl(pattern, "muffleMessage") [18:01:49.323] if (muffled) [18:01:49.323] invokeRestart("muffleMessage") [18:01:49.323] } [18:01:49.323] else if (inherits(cond, "warning")) { [18:01:49.323] muffled <- grepl(pattern, "muffleWarning") [18:01:49.323] if (muffled) [18:01:49.323] invokeRestart("muffleWarning") [18:01:49.323] } [18:01:49.323] else if (inherits(cond, "condition")) { [18:01:49.323] if (!is.null(pattern)) { [18:01:49.323] computeRestarts <- base::computeRestarts [18:01:49.323] grepl <- base::grepl [18:01:49.323] restarts <- computeRestarts(cond) [18:01:49.323] for (restart in restarts) { [18:01:49.323] name <- restart$name [18:01:49.323] if (is.null(name)) [18:01:49.323] next [18:01:49.323] if (!grepl(pattern, name)) [18:01:49.323] next [18:01:49.323] invokeRestart(restart) [18:01:49.323] muffled <- TRUE [18:01:49.323] break [18:01:49.323] } [18:01:49.323] } [18:01:49.323] } [18:01:49.323] invisible(muffled) [18:01:49.323] } [18:01:49.323] muffleCondition(cond, pattern = "^muffle") [18:01:49.323] } [18:01:49.323] } [18:01:49.323] } [18:01:49.323] })) [18:01:49.323] }, error = function(ex) { [18:01:49.323] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.323] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.323] ...future.rng), started = ...future.startTime, [18:01:49.323] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.323] version = "1.8"), class = "FutureResult") [18:01:49.323] }, finally = { [18:01:49.323] if (!identical(...future.workdir, getwd())) [18:01:49.323] setwd(...future.workdir) [18:01:49.323] { [18:01:49.323] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.323] ...future.oldOptions$nwarnings <- NULL [18:01:49.323] } [18:01:49.323] base::options(...future.oldOptions) [18:01:49.323] if (.Platform$OS.type == "windows") { [18:01:49.323] old_names <- names(...future.oldEnvVars) [18:01:49.323] envs <- base::Sys.getenv() [18:01:49.323] names <- names(envs) [18:01:49.323] common <- intersect(names, old_names) [18:01:49.323] added <- setdiff(names, old_names) [18:01:49.323] removed <- setdiff(old_names, names) [18:01:49.323] changed <- common[...future.oldEnvVars[common] != [18:01:49.323] envs[common]] [18:01:49.323] NAMES <- toupper(changed) [18:01:49.323] args <- list() [18:01:49.323] for (kk in seq_along(NAMES)) { [18:01:49.323] name <- changed[[kk]] [18:01:49.323] NAME <- NAMES[[kk]] [18:01:49.323] if (name != NAME && is.element(NAME, old_names)) [18:01:49.323] next [18:01:49.323] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.323] } [18:01:49.323] NAMES <- toupper(added) [18:01:49.323] for (kk in seq_along(NAMES)) { [18:01:49.323] name <- added[[kk]] [18:01:49.323] NAME <- NAMES[[kk]] [18:01:49.323] if (name != NAME && is.element(NAME, old_names)) [18:01:49.323] next [18:01:49.323] args[[name]] <- "" [18:01:49.323] } [18:01:49.323] NAMES <- toupper(removed) [18:01:49.323] for (kk in seq_along(NAMES)) { [18:01:49.323] name <- removed[[kk]] [18:01:49.323] NAME <- NAMES[[kk]] [18:01:49.323] if (name != NAME && is.element(NAME, old_names)) [18:01:49.323] next [18:01:49.323] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.323] } [18:01:49.323] if (length(args) > 0) [18:01:49.323] base::do.call(base::Sys.setenv, args = args) [18:01:49.323] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.323] } [18:01:49.323] else { [18:01:49.323] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.323] } [18:01:49.323] { [18:01:49.323] if (base::length(...future.futureOptionsAdded) > [18:01:49.323] 0L) { [18:01:49.323] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.323] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.323] base::options(opts) [18:01:49.323] } [18:01:49.323] { [18:01:49.323] { [18:01:49.323] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.323] NULL [18:01:49.323] } [18:01:49.323] options(future.plan = NULL) [18:01:49.323] if (is.na(NA_character_)) [18:01:49.323] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.323] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.323] future::plan(list(function (..., workers = availableCores(), [18:01:49.323] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.323] envir = parent.frame()) [18:01:49.323] { [18:01:49.323] if (is.function(workers)) [18:01:49.323] workers <- workers() [18:01:49.323] workers <- structure(as.integer(workers), [18:01:49.323] class = class(workers)) [18:01:49.323] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.323] workers >= 1) [18:01:49.323] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.323] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.323] } [18:01:49.323] future <- MultisessionFuture(..., workers = workers, [18:01:49.323] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.323] envir = envir) [18:01:49.323] if (!future$lazy) [18:01:49.323] future <- run(future) [18:01:49.323] invisible(future) [18:01:49.323] }), .cleanup = FALSE, .init = FALSE) [18:01:49.323] } [18:01:49.323] } [18:01:49.323] } [18:01:49.323] }) [18:01:49.323] if (TRUE) { [18:01:49.323] base::sink(type = "output", split = FALSE) [18:01:49.323] if (TRUE) { [18:01:49.323] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.323] } [18:01:49.323] else { [18:01:49.323] ...future.result["stdout"] <- base::list(NULL) [18:01:49.323] } [18:01:49.323] base::close(...future.stdout) [18:01:49.323] ...future.stdout <- NULL [18:01:49.323] } [18:01:49.323] ...future.result$conditions <- ...future.conditions [18:01:49.323] ...future.result$finished <- base::Sys.time() [18:01:49.323] ...future.result [18:01:49.323] } [18:01:49.329] MultisessionFuture started [18:01:49.329] - Launch lazy future ... done [18:01:49.330] run() for 'MultisessionFuture' ... done [18:01:49.330] result() for ClusterFuture ... [18:01:49.330] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.330] - Validating connection of MultisessionFuture [18:01:49.348] - received message: FutureResult [18:01:49.348] - Received FutureResult [18:01:49.349] - Erased future from FutureRegistry [18:01:49.349] result() for ClusterFuture ... [18:01:49.349] - result already collected: FutureResult [18:01:49.349] result() for ClusterFuture ... done [18:01:49.349] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.349] result() for ClusterFuture ... done [18:01:49.350] result() for ClusterFuture ... [18:01:49.350] - result already collected: FutureResult [18:01:49.350] result() for ClusterFuture ... done Call: lm(formula = dist ~ speed + speed^2, data = cars) Coefficients: (Intercept) speed -17.579 3.932 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ speed + I(speed^2), data = cars) Coefficients: (Intercept) speed I(speed^2) 2.47014 0.91329 0.09996 [18:01:49.353] getGlobalsAndPackages() ... [18:01:49.353] Searching for globals... [18:01:49.356] - globals found: [9] '{', 'lm', 'dist', '+', 'speed', 'I', '^', '~', 'cars' [18:01:49.356] Searching for globals ... DONE [18:01:49.356] Resolving globals: FALSE [18:01:49.357] [18:01:49.357] - packages: [2] 'stats', 'datasets' [18:01:49.357] getGlobalsAndPackages() ... DONE [18:01:49.358] run() for 'Future' ... [18:01:49.358] - state: 'created' [18:01:49.358] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.371] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.372] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.372] - Field: 'node' [18:01:49.372] - Field: 'label' [18:01:49.372] - Field: 'local' [18:01:49.373] - Field: 'owner' [18:01:49.373] - Field: 'envir' [18:01:49.373] - Field: 'workers' [18:01:49.373] - Field: 'packages' [18:01:49.373] - Field: 'gc' [18:01:49.373] - Field: 'conditions' [18:01:49.374] - Field: 'persistent' [18:01:49.374] - Field: 'expr' [18:01:49.374] - Field: 'uuid' [18:01:49.374] - Field: 'seed' [18:01:49.374] - Field: 'version' [18:01:49.374] - Field: 'result' [18:01:49.375] - Field: 'asynchronous' [18:01:49.375] - Field: 'calls' [18:01:49.375] - Field: 'globals' [18:01:49.375] - Field: 'stdout' [18:01:49.375] - Field: 'earlySignal' [18:01:49.376] - Field: 'lazy' [18:01:49.376] - Field: 'state' [18:01:49.376] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.376] - Launch lazy future ... [18:01:49.376] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:49.377] Packages needed by future strategies (n = 0): [18:01:49.377] { [18:01:49.377] { [18:01:49.377] { [18:01:49.377] ...future.startTime <- base::Sys.time() [18:01:49.377] { [18:01:49.377] { [18:01:49.377] { [18:01:49.377] { [18:01:49.377] { [18:01:49.377] base::local({ [18:01:49.377] has_future <- base::requireNamespace("future", [18:01:49.377] quietly = TRUE) [18:01:49.377] if (has_future) { [18:01:49.377] ns <- base::getNamespace("future") [18:01:49.377] version <- ns[[".package"]][["version"]] [18:01:49.377] if (is.null(version)) [18:01:49.377] version <- utils::packageVersion("future") [18:01:49.377] } [18:01:49.377] else { [18:01:49.377] version <- NULL [18:01:49.377] } [18:01:49.377] if (!has_future || version < "1.8.0") { [18:01:49.377] info <- base::c(r_version = base::gsub("R version ", [18:01:49.377] "", base::R.version$version.string), [18:01:49.377] platform = base::sprintf("%s (%s-bit)", [18:01:49.377] base::R.version$platform, 8 * [18:01:49.377] base::.Machine$sizeof.pointer), [18:01:49.377] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.377] "release", "version")], collapse = " "), [18:01:49.377] hostname = base::Sys.info()[["nodename"]]) [18:01:49.377] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.377] info) [18:01:49.377] info <- base::paste(info, collapse = "; ") [18:01:49.377] if (!has_future) { [18:01:49.377] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.377] info) [18:01:49.377] } [18:01:49.377] else { [18:01:49.377] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.377] info, version) [18:01:49.377] } [18:01:49.377] base::stop(msg) [18:01:49.377] } [18:01:49.377] }) [18:01:49.377] } [18:01:49.377] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.377] base::options(mc.cores = 1L) [18:01:49.377] } [18:01:49.377] base::local({ [18:01:49.377] for (pkg in c("stats", "datasets")) { [18:01:49.377] base::loadNamespace(pkg) [18:01:49.377] base::library(pkg, character.only = TRUE) [18:01:49.377] } [18:01:49.377] }) [18:01:49.377] } [18:01:49.377] options(future.plan = NULL) [18:01:49.377] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.377] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.377] } [18:01:49.377] ...future.workdir <- getwd() [18:01:49.377] } [18:01:49.377] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.377] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.377] } [18:01:49.377] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.377] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.377] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.377] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.377] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.377] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.377] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.377] base::names(...future.oldOptions)) [18:01:49.377] } [18:01:49.377] if (FALSE) { [18:01:49.377] } [18:01:49.377] else { [18:01:49.377] if (TRUE) { [18:01:49.377] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.377] open = "w") [18:01:49.377] } [18:01:49.377] else { [18:01:49.377] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.377] windows = "NUL", "/dev/null"), open = "w") [18:01:49.377] } [18:01:49.377] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.377] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.377] base::sink(type = "output", split = FALSE) [18:01:49.377] base::close(...future.stdout) [18:01:49.377] }, add = TRUE) [18:01:49.377] } [18:01:49.377] ...future.frame <- base::sys.nframe() [18:01:49.377] ...future.conditions <- base::list() [18:01:49.377] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.377] if (FALSE) { [18:01:49.377] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.377] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.377] } [18:01:49.377] ...future.result <- base::tryCatch({ [18:01:49.377] base::withCallingHandlers({ [18:01:49.377] ...future.value <- base::withVisible(base::local({ [18:01:49.377] ...future.makeSendCondition <- local({ [18:01:49.377] sendCondition <- NULL [18:01:49.377] function(frame = 1L) { [18:01:49.377] if (is.function(sendCondition)) [18:01:49.377] return(sendCondition) [18:01:49.377] ns <- getNamespace("parallel") [18:01:49.377] if (exists("sendData", mode = "function", [18:01:49.377] envir = ns)) { [18:01:49.377] parallel_sendData <- get("sendData", mode = "function", [18:01:49.377] envir = ns) [18:01:49.377] envir <- sys.frame(frame) [18:01:49.377] master <- NULL [18:01:49.377] while (!identical(envir, .GlobalEnv) && [18:01:49.377] !identical(envir, emptyenv())) { [18:01:49.377] if (exists("master", mode = "list", envir = envir, [18:01:49.377] inherits = FALSE)) { [18:01:49.377] master <- get("master", mode = "list", [18:01:49.377] envir = envir, inherits = FALSE) [18:01:49.377] if (inherits(master, c("SOCKnode", [18:01:49.377] "SOCK0node"))) { [18:01:49.377] sendCondition <<- function(cond) { [18:01:49.377] data <- list(type = "VALUE", value = cond, [18:01:49.377] success = TRUE) [18:01:49.377] parallel_sendData(master, data) [18:01:49.377] } [18:01:49.377] return(sendCondition) [18:01:49.377] } [18:01:49.377] } [18:01:49.377] frame <- frame + 1L [18:01:49.377] envir <- sys.frame(frame) [18:01:49.377] } [18:01:49.377] } [18:01:49.377] sendCondition <<- function(cond) NULL [18:01:49.377] } [18:01:49.377] }) [18:01:49.377] withCallingHandlers({ [18:01:49.377] { [18:01:49.377] lm(dist ~ speed + I(speed^2), data = cars) [18:01:49.377] } [18:01:49.377] }, immediateCondition = function(cond) { [18:01:49.377] sendCondition <- ...future.makeSendCondition() [18:01:49.377] sendCondition(cond) [18:01:49.377] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.377] { [18:01:49.377] inherits <- base::inherits [18:01:49.377] invokeRestart <- base::invokeRestart [18:01:49.377] is.null <- base::is.null [18:01:49.377] muffled <- FALSE [18:01:49.377] if (inherits(cond, "message")) { [18:01:49.377] muffled <- grepl(pattern, "muffleMessage") [18:01:49.377] if (muffled) [18:01:49.377] invokeRestart("muffleMessage") [18:01:49.377] } [18:01:49.377] else if (inherits(cond, "warning")) { [18:01:49.377] muffled <- grepl(pattern, "muffleWarning") [18:01:49.377] if (muffled) [18:01:49.377] invokeRestart("muffleWarning") [18:01:49.377] } [18:01:49.377] else if (inherits(cond, "condition")) { [18:01:49.377] if (!is.null(pattern)) { [18:01:49.377] computeRestarts <- base::computeRestarts [18:01:49.377] grepl <- base::grepl [18:01:49.377] restarts <- computeRestarts(cond) [18:01:49.377] for (restart in restarts) { [18:01:49.377] name <- restart$name [18:01:49.377] if (is.null(name)) [18:01:49.377] next [18:01:49.377] if (!grepl(pattern, name)) [18:01:49.377] next [18:01:49.377] invokeRestart(restart) [18:01:49.377] muffled <- TRUE [18:01:49.377] break [18:01:49.377] } [18:01:49.377] } [18:01:49.377] } [18:01:49.377] invisible(muffled) [18:01:49.377] } [18:01:49.377] muffleCondition(cond) [18:01:49.377] }) [18:01:49.377] })) [18:01:49.377] future::FutureResult(value = ...future.value$value, [18:01:49.377] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.377] ...future.rng), globalenv = if (FALSE) [18:01:49.377] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.377] ...future.globalenv.names)) [18:01:49.377] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.377] }, condition = base::local({ [18:01:49.377] c <- base::c [18:01:49.377] inherits <- base::inherits [18:01:49.377] invokeRestart <- base::invokeRestart [18:01:49.377] length <- base::length [18:01:49.377] list <- base::list [18:01:49.377] seq.int <- base::seq.int [18:01:49.377] signalCondition <- base::signalCondition [18:01:49.377] sys.calls <- base::sys.calls [18:01:49.377] `[[` <- base::`[[` [18:01:49.377] `+` <- base::`+` [18:01:49.377] `<<-` <- base::`<<-` [18:01:49.377] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.377] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.377] 3L)] [18:01:49.377] } [18:01:49.377] function(cond) { [18:01:49.377] is_error <- inherits(cond, "error") [18:01:49.377] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.377] NULL) [18:01:49.377] if (is_error) { [18:01:49.377] sessionInformation <- function() { [18:01:49.377] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.377] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.377] search = base::search(), system = base::Sys.info()) [18:01:49.377] } [18:01:49.377] ...future.conditions[[length(...future.conditions) + [18:01:49.377] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.377] cond$call), session = sessionInformation(), [18:01:49.377] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.377] signalCondition(cond) [18:01:49.377] } [18:01:49.377] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.377] "immediateCondition"))) { [18:01:49.377] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.377] ...future.conditions[[length(...future.conditions) + [18:01:49.377] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.377] if (TRUE && !signal) { [18:01:49.377] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.377] { [18:01:49.377] inherits <- base::inherits [18:01:49.377] invokeRestart <- base::invokeRestart [18:01:49.377] is.null <- base::is.null [18:01:49.377] muffled <- FALSE [18:01:49.377] if (inherits(cond, "message")) { [18:01:49.377] muffled <- grepl(pattern, "muffleMessage") [18:01:49.377] if (muffled) [18:01:49.377] invokeRestart("muffleMessage") [18:01:49.377] } [18:01:49.377] else if (inherits(cond, "warning")) { [18:01:49.377] muffled <- grepl(pattern, "muffleWarning") [18:01:49.377] if (muffled) [18:01:49.377] invokeRestart("muffleWarning") [18:01:49.377] } [18:01:49.377] else if (inherits(cond, "condition")) { [18:01:49.377] if (!is.null(pattern)) { [18:01:49.377] computeRestarts <- base::computeRestarts [18:01:49.377] grepl <- base::grepl [18:01:49.377] restarts <- computeRestarts(cond) [18:01:49.377] for (restart in restarts) { [18:01:49.377] name <- restart$name [18:01:49.377] if (is.null(name)) [18:01:49.377] next [18:01:49.377] if (!grepl(pattern, name)) [18:01:49.377] next [18:01:49.377] invokeRestart(restart) [18:01:49.377] muffled <- TRUE [18:01:49.377] break [18:01:49.377] } [18:01:49.377] } [18:01:49.377] } [18:01:49.377] invisible(muffled) [18:01:49.377] } [18:01:49.377] muffleCondition(cond, pattern = "^muffle") [18:01:49.377] } [18:01:49.377] } [18:01:49.377] else { [18:01:49.377] if (TRUE) { [18:01:49.377] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.377] { [18:01:49.377] inherits <- base::inherits [18:01:49.377] invokeRestart <- base::invokeRestart [18:01:49.377] is.null <- base::is.null [18:01:49.377] muffled <- FALSE [18:01:49.377] if (inherits(cond, "message")) { [18:01:49.377] muffled <- grepl(pattern, "muffleMessage") [18:01:49.377] if (muffled) [18:01:49.377] invokeRestart("muffleMessage") [18:01:49.377] } [18:01:49.377] else if (inherits(cond, "warning")) { [18:01:49.377] muffled <- grepl(pattern, "muffleWarning") [18:01:49.377] if (muffled) [18:01:49.377] invokeRestart("muffleWarning") [18:01:49.377] } [18:01:49.377] else if (inherits(cond, "condition")) { [18:01:49.377] if (!is.null(pattern)) { [18:01:49.377] computeRestarts <- base::computeRestarts [18:01:49.377] grepl <- base::grepl [18:01:49.377] restarts <- computeRestarts(cond) [18:01:49.377] for (restart in restarts) { [18:01:49.377] name <- restart$name [18:01:49.377] if (is.null(name)) [18:01:49.377] next [18:01:49.377] if (!grepl(pattern, name)) [18:01:49.377] next [18:01:49.377] invokeRestart(restart) [18:01:49.377] muffled <- TRUE [18:01:49.377] break [18:01:49.377] } [18:01:49.377] } [18:01:49.377] } [18:01:49.377] invisible(muffled) [18:01:49.377] } [18:01:49.377] muffleCondition(cond, pattern = "^muffle") [18:01:49.377] } [18:01:49.377] } [18:01:49.377] } [18:01:49.377] })) [18:01:49.377] }, error = function(ex) { [18:01:49.377] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.377] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.377] ...future.rng), started = ...future.startTime, [18:01:49.377] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.377] version = "1.8"), class = "FutureResult") [18:01:49.377] }, finally = { [18:01:49.377] if (!identical(...future.workdir, getwd())) [18:01:49.377] setwd(...future.workdir) [18:01:49.377] { [18:01:49.377] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.377] ...future.oldOptions$nwarnings <- NULL [18:01:49.377] } [18:01:49.377] base::options(...future.oldOptions) [18:01:49.377] if (.Platform$OS.type == "windows") { [18:01:49.377] old_names <- names(...future.oldEnvVars) [18:01:49.377] envs <- base::Sys.getenv() [18:01:49.377] names <- names(envs) [18:01:49.377] common <- intersect(names, old_names) [18:01:49.377] added <- setdiff(names, old_names) [18:01:49.377] removed <- setdiff(old_names, names) [18:01:49.377] changed <- common[...future.oldEnvVars[common] != [18:01:49.377] envs[common]] [18:01:49.377] NAMES <- toupper(changed) [18:01:49.377] args <- list() [18:01:49.377] for (kk in seq_along(NAMES)) { [18:01:49.377] name <- changed[[kk]] [18:01:49.377] NAME <- NAMES[[kk]] [18:01:49.377] if (name != NAME && is.element(NAME, old_names)) [18:01:49.377] next [18:01:49.377] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.377] } [18:01:49.377] NAMES <- toupper(added) [18:01:49.377] for (kk in seq_along(NAMES)) { [18:01:49.377] name <- added[[kk]] [18:01:49.377] NAME <- NAMES[[kk]] [18:01:49.377] if (name != NAME && is.element(NAME, old_names)) [18:01:49.377] next [18:01:49.377] args[[name]] <- "" [18:01:49.377] } [18:01:49.377] NAMES <- toupper(removed) [18:01:49.377] for (kk in seq_along(NAMES)) { [18:01:49.377] name <- removed[[kk]] [18:01:49.377] NAME <- NAMES[[kk]] [18:01:49.377] if (name != NAME && is.element(NAME, old_names)) [18:01:49.377] next [18:01:49.377] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.377] } [18:01:49.377] if (length(args) > 0) [18:01:49.377] base::do.call(base::Sys.setenv, args = args) [18:01:49.377] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.377] } [18:01:49.377] else { [18:01:49.377] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.377] } [18:01:49.377] { [18:01:49.377] if (base::length(...future.futureOptionsAdded) > [18:01:49.377] 0L) { [18:01:49.377] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.377] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.377] base::options(opts) [18:01:49.377] } [18:01:49.377] { [18:01:49.377] { [18:01:49.377] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.377] NULL [18:01:49.377] } [18:01:49.377] options(future.plan = NULL) [18:01:49.377] if (is.na(NA_character_)) [18:01:49.377] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.377] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.377] future::plan(list(function (..., workers = availableCores(), [18:01:49.377] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.377] envir = parent.frame()) [18:01:49.377] { [18:01:49.377] if (is.function(workers)) [18:01:49.377] workers <- workers() [18:01:49.377] workers <- structure(as.integer(workers), [18:01:49.377] class = class(workers)) [18:01:49.377] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.377] workers >= 1) [18:01:49.377] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.377] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.377] } [18:01:49.377] future <- MultisessionFuture(..., workers = workers, [18:01:49.377] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.377] envir = envir) [18:01:49.377] if (!future$lazy) [18:01:49.377] future <- run(future) [18:01:49.377] invisible(future) [18:01:49.377] }), .cleanup = FALSE, .init = FALSE) [18:01:49.377] } [18:01:49.377] } [18:01:49.377] } [18:01:49.377] }) [18:01:49.377] if (TRUE) { [18:01:49.377] base::sink(type = "output", split = FALSE) [18:01:49.377] if (TRUE) { [18:01:49.377] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.377] } [18:01:49.377] else { [18:01:49.377] ...future.result["stdout"] <- base::list(NULL) [18:01:49.377] } [18:01:49.377] base::close(...future.stdout) [18:01:49.377] ...future.stdout <- NULL [18:01:49.377] } [18:01:49.377] ...future.result$conditions <- ...future.conditions [18:01:49.377] ...future.result$finished <- base::Sys.time() [18:01:49.377] ...future.result [18:01:49.377] } [18:01:49.383] MultisessionFuture started [18:01:49.383] - Launch lazy future ... done [18:01:49.383] run() for 'MultisessionFuture' ... done [18:01:49.384] result() for ClusterFuture ... [18:01:49.384] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.384] - Validating connection of MultisessionFuture [18:01:49.401] - received message: FutureResult [18:01:49.401] - Received FutureResult [18:01:49.401] - Erased future from FutureRegistry [18:01:49.401] result() for ClusterFuture ... [18:01:49.402] - result already collected: FutureResult [18:01:49.402] result() for ClusterFuture ... done [18:01:49.402] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.402] result() for ClusterFuture ... done [18:01:49.402] result() for ClusterFuture ... [18:01:49.402] - result already collected: FutureResult [18:01:49.403] result() for ClusterFuture ... done Call: lm(formula = dist ~ speed + I(speed^2), data = cars) Coefficients: (Intercept) speed I(speed^2) 2.47014 0.91329 0.09996 - Globals - lm(, data = cars) ... Call: lm(formula = dist ~ poly(speed, 2), data = cars) Coefficients: (Intercept) poly(speed, 2)1 poly(speed, 2)2 42.98 145.55 23.00 [18:01:49.406] getGlobalsAndPackages() ... [18:01:49.406] Searching for globals... [18:01:49.408] - globals found: [7] '{', 'lm', 'dist', 'poly', 'speed', '~', 'cars' [18:01:49.408] Searching for globals ... DONE [18:01:49.409] Resolving globals: FALSE [18:01:49.409] [18:01:49.409] - packages: [2] 'stats', 'datasets' [18:01:49.410] getGlobalsAndPackages() ... DONE [18:01:49.410] run() for 'Future' ... [18:01:49.410] - state: 'created' [18:01:49.410] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.424] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.424] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.425] - Field: 'node' [18:01:49.425] - Field: 'label' [18:01:49.425] - Field: 'local' [18:01:49.425] - Field: 'owner' [18:01:49.425] - Field: 'envir' [18:01:49.425] - Field: 'workers' [18:01:49.426] - Field: 'packages' [18:01:49.426] - Field: 'gc' [18:01:49.426] - Field: 'conditions' [18:01:49.426] - Field: 'persistent' [18:01:49.426] - Field: 'expr' [18:01:49.427] - Field: 'uuid' [18:01:49.427] - Field: 'seed' [18:01:49.427] - Field: 'version' [18:01:49.427] - Field: 'result' [18:01:49.427] - Field: 'asynchronous' [18:01:49.427] - Field: 'calls' [18:01:49.428] - Field: 'globals' [18:01:49.428] - Field: 'stdout' [18:01:49.428] - Field: 'earlySignal' [18:01:49.428] - Field: 'lazy' [18:01:49.428] - Field: 'state' [18:01:49.429] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.429] - Launch lazy future ... [18:01:49.429] Packages needed by the future expression (n = 2): 'stats', 'datasets' [18:01:49.429] Packages needed by future strategies (n = 0): [18:01:49.430] { [18:01:49.430] { [18:01:49.430] { [18:01:49.430] ...future.startTime <- base::Sys.time() [18:01:49.430] { [18:01:49.430] { [18:01:49.430] { [18:01:49.430] { [18:01:49.430] { [18:01:49.430] base::local({ [18:01:49.430] has_future <- base::requireNamespace("future", [18:01:49.430] quietly = TRUE) [18:01:49.430] if (has_future) { [18:01:49.430] ns <- base::getNamespace("future") [18:01:49.430] version <- ns[[".package"]][["version"]] [18:01:49.430] if (is.null(version)) [18:01:49.430] version <- utils::packageVersion("future") [18:01:49.430] } [18:01:49.430] else { [18:01:49.430] version <- NULL [18:01:49.430] } [18:01:49.430] if (!has_future || version < "1.8.0") { [18:01:49.430] info <- base::c(r_version = base::gsub("R version ", [18:01:49.430] "", base::R.version$version.string), [18:01:49.430] platform = base::sprintf("%s (%s-bit)", [18:01:49.430] base::R.version$platform, 8 * [18:01:49.430] base::.Machine$sizeof.pointer), [18:01:49.430] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.430] "release", "version")], collapse = " "), [18:01:49.430] hostname = base::Sys.info()[["nodename"]]) [18:01:49.430] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.430] info) [18:01:49.430] info <- base::paste(info, collapse = "; ") [18:01:49.430] if (!has_future) { [18:01:49.430] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.430] info) [18:01:49.430] } [18:01:49.430] else { [18:01:49.430] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.430] info, version) [18:01:49.430] } [18:01:49.430] base::stop(msg) [18:01:49.430] } [18:01:49.430] }) [18:01:49.430] } [18:01:49.430] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.430] base::options(mc.cores = 1L) [18:01:49.430] } [18:01:49.430] base::local({ [18:01:49.430] for (pkg in c("stats", "datasets")) { [18:01:49.430] base::loadNamespace(pkg) [18:01:49.430] base::library(pkg, character.only = TRUE) [18:01:49.430] } [18:01:49.430] }) [18:01:49.430] } [18:01:49.430] options(future.plan = NULL) [18:01:49.430] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.430] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.430] } [18:01:49.430] ...future.workdir <- getwd() [18:01:49.430] } [18:01:49.430] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.430] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.430] } [18:01:49.430] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.430] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.430] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.430] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.430] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.430] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.430] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.430] base::names(...future.oldOptions)) [18:01:49.430] } [18:01:49.430] if (FALSE) { [18:01:49.430] } [18:01:49.430] else { [18:01:49.430] if (TRUE) { [18:01:49.430] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.430] open = "w") [18:01:49.430] } [18:01:49.430] else { [18:01:49.430] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.430] windows = "NUL", "/dev/null"), open = "w") [18:01:49.430] } [18:01:49.430] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.430] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.430] base::sink(type = "output", split = FALSE) [18:01:49.430] base::close(...future.stdout) [18:01:49.430] }, add = TRUE) [18:01:49.430] } [18:01:49.430] ...future.frame <- base::sys.nframe() [18:01:49.430] ...future.conditions <- base::list() [18:01:49.430] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.430] if (FALSE) { [18:01:49.430] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.430] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.430] } [18:01:49.430] ...future.result <- base::tryCatch({ [18:01:49.430] base::withCallingHandlers({ [18:01:49.430] ...future.value <- base::withVisible(base::local({ [18:01:49.430] ...future.makeSendCondition <- local({ [18:01:49.430] sendCondition <- NULL [18:01:49.430] function(frame = 1L) { [18:01:49.430] if (is.function(sendCondition)) [18:01:49.430] return(sendCondition) [18:01:49.430] ns <- getNamespace("parallel") [18:01:49.430] if (exists("sendData", mode = "function", [18:01:49.430] envir = ns)) { [18:01:49.430] parallel_sendData <- get("sendData", mode = "function", [18:01:49.430] envir = ns) [18:01:49.430] envir <- sys.frame(frame) [18:01:49.430] master <- NULL [18:01:49.430] while (!identical(envir, .GlobalEnv) && [18:01:49.430] !identical(envir, emptyenv())) { [18:01:49.430] if (exists("master", mode = "list", envir = envir, [18:01:49.430] inherits = FALSE)) { [18:01:49.430] master <- get("master", mode = "list", [18:01:49.430] envir = envir, inherits = FALSE) [18:01:49.430] if (inherits(master, c("SOCKnode", [18:01:49.430] "SOCK0node"))) { [18:01:49.430] sendCondition <<- function(cond) { [18:01:49.430] data <- list(type = "VALUE", value = cond, [18:01:49.430] success = TRUE) [18:01:49.430] parallel_sendData(master, data) [18:01:49.430] } [18:01:49.430] return(sendCondition) [18:01:49.430] } [18:01:49.430] } [18:01:49.430] frame <- frame + 1L [18:01:49.430] envir <- sys.frame(frame) [18:01:49.430] } [18:01:49.430] } [18:01:49.430] sendCondition <<- function(cond) NULL [18:01:49.430] } [18:01:49.430] }) [18:01:49.430] withCallingHandlers({ [18:01:49.430] { [18:01:49.430] lm(dist ~ poly(speed, 2), data = cars) [18:01:49.430] } [18:01:49.430] }, immediateCondition = function(cond) { [18:01:49.430] sendCondition <- ...future.makeSendCondition() [18:01:49.430] sendCondition(cond) [18:01:49.430] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.430] { [18:01:49.430] inherits <- base::inherits [18:01:49.430] invokeRestart <- base::invokeRestart [18:01:49.430] is.null <- base::is.null [18:01:49.430] muffled <- FALSE [18:01:49.430] if (inherits(cond, "message")) { [18:01:49.430] muffled <- grepl(pattern, "muffleMessage") [18:01:49.430] if (muffled) [18:01:49.430] invokeRestart("muffleMessage") [18:01:49.430] } [18:01:49.430] else if (inherits(cond, "warning")) { [18:01:49.430] muffled <- grepl(pattern, "muffleWarning") [18:01:49.430] if (muffled) [18:01:49.430] invokeRestart("muffleWarning") [18:01:49.430] } [18:01:49.430] else if (inherits(cond, "condition")) { [18:01:49.430] if (!is.null(pattern)) { [18:01:49.430] computeRestarts <- base::computeRestarts [18:01:49.430] grepl <- base::grepl [18:01:49.430] restarts <- computeRestarts(cond) [18:01:49.430] for (restart in restarts) { [18:01:49.430] name <- restart$name [18:01:49.430] if (is.null(name)) [18:01:49.430] next [18:01:49.430] if (!grepl(pattern, name)) [18:01:49.430] next [18:01:49.430] invokeRestart(restart) [18:01:49.430] muffled <- TRUE [18:01:49.430] break [18:01:49.430] } [18:01:49.430] } [18:01:49.430] } [18:01:49.430] invisible(muffled) [18:01:49.430] } [18:01:49.430] muffleCondition(cond) [18:01:49.430] }) [18:01:49.430] })) [18:01:49.430] future::FutureResult(value = ...future.value$value, [18:01:49.430] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.430] ...future.rng), globalenv = if (FALSE) [18:01:49.430] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.430] ...future.globalenv.names)) [18:01:49.430] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.430] }, condition = base::local({ [18:01:49.430] c <- base::c [18:01:49.430] inherits <- base::inherits [18:01:49.430] invokeRestart <- base::invokeRestart [18:01:49.430] length <- base::length [18:01:49.430] list <- base::list [18:01:49.430] seq.int <- base::seq.int [18:01:49.430] signalCondition <- base::signalCondition [18:01:49.430] sys.calls <- base::sys.calls [18:01:49.430] `[[` <- base::`[[` [18:01:49.430] `+` <- base::`+` [18:01:49.430] `<<-` <- base::`<<-` [18:01:49.430] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.430] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.430] 3L)] [18:01:49.430] } [18:01:49.430] function(cond) { [18:01:49.430] is_error <- inherits(cond, "error") [18:01:49.430] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.430] NULL) [18:01:49.430] if (is_error) { [18:01:49.430] sessionInformation <- function() { [18:01:49.430] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.430] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.430] search = base::search(), system = base::Sys.info()) [18:01:49.430] } [18:01:49.430] ...future.conditions[[length(...future.conditions) + [18:01:49.430] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.430] cond$call), session = sessionInformation(), [18:01:49.430] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.430] signalCondition(cond) [18:01:49.430] } [18:01:49.430] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.430] "immediateCondition"))) { [18:01:49.430] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.430] ...future.conditions[[length(...future.conditions) + [18:01:49.430] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.430] if (TRUE && !signal) { [18:01:49.430] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.430] { [18:01:49.430] inherits <- base::inherits [18:01:49.430] invokeRestart <- base::invokeRestart [18:01:49.430] is.null <- base::is.null [18:01:49.430] muffled <- FALSE [18:01:49.430] if (inherits(cond, "message")) { [18:01:49.430] muffled <- grepl(pattern, "muffleMessage") [18:01:49.430] if (muffled) [18:01:49.430] invokeRestart("muffleMessage") [18:01:49.430] } [18:01:49.430] else if (inherits(cond, "warning")) { [18:01:49.430] muffled <- grepl(pattern, "muffleWarning") [18:01:49.430] if (muffled) [18:01:49.430] invokeRestart("muffleWarning") [18:01:49.430] } [18:01:49.430] else if (inherits(cond, "condition")) { [18:01:49.430] if (!is.null(pattern)) { [18:01:49.430] computeRestarts <- base::computeRestarts [18:01:49.430] grepl <- base::grepl [18:01:49.430] restarts <- computeRestarts(cond) [18:01:49.430] for (restart in restarts) { [18:01:49.430] name <- restart$name [18:01:49.430] if (is.null(name)) [18:01:49.430] next [18:01:49.430] if (!grepl(pattern, name)) [18:01:49.430] next [18:01:49.430] invokeRestart(restart) [18:01:49.430] muffled <- TRUE [18:01:49.430] break [18:01:49.430] } [18:01:49.430] } [18:01:49.430] } [18:01:49.430] invisible(muffled) [18:01:49.430] } [18:01:49.430] muffleCondition(cond, pattern = "^muffle") [18:01:49.430] } [18:01:49.430] } [18:01:49.430] else { [18:01:49.430] if (TRUE) { [18:01:49.430] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.430] { [18:01:49.430] inherits <- base::inherits [18:01:49.430] invokeRestart <- base::invokeRestart [18:01:49.430] is.null <- base::is.null [18:01:49.430] muffled <- FALSE [18:01:49.430] if (inherits(cond, "message")) { [18:01:49.430] muffled <- grepl(pattern, "muffleMessage") [18:01:49.430] if (muffled) [18:01:49.430] invokeRestart("muffleMessage") [18:01:49.430] } [18:01:49.430] else if (inherits(cond, "warning")) { [18:01:49.430] muffled <- grepl(pattern, "muffleWarning") [18:01:49.430] if (muffled) [18:01:49.430] invokeRestart("muffleWarning") [18:01:49.430] } [18:01:49.430] else if (inherits(cond, "condition")) { [18:01:49.430] if (!is.null(pattern)) { [18:01:49.430] computeRestarts <- base::computeRestarts [18:01:49.430] grepl <- base::grepl [18:01:49.430] restarts <- computeRestarts(cond) [18:01:49.430] for (restart in restarts) { [18:01:49.430] name <- restart$name [18:01:49.430] if (is.null(name)) [18:01:49.430] next [18:01:49.430] if (!grepl(pattern, name)) [18:01:49.430] next [18:01:49.430] invokeRestart(restart) [18:01:49.430] muffled <- TRUE [18:01:49.430] break [18:01:49.430] } [18:01:49.430] } [18:01:49.430] } [18:01:49.430] invisible(muffled) [18:01:49.430] } [18:01:49.430] muffleCondition(cond, pattern = "^muffle") [18:01:49.430] } [18:01:49.430] } [18:01:49.430] } [18:01:49.430] })) [18:01:49.430] }, error = function(ex) { [18:01:49.430] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.430] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.430] ...future.rng), started = ...future.startTime, [18:01:49.430] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.430] version = "1.8"), class = "FutureResult") [18:01:49.430] }, finally = { [18:01:49.430] if (!identical(...future.workdir, getwd())) [18:01:49.430] setwd(...future.workdir) [18:01:49.430] { [18:01:49.430] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.430] ...future.oldOptions$nwarnings <- NULL [18:01:49.430] } [18:01:49.430] base::options(...future.oldOptions) [18:01:49.430] if (.Platform$OS.type == "windows") { [18:01:49.430] old_names <- names(...future.oldEnvVars) [18:01:49.430] envs <- base::Sys.getenv() [18:01:49.430] names <- names(envs) [18:01:49.430] common <- intersect(names, old_names) [18:01:49.430] added <- setdiff(names, old_names) [18:01:49.430] removed <- setdiff(old_names, names) [18:01:49.430] changed <- common[...future.oldEnvVars[common] != [18:01:49.430] envs[common]] [18:01:49.430] NAMES <- toupper(changed) [18:01:49.430] args <- list() [18:01:49.430] for (kk in seq_along(NAMES)) { [18:01:49.430] name <- changed[[kk]] [18:01:49.430] NAME <- NAMES[[kk]] [18:01:49.430] if (name != NAME && is.element(NAME, old_names)) [18:01:49.430] next [18:01:49.430] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.430] } [18:01:49.430] NAMES <- toupper(added) [18:01:49.430] for (kk in seq_along(NAMES)) { [18:01:49.430] name <- added[[kk]] [18:01:49.430] NAME <- NAMES[[kk]] [18:01:49.430] if (name != NAME && is.element(NAME, old_names)) [18:01:49.430] next [18:01:49.430] args[[name]] <- "" [18:01:49.430] } [18:01:49.430] NAMES <- toupper(removed) [18:01:49.430] for (kk in seq_along(NAMES)) { [18:01:49.430] name <- removed[[kk]] [18:01:49.430] NAME <- NAMES[[kk]] [18:01:49.430] if (name != NAME && is.element(NAME, old_names)) [18:01:49.430] next [18:01:49.430] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.430] } [18:01:49.430] if (length(args) > 0) [18:01:49.430] base::do.call(base::Sys.setenv, args = args) [18:01:49.430] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.430] } [18:01:49.430] else { [18:01:49.430] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.430] } [18:01:49.430] { [18:01:49.430] if (base::length(...future.futureOptionsAdded) > [18:01:49.430] 0L) { [18:01:49.430] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.430] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.430] base::options(opts) [18:01:49.430] } [18:01:49.430] { [18:01:49.430] { [18:01:49.430] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.430] NULL [18:01:49.430] } [18:01:49.430] options(future.plan = NULL) [18:01:49.430] if (is.na(NA_character_)) [18:01:49.430] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.430] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.430] future::plan(list(function (..., workers = availableCores(), [18:01:49.430] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.430] envir = parent.frame()) [18:01:49.430] { [18:01:49.430] if (is.function(workers)) [18:01:49.430] workers <- workers() [18:01:49.430] workers <- structure(as.integer(workers), [18:01:49.430] class = class(workers)) [18:01:49.430] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.430] workers >= 1) [18:01:49.430] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.430] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.430] } [18:01:49.430] future <- MultisessionFuture(..., workers = workers, [18:01:49.430] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.430] envir = envir) [18:01:49.430] if (!future$lazy) [18:01:49.430] future <- run(future) [18:01:49.430] invisible(future) [18:01:49.430] }), .cleanup = FALSE, .init = FALSE) [18:01:49.430] } [18:01:49.430] } [18:01:49.430] } [18:01:49.430] }) [18:01:49.430] if (TRUE) { [18:01:49.430] base::sink(type = "output", split = FALSE) [18:01:49.430] if (TRUE) { [18:01:49.430] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.430] } [18:01:49.430] else { [18:01:49.430] ...future.result["stdout"] <- base::list(NULL) [18:01:49.430] } [18:01:49.430] base::close(...future.stdout) [18:01:49.430] ...future.stdout <- NULL [18:01:49.430] } [18:01:49.430] ...future.result$conditions <- ...future.conditions [18:01:49.430] ...future.result$finished <- base::Sys.time() [18:01:49.430] ...future.result [18:01:49.430] } [18:01:49.436] MultisessionFuture started [18:01:49.436] - Launch lazy future ... done [18:01:49.436] run() for 'MultisessionFuture' ... done [18:01:49.436] result() for ClusterFuture ... [18:01:49.437] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.437] - Validating connection of MultisessionFuture [18:01:49.456] - received message: FutureResult [18:01:49.457] - Received FutureResult [18:01:49.457] - Erased future from FutureRegistry [18:01:49.457] result() for ClusterFuture ... [18:01:49.457] - result already collected: FutureResult [18:01:49.457] result() for ClusterFuture ... done [18:01:49.458] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.458] result() for ClusterFuture ... done [18:01:49.458] result() for ClusterFuture ... [18:01:49.458] - result already collected: FutureResult [18:01:49.458] result() for ClusterFuture ... done Call: lm(formula = dist ~ poly(speed, 2), data = cars) Coefficients: (Intercept) poly(speed, 2)1 poly(speed, 2)2 42.98 145.55 23.00 - Globals - map(x, ~ expr) ... [18:01:49.460] getGlobalsAndPackages() ... [18:01:49.461] Searching for globals... [18:01:49.469] - globals found: [16] '{', 'outer_function', 'map', ':', '~', 'inner_function', '.x', 'if', 'inherits', '<-', '[[', '-', 'eval', 'bquote', 'lapply', '+' [18:01:49.469] Searching for globals ... DONE [18:01:49.469] Resolving globals: FALSE [18:01:49.470] The total size of the 3 globals is 7.52 KiB (7704 bytes) [18:01:49.470] The total size of the 3 globals exported for future expression ('{; outer_function(1L); }') is 7.52 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'map' (4.43 KiB of class 'function'), 'inner_function' (1.78 KiB of class 'function') and 'outer_function' (1.31 KiB of class 'function') [18:01:49.471] - globals: [3] 'outer_function', 'map', 'inner_function' [18:01:49.471] [18:01:49.471] getGlobalsAndPackages() ... DONE [18:01:49.471] run() for 'Future' ... [18:01:49.471] - state: 'created' [18:01:49.472] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.485] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.485] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.486] - Field: 'node' [18:01:49.486] - Field: 'label' [18:01:49.486] - Field: 'local' [18:01:49.486] - Field: 'owner' [18:01:49.486] - Field: 'envir' [18:01:49.486] - Field: 'workers' [18:01:49.487] - Field: 'packages' [18:01:49.487] - Field: 'gc' [18:01:49.487] - Field: 'conditions' [18:01:49.487] - Field: 'persistent' [18:01:49.487] - Field: 'expr' [18:01:49.488] - Field: 'uuid' [18:01:49.488] - Field: 'seed' [18:01:49.488] - Field: 'version' [18:01:49.488] - Field: 'result' [18:01:49.488] - Field: 'asynchronous' [18:01:49.488] - Field: 'calls' [18:01:49.489] - Field: 'globals' [18:01:49.489] - Field: 'stdout' [18:01:49.489] - Field: 'earlySignal' [18:01:49.489] - Field: 'lazy' [18:01:49.489] - Field: 'state' [18:01:49.490] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.490] - Launch lazy future ... [18:01:49.490] Packages needed by the future expression (n = 0): [18:01:49.490] Packages needed by future strategies (n = 0): [18:01:49.491] { [18:01:49.491] { [18:01:49.491] { [18:01:49.491] ...future.startTime <- base::Sys.time() [18:01:49.491] { [18:01:49.491] { [18:01:49.491] { [18:01:49.491] { [18:01:49.491] base::local({ [18:01:49.491] has_future <- base::requireNamespace("future", [18:01:49.491] quietly = TRUE) [18:01:49.491] if (has_future) { [18:01:49.491] ns <- base::getNamespace("future") [18:01:49.491] version <- ns[[".package"]][["version"]] [18:01:49.491] if (is.null(version)) [18:01:49.491] version <- utils::packageVersion("future") [18:01:49.491] } [18:01:49.491] else { [18:01:49.491] version <- NULL [18:01:49.491] } [18:01:49.491] if (!has_future || version < "1.8.0") { [18:01:49.491] info <- base::c(r_version = base::gsub("R version ", [18:01:49.491] "", base::R.version$version.string), [18:01:49.491] platform = base::sprintf("%s (%s-bit)", [18:01:49.491] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:49.491] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.491] "release", "version")], collapse = " "), [18:01:49.491] hostname = base::Sys.info()[["nodename"]]) [18:01:49.491] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.491] info) [18:01:49.491] info <- base::paste(info, collapse = "; ") [18:01:49.491] if (!has_future) { [18:01:49.491] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.491] info) [18:01:49.491] } [18:01:49.491] else { [18:01:49.491] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.491] info, version) [18:01:49.491] } [18:01:49.491] base::stop(msg) [18:01:49.491] } [18:01:49.491] }) [18:01:49.491] } [18:01:49.491] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.491] base::options(mc.cores = 1L) [18:01:49.491] } [18:01:49.491] options(future.plan = NULL) [18:01:49.491] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.491] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.491] } [18:01:49.491] ...future.workdir <- getwd() [18:01:49.491] } [18:01:49.491] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.491] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.491] } [18:01:49.491] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.491] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.491] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.491] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.491] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.491] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.491] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.491] base::names(...future.oldOptions)) [18:01:49.491] } [18:01:49.491] if (FALSE) { [18:01:49.491] } [18:01:49.491] else { [18:01:49.491] if (TRUE) { [18:01:49.491] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.491] open = "w") [18:01:49.491] } [18:01:49.491] else { [18:01:49.491] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.491] windows = "NUL", "/dev/null"), open = "w") [18:01:49.491] } [18:01:49.491] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.491] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.491] base::sink(type = "output", split = FALSE) [18:01:49.491] base::close(...future.stdout) [18:01:49.491] }, add = TRUE) [18:01:49.491] } [18:01:49.491] ...future.frame <- base::sys.nframe() [18:01:49.491] ...future.conditions <- base::list() [18:01:49.491] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.491] if (FALSE) { [18:01:49.491] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.491] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.491] } [18:01:49.491] ...future.result <- base::tryCatch({ [18:01:49.491] base::withCallingHandlers({ [18:01:49.491] ...future.value <- base::withVisible(base::local({ [18:01:49.491] ...future.makeSendCondition <- local({ [18:01:49.491] sendCondition <- NULL [18:01:49.491] function(frame = 1L) { [18:01:49.491] if (is.function(sendCondition)) [18:01:49.491] return(sendCondition) [18:01:49.491] ns <- getNamespace("parallel") [18:01:49.491] if (exists("sendData", mode = "function", [18:01:49.491] envir = ns)) { [18:01:49.491] parallel_sendData <- get("sendData", mode = "function", [18:01:49.491] envir = ns) [18:01:49.491] envir <- sys.frame(frame) [18:01:49.491] master <- NULL [18:01:49.491] while (!identical(envir, .GlobalEnv) && [18:01:49.491] !identical(envir, emptyenv())) { [18:01:49.491] if (exists("master", mode = "list", envir = envir, [18:01:49.491] inherits = FALSE)) { [18:01:49.491] master <- get("master", mode = "list", [18:01:49.491] envir = envir, inherits = FALSE) [18:01:49.491] if (inherits(master, c("SOCKnode", [18:01:49.491] "SOCK0node"))) { [18:01:49.491] sendCondition <<- function(cond) { [18:01:49.491] data <- list(type = "VALUE", value = cond, [18:01:49.491] success = TRUE) [18:01:49.491] parallel_sendData(master, data) [18:01:49.491] } [18:01:49.491] return(sendCondition) [18:01:49.491] } [18:01:49.491] } [18:01:49.491] frame <- frame + 1L [18:01:49.491] envir <- sys.frame(frame) [18:01:49.491] } [18:01:49.491] } [18:01:49.491] sendCondition <<- function(cond) NULL [18:01:49.491] } [18:01:49.491] }) [18:01:49.491] withCallingHandlers({ [18:01:49.491] { [18:01:49.491] outer_function(1L) [18:01:49.491] } [18:01:49.491] }, immediateCondition = function(cond) { [18:01:49.491] sendCondition <- ...future.makeSendCondition() [18:01:49.491] sendCondition(cond) [18:01:49.491] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.491] { [18:01:49.491] inherits <- base::inherits [18:01:49.491] invokeRestart <- base::invokeRestart [18:01:49.491] is.null <- base::is.null [18:01:49.491] muffled <- FALSE [18:01:49.491] if (inherits(cond, "message")) { [18:01:49.491] muffled <- grepl(pattern, "muffleMessage") [18:01:49.491] if (muffled) [18:01:49.491] invokeRestart("muffleMessage") [18:01:49.491] } [18:01:49.491] else if (inherits(cond, "warning")) { [18:01:49.491] muffled <- grepl(pattern, "muffleWarning") [18:01:49.491] if (muffled) [18:01:49.491] invokeRestart("muffleWarning") [18:01:49.491] } [18:01:49.491] else if (inherits(cond, "condition")) { [18:01:49.491] if (!is.null(pattern)) { [18:01:49.491] computeRestarts <- base::computeRestarts [18:01:49.491] grepl <- base::grepl [18:01:49.491] restarts <- computeRestarts(cond) [18:01:49.491] for (restart in restarts) { [18:01:49.491] name <- restart$name [18:01:49.491] if (is.null(name)) [18:01:49.491] next [18:01:49.491] if (!grepl(pattern, name)) [18:01:49.491] next [18:01:49.491] invokeRestart(restart) [18:01:49.491] muffled <- TRUE [18:01:49.491] break [18:01:49.491] } [18:01:49.491] } [18:01:49.491] } [18:01:49.491] invisible(muffled) [18:01:49.491] } [18:01:49.491] muffleCondition(cond) [18:01:49.491] }) [18:01:49.491] })) [18:01:49.491] future::FutureResult(value = ...future.value$value, [18:01:49.491] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.491] ...future.rng), globalenv = if (FALSE) [18:01:49.491] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.491] ...future.globalenv.names)) [18:01:49.491] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.491] }, condition = base::local({ [18:01:49.491] c <- base::c [18:01:49.491] inherits <- base::inherits [18:01:49.491] invokeRestart <- base::invokeRestart [18:01:49.491] length <- base::length [18:01:49.491] list <- base::list [18:01:49.491] seq.int <- base::seq.int [18:01:49.491] signalCondition <- base::signalCondition [18:01:49.491] sys.calls <- base::sys.calls [18:01:49.491] `[[` <- base::`[[` [18:01:49.491] `+` <- base::`+` [18:01:49.491] `<<-` <- base::`<<-` [18:01:49.491] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.491] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.491] 3L)] [18:01:49.491] } [18:01:49.491] function(cond) { [18:01:49.491] is_error <- inherits(cond, "error") [18:01:49.491] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.491] NULL) [18:01:49.491] if (is_error) { [18:01:49.491] sessionInformation <- function() { [18:01:49.491] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.491] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.491] search = base::search(), system = base::Sys.info()) [18:01:49.491] } [18:01:49.491] ...future.conditions[[length(...future.conditions) + [18:01:49.491] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.491] cond$call), session = sessionInformation(), [18:01:49.491] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.491] signalCondition(cond) [18:01:49.491] } [18:01:49.491] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.491] "immediateCondition"))) { [18:01:49.491] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.491] ...future.conditions[[length(...future.conditions) + [18:01:49.491] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.491] if (TRUE && !signal) { [18:01:49.491] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.491] { [18:01:49.491] inherits <- base::inherits [18:01:49.491] invokeRestart <- base::invokeRestart [18:01:49.491] is.null <- base::is.null [18:01:49.491] muffled <- FALSE [18:01:49.491] if (inherits(cond, "message")) { [18:01:49.491] muffled <- grepl(pattern, "muffleMessage") [18:01:49.491] if (muffled) [18:01:49.491] invokeRestart("muffleMessage") [18:01:49.491] } [18:01:49.491] else if (inherits(cond, "warning")) { [18:01:49.491] muffled <- grepl(pattern, "muffleWarning") [18:01:49.491] if (muffled) [18:01:49.491] invokeRestart("muffleWarning") [18:01:49.491] } [18:01:49.491] else if (inherits(cond, "condition")) { [18:01:49.491] if (!is.null(pattern)) { [18:01:49.491] computeRestarts <- base::computeRestarts [18:01:49.491] grepl <- base::grepl [18:01:49.491] restarts <- computeRestarts(cond) [18:01:49.491] for (restart in restarts) { [18:01:49.491] name <- restart$name [18:01:49.491] if (is.null(name)) [18:01:49.491] next [18:01:49.491] if (!grepl(pattern, name)) [18:01:49.491] next [18:01:49.491] invokeRestart(restart) [18:01:49.491] muffled <- TRUE [18:01:49.491] break [18:01:49.491] } [18:01:49.491] } [18:01:49.491] } [18:01:49.491] invisible(muffled) [18:01:49.491] } [18:01:49.491] muffleCondition(cond, pattern = "^muffle") [18:01:49.491] } [18:01:49.491] } [18:01:49.491] else { [18:01:49.491] if (TRUE) { [18:01:49.491] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.491] { [18:01:49.491] inherits <- base::inherits [18:01:49.491] invokeRestart <- base::invokeRestart [18:01:49.491] is.null <- base::is.null [18:01:49.491] muffled <- FALSE [18:01:49.491] if (inherits(cond, "message")) { [18:01:49.491] muffled <- grepl(pattern, "muffleMessage") [18:01:49.491] if (muffled) [18:01:49.491] invokeRestart("muffleMessage") [18:01:49.491] } [18:01:49.491] else if (inherits(cond, "warning")) { [18:01:49.491] muffled <- grepl(pattern, "muffleWarning") [18:01:49.491] if (muffled) [18:01:49.491] invokeRestart("muffleWarning") [18:01:49.491] } [18:01:49.491] else if (inherits(cond, "condition")) { [18:01:49.491] if (!is.null(pattern)) { [18:01:49.491] computeRestarts <- base::computeRestarts [18:01:49.491] grepl <- base::grepl [18:01:49.491] restarts <- computeRestarts(cond) [18:01:49.491] for (restart in restarts) { [18:01:49.491] name <- restart$name [18:01:49.491] if (is.null(name)) [18:01:49.491] next [18:01:49.491] if (!grepl(pattern, name)) [18:01:49.491] next [18:01:49.491] invokeRestart(restart) [18:01:49.491] muffled <- TRUE [18:01:49.491] break [18:01:49.491] } [18:01:49.491] } [18:01:49.491] } [18:01:49.491] invisible(muffled) [18:01:49.491] } [18:01:49.491] muffleCondition(cond, pattern = "^muffle") [18:01:49.491] } [18:01:49.491] } [18:01:49.491] } [18:01:49.491] })) [18:01:49.491] }, error = function(ex) { [18:01:49.491] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.491] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.491] ...future.rng), started = ...future.startTime, [18:01:49.491] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.491] version = "1.8"), class = "FutureResult") [18:01:49.491] }, finally = { [18:01:49.491] if (!identical(...future.workdir, getwd())) [18:01:49.491] setwd(...future.workdir) [18:01:49.491] { [18:01:49.491] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.491] ...future.oldOptions$nwarnings <- NULL [18:01:49.491] } [18:01:49.491] base::options(...future.oldOptions) [18:01:49.491] if (.Platform$OS.type == "windows") { [18:01:49.491] old_names <- names(...future.oldEnvVars) [18:01:49.491] envs <- base::Sys.getenv() [18:01:49.491] names <- names(envs) [18:01:49.491] common <- intersect(names, old_names) [18:01:49.491] added <- setdiff(names, old_names) [18:01:49.491] removed <- setdiff(old_names, names) [18:01:49.491] changed <- common[...future.oldEnvVars[common] != [18:01:49.491] envs[common]] [18:01:49.491] NAMES <- toupper(changed) [18:01:49.491] args <- list() [18:01:49.491] for (kk in seq_along(NAMES)) { [18:01:49.491] name <- changed[[kk]] [18:01:49.491] NAME <- NAMES[[kk]] [18:01:49.491] if (name != NAME && is.element(NAME, old_names)) [18:01:49.491] next [18:01:49.491] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.491] } [18:01:49.491] NAMES <- toupper(added) [18:01:49.491] for (kk in seq_along(NAMES)) { [18:01:49.491] name <- added[[kk]] [18:01:49.491] NAME <- NAMES[[kk]] [18:01:49.491] if (name != NAME && is.element(NAME, old_names)) [18:01:49.491] next [18:01:49.491] args[[name]] <- "" [18:01:49.491] } [18:01:49.491] NAMES <- toupper(removed) [18:01:49.491] for (kk in seq_along(NAMES)) { [18:01:49.491] name <- removed[[kk]] [18:01:49.491] NAME <- NAMES[[kk]] [18:01:49.491] if (name != NAME && is.element(NAME, old_names)) [18:01:49.491] next [18:01:49.491] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.491] } [18:01:49.491] if (length(args) > 0) [18:01:49.491] base::do.call(base::Sys.setenv, args = args) [18:01:49.491] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.491] } [18:01:49.491] else { [18:01:49.491] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.491] } [18:01:49.491] { [18:01:49.491] if (base::length(...future.futureOptionsAdded) > [18:01:49.491] 0L) { [18:01:49.491] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.491] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.491] base::options(opts) [18:01:49.491] } [18:01:49.491] { [18:01:49.491] { [18:01:49.491] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.491] NULL [18:01:49.491] } [18:01:49.491] options(future.plan = NULL) [18:01:49.491] if (is.na(NA_character_)) [18:01:49.491] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.491] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.491] future::plan(list(function (..., workers = availableCores(), [18:01:49.491] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.491] envir = parent.frame()) [18:01:49.491] { [18:01:49.491] if (is.function(workers)) [18:01:49.491] workers <- workers() [18:01:49.491] workers <- structure(as.integer(workers), [18:01:49.491] class = class(workers)) [18:01:49.491] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.491] workers >= 1) [18:01:49.491] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.491] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.491] } [18:01:49.491] future <- MultisessionFuture(..., workers = workers, [18:01:49.491] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.491] envir = envir) [18:01:49.491] if (!future$lazy) [18:01:49.491] future <- run(future) [18:01:49.491] invisible(future) [18:01:49.491] }), .cleanup = FALSE, .init = FALSE) [18:01:49.491] } [18:01:49.491] } [18:01:49.491] } [18:01:49.491] }) [18:01:49.491] if (TRUE) { [18:01:49.491] base::sink(type = "output", split = FALSE) [18:01:49.491] if (TRUE) { [18:01:49.491] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.491] } [18:01:49.491] else { [18:01:49.491] ...future.result["stdout"] <- base::list(NULL) [18:01:49.491] } [18:01:49.491] base::close(...future.stdout) [18:01:49.491] ...future.stdout <- NULL [18:01:49.491] } [18:01:49.491] ...future.result$conditions <- ...future.conditions [18:01:49.491] ...future.result$finished <- base::Sys.time() [18:01:49.491] ...future.result [18:01:49.491] } [18:01:49.496] Exporting 3 global objects (7.52 KiB) to cluster node #1 ... [18:01:49.496] Exporting 'outer_function' (1.31 KiB) to cluster node #1 ... [18:01:49.497] Exporting 'outer_function' (1.31 KiB) to cluster node #1 ... DONE [18:01:49.497] Exporting 'map' (4.43 KiB) to cluster node #1 ... [18:01:49.497] Exporting 'map' (4.43 KiB) to cluster node #1 ... DONE [18:01:49.498] Exporting 'inner_function' (1.78 KiB) to cluster node #1 ... [18:01:49.498] Exporting 'inner_function' (1.78 KiB) to cluster node #1 ... DONE [18:01:49.498] Exporting 3 global objects (7.52 KiB) to cluster node #1 ... DONE [18:01:49.499] MultisessionFuture started [18:01:49.499] - Launch lazy future ... done [18:01:49.499] run() for 'MultisessionFuture' ... done [18:01:49.499] result() for ClusterFuture ... [18:01:49.499] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.500] - Validating connection of MultisessionFuture [18:01:49.522] - received message: FutureResult [18:01:49.523] - Received FutureResult [18:01:49.523] - Erased future from FutureRegistry [18:01:49.523] result() for ClusterFuture ... [18:01:49.523] - result already collected: FutureResult [18:01:49.523] result() for ClusterFuture ... done [18:01:49.523] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.524] result() for ClusterFuture ... done [18:01:49.524] result() for ClusterFuture ... [18:01:49.524] - result already collected: FutureResult [18:01:49.524] result() for ClusterFuture ... done List of 2 $ : num [1:2] 2 3 $ : num [1:2] 2 3 [18:01:49.526] getGlobalsAndPackages() ... [18:01:49.526] Searching for globals... [18:01:49.531] - globals found: [16] '{', 'outer_function', 'map', ':', '~', 'inner_function', '.x', 'if', 'inherits', '<-', '[[', '-', 'eval', 'bquote', 'lapply', '+' [18:01:49.531] Searching for globals ... DONE [18:01:49.532] Resolving globals: FALSE [18:01:49.533] The total size of the 3 globals is 7.52 KiB (7704 bytes) [18:01:49.533] The total size of the 3 globals exported for future expression ('{; outer_function(1L); }') is 7.52 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'map' (4.43 KiB of class 'function'), 'inner_function' (1.78 KiB of class 'function') and 'outer_function' (1.31 KiB of class 'function') [18:01:49.533] - globals: [3] 'outer_function', 'map', 'inner_function' [18:01:49.534] [18:01:49.534] getGlobalsAndPackages() ... DONE [18:01:49.534] run() for 'Future' ... [18:01:49.534] - state: 'created' [18:01:49.534] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:49.550] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:49.550] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:49.550] - Field: 'node' [18:01:49.550] - Field: 'label' [18:01:49.550] - Field: 'local' [18:01:49.551] - Field: 'owner' [18:01:49.551] - Field: 'envir' [18:01:49.551] - Field: 'workers' [18:01:49.551] - Field: 'packages' [18:01:49.551] - Field: 'gc' [18:01:49.552] - Field: 'conditions' [18:01:49.552] - Field: 'persistent' [18:01:49.552] - Field: 'expr' [18:01:49.552] - Field: 'uuid' [18:01:49.552] - Field: 'seed' [18:01:49.552] - Field: 'version' [18:01:49.553] - Field: 'result' [18:01:49.553] - Field: 'asynchronous' [18:01:49.553] - Field: 'calls' [18:01:49.553] - Field: 'globals' [18:01:49.553] - Field: 'stdout' [18:01:49.553] - Field: 'earlySignal' [18:01:49.554] - Field: 'lazy' [18:01:49.554] - Field: 'state' [18:01:49.554] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:49.554] - Launch lazy future ... [18:01:49.555] Packages needed by the future expression (n = 0): [18:01:49.555] Packages needed by future strategies (n = 0): [18:01:49.555] { [18:01:49.555] { [18:01:49.555] { [18:01:49.555] ...future.startTime <- base::Sys.time() [18:01:49.555] { [18:01:49.555] { [18:01:49.555] { [18:01:49.555] { [18:01:49.555] base::local({ [18:01:49.555] has_future <- base::requireNamespace("future", [18:01:49.555] quietly = TRUE) [18:01:49.555] if (has_future) { [18:01:49.555] ns <- base::getNamespace("future") [18:01:49.555] version <- ns[[".package"]][["version"]] [18:01:49.555] if (is.null(version)) [18:01:49.555] version <- utils::packageVersion("future") [18:01:49.555] } [18:01:49.555] else { [18:01:49.555] version <- NULL [18:01:49.555] } [18:01:49.555] if (!has_future || version < "1.8.0") { [18:01:49.555] info <- base::c(r_version = base::gsub("R version ", [18:01:49.555] "", base::R.version$version.string), [18:01:49.555] platform = base::sprintf("%s (%s-bit)", [18:01:49.555] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:49.555] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:49.555] "release", "version")], collapse = " "), [18:01:49.555] hostname = base::Sys.info()[["nodename"]]) [18:01:49.555] info <- base::sprintf("%s: %s", base::names(info), [18:01:49.555] info) [18:01:49.555] info <- base::paste(info, collapse = "; ") [18:01:49.555] if (!has_future) { [18:01:49.555] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:49.555] info) [18:01:49.555] } [18:01:49.555] else { [18:01:49.555] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:49.555] info, version) [18:01:49.555] } [18:01:49.555] base::stop(msg) [18:01:49.555] } [18:01:49.555] }) [18:01:49.555] } [18:01:49.555] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:49.555] base::options(mc.cores = 1L) [18:01:49.555] } [18:01:49.555] options(future.plan = NULL) [18:01:49.555] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.555] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:49.555] } [18:01:49.555] ...future.workdir <- getwd() [18:01:49.555] } [18:01:49.555] ...future.oldOptions <- base::as.list(base::.Options) [18:01:49.555] ...future.oldEnvVars <- base::Sys.getenv() [18:01:49.555] } [18:01:49.555] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:49.555] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:49.555] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:49.555] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:49.555] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:49.555] future.stdout.windows.reencode = NULL, width = 80L) [18:01:49.555] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:49.555] base::names(...future.oldOptions)) [18:01:49.555] } [18:01:49.555] if (FALSE) { [18:01:49.555] } [18:01:49.555] else { [18:01:49.555] if (TRUE) { [18:01:49.555] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:49.555] open = "w") [18:01:49.555] } [18:01:49.555] else { [18:01:49.555] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:49.555] windows = "NUL", "/dev/null"), open = "w") [18:01:49.555] } [18:01:49.555] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:49.555] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:49.555] base::sink(type = "output", split = FALSE) [18:01:49.555] base::close(...future.stdout) [18:01:49.555] }, add = TRUE) [18:01:49.555] } [18:01:49.555] ...future.frame <- base::sys.nframe() [18:01:49.555] ...future.conditions <- base::list() [18:01:49.555] ...future.rng <- base::globalenv()$.Random.seed [18:01:49.555] if (FALSE) { [18:01:49.555] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:49.555] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:49.555] } [18:01:49.555] ...future.result <- base::tryCatch({ [18:01:49.555] base::withCallingHandlers({ [18:01:49.555] ...future.value <- base::withVisible(base::local({ [18:01:49.555] ...future.makeSendCondition <- local({ [18:01:49.555] sendCondition <- NULL [18:01:49.555] function(frame = 1L) { [18:01:49.555] if (is.function(sendCondition)) [18:01:49.555] return(sendCondition) [18:01:49.555] ns <- getNamespace("parallel") [18:01:49.555] if (exists("sendData", mode = "function", [18:01:49.555] envir = ns)) { [18:01:49.555] parallel_sendData <- get("sendData", mode = "function", [18:01:49.555] envir = ns) [18:01:49.555] envir <- sys.frame(frame) [18:01:49.555] master <- NULL [18:01:49.555] while (!identical(envir, .GlobalEnv) && [18:01:49.555] !identical(envir, emptyenv())) { [18:01:49.555] if (exists("master", mode = "list", envir = envir, [18:01:49.555] inherits = FALSE)) { [18:01:49.555] master <- get("master", mode = "list", [18:01:49.555] envir = envir, inherits = FALSE) [18:01:49.555] if (inherits(master, c("SOCKnode", [18:01:49.555] "SOCK0node"))) { [18:01:49.555] sendCondition <<- function(cond) { [18:01:49.555] data <- list(type = "VALUE", value = cond, [18:01:49.555] success = TRUE) [18:01:49.555] parallel_sendData(master, data) [18:01:49.555] } [18:01:49.555] return(sendCondition) [18:01:49.555] } [18:01:49.555] } [18:01:49.555] frame <- frame + 1L [18:01:49.555] envir <- sys.frame(frame) [18:01:49.555] } [18:01:49.555] } [18:01:49.555] sendCondition <<- function(cond) NULL [18:01:49.555] } [18:01:49.555] }) [18:01:49.555] withCallingHandlers({ [18:01:49.555] { [18:01:49.555] outer_function(1L) [18:01:49.555] } [18:01:49.555] }, immediateCondition = function(cond) { [18:01:49.555] sendCondition <- ...future.makeSendCondition() [18:01:49.555] sendCondition(cond) [18:01:49.555] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.555] { [18:01:49.555] inherits <- base::inherits [18:01:49.555] invokeRestart <- base::invokeRestart [18:01:49.555] is.null <- base::is.null [18:01:49.555] muffled <- FALSE [18:01:49.555] if (inherits(cond, "message")) { [18:01:49.555] muffled <- grepl(pattern, "muffleMessage") [18:01:49.555] if (muffled) [18:01:49.555] invokeRestart("muffleMessage") [18:01:49.555] } [18:01:49.555] else if (inherits(cond, "warning")) { [18:01:49.555] muffled <- grepl(pattern, "muffleWarning") [18:01:49.555] if (muffled) [18:01:49.555] invokeRestart("muffleWarning") [18:01:49.555] } [18:01:49.555] else if (inherits(cond, "condition")) { [18:01:49.555] if (!is.null(pattern)) { [18:01:49.555] computeRestarts <- base::computeRestarts [18:01:49.555] grepl <- base::grepl [18:01:49.555] restarts <- computeRestarts(cond) [18:01:49.555] for (restart in restarts) { [18:01:49.555] name <- restart$name [18:01:49.555] if (is.null(name)) [18:01:49.555] next [18:01:49.555] if (!grepl(pattern, name)) [18:01:49.555] next [18:01:49.555] invokeRestart(restart) [18:01:49.555] muffled <- TRUE [18:01:49.555] break [18:01:49.555] } [18:01:49.555] } [18:01:49.555] } [18:01:49.555] invisible(muffled) [18:01:49.555] } [18:01:49.555] muffleCondition(cond) [18:01:49.555] }) [18:01:49.555] })) [18:01:49.555] future::FutureResult(value = ...future.value$value, [18:01:49.555] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.555] ...future.rng), globalenv = if (FALSE) [18:01:49.555] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:49.555] ...future.globalenv.names)) [18:01:49.555] else NULL, started = ...future.startTime, version = "1.8") [18:01:49.555] }, condition = base::local({ [18:01:49.555] c <- base::c [18:01:49.555] inherits <- base::inherits [18:01:49.555] invokeRestart <- base::invokeRestart [18:01:49.555] length <- base::length [18:01:49.555] list <- base::list [18:01:49.555] seq.int <- base::seq.int [18:01:49.555] signalCondition <- base::signalCondition [18:01:49.555] sys.calls <- base::sys.calls [18:01:49.555] `[[` <- base::`[[` [18:01:49.555] `+` <- base::`+` [18:01:49.555] `<<-` <- base::`<<-` [18:01:49.555] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:49.555] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:49.555] 3L)] [18:01:49.555] } [18:01:49.555] function(cond) { [18:01:49.555] is_error <- inherits(cond, "error") [18:01:49.555] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:49.555] NULL) [18:01:49.555] if (is_error) { [18:01:49.555] sessionInformation <- function() { [18:01:49.555] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:49.555] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:49.555] search = base::search(), system = base::Sys.info()) [18:01:49.555] } [18:01:49.555] ...future.conditions[[length(...future.conditions) + [18:01:49.555] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:49.555] cond$call), session = sessionInformation(), [18:01:49.555] timestamp = base::Sys.time(), signaled = 0L) [18:01:49.555] signalCondition(cond) [18:01:49.555] } [18:01:49.555] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:49.555] "immediateCondition"))) { [18:01:49.555] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:49.555] ...future.conditions[[length(...future.conditions) + [18:01:49.555] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:49.555] if (TRUE && !signal) { [18:01:49.555] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.555] { [18:01:49.555] inherits <- base::inherits [18:01:49.555] invokeRestart <- base::invokeRestart [18:01:49.555] is.null <- base::is.null [18:01:49.555] muffled <- FALSE [18:01:49.555] if (inherits(cond, "message")) { [18:01:49.555] muffled <- grepl(pattern, "muffleMessage") [18:01:49.555] if (muffled) [18:01:49.555] invokeRestart("muffleMessage") [18:01:49.555] } [18:01:49.555] else if (inherits(cond, "warning")) { [18:01:49.555] muffled <- grepl(pattern, "muffleWarning") [18:01:49.555] if (muffled) [18:01:49.555] invokeRestart("muffleWarning") [18:01:49.555] } [18:01:49.555] else if (inherits(cond, "condition")) { [18:01:49.555] if (!is.null(pattern)) { [18:01:49.555] computeRestarts <- base::computeRestarts [18:01:49.555] grepl <- base::grepl [18:01:49.555] restarts <- computeRestarts(cond) [18:01:49.555] for (restart in restarts) { [18:01:49.555] name <- restart$name [18:01:49.555] if (is.null(name)) [18:01:49.555] next [18:01:49.555] if (!grepl(pattern, name)) [18:01:49.555] next [18:01:49.555] invokeRestart(restart) [18:01:49.555] muffled <- TRUE [18:01:49.555] break [18:01:49.555] } [18:01:49.555] } [18:01:49.555] } [18:01:49.555] invisible(muffled) [18:01:49.555] } [18:01:49.555] muffleCondition(cond, pattern = "^muffle") [18:01:49.555] } [18:01:49.555] } [18:01:49.555] else { [18:01:49.555] if (TRUE) { [18:01:49.555] muffleCondition <- function (cond, pattern = "^muffle") [18:01:49.555] { [18:01:49.555] inherits <- base::inherits [18:01:49.555] invokeRestart <- base::invokeRestart [18:01:49.555] is.null <- base::is.null [18:01:49.555] muffled <- FALSE [18:01:49.555] if (inherits(cond, "message")) { [18:01:49.555] muffled <- grepl(pattern, "muffleMessage") [18:01:49.555] if (muffled) [18:01:49.555] invokeRestart("muffleMessage") [18:01:49.555] } [18:01:49.555] else if (inherits(cond, "warning")) { [18:01:49.555] muffled <- grepl(pattern, "muffleWarning") [18:01:49.555] if (muffled) [18:01:49.555] invokeRestart("muffleWarning") [18:01:49.555] } [18:01:49.555] else if (inherits(cond, "condition")) { [18:01:49.555] if (!is.null(pattern)) { [18:01:49.555] computeRestarts <- base::computeRestarts [18:01:49.555] grepl <- base::grepl [18:01:49.555] restarts <- computeRestarts(cond) [18:01:49.555] for (restart in restarts) { [18:01:49.555] name <- restart$name [18:01:49.555] if (is.null(name)) [18:01:49.555] next [18:01:49.555] if (!grepl(pattern, name)) [18:01:49.555] next [18:01:49.555] invokeRestart(restart) [18:01:49.555] muffled <- TRUE [18:01:49.555] break [18:01:49.555] } [18:01:49.555] } [18:01:49.555] } [18:01:49.555] invisible(muffled) [18:01:49.555] } [18:01:49.555] muffleCondition(cond, pattern = "^muffle") [18:01:49.555] } [18:01:49.555] } [18:01:49.555] } [18:01:49.555] })) [18:01:49.555] }, error = function(ex) { [18:01:49.555] base::structure(base::list(value = NULL, visible = NULL, [18:01:49.555] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:49.555] ...future.rng), started = ...future.startTime, [18:01:49.555] finished = Sys.time(), session_uuid = NA_character_, [18:01:49.555] version = "1.8"), class = "FutureResult") [18:01:49.555] }, finally = { [18:01:49.555] if (!identical(...future.workdir, getwd())) [18:01:49.555] setwd(...future.workdir) [18:01:49.555] { [18:01:49.555] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:49.555] ...future.oldOptions$nwarnings <- NULL [18:01:49.555] } [18:01:49.555] base::options(...future.oldOptions) [18:01:49.555] if (.Platform$OS.type == "windows") { [18:01:49.555] old_names <- names(...future.oldEnvVars) [18:01:49.555] envs <- base::Sys.getenv() [18:01:49.555] names <- names(envs) [18:01:49.555] common <- intersect(names, old_names) [18:01:49.555] added <- setdiff(names, old_names) [18:01:49.555] removed <- setdiff(old_names, names) [18:01:49.555] changed <- common[...future.oldEnvVars[common] != [18:01:49.555] envs[common]] [18:01:49.555] NAMES <- toupper(changed) [18:01:49.555] args <- list() [18:01:49.555] for (kk in seq_along(NAMES)) { [18:01:49.555] name <- changed[[kk]] [18:01:49.555] NAME <- NAMES[[kk]] [18:01:49.555] if (name != NAME && is.element(NAME, old_names)) [18:01:49.555] next [18:01:49.555] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.555] } [18:01:49.555] NAMES <- toupper(added) [18:01:49.555] for (kk in seq_along(NAMES)) { [18:01:49.555] name <- added[[kk]] [18:01:49.555] NAME <- NAMES[[kk]] [18:01:49.555] if (name != NAME && is.element(NAME, old_names)) [18:01:49.555] next [18:01:49.555] args[[name]] <- "" [18:01:49.555] } [18:01:49.555] NAMES <- toupper(removed) [18:01:49.555] for (kk in seq_along(NAMES)) { [18:01:49.555] name <- removed[[kk]] [18:01:49.555] NAME <- NAMES[[kk]] [18:01:49.555] if (name != NAME && is.element(NAME, old_names)) [18:01:49.555] next [18:01:49.555] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:49.555] } [18:01:49.555] if (length(args) > 0) [18:01:49.555] base::do.call(base::Sys.setenv, args = args) [18:01:49.555] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:49.555] } [18:01:49.555] else { [18:01:49.555] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:49.555] } [18:01:49.555] { [18:01:49.555] if (base::length(...future.futureOptionsAdded) > [18:01:49.555] 0L) { [18:01:49.555] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:49.555] base::names(opts) <- ...future.futureOptionsAdded [18:01:49.555] base::options(opts) [18:01:49.555] } [18:01:49.555] { [18:01:49.555] { [18:01:49.555] base::options(mc.cores = ...future.mc.cores.old) [18:01:49.555] NULL [18:01:49.555] } [18:01:49.555] options(future.plan = NULL) [18:01:49.555] if (is.na(NA_character_)) [18:01:49.555] Sys.unsetenv("R_FUTURE_PLAN") [18:01:49.555] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:49.555] future::plan(list(function (..., workers = availableCores(), [18:01:49.555] lazy = FALSE, rscript_libs = .libPaths(), [18:01:49.555] envir = parent.frame()) [18:01:49.555] { [18:01:49.555] if (is.function(workers)) [18:01:49.555] workers <- workers() [18:01:49.555] workers <- structure(as.integer(workers), [18:01:49.555] class = class(workers)) [18:01:49.555] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:49.555] workers >= 1) [18:01:49.555] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:49.555] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:49.555] } [18:01:49.555] future <- MultisessionFuture(..., workers = workers, [18:01:49.555] lazy = lazy, rscript_libs = rscript_libs, [18:01:49.555] envir = envir) [18:01:49.555] if (!future$lazy) [18:01:49.555] future <- run(future) [18:01:49.555] invisible(future) [18:01:49.555] }), .cleanup = FALSE, .init = FALSE) [18:01:49.555] } [18:01:49.555] } [18:01:49.555] } [18:01:49.555] }) [18:01:49.555] if (TRUE) { [18:01:49.555] base::sink(type = "output", split = FALSE) [18:01:49.555] if (TRUE) { [18:01:49.555] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:49.555] } [18:01:49.555] else { [18:01:49.555] ...future.result["stdout"] <- base::list(NULL) [18:01:49.555] } [18:01:49.555] base::close(...future.stdout) [18:01:49.555] ...future.stdout <- NULL [18:01:49.555] } [18:01:49.555] ...future.result$conditions <- ...future.conditions [18:01:49.555] ...future.result$finished <- base::Sys.time() [18:01:49.555] ...future.result [18:01:49.555] } [18:01:49.561] Exporting 3 global objects (7.52 KiB) to cluster node #1 ... [18:01:49.561] Exporting 'outer_function' (1.31 KiB) to cluster node #1 ... [18:01:49.561] Exporting 'outer_function' (1.31 KiB) to cluster node #1 ... DONE [18:01:49.561] Exporting 'map' (4.43 KiB) to cluster node #1 ... [18:01:49.562] Exporting 'map' (4.43 KiB) to cluster node #1 ... DONE [18:01:49.562] Exporting 'inner_function' (1.78 KiB) to cluster node #1 ... [18:01:49.562] Exporting 'inner_function' (1.78 KiB) to cluster node #1 ... DONE [18:01:49.563] Exporting 3 global objects (7.52 KiB) to cluster node #1 ... DONE [18:01:49.563] MultisessionFuture started [18:01:49.563] - Launch lazy future ... done [18:01:49.564] run() for 'MultisessionFuture' ... done [18:01:49.564] result() for ClusterFuture ... [18:01:49.564] receiveMessageFromWorker() for ClusterFuture ... [18:01:49.564] - Validating connection of MultisessionFuture [18:01:49.582] - received message: FutureResult [18:01:49.582] - Received FutureResult [18:01:49.582] - Erased future from FutureRegistry [18:01:49.582] result() for ClusterFuture ... [18:01:49.582] - result already collected: FutureResult [18:01:49.583] result() for ClusterFuture ... done [18:01:49.583] receiveMessageFromWorker() for ClusterFuture ... done [18:01:49.583] result() for ClusterFuture ... done [18:01:49.583] result() for ClusterFuture ... [18:01:49.583] - result already collected: FutureResult [18:01:49.583] result() for ClusterFuture ... done List of 2 $ : num [1:2] 2 3 $ : num [1:2] 2 3 Testing with 2 cores ... DONE > > message("*** Globals - formulas ... DONE") *** Globals - formulas ... DONE > > source("incl/end.R") [18:01:49.586] plan(): Setting new future strategy stack: [18:01:49.586] List of future strategies: [18:01:49.586] 1. FutureStrategy: [18:01:49.586] - args: function (..., envir = parent.frame()) [18:01:49.586] - tweaked: FALSE [18:01:49.586] - call: future::plan(oplan) [18:01:49.587] plan(): nbrOfWorkers() = 1 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 1.31 0.07 2.40