R Under development (unstable) (2024-07-28 r86931 ucrt) -- "Unsuffered Consequences" Copyright (C) 2024 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") [17:27:34.101] plan(): Setting new future strategy stack: [17:27:34.103] List of future strategies: [17:27:34.103] 1. sequential: [17:27:34.103] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.103] - tweaked: FALSE [17:27:34.103] - call: future::plan("sequential") [17:27:34.124] plan(): nbrOfWorkers() = 1 > library("listenv") > > ## Backward compatibility > if (getRversion() < "3.2.0") { + names <- function(x) { + if (class(x)[1] == "environment") { + ls(envir = x, all.names = TRUE) + } else { + base::names(x) + } + } + } > > dims <- list( + NULL, + c(1, 6), + c(2, 3), + c(2, 3, 1), + c(2, 1, 3, 1) + ) > > > message("*** futures() / resolved() / value() ...") *** futures() / resolved() / value() ... > > for (cores in 1:availCores) { + message(sprintf("Testing with %d cores ...", cores)) + options(mc.cores = cores) + + for (type in c("list", "environment", "listenv")) { + message(sprintf("Type of object: %s", type)) + + for (strategy in supportedStrategies(cores)) { + message("Type of future: ", strategy) + plan(strategy) + + for (dim in dims) { + message("Dimensions: ", deparse(dim)) + + if (type == "list") { + x <- list() + } else if (type == "listenv") { + x <- listenv() + } else if (type == "environment") { + x <- new.env() + } + + x$a <- 1 + x$b <- future(2) + x$c <- future(NULL) + if (type != "list") x$d %<-% { 4 } + if (type != "environment") x[[6]] <- 6 + str(x) + + if (!is.null(dim)) { + if (type != "environment") { + names <- names(x) + dim(x) <- dim + dimnames(x) <- lapply(dim, FUN = function(n) letters[1:n]) + names(x) <- names + } + } + + f <- futures(x) + str(f) + if (type != "environment") { + stopifnot(length(f) == length(x)) + stopifnot(identical(names(f), names(x))) + } + stopifnot(identical(dim(f), dim(x))) + stopifnot(identical(dimnames(f), dimnames(x))) + + r <- resolved(x) + str(r) + if (type != "environment") { + stopifnot(length(r) == length(x)) + stopifnot(identical(names(r), names(x))) + } + stopifnot(identical(dim(r), dim(x))) + stopifnot(identical(dimnames(r), dimnames(x))) + + v <- value(x) + str(v) + if (type != "environment") { + stopifnot(length(v) == length(x)) + stopifnot(identical(names(v), names(x))) + } + stopifnot(identical(dim(v), dim(x))) + stopifnot(identical(dimnames(v), dimnames(x))) + } # for (dim ...) + } # for (strategy ...) + + message(sprintf("*** futures() - %s ... DONE", type)) + } # for (type ...) + + message(sprintf("Testing with %d cores ... DONE", cores)) + } ## for (cores ...) Testing with 1 cores ... Type of object: list Type of future: sequential [17:27:34.222] plan(): Setting new future strategy stack: [17:27:34.223] List of future strategies: [17:27:34.223] 1. sequential: [17:27:34.223] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.223] - tweaked: FALSE [17:27:34.223] - call: plan(strategy) [17:27:34.247] plan(): nbrOfWorkers() = 1 Dimensions: NULL [17:27:34.249] getGlobalsAndPackages() ... [17:27:34.249] Searching for globals... [17:27:34.253] [17:27:34.254] Searching for globals ... DONE [17:27:34.254] - globals: [0] [17:27:34.254] getGlobalsAndPackages() ... DONE [17:27:34.256] run() for 'Future' ... [17:27:34.256] - state: 'created' [17:27:34.256] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.257] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.258] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.258] - Field: 'label' [17:27:34.258] - Field: 'local' [17:27:34.258] - Field: 'owner' [17:27:34.259] - Field: 'envir' [17:27:34.259] - Field: 'packages' [17:27:34.259] - Field: 'gc' [17:27:34.260] - Field: 'conditions' [17:27:34.260] - Field: 'expr' [17:27:34.260] - Field: 'uuid' [17:27:34.260] - Field: 'seed' [17:27:34.261] - Field: 'version' [17:27:34.261] - Field: 'result' [17:27:34.261] - Field: 'asynchronous' [17:27:34.261] - Field: 'calls' [17:27:34.262] - Field: 'globals' [17:27:34.262] - Field: 'stdout' [17:27:34.262] - Field: 'earlySignal' [17:27:34.263] - Field: 'lazy' [17:27:34.263] - Field: 'state' [17:27:34.263] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.263] - Launch lazy future ... [17:27:34.265] Packages needed by the future expression (n = 0): [17:27:34.265] Packages needed by future strategies (n = 0): [17:27:34.267] { [17:27:34.267] { [17:27:34.267] { [17:27:34.267] ...future.startTime <- base::Sys.time() [17:27:34.267] { [17:27:34.267] { [17:27:34.267] { [17:27:34.267] base::local({ [17:27:34.267] has_future <- base::requireNamespace("future", [17:27:34.267] quietly = TRUE) [17:27:34.267] if (has_future) { [17:27:34.267] ns <- base::getNamespace("future") [17:27:34.267] version <- ns[[".package"]][["version"]] [17:27:34.267] if (is.null(version)) [17:27:34.267] version <- utils::packageVersion("future") [17:27:34.267] } [17:27:34.267] else { [17:27:34.267] version <- NULL [17:27:34.267] } [17:27:34.267] if (!has_future || version < "1.8.0") { [17:27:34.267] info <- base::c(r_version = base::gsub("R version ", [17:27:34.267] "", base::R.version$version.string), [17:27:34.267] platform = base::sprintf("%s (%s-bit)", [17:27:34.267] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.267] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.267] "release", "version")], collapse = " "), [17:27:34.267] hostname = base::Sys.info()[["nodename"]]) [17:27:34.267] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.267] info) [17:27:34.267] info <- base::paste(info, collapse = "; ") [17:27:34.267] if (!has_future) { [17:27:34.267] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.267] info) [17:27:34.267] } [17:27:34.267] else { [17:27:34.267] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.267] info, version) [17:27:34.267] } [17:27:34.267] base::stop(msg) [17:27:34.267] } [17:27:34.267] }) [17:27:34.267] } [17:27:34.267] ...future.strategy.old <- future::plan("list") [17:27:34.267] options(future.plan = NULL) [17:27:34.267] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.267] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.267] } [17:27:34.267] ...future.workdir <- getwd() [17:27:34.267] } [17:27:34.267] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.267] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.267] } [17:27:34.267] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.267] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.267] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.267] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.267] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.267] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.267] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.267] base::names(...future.oldOptions)) [17:27:34.267] } [17:27:34.267] if (FALSE) { [17:27:34.267] } [17:27:34.267] else { [17:27:34.267] if (TRUE) { [17:27:34.267] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.267] open = "w") [17:27:34.267] } [17:27:34.267] else { [17:27:34.267] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.267] windows = "NUL", "/dev/null"), open = "w") [17:27:34.267] } [17:27:34.267] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.267] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.267] base::sink(type = "output", split = FALSE) [17:27:34.267] base::close(...future.stdout) [17:27:34.267] }, add = TRUE) [17:27:34.267] } [17:27:34.267] ...future.frame <- base::sys.nframe() [17:27:34.267] ...future.conditions <- base::list() [17:27:34.267] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.267] if (FALSE) { [17:27:34.267] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.267] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.267] } [17:27:34.267] ...future.result <- base::tryCatch({ [17:27:34.267] base::withCallingHandlers({ [17:27:34.267] ...future.value <- base::withVisible(base::local(2)) [17:27:34.267] future::FutureResult(value = ...future.value$value, [17:27:34.267] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.267] ...future.rng), globalenv = if (FALSE) [17:27:34.267] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.267] ...future.globalenv.names)) [17:27:34.267] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.267] }, condition = base::local({ [17:27:34.267] c <- base::c [17:27:34.267] inherits <- base::inherits [17:27:34.267] invokeRestart <- base::invokeRestart [17:27:34.267] length <- base::length [17:27:34.267] list <- base::list [17:27:34.267] seq.int <- base::seq.int [17:27:34.267] signalCondition <- base::signalCondition [17:27:34.267] sys.calls <- base::sys.calls [17:27:34.267] `[[` <- base::`[[` [17:27:34.267] `+` <- base::`+` [17:27:34.267] `<<-` <- base::`<<-` [17:27:34.267] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.267] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.267] 3L)] [17:27:34.267] } [17:27:34.267] function(cond) { [17:27:34.267] is_error <- inherits(cond, "error") [17:27:34.267] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.267] NULL) [17:27:34.267] if (is_error) { [17:27:34.267] sessionInformation <- function() { [17:27:34.267] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.267] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.267] search = base::search(), system = base::Sys.info()) [17:27:34.267] } [17:27:34.267] ...future.conditions[[length(...future.conditions) + [17:27:34.267] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.267] cond$call), session = sessionInformation(), [17:27:34.267] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.267] signalCondition(cond) [17:27:34.267] } [17:27:34.267] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.267] "immediateCondition"))) { [17:27:34.267] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.267] ...future.conditions[[length(...future.conditions) + [17:27:34.267] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.267] if (TRUE && !signal) { [17:27:34.267] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.267] { [17:27:34.267] inherits <- base::inherits [17:27:34.267] invokeRestart <- base::invokeRestart [17:27:34.267] is.null <- base::is.null [17:27:34.267] muffled <- FALSE [17:27:34.267] if (inherits(cond, "message")) { [17:27:34.267] muffled <- grepl(pattern, "muffleMessage") [17:27:34.267] if (muffled) [17:27:34.267] invokeRestart("muffleMessage") [17:27:34.267] } [17:27:34.267] else if (inherits(cond, "warning")) { [17:27:34.267] muffled <- grepl(pattern, "muffleWarning") [17:27:34.267] if (muffled) [17:27:34.267] invokeRestart("muffleWarning") [17:27:34.267] } [17:27:34.267] else if (inherits(cond, "condition")) { [17:27:34.267] if (!is.null(pattern)) { [17:27:34.267] computeRestarts <- base::computeRestarts [17:27:34.267] grepl <- base::grepl [17:27:34.267] restarts <- computeRestarts(cond) [17:27:34.267] for (restart in restarts) { [17:27:34.267] name <- restart$name [17:27:34.267] if (is.null(name)) [17:27:34.267] next [17:27:34.267] if (!grepl(pattern, name)) [17:27:34.267] next [17:27:34.267] invokeRestart(restart) [17:27:34.267] muffled <- TRUE [17:27:34.267] break [17:27:34.267] } [17:27:34.267] } [17:27:34.267] } [17:27:34.267] invisible(muffled) [17:27:34.267] } [17:27:34.267] muffleCondition(cond, pattern = "^muffle") [17:27:34.267] } [17:27:34.267] } [17:27:34.267] else { [17:27:34.267] if (TRUE) { [17:27:34.267] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.267] { [17:27:34.267] inherits <- base::inherits [17:27:34.267] invokeRestart <- base::invokeRestart [17:27:34.267] is.null <- base::is.null [17:27:34.267] muffled <- FALSE [17:27:34.267] if (inherits(cond, "message")) { [17:27:34.267] muffled <- grepl(pattern, "muffleMessage") [17:27:34.267] if (muffled) [17:27:34.267] invokeRestart("muffleMessage") [17:27:34.267] } [17:27:34.267] else if (inherits(cond, "warning")) { [17:27:34.267] muffled <- grepl(pattern, "muffleWarning") [17:27:34.267] if (muffled) [17:27:34.267] invokeRestart("muffleWarning") [17:27:34.267] } [17:27:34.267] else if (inherits(cond, "condition")) { [17:27:34.267] if (!is.null(pattern)) { [17:27:34.267] computeRestarts <- base::computeRestarts [17:27:34.267] grepl <- base::grepl [17:27:34.267] restarts <- computeRestarts(cond) [17:27:34.267] for (restart in restarts) { [17:27:34.267] name <- restart$name [17:27:34.267] if (is.null(name)) [17:27:34.267] next [17:27:34.267] if (!grepl(pattern, name)) [17:27:34.267] next [17:27:34.267] invokeRestart(restart) [17:27:34.267] muffled <- TRUE [17:27:34.267] break [17:27:34.267] } [17:27:34.267] } [17:27:34.267] } [17:27:34.267] invisible(muffled) [17:27:34.267] } [17:27:34.267] muffleCondition(cond, pattern = "^muffle") [17:27:34.267] } [17:27:34.267] } [17:27:34.267] } [17:27:34.267] })) [17:27:34.267] }, error = function(ex) { [17:27:34.267] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.267] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.267] ...future.rng), started = ...future.startTime, [17:27:34.267] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.267] version = "1.8"), class = "FutureResult") [17:27:34.267] }, finally = { [17:27:34.267] if (!identical(...future.workdir, getwd())) [17:27:34.267] setwd(...future.workdir) [17:27:34.267] { [17:27:34.267] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.267] ...future.oldOptions$nwarnings <- NULL [17:27:34.267] } [17:27:34.267] base::options(...future.oldOptions) [17:27:34.267] if (.Platform$OS.type == "windows") { [17:27:34.267] old_names <- names(...future.oldEnvVars) [17:27:34.267] envs <- base::Sys.getenv() [17:27:34.267] names <- names(envs) [17:27:34.267] common <- intersect(names, old_names) [17:27:34.267] added <- setdiff(names, old_names) [17:27:34.267] removed <- setdiff(old_names, names) [17:27:34.267] changed <- common[...future.oldEnvVars[common] != [17:27:34.267] envs[common]] [17:27:34.267] NAMES <- toupper(changed) [17:27:34.267] args <- list() [17:27:34.267] for (kk in seq_along(NAMES)) { [17:27:34.267] name <- changed[[kk]] [17:27:34.267] NAME <- NAMES[[kk]] [17:27:34.267] if (name != NAME && is.element(NAME, old_names)) [17:27:34.267] next [17:27:34.267] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.267] } [17:27:34.267] NAMES <- toupper(added) [17:27:34.267] for (kk in seq_along(NAMES)) { [17:27:34.267] name <- added[[kk]] [17:27:34.267] NAME <- NAMES[[kk]] [17:27:34.267] if (name != NAME && is.element(NAME, old_names)) [17:27:34.267] next [17:27:34.267] args[[name]] <- "" [17:27:34.267] } [17:27:34.267] NAMES <- toupper(removed) [17:27:34.267] for (kk in seq_along(NAMES)) { [17:27:34.267] name <- removed[[kk]] [17:27:34.267] NAME <- NAMES[[kk]] [17:27:34.267] if (name != NAME && is.element(NAME, old_names)) [17:27:34.267] next [17:27:34.267] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.267] } [17:27:34.267] if (length(args) > 0) [17:27:34.267] base::do.call(base::Sys.setenv, args = args) [17:27:34.267] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.267] } [17:27:34.267] else { [17:27:34.267] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.267] } [17:27:34.267] { [17:27:34.267] if (base::length(...future.futureOptionsAdded) > [17:27:34.267] 0L) { [17:27:34.267] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.267] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.267] base::options(opts) [17:27:34.267] } [17:27:34.267] { [17:27:34.267] { [17:27:34.267] NULL [17:27:34.267] RNGkind("Mersenne-Twister") [17:27:34.267] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.267] inherits = FALSE) [17:27:34.267] } [17:27:34.267] options(future.plan = NULL) [17:27:34.267] if (is.na(NA_character_)) [17:27:34.267] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.267] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.267] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.267] .init = FALSE) [17:27:34.267] } [17:27:34.267] } [17:27:34.267] } [17:27:34.267] }) [17:27:34.267] if (TRUE) { [17:27:34.267] base::sink(type = "output", split = FALSE) [17:27:34.267] if (TRUE) { [17:27:34.267] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.267] } [17:27:34.267] else { [17:27:34.267] ...future.result["stdout"] <- base::list(NULL) [17:27:34.267] } [17:27:34.267] base::close(...future.stdout) [17:27:34.267] ...future.stdout <- NULL [17:27:34.267] } [17:27:34.267] ...future.result$conditions <- ...future.conditions [17:27:34.267] ...future.result$finished <- base::Sys.time() [17:27:34.267] ...future.result [17:27:34.267] } [17:27:34.275] plan(): Setting new future strategy stack: [17:27:34.276] List of future strategies: [17:27:34.276] 1. sequential: [17:27:34.276] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.276] - tweaked: FALSE [17:27:34.276] - call: NULL [17:27:34.277] plan(): nbrOfWorkers() = 1 [17:27:34.281] plan(): Setting new future strategy stack: [17:27:34.281] List of future strategies: [17:27:34.281] 1. sequential: [17:27:34.281] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.281] - tweaked: FALSE [17:27:34.281] - call: plan(strategy) [17:27:34.282] plan(): nbrOfWorkers() = 1 [17:27:34.282] SequentialFuture started (and completed) [17:27:34.283] - Launch lazy future ... done [17:27:34.284] run() for 'SequentialFuture' ... done [17:27:34.284] getGlobalsAndPackages() ... [17:27:34.284] Searching for globals... [17:27:34.285] [17:27:34.286] Searching for globals ... DONE [17:27:34.286] - globals: [0] [17:27:34.286] getGlobalsAndPackages() ... DONE [17:27:34.287] run() for 'Future' ... [17:27:34.287] - state: 'created' [17:27:34.288] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.288] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.288] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.289] - Field: 'label' [17:27:34.289] - Field: 'local' [17:27:34.289] - Field: 'owner' [17:27:34.290] - Field: 'envir' [17:27:34.290] - Field: 'packages' [17:27:34.290] - Field: 'gc' [17:27:34.291] - Field: 'conditions' [17:27:34.291] - Field: 'expr' [17:27:34.291] - Field: 'uuid' [17:27:34.291] - Field: 'seed' [17:27:34.292] - Field: 'version' [17:27:34.292] - Field: 'result' [17:27:34.293] - Field: 'asynchronous' [17:27:34.293] - Field: 'calls' [17:27:34.293] - Field: 'globals' [17:27:34.294] - Field: 'stdout' [17:27:34.294] - Field: 'earlySignal' [17:27:34.294] - Field: 'lazy' [17:27:34.295] - Field: 'state' [17:27:34.295] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.295] - Launch lazy future ... [17:27:34.296] Packages needed by the future expression (n = 0): [17:27:34.296] Packages needed by future strategies (n = 0): [17:27:34.298] { [17:27:34.298] { [17:27:34.298] { [17:27:34.298] ...future.startTime <- base::Sys.time() [17:27:34.298] { [17:27:34.298] { [17:27:34.298] { [17:27:34.298] base::local({ [17:27:34.298] has_future <- base::requireNamespace("future", [17:27:34.298] quietly = TRUE) [17:27:34.298] if (has_future) { [17:27:34.298] ns <- base::getNamespace("future") [17:27:34.298] version <- ns[[".package"]][["version"]] [17:27:34.298] if (is.null(version)) [17:27:34.298] version <- utils::packageVersion("future") [17:27:34.298] } [17:27:34.298] else { [17:27:34.298] version <- NULL [17:27:34.298] } [17:27:34.298] if (!has_future || version < "1.8.0") { [17:27:34.298] info <- base::c(r_version = base::gsub("R version ", [17:27:34.298] "", base::R.version$version.string), [17:27:34.298] platform = base::sprintf("%s (%s-bit)", [17:27:34.298] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.298] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.298] "release", "version")], collapse = " "), [17:27:34.298] hostname = base::Sys.info()[["nodename"]]) [17:27:34.298] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.298] info) [17:27:34.298] info <- base::paste(info, collapse = "; ") [17:27:34.298] if (!has_future) { [17:27:34.298] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.298] info) [17:27:34.298] } [17:27:34.298] else { [17:27:34.298] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.298] info, version) [17:27:34.298] } [17:27:34.298] base::stop(msg) [17:27:34.298] } [17:27:34.298] }) [17:27:34.298] } [17:27:34.298] ...future.strategy.old <- future::plan("list") [17:27:34.298] options(future.plan = NULL) [17:27:34.298] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.298] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.298] } [17:27:34.298] ...future.workdir <- getwd() [17:27:34.298] } [17:27:34.298] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.298] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.298] } [17:27:34.298] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.298] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.298] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.298] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.298] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.298] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.298] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.298] base::names(...future.oldOptions)) [17:27:34.298] } [17:27:34.298] if (FALSE) { [17:27:34.298] } [17:27:34.298] else { [17:27:34.298] if (TRUE) { [17:27:34.298] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.298] open = "w") [17:27:34.298] } [17:27:34.298] else { [17:27:34.298] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.298] windows = "NUL", "/dev/null"), open = "w") [17:27:34.298] } [17:27:34.298] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.298] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.298] base::sink(type = "output", split = FALSE) [17:27:34.298] base::close(...future.stdout) [17:27:34.298] }, add = TRUE) [17:27:34.298] } [17:27:34.298] ...future.frame <- base::sys.nframe() [17:27:34.298] ...future.conditions <- base::list() [17:27:34.298] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.298] if (FALSE) { [17:27:34.298] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.298] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.298] } [17:27:34.298] ...future.result <- base::tryCatch({ [17:27:34.298] base::withCallingHandlers({ [17:27:34.298] ...future.value <- base::withVisible(base::local(NULL)) [17:27:34.298] future::FutureResult(value = ...future.value$value, [17:27:34.298] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.298] ...future.rng), globalenv = if (FALSE) [17:27:34.298] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.298] ...future.globalenv.names)) [17:27:34.298] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.298] }, condition = base::local({ [17:27:34.298] c <- base::c [17:27:34.298] inherits <- base::inherits [17:27:34.298] invokeRestart <- base::invokeRestart [17:27:34.298] length <- base::length [17:27:34.298] list <- base::list [17:27:34.298] seq.int <- base::seq.int [17:27:34.298] signalCondition <- base::signalCondition [17:27:34.298] sys.calls <- base::sys.calls [17:27:34.298] `[[` <- base::`[[` [17:27:34.298] `+` <- base::`+` [17:27:34.298] `<<-` <- base::`<<-` [17:27:34.298] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.298] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.298] 3L)] [17:27:34.298] } [17:27:34.298] function(cond) { [17:27:34.298] is_error <- inherits(cond, "error") [17:27:34.298] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.298] NULL) [17:27:34.298] if (is_error) { [17:27:34.298] sessionInformation <- function() { [17:27:34.298] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.298] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.298] search = base::search(), system = base::Sys.info()) [17:27:34.298] } [17:27:34.298] ...future.conditions[[length(...future.conditions) + [17:27:34.298] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.298] cond$call), session = sessionInformation(), [17:27:34.298] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.298] signalCondition(cond) [17:27:34.298] } [17:27:34.298] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.298] "immediateCondition"))) { [17:27:34.298] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.298] ...future.conditions[[length(...future.conditions) + [17:27:34.298] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.298] if (TRUE && !signal) { [17:27:34.298] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.298] { [17:27:34.298] inherits <- base::inherits [17:27:34.298] invokeRestart <- base::invokeRestart [17:27:34.298] is.null <- base::is.null [17:27:34.298] muffled <- FALSE [17:27:34.298] if (inherits(cond, "message")) { [17:27:34.298] muffled <- grepl(pattern, "muffleMessage") [17:27:34.298] if (muffled) [17:27:34.298] invokeRestart("muffleMessage") [17:27:34.298] } [17:27:34.298] else if (inherits(cond, "warning")) { [17:27:34.298] muffled <- grepl(pattern, "muffleWarning") [17:27:34.298] if (muffled) [17:27:34.298] invokeRestart("muffleWarning") [17:27:34.298] } [17:27:34.298] else if (inherits(cond, "condition")) { [17:27:34.298] if (!is.null(pattern)) { [17:27:34.298] computeRestarts <- base::computeRestarts [17:27:34.298] grepl <- base::grepl [17:27:34.298] restarts <- computeRestarts(cond) [17:27:34.298] for (restart in restarts) { [17:27:34.298] name <- restart$name [17:27:34.298] if (is.null(name)) [17:27:34.298] next [17:27:34.298] if (!grepl(pattern, name)) [17:27:34.298] next [17:27:34.298] invokeRestart(restart) [17:27:34.298] muffled <- TRUE [17:27:34.298] break [17:27:34.298] } [17:27:34.298] } [17:27:34.298] } [17:27:34.298] invisible(muffled) [17:27:34.298] } [17:27:34.298] muffleCondition(cond, pattern = "^muffle") [17:27:34.298] } [17:27:34.298] } [17:27:34.298] else { [17:27:34.298] if (TRUE) { [17:27:34.298] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.298] { [17:27:34.298] inherits <- base::inherits [17:27:34.298] invokeRestart <- base::invokeRestart [17:27:34.298] is.null <- base::is.null [17:27:34.298] muffled <- FALSE [17:27:34.298] if (inherits(cond, "message")) { [17:27:34.298] muffled <- grepl(pattern, "muffleMessage") [17:27:34.298] if (muffled) [17:27:34.298] invokeRestart("muffleMessage") [17:27:34.298] } [17:27:34.298] else if (inherits(cond, "warning")) { [17:27:34.298] muffled <- grepl(pattern, "muffleWarning") [17:27:34.298] if (muffled) [17:27:34.298] invokeRestart("muffleWarning") [17:27:34.298] } [17:27:34.298] else if (inherits(cond, "condition")) { [17:27:34.298] if (!is.null(pattern)) { [17:27:34.298] computeRestarts <- base::computeRestarts [17:27:34.298] grepl <- base::grepl [17:27:34.298] restarts <- computeRestarts(cond) [17:27:34.298] for (restart in restarts) { [17:27:34.298] name <- restart$name [17:27:34.298] if (is.null(name)) [17:27:34.298] next [17:27:34.298] if (!grepl(pattern, name)) [17:27:34.298] next [17:27:34.298] invokeRestart(restart) [17:27:34.298] muffled <- TRUE [17:27:34.298] break [17:27:34.298] } [17:27:34.298] } [17:27:34.298] } [17:27:34.298] invisible(muffled) [17:27:34.298] } [17:27:34.298] muffleCondition(cond, pattern = "^muffle") [17:27:34.298] } [17:27:34.298] } [17:27:34.298] } [17:27:34.298] })) [17:27:34.298] }, error = function(ex) { [17:27:34.298] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.298] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.298] ...future.rng), started = ...future.startTime, [17:27:34.298] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.298] version = "1.8"), class = "FutureResult") [17:27:34.298] }, finally = { [17:27:34.298] if (!identical(...future.workdir, getwd())) [17:27:34.298] setwd(...future.workdir) [17:27:34.298] { [17:27:34.298] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.298] ...future.oldOptions$nwarnings <- NULL [17:27:34.298] } [17:27:34.298] base::options(...future.oldOptions) [17:27:34.298] if (.Platform$OS.type == "windows") { [17:27:34.298] old_names <- names(...future.oldEnvVars) [17:27:34.298] envs <- base::Sys.getenv() [17:27:34.298] names <- names(envs) [17:27:34.298] common <- intersect(names, old_names) [17:27:34.298] added <- setdiff(names, old_names) [17:27:34.298] removed <- setdiff(old_names, names) [17:27:34.298] changed <- common[...future.oldEnvVars[common] != [17:27:34.298] envs[common]] [17:27:34.298] NAMES <- toupper(changed) [17:27:34.298] args <- list() [17:27:34.298] for (kk in seq_along(NAMES)) { [17:27:34.298] name <- changed[[kk]] [17:27:34.298] NAME <- NAMES[[kk]] [17:27:34.298] if (name != NAME && is.element(NAME, old_names)) [17:27:34.298] next [17:27:34.298] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.298] } [17:27:34.298] NAMES <- toupper(added) [17:27:34.298] for (kk in seq_along(NAMES)) { [17:27:34.298] name <- added[[kk]] [17:27:34.298] NAME <- NAMES[[kk]] [17:27:34.298] if (name != NAME && is.element(NAME, old_names)) [17:27:34.298] next [17:27:34.298] args[[name]] <- "" [17:27:34.298] } [17:27:34.298] NAMES <- toupper(removed) [17:27:34.298] for (kk in seq_along(NAMES)) { [17:27:34.298] name <- removed[[kk]] [17:27:34.298] NAME <- NAMES[[kk]] [17:27:34.298] if (name != NAME && is.element(NAME, old_names)) [17:27:34.298] next [17:27:34.298] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.298] } [17:27:34.298] if (length(args) > 0) [17:27:34.298] base::do.call(base::Sys.setenv, args = args) [17:27:34.298] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.298] } [17:27:34.298] else { [17:27:34.298] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.298] } [17:27:34.298] { [17:27:34.298] if (base::length(...future.futureOptionsAdded) > [17:27:34.298] 0L) { [17:27:34.298] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.298] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.298] base::options(opts) [17:27:34.298] } [17:27:34.298] { [17:27:34.298] { [17:27:34.298] NULL [17:27:34.298] RNGkind("Mersenne-Twister") [17:27:34.298] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.298] inherits = FALSE) [17:27:34.298] } [17:27:34.298] options(future.plan = NULL) [17:27:34.298] if (is.na(NA_character_)) [17:27:34.298] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.298] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.298] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.298] .init = FALSE) [17:27:34.298] } [17:27:34.298] } [17:27:34.298] } [17:27:34.298] }) [17:27:34.298] if (TRUE) { [17:27:34.298] base::sink(type = "output", split = FALSE) [17:27:34.298] if (TRUE) { [17:27:34.298] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.298] } [17:27:34.298] else { [17:27:34.298] ...future.result["stdout"] <- base::list(NULL) [17:27:34.298] } [17:27:34.298] base::close(...future.stdout) [17:27:34.298] ...future.stdout <- NULL [17:27:34.298] } [17:27:34.298] ...future.result$conditions <- ...future.conditions [17:27:34.298] ...future.result$finished <- base::Sys.time() [17:27:34.298] ...future.result [17:27:34.298] } [17:27:34.305] plan(): Setting new future strategy stack: [17:27:34.306] List of future strategies: [17:27:34.306] 1. sequential: [17:27:34.306] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.306] - tweaked: FALSE [17:27:34.306] - call: NULL [17:27:34.307] plan(): nbrOfWorkers() = 1 [17:27:34.309] plan(): Setting new future strategy stack: [17:27:34.310] List of future strategies: [17:27:34.310] 1. sequential: [17:27:34.310] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.310] - tweaked: FALSE [17:27:34.310] - call: plan(strategy) [17:27:34.311] plan(): nbrOfWorkers() = 1 [17:27:34.311] SequentialFuture started (and completed) [17:27:34.312] - Launch lazy future ... done [17:27:34.312] run() for 'SequentialFuture' ... done List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 [17:27:34.324] resolved() for 'SequentialFuture' ... [17:27:34.324] - state: 'finished' [17:27:34.330] - run: TRUE [17:27:34.330] - result: 'FutureResult' [17:27:34.330] resolved() for 'SequentialFuture' ... done [17:27:34.331] resolved() for 'SequentialFuture' ... [17:27:34.331] - state: 'finished' [17:27:34.332] - run: TRUE [17:27:34.332] - result: 'FutureResult' [17:27:34.332] resolved() for 'SequentialFuture' ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:34.335] resolve() on list ... [17:27:34.335] recursive: 0 [17:27:34.336] length: 6 [17:27:34.336] elements: 'a', 'b', 'c', '', '', '' [17:27:34.336] signalConditionsASAP(numeric, pos=1) ... [17:27:34.337] - nx: 6 [17:27:34.337] - relay: TRUE [17:27:34.337] - stdout: TRUE [17:27:34.337] - signal: TRUE [17:27:34.338] - resignal: FALSE [17:27:34.338] - force: TRUE [17:27:34.338] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.339] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.339] - until=2 [17:27:34.339] - relaying element #2 [17:27:34.340] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.340] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.340] signalConditionsASAP(NULL, pos=1) ... done [17:27:34.340] length: 5 (resolved future 1) [17:27:34.341] resolved() for 'SequentialFuture' ... [17:27:34.341] - state: 'finished' [17:27:34.341] - run: TRUE [17:27:34.342] - result: 'FutureResult' [17:27:34.342] resolved() for 'SequentialFuture' ... done [17:27:34.342] Future #2 [17:27:34.343] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:34.344] - nx: 6 [17:27:34.344] - relay: TRUE [17:27:34.344] - stdout: TRUE [17:27:34.345] - signal: TRUE [17:27:34.345] - resignal: FALSE [17:27:34.345] - force: TRUE [17:27:34.345] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.346] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.346] - until=2 [17:27:34.346] - relaying element #2 [17:27:34.347] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.347] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.347] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:34.348] length: 4 (resolved future 2) [17:27:34.348] resolved() for 'SequentialFuture' ... [17:27:34.349] - state: 'finished' [17:27:34.349] - run: TRUE [17:27:34.349] - result: 'FutureResult' [17:27:34.350] resolved() for 'SequentialFuture' ... done [17:27:34.350] Future #3 [17:27:34.350] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:34.351] - nx: 6 [17:27:34.351] - relay: TRUE [17:27:34.351] - stdout: TRUE [17:27:34.351] - signal: TRUE [17:27:34.352] - resignal: FALSE [17:27:34.352] - force: TRUE [17:27:34.352] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.352] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.352] - until=3 [17:27:34.352] - relaying element #3 [17:27:34.353] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.353] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.353] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:34.353] length: 3 (resolved future 3) [17:27:34.354] signalConditionsASAP(NULL, pos=4) ... [17:27:34.354] - nx: 6 [17:27:34.354] - relay: TRUE [17:27:34.354] - stdout: TRUE [17:27:34.354] - signal: TRUE [17:27:34.354] - resignal: FALSE [17:27:34.355] - force: TRUE [17:27:34.355] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.355] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.355] - until=5 [17:27:34.355] - relaying element #5 [17:27:34.355] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.356] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.356] signalConditionsASAP(NULL, pos=4) ... done [17:27:34.356] length: 2 (resolved future 4) [17:27:34.356] signalConditionsASAP(NULL, pos=5) ... [17:27:34.356] - nx: 6 [17:27:34.357] - relay: TRUE [17:27:34.357] - stdout: TRUE [17:27:34.357] - signal: TRUE [17:27:34.357] - resignal: FALSE [17:27:34.357] - force: TRUE [17:27:34.357] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.358] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.358] - until=6 [17:27:34.358] - relaying element #6 [17:27:34.358] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.358] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.358] signalConditionsASAP(NULL, pos=5) ... done [17:27:34.359] length: 1 (resolved future 5) [17:27:34.359] signalConditionsASAP(numeric, pos=6) ... [17:27:34.359] - nx: 6 [17:27:34.359] - relay: TRUE [17:27:34.359] - stdout: TRUE [17:27:34.359] - signal: TRUE [17:27:34.360] - resignal: FALSE [17:27:34.360] - force: TRUE [17:27:34.360] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.360] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.360] - until=6 [17:27:34.361] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.361] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.361] signalConditionsASAP(numeric, pos=6) ... done [17:27:34.361] length: 0 (resolved future 6) [17:27:34.362] Relaying remaining futures [17:27:34.362] signalConditionsASAP(NULL, pos=0) ... [17:27:34.362] - nx: 6 [17:27:34.362] - relay: TRUE [17:27:34.363] - stdout: TRUE [17:27:34.363] - signal: TRUE [17:27:34.363] - resignal: FALSE [17:27:34.363] - force: TRUE [17:27:34.364] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.364] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:34.364] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.364] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.365] signalConditionsASAP(NULL, pos=0) ... done [17:27:34.365] resolve() on list ... DONE List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 Dimensions: c(1, 6) [17:27:34.370] getGlobalsAndPackages() ... [17:27:34.370] Searching for globals... [17:27:34.371] [17:27:34.371] Searching for globals ... DONE [17:27:34.371] - globals: [0] [17:27:34.372] getGlobalsAndPackages() ... DONE [17:27:34.372] run() for 'Future' ... [17:27:34.372] - state: 'created' [17:27:34.373] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.373] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.374] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.374] - Field: 'label' [17:27:34.374] - Field: 'local' [17:27:34.375] - Field: 'owner' [17:27:34.375] - Field: 'envir' [17:27:34.375] - Field: 'packages' [17:27:34.375] - Field: 'gc' [17:27:34.376] - Field: 'conditions' [17:27:34.376] - Field: 'expr' [17:27:34.376] - Field: 'uuid' [17:27:34.377] - Field: 'seed' [17:27:34.377] - Field: 'version' [17:27:34.377] - Field: 'result' [17:27:34.378] - Field: 'asynchronous' [17:27:34.378] - Field: 'calls' [17:27:34.378] - Field: 'globals' [17:27:34.379] - Field: 'stdout' [17:27:34.379] - Field: 'earlySignal' [17:27:34.379] - Field: 'lazy' [17:27:34.380] - Field: 'state' [17:27:34.380] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.380] - Launch lazy future ... [17:27:34.381] Packages needed by the future expression (n = 0): [17:27:34.381] Packages needed by future strategies (n = 0): [17:27:34.382] { [17:27:34.382] { [17:27:34.382] { [17:27:34.382] ...future.startTime <- base::Sys.time() [17:27:34.382] { [17:27:34.382] { [17:27:34.382] { [17:27:34.382] base::local({ [17:27:34.382] has_future <- base::requireNamespace("future", [17:27:34.382] quietly = TRUE) [17:27:34.382] if (has_future) { [17:27:34.382] ns <- base::getNamespace("future") [17:27:34.382] version <- ns[[".package"]][["version"]] [17:27:34.382] if (is.null(version)) [17:27:34.382] version <- utils::packageVersion("future") [17:27:34.382] } [17:27:34.382] else { [17:27:34.382] version <- NULL [17:27:34.382] } [17:27:34.382] if (!has_future || version < "1.8.0") { [17:27:34.382] info <- base::c(r_version = base::gsub("R version ", [17:27:34.382] "", base::R.version$version.string), [17:27:34.382] platform = base::sprintf("%s (%s-bit)", [17:27:34.382] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.382] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.382] "release", "version")], collapse = " "), [17:27:34.382] hostname = base::Sys.info()[["nodename"]]) [17:27:34.382] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.382] info) [17:27:34.382] info <- base::paste(info, collapse = "; ") [17:27:34.382] if (!has_future) { [17:27:34.382] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.382] info) [17:27:34.382] } [17:27:34.382] else { [17:27:34.382] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.382] info, version) [17:27:34.382] } [17:27:34.382] base::stop(msg) [17:27:34.382] } [17:27:34.382] }) [17:27:34.382] } [17:27:34.382] ...future.strategy.old <- future::plan("list") [17:27:34.382] options(future.plan = NULL) [17:27:34.382] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.382] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.382] } [17:27:34.382] ...future.workdir <- getwd() [17:27:34.382] } [17:27:34.382] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.382] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.382] } [17:27:34.382] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.382] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.382] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.382] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.382] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.382] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.382] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.382] base::names(...future.oldOptions)) [17:27:34.382] } [17:27:34.382] if (FALSE) { [17:27:34.382] } [17:27:34.382] else { [17:27:34.382] if (TRUE) { [17:27:34.382] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.382] open = "w") [17:27:34.382] } [17:27:34.382] else { [17:27:34.382] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.382] windows = "NUL", "/dev/null"), open = "w") [17:27:34.382] } [17:27:34.382] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.382] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.382] base::sink(type = "output", split = FALSE) [17:27:34.382] base::close(...future.stdout) [17:27:34.382] }, add = TRUE) [17:27:34.382] } [17:27:34.382] ...future.frame <- base::sys.nframe() [17:27:34.382] ...future.conditions <- base::list() [17:27:34.382] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.382] if (FALSE) { [17:27:34.382] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.382] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.382] } [17:27:34.382] ...future.result <- base::tryCatch({ [17:27:34.382] base::withCallingHandlers({ [17:27:34.382] ...future.value <- base::withVisible(base::local(2)) [17:27:34.382] future::FutureResult(value = ...future.value$value, [17:27:34.382] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.382] ...future.rng), globalenv = if (FALSE) [17:27:34.382] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.382] ...future.globalenv.names)) [17:27:34.382] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.382] }, condition = base::local({ [17:27:34.382] c <- base::c [17:27:34.382] inherits <- base::inherits [17:27:34.382] invokeRestart <- base::invokeRestart [17:27:34.382] length <- base::length [17:27:34.382] list <- base::list [17:27:34.382] seq.int <- base::seq.int [17:27:34.382] signalCondition <- base::signalCondition [17:27:34.382] sys.calls <- base::sys.calls [17:27:34.382] `[[` <- base::`[[` [17:27:34.382] `+` <- base::`+` [17:27:34.382] `<<-` <- base::`<<-` [17:27:34.382] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.382] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.382] 3L)] [17:27:34.382] } [17:27:34.382] function(cond) { [17:27:34.382] is_error <- inherits(cond, "error") [17:27:34.382] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.382] NULL) [17:27:34.382] if (is_error) { [17:27:34.382] sessionInformation <- function() { [17:27:34.382] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.382] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.382] search = base::search(), system = base::Sys.info()) [17:27:34.382] } [17:27:34.382] ...future.conditions[[length(...future.conditions) + [17:27:34.382] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.382] cond$call), session = sessionInformation(), [17:27:34.382] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.382] signalCondition(cond) [17:27:34.382] } [17:27:34.382] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.382] "immediateCondition"))) { [17:27:34.382] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.382] ...future.conditions[[length(...future.conditions) + [17:27:34.382] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.382] if (TRUE && !signal) { [17:27:34.382] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.382] { [17:27:34.382] inherits <- base::inherits [17:27:34.382] invokeRestart <- base::invokeRestart [17:27:34.382] is.null <- base::is.null [17:27:34.382] muffled <- FALSE [17:27:34.382] if (inherits(cond, "message")) { [17:27:34.382] muffled <- grepl(pattern, "muffleMessage") [17:27:34.382] if (muffled) [17:27:34.382] invokeRestart("muffleMessage") [17:27:34.382] } [17:27:34.382] else if (inherits(cond, "warning")) { [17:27:34.382] muffled <- grepl(pattern, "muffleWarning") [17:27:34.382] if (muffled) [17:27:34.382] invokeRestart("muffleWarning") [17:27:34.382] } [17:27:34.382] else if (inherits(cond, "condition")) { [17:27:34.382] if (!is.null(pattern)) { [17:27:34.382] computeRestarts <- base::computeRestarts [17:27:34.382] grepl <- base::grepl [17:27:34.382] restarts <- computeRestarts(cond) [17:27:34.382] for (restart in restarts) { [17:27:34.382] name <- restart$name [17:27:34.382] if (is.null(name)) [17:27:34.382] next [17:27:34.382] if (!grepl(pattern, name)) [17:27:34.382] next [17:27:34.382] invokeRestart(restart) [17:27:34.382] muffled <- TRUE [17:27:34.382] break [17:27:34.382] } [17:27:34.382] } [17:27:34.382] } [17:27:34.382] invisible(muffled) [17:27:34.382] } [17:27:34.382] muffleCondition(cond, pattern = "^muffle") [17:27:34.382] } [17:27:34.382] } [17:27:34.382] else { [17:27:34.382] if (TRUE) { [17:27:34.382] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.382] { [17:27:34.382] inherits <- base::inherits [17:27:34.382] invokeRestart <- base::invokeRestart [17:27:34.382] is.null <- base::is.null [17:27:34.382] muffled <- FALSE [17:27:34.382] if (inherits(cond, "message")) { [17:27:34.382] muffled <- grepl(pattern, "muffleMessage") [17:27:34.382] if (muffled) [17:27:34.382] invokeRestart("muffleMessage") [17:27:34.382] } [17:27:34.382] else if (inherits(cond, "warning")) { [17:27:34.382] muffled <- grepl(pattern, "muffleWarning") [17:27:34.382] if (muffled) [17:27:34.382] invokeRestart("muffleWarning") [17:27:34.382] } [17:27:34.382] else if (inherits(cond, "condition")) { [17:27:34.382] if (!is.null(pattern)) { [17:27:34.382] computeRestarts <- base::computeRestarts [17:27:34.382] grepl <- base::grepl [17:27:34.382] restarts <- computeRestarts(cond) [17:27:34.382] for (restart in restarts) { [17:27:34.382] name <- restart$name [17:27:34.382] if (is.null(name)) [17:27:34.382] next [17:27:34.382] if (!grepl(pattern, name)) [17:27:34.382] next [17:27:34.382] invokeRestart(restart) [17:27:34.382] muffled <- TRUE [17:27:34.382] break [17:27:34.382] } [17:27:34.382] } [17:27:34.382] } [17:27:34.382] invisible(muffled) [17:27:34.382] } [17:27:34.382] muffleCondition(cond, pattern = "^muffle") [17:27:34.382] } [17:27:34.382] } [17:27:34.382] } [17:27:34.382] })) [17:27:34.382] }, error = function(ex) { [17:27:34.382] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.382] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.382] ...future.rng), started = ...future.startTime, [17:27:34.382] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.382] version = "1.8"), class = "FutureResult") [17:27:34.382] }, finally = { [17:27:34.382] if (!identical(...future.workdir, getwd())) [17:27:34.382] setwd(...future.workdir) [17:27:34.382] { [17:27:34.382] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.382] ...future.oldOptions$nwarnings <- NULL [17:27:34.382] } [17:27:34.382] base::options(...future.oldOptions) [17:27:34.382] if (.Platform$OS.type == "windows") { [17:27:34.382] old_names <- names(...future.oldEnvVars) [17:27:34.382] envs <- base::Sys.getenv() [17:27:34.382] names <- names(envs) [17:27:34.382] common <- intersect(names, old_names) [17:27:34.382] added <- setdiff(names, old_names) [17:27:34.382] removed <- setdiff(old_names, names) [17:27:34.382] changed <- common[...future.oldEnvVars[common] != [17:27:34.382] envs[common]] [17:27:34.382] NAMES <- toupper(changed) [17:27:34.382] args <- list() [17:27:34.382] for (kk in seq_along(NAMES)) { [17:27:34.382] name <- changed[[kk]] [17:27:34.382] NAME <- NAMES[[kk]] [17:27:34.382] if (name != NAME && is.element(NAME, old_names)) [17:27:34.382] next [17:27:34.382] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.382] } [17:27:34.382] NAMES <- toupper(added) [17:27:34.382] for (kk in seq_along(NAMES)) { [17:27:34.382] name <- added[[kk]] [17:27:34.382] NAME <- NAMES[[kk]] [17:27:34.382] if (name != NAME && is.element(NAME, old_names)) [17:27:34.382] next [17:27:34.382] args[[name]] <- "" [17:27:34.382] } [17:27:34.382] NAMES <- toupper(removed) [17:27:34.382] for (kk in seq_along(NAMES)) { [17:27:34.382] name <- removed[[kk]] [17:27:34.382] NAME <- NAMES[[kk]] [17:27:34.382] if (name != NAME && is.element(NAME, old_names)) [17:27:34.382] next [17:27:34.382] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.382] } [17:27:34.382] if (length(args) > 0) [17:27:34.382] base::do.call(base::Sys.setenv, args = args) [17:27:34.382] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.382] } [17:27:34.382] else { [17:27:34.382] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.382] } [17:27:34.382] { [17:27:34.382] if (base::length(...future.futureOptionsAdded) > [17:27:34.382] 0L) { [17:27:34.382] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.382] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.382] base::options(opts) [17:27:34.382] } [17:27:34.382] { [17:27:34.382] { [17:27:34.382] NULL [17:27:34.382] RNGkind("Mersenne-Twister") [17:27:34.382] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.382] inherits = FALSE) [17:27:34.382] } [17:27:34.382] options(future.plan = NULL) [17:27:34.382] if (is.na(NA_character_)) [17:27:34.382] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.382] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.382] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.382] .init = FALSE) [17:27:34.382] } [17:27:34.382] } [17:27:34.382] } [17:27:34.382] }) [17:27:34.382] if (TRUE) { [17:27:34.382] base::sink(type = "output", split = FALSE) [17:27:34.382] if (TRUE) { [17:27:34.382] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.382] } [17:27:34.382] else { [17:27:34.382] ...future.result["stdout"] <- base::list(NULL) [17:27:34.382] } [17:27:34.382] base::close(...future.stdout) [17:27:34.382] ...future.stdout <- NULL [17:27:34.382] } [17:27:34.382] ...future.result$conditions <- ...future.conditions [17:27:34.382] ...future.result$finished <- base::Sys.time() [17:27:34.382] ...future.result [17:27:34.382] } [17:27:34.390] plan(): Setting new future strategy stack: [17:27:34.390] List of future strategies: [17:27:34.390] 1. sequential: [17:27:34.390] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.390] - tweaked: FALSE [17:27:34.390] - call: NULL [17:27:34.391] plan(): nbrOfWorkers() = 1 [17:27:34.393] plan(): Setting new future strategy stack: [17:27:34.393] List of future strategies: [17:27:34.393] 1. sequential: [17:27:34.393] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.393] - tweaked: FALSE [17:27:34.393] - call: plan(strategy) [17:27:34.394] plan(): nbrOfWorkers() = 1 [17:27:34.394] SequentialFuture started (and completed) [17:27:34.395] - Launch lazy future ... done [17:27:34.395] run() for 'SequentialFuture' ... done [17:27:34.395] getGlobalsAndPackages() ... [17:27:34.395] Searching for globals... [17:27:34.396] [17:27:34.396] Searching for globals ... DONE [17:27:34.397] - globals: [0] [17:27:34.397] getGlobalsAndPackages() ... DONE [17:27:34.398] run() for 'Future' ... [17:27:34.398] - state: 'created' [17:27:34.398] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.399] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.399] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.400] - Field: 'label' [17:27:34.400] - Field: 'local' [17:27:34.400] - Field: 'owner' [17:27:34.401] - Field: 'envir' [17:27:34.401] - Field: 'packages' [17:27:34.401] - Field: 'gc' [17:27:34.402] - Field: 'conditions' [17:27:34.402] - Field: 'expr' [17:27:34.402] - Field: 'uuid' [17:27:34.403] - Field: 'seed' [17:27:34.403] - Field: 'version' [17:27:34.403] - Field: 'result' [17:27:34.404] - Field: 'asynchronous' [17:27:34.404] - Field: 'calls' [17:27:34.404] - Field: 'globals' [17:27:34.405] - Field: 'stdout' [17:27:34.405] - Field: 'earlySignal' [17:27:34.405] - Field: 'lazy' [17:27:34.406] - Field: 'state' [17:27:34.406] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.406] - Launch lazy future ... [17:27:34.407] Packages needed by the future expression (n = 0): [17:27:34.407] Packages needed by future strategies (n = 0): [17:27:34.408] { [17:27:34.408] { [17:27:34.408] { [17:27:34.408] ...future.startTime <- base::Sys.time() [17:27:34.408] { [17:27:34.408] { [17:27:34.408] { [17:27:34.408] base::local({ [17:27:34.408] has_future <- base::requireNamespace("future", [17:27:34.408] quietly = TRUE) [17:27:34.408] if (has_future) { [17:27:34.408] ns <- base::getNamespace("future") [17:27:34.408] version <- ns[[".package"]][["version"]] [17:27:34.408] if (is.null(version)) [17:27:34.408] version <- utils::packageVersion("future") [17:27:34.408] } [17:27:34.408] else { [17:27:34.408] version <- NULL [17:27:34.408] } [17:27:34.408] if (!has_future || version < "1.8.0") { [17:27:34.408] info <- base::c(r_version = base::gsub("R version ", [17:27:34.408] "", base::R.version$version.string), [17:27:34.408] platform = base::sprintf("%s (%s-bit)", [17:27:34.408] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.408] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.408] "release", "version")], collapse = " "), [17:27:34.408] hostname = base::Sys.info()[["nodename"]]) [17:27:34.408] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.408] info) [17:27:34.408] info <- base::paste(info, collapse = "; ") [17:27:34.408] if (!has_future) { [17:27:34.408] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.408] info) [17:27:34.408] } [17:27:34.408] else { [17:27:34.408] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.408] info, version) [17:27:34.408] } [17:27:34.408] base::stop(msg) [17:27:34.408] } [17:27:34.408] }) [17:27:34.408] } [17:27:34.408] ...future.strategy.old <- future::plan("list") [17:27:34.408] options(future.plan = NULL) [17:27:34.408] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.408] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.408] } [17:27:34.408] ...future.workdir <- getwd() [17:27:34.408] } [17:27:34.408] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.408] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.408] } [17:27:34.408] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.408] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.408] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.408] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.408] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.408] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.408] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.408] base::names(...future.oldOptions)) [17:27:34.408] } [17:27:34.408] if (FALSE) { [17:27:34.408] } [17:27:34.408] else { [17:27:34.408] if (TRUE) { [17:27:34.408] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.408] open = "w") [17:27:34.408] } [17:27:34.408] else { [17:27:34.408] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.408] windows = "NUL", "/dev/null"), open = "w") [17:27:34.408] } [17:27:34.408] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.408] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.408] base::sink(type = "output", split = FALSE) [17:27:34.408] base::close(...future.stdout) [17:27:34.408] }, add = TRUE) [17:27:34.408] } [17:27:34.408] ...future.frame <- base::sys.nframe() [17:27:34.408] ...future.conditions <- base::list() [17:27:34.408] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.408] if (FALSE) { [17:27:34.408] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.408] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.408] } [17:27:34.408] ...future.result <- base::tryCatch({ [17:27:34.408] base::withCallingHandlers({ [17:27:34.408] ...future.value <- base::withVisible(base::local(NULL)) [17:27:34.408] future::FutureResult(value = ...future.value$value, [17:27:34.408] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.408] ...future.rng), globalenv = if (FALSE) [17:27:34.408] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.408] ...future.globalenv.names)) [17:27:34.408] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.408] }, condition = base::local({ [17:27:34.408] c <- base::c [17:27:34.408] inherits <- base::inherits [17:27:34.408] invokeRestart <- base::invokeRestart [17:27:34.408] length <- base::length [17:27:34.408] list <- base::list [17:27:34.408] seq.int <- base::seq.int [17:27:34.408] signalCondition <- base::signalCondition [17:27:34.408] sys.calls <- base::sys.calls [17:27:34.408] `[[` <- base::`[[` [17:27:34.408] `+` <- base::`+` [17:27:34.408] `<<-` <- base::`<<-` [17:27:34.408] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.408] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.408] 3L)] [17:27:34.408] } [17:27:34.408] function(cond) { [17:27:34.408] is_error <- inherits(cond, "error") [17:27:34.408] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.408] NULL) [17:27:34.408] if (is_error) { [17:27:34.408] sessionInformation <- function() { [17:27:34.408] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.408] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.408] search = base::search(), system = base::Sys.info()) [17:27:34.408] } [17:27:34.408] ...future.conditions[[length(...future.conditions) + [17:27:34.408] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.408] cond$call), session = sessionInformation(), [17:27:34.408] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.408] signalCondition(cond) [17:27:34.408] } [17:27:34.408] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.408] "immediateCondition"))) { [17:27:34.408] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.408] ...future.conditions[[length(...future.conditions) + [17:27:34.408] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.408] if (TRUE && !signal) { [17:27:34.408] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.408] { [17:27:34.408] inherits <- base::inherits [17:27:34.408] invokeRestart <- base::invokeRestart [17:27:34.408] is.null <- base::is.null [17:27:34.408] muffled <- FALSE [17:27:34.408] if (inherits(cond, "message")) { [17:27:34.408] muffled <- grepl(pattern, "muffleMessage") [17:27:34.408] if (muffled) [17:27:34.408] invokeRestart("muffleMessage") [17:27:34.408] } [17:27:34.408] else if (inherits(cond, "warning")) { [17:27:34.408] muffled <- grepl(pattern, "muffleWarning") [17:27:34.408] if (muffled) [17:27:34.408] invokeRestart("muffleWarning") [17:27:34.408] } [17:27:34.408] else if (inherits(cond, "condition")) { [17:27:34.408] if (!is.null(pattern)) { [17:27:34.408] computeRestarts <- base::computeRestarts [17:27:34.408] grepl <- base::grepl [17:27:34.408] restarts <- computeRestarts(cond) [17:27:34.408] for (restart in restarts) { [17:27:34.408] name <- restart$name [17:27:34.408] if (is.null(name)) [17:27:34.408] next [17:27:34.408] if (!grepl(pattern, name)) [17:27:34.408] next [17:27:34.408] invokeRestart(restart) [17:27:34.408] muffled <- TRUE [17:27:34.408] break [17:27:34.408] } [17:27:34.408] } [17:27:34.408] } [17:27:34.408] invisible(muffled) [17:27:34.408] } [17:27:34.408] muffleCondition(cond, pattern = "^muffle") [17:27:34.408] } [17:27:34.408] } [17:27:34.408] else { [17:27:34.408] if (TRUE) { [17:27:34.408] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.408] { [17:27:34.408] inherits <- base::inherits [17:27:34.408] invokeRestart <- base::invokeRestart [17:27:34.408] is.null <- base::is.null [17:27:34.408] muffled <- FALSE [17:27:34.408] if (inherits(cond, "message")) { [17:27:34.408] muffled <- grepl(pattern, "muffleMessage") [17:27:34.408] if (muffled) [17:27:34.408] invokeRestart("muffleMessage") [17:27:34.408] } [17:27:34.408] else if (inherits(cond, "warning")) { [17:27:34.408] muffled <- grepl(pattern, "muffleWarning") [17:27:34.408] if (muffled) [17:27:34.408] invokeRestart("muffleWarning") [17:27:34.408] } [17:27:34.408] else if (inherits(cond, "condition")) { [17:27:34.408] if (!is.null(pattern)) { [17:27:34.408] computeRestarts <- base::computeRestarts [17:27:34.408] grepl <- base::grepl [17:27:34.408] restarts <- computeRestarts(cond) [17:27:34.408] for (restart in restarts) { [17:27:34.408] name <- restart$name [17:27:34.408] if (is.null(name)) [17:27:34.408] next [17:27:34.408] if (!grepl(pattern, name)) [17:27:34.408] next [17:27:34.408] invokeRestart(restart) [17:27:34.408] muffled <- TRUE [17:27:34.408] break [17:27:34.408] } [17:27:34.408] } [17:27:34.408] } [17:27:34.408] invisible(muffled) [17:27:34.408] } [17:27:34.408] muffleCondition(cond, pattern = "^muffle") [17:27:34.408] } [17:27:34.408] } [17:27:34.408] } [17:27:34.408] })) [17:27:34.408] }, error = function(ex) { [17:27:34.408] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.408] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.408] ...future.rng), started = ...future.startTime, [17:27:34.408] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.408] version = "1.8"), class = "FutureResult") [17:27:34.408] }, finally = { [17:27:34.408] if (!identical(...future.workdir, getwd())) [17:27:34.408] setwd(...future.workdir) [17:27:34.408] { [17:27:34.408] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.408] ...future.oldOptions$nwarnings <- NULL [17:27:34.408] } [17:27:34.408] base::options(...future.oldOptions) [17:27:34.408] if (.Platform$OS.type == "windows") { [17:27:34.408] old_names <- names(...future.oldEnvVars) [17:27:34.408] envs <- base::Sys.getenv() [17:27:34.408] names <- names(envs) [17:27:34.408] common <- intersect(names, old_names) [17:27:34.408] added <- setdiff(names, old_names) [17:27:34.408] removed <- setdiff(old_names, names) [17:27:34.408] changed <- common[...future.oldEnvVars[common] != [17:27:34.408] envs[common]] [17:27:34.408] NAMES <- toupper(changed) [17:27:34.408] args <- list() [17:27:34.408] for (kk in seq_along(NAMES)) { [17:27:34.408] name <- changed[[kk]] [17:27:34.408] NAME <- NAMES[[kk]] [17:27:34.408] if (name != NAME && is.element(NAME, old_names)) [17:27:34.408] next [17:27:34.408] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.408] } [17:27:34.408] NAMES <- toupper(added) [17:27:34.408] for (kk in seq_along(NAMES)) { [17:27:34.408] name <- added[[kk]] [17:27:34.408] NAME <- NAMES[[kk]] [17:27:34.408] if (name != NAME && is.element(NAME, old_names)) [17:27:34.408] next [17:27:34.408] args[[name]] <- "" [17:27:34.408] } [17:27:34.408] NAMES <- toupper(removed) [17:27:34.408] for (kk in seq_along(NAMES)) { [17:27:34.408] name <- removed[[kk]] [17:27:34.408] NAME <- NAMES[[kk]] [17:27:34.408] if (name != NAME && is.element(NAME, old_names)) [17:27:34.408] next [17:27:34.408] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.408] } [17:27:34.408] if (length(args) > 0) [17:27:34.408] base::do.call(base::Sys.setenv, args = args) [17:27:34.408] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.408] } [17:27:34.408] else { [17:27:34.408] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.408] } [17:27:34.408] { [17:27:34.408] if (base::length(...future.futureOptionsAdded) > [17:27:34.408] 0L) { [17:27:34.408] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.408] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.408] base::options(opts) [17:27:34.408] } [17:27:34.408] { [17:27:34.408] { [17:27:34.408] NULL [17:27:34.408] RNGkind("Mersenne-Twister") [17:27:34.408] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.408] inherits = FALSE) [17:27:34.408] } [17:27:34.408] options(future.plan = NULL) [17:27:34.408] if (is.na(NA_character_)) [17:27:34.408] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.408] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.408] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.408] .init = FALSE) [17:27:34.408] } [17:27:34.408] } [17:27:34.408] } [17:27:34.408] }) [17:27:34.408] if (TRUE) { [17:27:34.408] base::sink(type = "output", split = FALSE) [17:27:34.408] if (TRUE) { [17:27:34.408] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.408] } [17:27:34.408] else { [17:27:34.408] ...future.result["stdout"] <- base::list(NULL) [17:27:34.408] } [17:27:34.408] base::close(...future.stdout) [17:27:34.408] ...future.stdout <- NULL [17:27:34.408] } [17:27:34.408] ...future.result$conditions <- ...future.conditions [17:27:34.408] ...future.result$finished <- base::Sys.time() [17:27:34.408] ...future.result [17:27:34.408] } [17:27:34.415] plan(): Setting new future strategy stack: [17:27:34.416] List of future strategies: [17:27:34.416] 1. sequential: [17:27:34.416] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.416] - tweaked: FALSE [17:27:34.416] - call: NULL [17:27:34.417] plan(): nbrOfWorkers() = 1 [17:27:34.419] plan(): Setting new future strategy stack: [17:27:34.420] List of future strategies: [17:27:34.420] 1. sequential: [17:27:34.420] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.420] - tweaked: FALSE [17:27:34.420] - call: plan(strategy) [17:27:34.421] plan(): nbrOfWorkers() = 1 [17:27:34.421] SequentialFuture started (and completed) [17:27:34.421] - Launch lazy future ... done [17:27:34.422] run() for 'SequentialFuture' ... done List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 1 6 - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... [17:27:34.433] resolved() for 'SequentialFuture' ... [17:27:34.434] - state: 'finished' [17:27:34.434] - run: TRUE [17:27:34.434] - result: 'FutureResult' [17:27:34.435] resolved() for 'SequentialFuture' ... done [17:27:34.435] resolved() for 'SequentialFuture' ... [17:27:34.435] - state: 'finished' [17:27:34.436] - run: TRUE [17:27:34.436] - result: 'FutureResult' [17:27:34.436] resolved() for 'SequentialFuture' ... done logi [1, 1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:34.441] resolve() on list ... [17:27:34.441] recursive: 0 [17:27:34.441] length: 6 [17:27:34.442] elements: 'a', 'b', 'c', '', '', '' [17:27:34.442] signalConditionsASAP(numeric, pos=1) ... [17:27:34.442] - nx: 6 [17:27:34.443] - relay: TRUE [17:27:34.443] - stdout: TRUE [17:27:34.443] - signal: TRUE [17:27:34.443] - resignal: FALSE [17:27:34.444] - force: TRUE [17:27:34.444] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.444] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.445] - until=2 [17:27:34.445] - relaying element #2 [17:27:34.445] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.445] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.446] signalConditionsASAP(NULL, pos=1) ... done [17:27:34.446] length: 5 (resolved future 1) [17:27:34.446] resolved() for 'SequentialFuture' ... [17:27:34.447] - state: 'finished' [17:27:34.447] - run: TRUE [17:27:34.448] - result: 'FutureResult' [17:27:34.448] resolved() for 'SequentialFuture' ... done [17:27:34.448] Future #2 [17:27:34.449] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:34.449] - nx: 6 [17:27:34.449] - relay: TRUE [17:27:34.450] - stdout: TRUE [17:27:34.450] - signal: TRUE [17:27:34.450] - resignal: FALSE [17:27:34.451] - force: TRUE [17:27:34.451] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.451] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.451] - until=2 [17:27:34.455] - relaying element #2 [17:27:34.456] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.456] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.456] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:34.457] length: 4 (resolved future 2) [17:27:34.457] resolved() for 'SequentialFuture' ... [17:27:34.457] - state: 'finished' [17:27:34.458] - run: TRUE [17:27:34.458] - result: 'FutureResult' [17:27:34.458] resolved() for 'SequentialFuture' ... done [17:27:34.458] Future #3 [17:27:34.459] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:34.459] - nx: 6 [17:27:34.459] - relay: TRUE [17:27:34.459] - stdout: TRUE [17:27:34.459] - signal: TRUE [17:27:34.460] - resignal: FALSE [17:27:34.460] - force: TRUE [17:27:34.460] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.460] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.460] - until=3 [17:27:34.460] - relaying element #3 [17:27:34.461] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.461] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.461] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:34.461] length: 3 (resolved future 3) [17:27:34.462] signalConditionsASAP(NULL, pos=4) ... [17:27:34.462] - nx: 6 [17:27:34.462] - relay: TRUE [17:27:34.462] - stdout: TRUE [17:27:34.462] - signal: TRUE [17:27:34.462] - resignal: FALSE [17:27:34.463] - force: TRUE [17:27:34.463] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.463] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.463] - until=5 [17:27:34.463] - relaying element #5 [17:27:34.463] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.464] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.464] signalConditionsASAP(NULL, pos=4) ... done [17:27:34.464] length: 2 (resolved future 4) [17:27:34.464] signalConditionsASAP(NULL, pos=5) ... [17:27:34.464] - nx: 6 [17:27:34.465] - relay: TRUE [17:27:34.465] - stdout: TRUE [17:27:34.465] - signal: TRUE [17:27:34.465] - resignal: FALSE [17:27:34.465] - force: TRUE [17:27:34.465] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.465] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.466] - until=6 [17:27:34.466] - relaying element #6 [17:27:34.466] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.466] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.466] signalConditionsASAP(NULL, pos=5) ... done [17:27:34.467] length: 1 (resolved future 5) [17:27:34.467] signalConditionsASAP(numeric, pos=6) ... [17:27:34.467] - nx: 6 [17:27:34.467] - relay: TRUE [17:27:34.467] - stdout: TRUE [17:27:34.467] - signal: TRUE [17:27:34.468] - resignal: FALSE [17:27:34.468] - force: TRUE [17:27:34.468] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.468] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.468] - until=6 [17:27:34.468] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.469] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.469] signalConditionsASAP(numeric, pos=6) ... done [17:27:34.469] length: 0 (resolved future 6) [17:27:34.469] Relaying remaining futures [17:27:34.469] signalConditionsASAP(NULL, pos=0) ... [17:27:34.469] - nx: 6 [17:27:34.470] - relay: TRUE [17:27:34.470] - stdout: TRUE [17:27:34.470] - signal: TRUE [17:27:34.470] - resignal: FALSE [17:27:34.471] - force: TRUE [17:27:34.471] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.471] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:34.472] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.472] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.472] signalConditionsASAP(NULL, pos=0) ... done [17:27:34.472] resolve() on list ... DONE List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 1 6 - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... Dimensions: c(2, 3) [17:27:34.480] getGlobalsAndPackages() ... [17:27:34.480] Searching for globals... [17:27:34.481] [17:27:34.481] Searching for globals ... DONE [17:27:34.481] - globals: [0] [17:27:34.481] getGlobalsAndPackages() ... DONE [17:27:34.482] run() for 'Future' ... [17:27:34.482] - state: 'created' [17:27:34.483] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.483] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.484] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.484] - Field: 'label' [17:27:34.484] - Field: 'local' [17:27:34.485] - Field: 'owner' [17:27:34.485] - Field: 'envir' [17:27:34.485] - Field: 'packages' [17:27:34.485] - Field: 'gc' [17:27:34.486] - Field: 'conditions' [17:27:34.486] - Field: 'expr' [17:27:34.486] - Field: 'uuid' [17:27:34.486] - Field: 'seed' [17:27:34.486] - Field: 'version' [17:27:34.487] - Field: 'result' [17:27:34.487] - Field: 'asynchronous' [17:27:34.487] - Field: 'calls' [17:27:34.487] - Field: 'globals' [17:27:34.487] - Field: 'stdout' [17:27:34.488] - Field: 'earlySignal' [17:27:34.488] - Field: 'lazy' [17:27:34.488] - Field: 'state' [17:27:34.488] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.488] - Launch lazy future ... [17:27:34.489] Packages needed by the future expression (n = 0): [17:27:34.489] Packages needed by future strategies (n = 0): [17:27:34.490] { [17:27:34.490] { [17:27:34.490] { [17:27:34.490] ...future.startTime <- base::Sys.time() [17:27:34.490] { [17:27:34.490] { [17:27:34.490] { [17:27:34.490] base::local({ [17:27:34.490] has_future <- base::requireNamespace("future", [17:27:34.490] quietly = TRUE) [17:27:34.490] if (has_future) { [17:27:34.490] ns <- base::getNamespace("future") [17:27:34.490] version <- ns[[".package"]][["version"]] [17:27:34.490] if (is.null(version)) [17:27:34.490] version <- utils::packageVersion("future") [17:27:34.490] } [17:27:34.490] else { [17:27:34.490] version <- NULL [17:27:34.490] } [17:27:34.490] if (!has_future || version < "1.8.0") { [17:27:34.490] info <- base::c(r_version = base::gsub("R version ", [17:27:34.490] "", base::R.version$version.string), [17:27:34.490] platform = base::sprintf("%s (%s-bit)", [17:27:34.490] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.490] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.490] "release", "version")], collapse = " "), [17:27:34.490] hostname = base::Sys.info()[["nodename"]]) [17:27:34.490] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.490] info) [17:27:34.490] info <- base::paste(info, collapse = "; ") [17:27:34.490] if (!has_future) { [17:27:34.490] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.490] info) [17:27:34.490] } [17:27:34.490] else { [17:27:34.490] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.490] info, version) [17:27:34.490] } [17:27:34.490] base::stop(msg) [17:27:34.490] } [17:27:34.490] }) [17:27:34.490] } [17:27:34.490] ...future.strategy.old <- future::plan("list") [17:27:34.490] options(future.plan = NULL) [17:27:34.490] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.490] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.490] } [17:27:34.490] ...future.workdir <- getwd() [17:27:34.490] } [17:27:34.490] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.490] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.490] } [17:27:34.490] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.490] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.490] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.490] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.490] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.490] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.490] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.490] base::names(...future.oldOptions)) [17:27:34.490] } [17:27:34.490] if (FALSE) { [17:27:34.490] } [17:27:34.490] else { [17:27:34.490] if (TRUE) { [17:27:34.490] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.490] open = "w") [17:27:34.490] } [17:27:34.490] else { [17:27:34.490] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.490] windows = "NUL", "/dev/null"), open = "w") [17:27:34.490] } [17:27:34.490] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.490] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.490] base::sink(type = "output", split = FALSE) [17:27:34.490] base::close(...future.stdout) [17:27:34.490] }, add = TRUE) [17:27:34.490] } [17:27:34.490] ...future.frame <- base::sys.nframe() [17:27:34.490] ...future.conditions <- base::list() [17:27:34.490] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.490] if (FALSE) { [17:27:34.490] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.490] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.490] } [17:27:34.490] ...future.result <- base::tryCatch({ [17:27:34.490] base::withCallingHandlers({ [17:27:34.490] ...future.value <- base::withVisible(base::local(2)) [17:27:34.490] future::FutureResult(value = ...future.value$value, [17:27:34.490] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.490] ...future.rng), globalenv = if (FALSE) [17:27:34.490] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.490] ...future.globalenv.names)) [17:27:34.490] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.490] }, condition = base::local({ [17:27:34.490] c <- base::c [17:27:34.490] inherits <- base::inherits [17:27:34.490] invokeRestart <- base::invokeRestart [17:27:34.490] length <- base::length [17:27:34.490] list <- base::list [17:27:34.490] seq.int <- base::seq.int [17:27:34.490] signalCondition <- base::signalCondition [17:27:34.490] sys.calls <- base::sys.calls [17:27:34.490] `[[` <- base::`[[` [17:27:34.490] `+` <- base::`+` [17:27:34.490] `<<-` <- base::`<<-` [17:27:34.490] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.490] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.490] 3L)] [17:27:34.490] } [17:27:34.490] function(cond) { [17:27:34.490] is_error <- inherits(cond, "error") [17:27:34.490] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.490] NULL) [17:27:34.490] if (is_error) { [17:27:34.490] sessionInformation <- function() { [17:27:34.490] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.490] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.490] search = base::search(), system = base::Sys.info()) [17:27:34.490] } [17:27:34.490] ...future.conditions[[length(...future.conditions) + [17:27:34.490] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.490] cond$call), session = sessionInformation(), [17:27:34.490] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.490] signalCondition(cond) [17:27:34.490] } [17:27:34.490] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.490] "immediateCondition"))) { [17:27:34.490] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.490] ...future.conditions[[length(...future.conditions) + [17:27:34.490] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.490] if (TRUE && !signal) { [17:27:34.490] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.490] { [17:27:34.490] inherits <- base::inherits [17:27:34.490] invokeRestart <- base::invokeRestart [17:27:34.490] is.null <- base::is.null [17:27:34.490] muffled <- FALSE [17:27:34.490] if (inherits(cond, "message")) { [17:27:34.490] muffled <- grepl(pattern, "muffleMessage") [17:27:34.490] if (muffled) [17:27:34.490] invokeRestart("muffleMessage") [17:27:34.490] } [17:27:34.490] else if (inherits(cond, "warning")) { [17:27:34.490] muffled <- grepl(pattern, "muffleWarning") [17:27:34.490] if (muffled) [17:27:34.490] invokeRestart("muffleWarning") [17:27:34.490] } [17:27:34.490] else if (inherits(cond, "condition")) { [17:27:34.490] if (!is.null(pattern)) { [17:27:34.490] computeRestarts <- base::computeRestarts [17:27:34.490] grepl <- base::grepl [17:27:34.490] restarts <- computeRestarts(cond) [17:27:34.490] for (restart in restarts) { [17:27:34.490] name <- restart$name [17:27:34.490] if (is.null(name)) [17:27:34.490] next [17:27:34.490] if (!grepl(pattern, name)) [17:27:34.490] next [17:27:34.490] invokeRestart(restart) [17:27:34.490] muffled <- TRUE [17:27:34.490] break [17:27:34.490] } [17:27:34.490] } [17:27:34.490] } [17:27:34.490] invisible(muffled) [17:27:34.490] } [17:27:34.490] muffleCondition(cond, pattern = "^muffle") [17:27:34.490] } [17:27:34.490] } [17:27:34.490] else { [17:27:34.490] if (TRUE) { [17:27:34.490] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.490] { [17:27:34.490] inherits <- base::inherits [17:27:34.490] invokeRestart <- base::invokeRestart [17:27:34.490] is.null <- base::is.null [17:27:34.490] muffled <- FALSE [17:27:34.490] if (inherits(cond, "message")) { [17:27:34.490] muffled <- grepl(pattern, "muffleMessage") [17:27:34.490] if (muffled) [17:27:34.490] invokeRestart("muffleMessage") [17:27:34.490] } [17:27:34.490] else if (inherits(cond, "warning")) { [17:27:34.490] muffled <- grepl(pattern, "muffleWarning") [17:27:34.490] if (muffled) [17:27:34.490] invokeRestart("muffleWarning") [17:27:34.490] } [17:27:34.490] else if (inherits(cond, "condition")) { [17:27:34.490] if (!is.null(pattern)) { [17:27:34.490] computeRestarts <- base::computeRestarts [17:27:34.490] grepl <- base::grepl [17:27:34.490] restarts <- computeRestarts(cond) [17:27:34.490] for (restart in restarts) { [17:27:34.490] name <- restart$name [17:27:34.490] if (is.null(name)) [17:27:34.490] next [17:27:34.490] if (!grepl(pattern, name)) [17:27:34.490] next [17:27:34.490] invokeRestart(restart) [17:27:34.490] muffled <- TRUE [17:27:34.490] break [17:27:34.490] } [17:27:34.490] } [17:27:34.490] } [17:27:34.490] invisible(muffled) [17:27:34.490] } [17:27:34.490] muffleCondition(cond, pattern = "^muffle") [17:27:34.490] } [17:27:34.490] } [17:27:34.490] } [17:27:34.490] })) [17:27:34.490] }, error = function(ex) { [17:27:34.490] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.490] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.490] ...future.rng), started = ...future.startTime, [17:27:34.490] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.490] version = "1.8"), class = "FutureResult") [17:27:34.490] }, finally = { [17:27:34.490] if (!identical(...future.workdir, getwd())) [17:27:34.490] setwd(...future.workdir) [17:27:34.490] { [17:27:34.490] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.490] ...future.oldOptions$nwarnings <- NULL [17:27:34.490] } [17:27:34.490] base::options(...future.oldOptions) [17:27:34.490] if (.Platform$OS.type == "windows") { [17:27:34.490] old_names <- names(...future.oldEnvVars) [17:27:34.490] envs <- base::Sys.getenv() [17:27:34.490] names <- names(envs) [17:27:34.490] common <- intersect(names, old_names) [17:27:34.490] added <- setdiff(names, old_names) [17:27:34.490] removed <- setdiff(old_names, names) [17:27:34.490] changed <- common[...future.oldEnvVars[common] != [17:27:34.490] envs[common]] [17:27:34.490] NAMES <- toupper(changed) [17:27:34.490] args <- list() [17:27:34.490] for (kk in seq_along(NAMES)) { [17:27:34.490] name <- changed[[kk]] [17:27:34.490] NAME <- NAMES[[kk]] [17:27:34.490] if (name != NAME && is.element(NAME, old_names)) [17:27:34.490] next [17:27:34.490] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.490] } [17:27:34.490] NAMES <- toupper(added) [17:27:34.490] for (kk in seq_along(NAMES)) { [17:27:34.490] name <- added[[kk]] [17:27:34.490] NAME <- NAMES[[kk]] [17:27:34.490] if (name != NAME && is.element(NAME, old_names)) [17:27:34.490] next [17:27:34.490] args[[name]] <- "" [17:27:34.490] } [17:27:34.490] NAMES <- toupper(removed) [17:27:34.490] for (kk in seq_along(NAMES)) { [17:27:34.490] name <- removed[[kk]] [17:27:34.490] NAME <- NAMES[[kk]] [17:27:34.490] if (name != NAME && is.element(NAME, old_names)) [17:27:34.490] next [17:27:34.490] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.490] } [17:27:34.490] if (length(args) > 0) [17:27:34.490] base::do.call(base::Sys.setenv, args = args) [17:27:34.490] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.490] } [17:27:34.490] else { [17:27:34.490] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.490] } [17:27:34.490] { [17:27:34.490] if (base::length(...future.futureOptionsAdded) > [17:27:34.490] 0L) { [17:27:34.490] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.490] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.490] base::options(opts) [17:27:34.490] } [17:27:34.490] { [17:27:34.490] { [17:27:34.490] NULL [17:27:34.490] RNGkind("Mersenne-Twister") [17:27:34.490] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.490] inherits = FALSE) [17:27:34.490] } [17:27:34.490] options(future.plan = NULL) [17:27:34.490] if (is.na(NA_character_)) [17:27:34.490] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.490] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.490] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.490] .init = FALSE) [17:27:34.490] } [17:27:34.490] } [17:27:34.490] } [17:27:34.490] }) [17:27:34.490] if (TRUE) { [17:27:34.490] base::sink(type = "output", split = FALSE) [17:27:34.490] if (TRUE) { [17:27:34.490] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.490] } [17:27:34.490] else { [17:27:34.490] ...future.result["stdout"] <- base::list(NULL) [17:27:34.490] } [17:27:34.490] base::close(...future.stdout) [17:27:34.490] ...future.stdout <- NULL [17:27:34.490] } [17:27:34.490] ...future.result$conditions <- ...future.conditions [17:27:34.490] ...future.result$finished <- base::Sys.time() [17:27:34.490] ...future.result [17:27:34.490] } [17:27:34.494] plan(): Setting new future strategy stack: [17:27:34.494] List of future strategies: [17:27:34.494] 1. sequential: [17:27:34.494] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.494] - tweaked: FALSE [17:27:34.494] - call: NULL [17:27:34.495] plan(): nbrOfWorkers() = 1 [17:27:34.496] plan(): Setting new future strategy stack: [17:27:34.497] List of future strategies: [17:27:34.497] 1. sequential: [17:27:34.497] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.497] - tweaked: FALSE [17:27:34.497] - call: plan(strategy) [17:27:34.497] plan(): nbrOfWorkers() = 1 [17:27:34.498] SequentialFuture started (and completed) [17:27:34.498] - Launch lazy future ... done [17:27:34.498] run() for 'SequentialFuture' ... done [17:27:34.498] getGlobalsAndPackages() ... [17:27:34.498] Searching for globals... [17:27:34.499] [17:27:34.499] Searching for globals ... DONE [17:27:34.499] - globals: [0] [17:27:34.500] getGlobalsAndPackages() ... DONE [17:27:34.500] run() for 'Future' ... [17:27:34.500] - state: 'created' [17:27:34.500] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.504] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.504] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.504] - Field: 'label' [17:27:34.505] - Field: 'local' [17:27:34.505] - Field: 'owner' [17:27:34.505] - Field: 'envir' [17:27:34.505] - Field: 'packages' [17:27:34.505] - Field: 'gc' [17:27:34.506] - Field: 'conditions' [17:27:34.506] - Field: 'expr' [17:27:34.506] - Field: 'uuid' [17:27:34.506] - Field: 'seed' [17:27:34.506] - Field: 'version' [17:27:34.506] - Field: 'result' [17:27:34.507] - Field: 'asynchronous' [17:27:34.507] - Field: 'calls' [17:27:34.507] - Field: 'globals' [17:27:34.507] - Field: 'stdout' [17:27:34.507] - Field: 'earlySignal' [17:27:34.508] - Field: 'lazy' [17:27:34.508] - Field: 'state' [17:27:34.508] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.508] - Launch lazy future ... [17:27:34.508] Packages needed by the future expression (n = 0): [17:27:34.509] Packages needed by future strategies (n = 0): [17:27:34.509] { [17:27:34.509] { [17:27:34.509] { [17:27:34.509] ...future.startTime <- base::Sys.time() [17:27:34.509] { [17:27:34.509] { [17:27:34.509] { [17:27:34.509] base::local({ [17:27:34.509] has_future <- base::requireNamespace("future", [17:27:34.509] quietly = TRUE) [17:27:34.509] if (has_future) { [17:27:34.509] ns <- base::getNamespace("future") [17:27:34.509] version <- ns[[".package"]][["version"]] [17:27:34.509] if (is.null(version)) [17:27:34.509] version <- utils::packageVersion("future") [17:27:34.509] } [17:27:34.509] else { [17:27:34.509] version <- NULL [17:27:34.509] } [17:27:34.509] if (!has_future || version < "1.8.0") { [17:27:34.509] info <- base::c(r_version = base::gsub("R version ", [17:27:34.509] "", base::R.version$version.string), [17:27:34.509] platform = base::sprintf("%s (%s-bit)", [17:27:34.509] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.509] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.509] "release", "version")], collapse = " "), [17:27:34.509] hostname = base::Sys.info()[["nodename"]]) [17:27:34.509] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.509] info) [17:27:34.509] info <- base::paste(info, collapse = "; ") [17:27:34.509] if (!has_future) { [17:27:34.509] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.509] info) [17:27:34.509] } [17:27:34.509] else { [17:27:34.509] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.509] info, version) [17:27:34.509] } [17:27:34.509] base::stop(msg) [17:27:34.509] } [17:27:34.509] }) [17:27:34.509] } [17:27:34.509] ...future.strategy.old <- future::plan("list") [17:27:34.509] options(future.plan = NULL) [17:27:34.509] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.509] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.509] } [17:27:34.509] ...future.workdir <- getwd() [17:27:34.509] } [17:27:34.509] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.509] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.509] } [17:27:34.509] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.509] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.509] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.509] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.509] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.509] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.509] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.509] base::names(...future.oldOptions)) [17:27:34.509] } [17:27:34.509] if (FALSE) { [17:27:34.509] } [17:27:34.509] else { [17:27:34.509] if (TRUE) { [17:27:34.509] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.509] open = "w") [17:27:34.509] } [17:27:34.509] else { [17:27:34.509] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.509] windows = "NUL", "/dev/null"), open = "w") [17:27:34.509] } [17:27:34.509] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.509] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.509] base::sink(type = "output", split = FALSE) [17:27:34.509] base::close(...future.stdout) [17:27:34.509] }, add = TRUE) [17:27:34.509] } [17:27:34.509] ...future.frame <- base::sys.nframe() [17:27:34.509] ...future.conditions <- base::list() [17:27:34.509] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.509] if (FALSE) { [17:27:34.509] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.509] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.509] } [17:27:34.509] ...future.result <- base::tryCatch({ [17:27:34.509] base::withCallingHandlers({ [17:27:34.509] ...future.value <- base::withVisible(base::local(NULL)) [17:27:34.509] future::FutureResult(value = ...future.value$value, [17:27:34.509] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.509] ...future.rng), globalenv = if (FALSE) [17:27:34.509] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.509] ...future.globalenv.names)) [17:27:34.509] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.509] }, condition = base::local({ [17:27:34.509] c <- base::c [17:27:34.509] inherits <- base::inherits [17:27:34.509] invokeRestart <- base::invokeRestart [17:27:34.509] length <- base::length [17:27:34.509] list <- base::list [17:27:34.509] seq.int <- base::seq.int [17:27:34.509] signalCondition <- base::signalCondition [17:27:34.509] sys.calls <- base::sys.calls [17:27:34.509] `[[` <- base::`[[` [17:27:34.509] `+` <- base::`+` [17:27:34.509] `<<-` <- base::`<<-` [17:27:34.509] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.509] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.509] 3L)] [17:27:34.509] } [17:27:34.509] function(cond) { [17:27:34.509] is_error <- inherits(cond, "error") [17:27:34.509] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.509] NULL) [17:27:34.509] if (is_error) { [17:27:34.509] sessionInformation <- function() { [17:27:34.509] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.509] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.509] search = base::search(), system = base::Sys.info()) [17:27:34.509] } [17:27:34.509] ...future.conditions[[length(...future.conditions) + [17:27:34.509] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.509] cond$call), session = sessionInformation(), [17:27:34.509] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.509] signalCondition(cond) [17:27:34.509] } [17:27:34.509] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.509] "immediateCondition"))) { [17:27:34.509] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.509] ...future.conditions[[length(...future.conditions) + [17:27:34.509] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.509] if (TRUE && !signal) { [17:27:34.509] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.509] { [17:27:34.509] inherits <- base::inherits [17:27:34.509] invokeRestart <- base::invokeRestart [17:27:34.509] is.null <- base::is.null [17:27:34.509] muffled <- FALSE [17:27:34.509] if (inherits(cond, "message")) { [17:27:34.509] muffled <- grepl(pattern, "muffleMessage") [17:27:34.509] if (muffled) [17:27:34.509] invokeRestart("muffleMessage") [17:27:34.509] } [17:27:34.509] else if (inherits(cond, "warning")) { [17:27:34.509] muffled <- grepl(pattern, "muffleWarning") [17:27:34.509] if (muffled) [17:27:34.509] invokeRestart("muffleWarning") [17:27:34.509] } [17:27:34.509] else if (inherits(cond, "condition")) { [17:27:34.509] if (!is.null(pattern)) { [17:27:34.509] computeRestarts <- base::computeRestarts [17:27:34.509] grepl <- base::grepl [17:27:34.509] restarts <- computeRestarts(cond) [17:27:34.509] for (restart in restarts) { [17:27:34.509] name <- restart$name [17:27:34.509] if (is.null(name)) [17:27:34.509] next [17:27:34.509] if (!grepl(pattern, name)) [17:27:34.509] next [17:27:34.509] invokeRestart(restart) [17:27:34.509] muffled <- TRUE [17:27:34.509] break [17:27:34.509] } [17:27:34.509] } [17:27:34.509] } [17:27:34.509] invisible(muffled) [17:27:34.509] } [17:27:34.509] muffleCondition(cond, pattern = "^muffle") [17:27:34.509] } [17:27:34.509] } [17:27:34.509] else { [17:27:34.509] if (TRUE) { [17:27:34.509] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.509] { [17:27:34.509] inherits <- base::inherits [17:27:34.509] invokeRestart <- base::invokeRestart [17:27:34.509] is.null <- base::is.null [17:27:34.509] muffled <- FALSE [17:27:34.509] if (inherits(cond, "message")) { [17:27:34.509] muffled <- grepl(pattern, "muffleMessage") [17:27:34.509] if (muffled) [17:27:34.509] invokeRestart("muffleMessage") [17:27:34.509] } [17:27:34.509] else if (inherits(cond, "warning")) { [17:27:34.509] muffled <- grepl(pattern, "muffleWarning") [17:27:34.509] if (muffled) [17:27:34.509] invokeRestart("muffleWarning") [17:27:34.509] } [17:27:34.509] else if (inherits(cond, "condition")) { [17:27:34.509] if (!is.null(pattern)) { [17:27:34.509] computeRestarts <- base::computeRestarts [17:27:34.509] grepl <- base::grepl [17:27:34.509] restarts <- computeRestarts(cond) [17:27:34.509] for (restart in restarts) { [17:27:34.509] name <- restart$name [17:27:34.509] if (is.null(name)) [17:27:34.509] next [17:27:34.509] if (!grepl(pattern, name)) [17:27:34.509] next [17:27:34.509] invokeRestart(restart) [17:27:34.509] muffled <- TRUE [17:27:34.509] break [17:27:34.509] } [17:27:34.509] } [17:27:34.509] } [17:27:34.509] invisible(muffled) [17:27:34.509] } [17:27:34.509] muffleCondition(cond, pattern = "^muffle") [17:27:34.509] } [17:27:34.509] } [17:27:34.509] } [17:27:34.509] })) [17:27:34.509] }, error = function(ex) { [17:27:34.509] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.509] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.509] ...future.rng), started = ...future.startTime, [17:27:34.509] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.509] version = "1.8"), class = "FutureResult") [17:27:34.509] }, finally = { [17:27:34.509] if (!identical(...future.workdir, getwd())) [17:27:34.509] setwd(...future.workdir) [17:27:34.509] { [17:27:34.509] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.509] ...future.oldOptions$nwarnings <- NULL [17:27:34.509] } [17:27:34.509] base::options(...future.oldOptions) [17:27:34.509] if (.Platform$OS.type == "windows") { [17:27:34.509] old_names <- names(...future.oldEnvVars) [17:27:34.509] envs <- base::Sys.getenv() [17:27:34.509] names <- names(envs) [17:27:34.509] common <- intersect(names, old_names) [17:27:34.509] added <- setdiff(names, old_names) [17:27:34.509] removed <- setdiff(old_names, names) [17:27:34.509] changed <- common[...future.oldEnvVars[common] != [17:27:34.509] envs[common]] [17:27:34.509] NAMES <- toupper(changed) [17:27:34.509] args <- list() [17:27:34.509] for (kk in seq_along(NAMES)) { [17:27:34.509] name <- changed[[kk]] [17:27:34.509] NAME <- NAMES[[kk]] [17:27:34.509] if (name != NAME && is.element(NAME, old_names)) [17:27:34.509] next [17:27:34.509] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.509] } [17:27:34.509] NAMES <- toupper(added) [17:27:34.509] for (kk in seq_along(NAMES)) { [17:27:34.509] name <- added[[kk]] [17:27:34.509] NAME <- NAMES[[kk]] [17:27:34.509] if (name != NAME && is.element(NAME, old_names)) [17:27:34.509] next [17:27:34.509] args[[name]] <- "" [17:27:34.509] } [17:27:34.509] NAMES <- toupper(removed) [17:27:34.509] for (kk in seq_along(NAMES)) { [17:27:34.509] name <- removed[[kk]] [17:27:34.509] NAME <- NAMES[[kk]] [17:27:34.509] if (name != NAME && is.element(NAME, old_names)) [17:27:34.509] next [17:27:34.509] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.509] } [17:27:34.509] if (length(args) > 0) [17:27:34.509] base::do.call(base::Sys.setenv, args = args) [17:27:34.509] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.509] } [17:27:34.509] else { [17:27:34.509] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.509] } [17:27:34.509] { [17:27:34.509] if (base::length(...future.futureOptionsAdded) > [17:27:34.509] 0L) { [17:27:34.509] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.509] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.509] base::options(opts) [17:27:34.509] } [17:27:34.509] { [17:27:34.509] { [17:27:34.509] NULL [17:27:34.509] RNGkind("Mersenne-Twister") [17:27:34.509] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.509] inherits = FALSE) [17:27:34.509] } [17:27:34.509] options(future.plan = NULL) [17:27:34.509] if (is.na(NA_character_)) [17:27:34.509] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.509] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.509] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.509] .init = FALSE) [17:27:34.509] } [17:27:34.509] } [17:27:34.509] } [17:27:34.509] }) [17:27:34.509] if (TRUE) { [17:27:34.509] base::sink(type = "output", split = FALSE) [17:27:34.509] if (TRUE) { [17:27:34.509] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.509] } [17:27:34.509] else { [17:27:34.509] ...future.result["stdout"] <- base::list(NULL) [17:27:34.509] } [17:27:34.509] base::close(...future.stdout) [17:27:34.509] ...future.stdout <- NULL [17:27:34.509] } [17:27:34.509] ...future.result$conditions <- ...future.conditions [17:27:34.509] ...future.result$finished <- base::Sys.time() [17:27:34.509] ...future.result [17:27:34.509] } [17:27:34.514] plan(): Setting new future strategy stack: [17:27:34.514] List of future strategies: [17:27:34.514] 1. sequential: [17:27:34.514] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.514] - tweaked: FALSE [17:27:34.514] - call: NULL [17:27:34.514] plan(): nbrOfWorkers() = 1 [17:27:34.516] plan(): Setting new future strategy stack: [17:27:34.516] List of future strategies: [17:27:34.516] 1. sequential: [17:27:34.516] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.516] - tweaked: FALSE [17:27:34.516] - call: plan(strategy) [17:27:34.517] plan(): nbrOfWorkers() = 1 [17:27:34.517] SequentialFuture started (and completed) [17:27:34.518] - Launch lazy future ... done [17:27:34.518] run() for 'SequentialFuture' ... done List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 2 3 - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" [17:27:34.528] resolved() for 'SequentialFuture' ... [17:27:34.528] - state: 'finished' [17:27:34.528] - run: TRUE [17:27:34.529] - result: 'FutureResult' [17:27:34.529] resolved() for 'SequentialFuture' ... done [17:27:34.529] resolved() for 'SequentialFuture' ... [17:27:34.530] - state: 'finished' [17:27:34.530] - run: TRUE [17:27:34.530] - result: 'FutureResult' [17:27:34.531] resolved() for 'SequentialFuture' ... done logi [1:2, 1:3] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:34.534] resolve() on list ... [17:27:34.534] recursive: 0 [17:27:34.535] length: 6 [17:27:34.535] elements: 'a', 'b', 'c', '', '', '' [17:27:34.535] signalConditionsASAP(numeric, pos=1) ... [17:27:34.535] - nx: 6 [17:27:34.536] - relay: TRUE [17:27:34.536] - stdout: TRUE [17:27:34.536] - signal: TRUE [17:27:34.536] - resignal: FALSE [17:27:34.537] - force: TRUE [17:27:34.537] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.537] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.538] - until=2 [17:27:34.538] - relaying element #2 [17:27:34.538] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.538] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.539] signalConditionsASAP(NULL, pos=1) ... done [17:27:34.539] length: 5 (resolved future 1) [17:27:34.539] resolved() for 'SequentialFuture' ... [17:27:34.540] - state: 'finished' [17:27:34.540] - run: TRUE [17:27:34.540] - result: 'FutureResult' [17:27:34.540] resolved() for 'SequentialFuture' ... done [17:27:34.541] Future #2 [17:27:34.541] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:34.541] - nx: 6 [17:27:34.542] - relay: TRUE [17:27:34.542] - stdout: TRUE [17:27:34.542] - signal: TRUE [17:27:34.542] - resignal: FALSE [17:27:34.543] - force: TRUE [17:27:34.543] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.543] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.544] - until=2 [17:27:34.544] - relaying element #2 [17:27:34.544] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.545] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.545] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:34.545] length: 4 (resolved future 2) [17:27:34.545] resolved() for 'SequentialFuture' ... [17:27:34.546] - state: 'finished' [17:27:34.546] - run: TRUE [17:27:34.546] - result: 'FutureResult' [17:27:34.547] resolved() for 'SequentialFuture' ... done [17:27:34.547] Future #3 [17:27:34.547] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:34.548] - nx: 6 [17:27:34.548] - relay: TRUE [17:27:34.548] - stdout: TRUE [17:27:34.548] - signal: TRUE [17:27:34.549] - resignal: FALSE [17:27:34.549] - force: TRUE [17:27:34.549] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.549] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.550] - until=3 [17:27:34.550] - relaying element #3 [17:27:34.551] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.551] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.551] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:34.551] length: 3 (resolved future 3) [17:27:34.552] signalConditionsASAP(NULL, pos=4) ... [17:27:34.552] - nx: 6 [17:27:34.552] - relay: TRUE [17:27:34.556] - stdout: TRUE [17:27:34.557] - signal: TRUE [17:27:34.557] - resignal: FALSE [17:27:34.557] - force: TRUE [17:27:34.557] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.558] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.558] - until=5 [17:27:34.558] - relaying element #5 [17:27:34.559] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.559] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.559] signalConditionsASAP(NULL, pos=4) ... done [17:27:34.559] length: 2 (resolved future 4) [17:27:34.560] signalConditionsASAP(NULL, pos=5) ... [17:27:34.560] - nx: 6 [17:27:34.560] - relay: TRUE [17:27:34.560] - stdout: TRUE [17:27:34.561] - signal: TRUE [17:27:34.561] - resignal: FALSE [17:27:34.561] - force: TRUE [17:27:34.561] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.562] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.562] - until=6 [17:27:34.562] - relaying element #6 [17:27:34.563] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.563] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.563] signalConditionsASAP(NULL, pos=5) ... done [17:27:34.563] length: 1 (resolved future 5) [17:27:34.564] signalConditionsASAP(numeric, pos=6) ... [17:27:34.564] - nx: 6 [17:27:34.564] - relay: TRUE [17:27:34.564] - stdout: TRUE [17:27:34.565] - signal: TRUE [17:27:34.565] - resignal: FALSE [17:27:34.565] - force: TRUE [17:27:34.565] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.566] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.566] - until=6 [17:27:34.566] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.566] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.567] signalConditionsASAP(numeric, pos=6) ... done [17:27:34.567] length: 0 (resolved future 6) [17:27:34.567] Relaying remaining futures [17:27:34.568] signalConditionsASAP(NULL, pos=0) ... [17:27:34.568] - nx: 6 [17:27:34.568] - relay: TRUE [17:27:34.568] - stdout: TRUE [17:27:34.569] - signal: TRUE [17:27:34.569] - resignal: FALSE [17:27:34.569] - force: TRUE [17:27:34.569] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.570] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:34.570] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.570] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.571] signalConditionsASAP(NULL, pos=0) ... done [17:27:34.571] resolve() on list ... DONE List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 2 3 - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" Dimensions: c(2, 3, 1) [17:27:34.578] getGlobalsAndPackages() ... [17:27:34.578] Searching for globals... [17:27:34.579] [17:27:34.579] Searching for globals ... DONE [17:27:34.580] - globals: [0] [17:27:34.580] getGlobalsAndPackages() ... DONE [17:27:34.581] run() for 'Future' ... [17:27:34.581] - state: 'created' [17:27:34.581] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.582] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.582] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.583] - Field: 'label' [17:27:34.583] - Field: 'local' [17:27:34.583] - Field: 'owner' [17:27:34.583] - Field: 'envir' [17:27:34.584] - Field: 'packages' [17:27:34.584] - Field: 'gc' [17:27:34.584] - Field: 'conditions' [17:27:34.585] - Field: 'expr' [17:27:34.585] - Field: 'uuid' [17:27:34.585] - Field: 'seed' [17:27:34.586] - Field: 'version' [17:27:34.586] - Field: 'result' [17:27:34.586] - Field: 'asynchronous' [17:27:34.586] - Field: 'calls' [17:27:34.587] - Field: 'globals' [17:27:34.587] - Field: 'stdout' [17:27:34.587] - Field: 'earlySignal' [17:27:34.587] - Field: 'lazy' [17:27:34.588] - Field: 'state' [17:27:34.588] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.588] - Launch lazy future ... [17:27:34.588] Packages needed by the future expression (n = 0): [17:27:34.589] Packages needed by future strategies (n = 0): [17:27:34.589] { [17:27:34.589] { [17:27:34.589] { [17:27:34.589] ...future.startTime <- base::Sys.time() [17:27:34.589] { [17:27:34.589] { [17:27:34.589] { [17:27:34.589] base::local({ [17:27:34.589] has_future <- base::requireNamespace("future", [17:27:34.589] quietly = TRUE) [17:27:34.589] if (has_future) { [17:27:34.589] ns <- base::getNamespace("future") [17:27:34.589] version <- ns[[".package"]][["version"]] [17:27:34.589] if (is.null(version)) [17:27:34.589] version <- utils::packageVersion("future") [17:27:34.589] } [17:27:34.589] else { [17:27:34.589] version <- NULL [17:27:34.589] } [17:27:34.589] if (!has_future || version < "1.8.0") { [17:27:34.589] info <- base::c(r_version = base::gsub("R version ", [17:27:34.589] "", base::R.version$version.string), [17:27:34.589] platform = base::sprintf("%s (%s-bit)", [17:27:34.589] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.589] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.589] "release", "version")], collapse = " "), [17:27:34.589] hostname = base::Sys.info()[["nodename"]]) [17:27:34.589] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.589] info) [17:27:34.589] info <- base::paste(info, collapse = "; ") [17:27:34.589] if (!has_future) { [17:27:34.589] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.589] info) [17:27:34.589] } [17:27:34.589] else { [17:27:34.589] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.589] info, version) [17:27:34.589] } [17:27:34.589] base::stop(msg) [17:27:34.589] } [17:27:34.589] }) [17:27:34.589] } [17:27:34.589] ...future.strategy.old <- future::plan("list") [17:27:34.589] options(future.plan = NULL) [17:27:34.589] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.589] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.589] } [17:27:34.589] ...future.workdir <- getwd() [17:27:34.589] } [17:27:34.589] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.589] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.589] } [17:27:34.589] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.589] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.589] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.589] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.589] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.589] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.589] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.589] base::names(...future.oldOptions)) [17:27:34.589] } [17:27:34.589] if (FALSE) { [17:27:34.589] } [17:27:34.589] else { [17:27:34.589] if (TRUE) { [17:27:34.589] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.589] open = "w") [17:27:34.589] } [17:27:34.589] else { [17:27:34.589] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.589] windows = "NUL", "/dev/null"), open = "w") [17:27:34.589] } [17:27:34.589] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.589] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.589] base::sink(type = "output", split = FALSE) [17:27:34.589] base::close(...future.stdout) [17:27:34.589] }, add = TRUE) [17:27:34.589] } [17:27:34.589] ...future.frame <- base::sys.nframe() [17:27:34.589] ...future.conditions <- base::list() [17:27:34.589] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.589] if (FALSE) { [17:27:34.589] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.589] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.589] } [17:27:34.589] ...future.result <- base::tryCatch({ [17:27:34.589] base::withCallingHandlers({ [17:27:34.589] ...future.value <- base::withVisible(base::local(2)) [17:27:34.589] future::FutureResult(value = ...future.value$value, [17:27:34.589] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.589] ...future.rng), globalenv = if (FALSE) [17:27:34.589] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.589] ...future.globalenv.names)) [17:27:34.589] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.589] }, condition = base::local({ [17:27:34.589] c <- base::c [17:27:34.589] inherits <- base::inherits [17:27:34.589] invokeRestart <- base::invokeRestart [17:27:34.589] length <- base::length [17:27:34.589] list <- base::list [17:27:34.589] seq.int <- base::seq.int [17:27:34.589] signalCondition <- base::signalCondition [17:27:34.589] sys.calls <- base::sys.calls [17:27:34.589] `[[` <- base::`[[` [17:27:34.589] `+` <- base::`+` [17:27:34.589] `<<-` <- base::`<<-` [17:27:34.589] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.589] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.589] 3L)] [17:27:34.589] } [17:27:34.589] function(cond) { [17:27:34.589] is_error <- inherits(cond, "error") [17:27:34.589] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.589] NULL) [17:27:34.589] if (is_error) { [17:27:34.589] sessionInformation <- function() { [17:27:34.589] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.589] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.589] search = base::search(), system = base::Sys.info()) [17:27:34.589] } [17:27:34.589] ...future.conditions[[length(...future.conditions) + [17:27:34.589] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.589] cond$call), session = sessionInformation(), [17:27:34.589] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.589] signalCondition(cond) [17:27:34.589] } [17:27:34.589] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.589] "immediateCondition"))) { [17:27:34.589] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.589] ...future.conditions[[length(...future.conditions) + [17:27:34.589] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.589] if (TRUE && !signal) { [17:27:34.589] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.589] { [17:27:34.589] inherits <- base::inherits [17:27:34.589] invokeRestart <- base::invokeRestart [17:27:34.589] is.null <- base::is.null [17:27:34.589] muffled <- FALSE [17:27:34.589] if (inherits(cond, "message")) { [17:27:34.589] muffled <- grepl(pattern, "muffleMessage") [17:27:34.589] if (muffled) [17:27:34.589] invokeRestart("muffleMessage") [17:27:34.589] } [17:27:34.589] else if (inherits(cond, "warning")) { [17:27:34.589] muffled <- grepl(pattern, "muffleWarning") [17:27:34.589] if (muffled) [17:27:34.589] invokeRestart("muffleWarning") [17:27:34.589] } [17:27:34.589] else if (inherits(cond, "condition")) { [17:27:34.589] if (!is.null(pattern)) { [17:27:34.589] computeRestarts <- base::computeRestarts [17:27:34.589] grepl <- base::grepl [17:27:34.589] restarts <- computeRestarts(cond) [17:27:34.589] for (restart in restarts) { [17:27:34.589] name <- restart$name [17:27:34.589] if (is.null(name)) [17:27:34.589] next [17:27:34.589] if (!grepl(pattern, name)) [17:27:34.589] next [17:27:34.589] invokeRestart(restart) [17:27:34.589] muffled <- TRUE [17:27:34.589] break [17:27:34.589] } [17:27:34.589] } [17:27:34.589] } [17:27:34.589] invisible(muffled) [17:27:34.589] } [17:27:34.589] muffleCondition(cond, pattern = "^muffle") [17:27:34.589] } [17:27:34.589] } [17:27:34.589] else { [17:27:34.589] if (TRUE) { [17:27:34.589] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.589] { [17:27:34.589] inherits <- base::inherits [17:27:34.589] invokeRestart <- base::invokeRestart [17:27:34.589] is.null <- base::is.null [17:27:34.589] muffled <- FALSE [17:27:34.589] if (inherits(cond, "message")) { [17:27:34.589] muffled <- grepl(pattern, "muffleMessage") [17:27:34.589] if (muffled) [17:27:34.589] invokeRestart("muffleMessage") [17:27:34.589] } [17:27:34.589] else if (inherits(cond, "warning")) { [17:27:34.589] muffled <- grepl(pattern, "muffleWarning") [17:27:34.589] if (muffled) [17:27:34.589] invokeRestart("muffleWarning") [17:27:34.589] } [17:27:34.589] else if (inherits(cond, "condition")) { [17:27:34.589] if (!is.null(pattern)) { [17:27:34.589] computeRestarts <- base::computeRestarts [17:27:34.589] grepl <- base::grepl [17:27:34.589] restarts <- computeRestarts(cond) [17:27:34.589] for (restart in restarts) { [17:27:34.589] name <- restart$name [17:27:34.589] if (is.null(name)) [17:27:34.589] next [17:27:34.589] if (!grepl(pattern, name)) [17:27:34.589] next [17:27:34.589] invokeRestart(restart) [17:27:34.589] muffled <- TRUE [17:27:34.589] break [17:27:34.589] } [17:27:34.589] } [17:27:34.589] } [17:27:34.589] invisible(muffled) [17:27:34.589] } [17:27:34.589] muffleCondition(cond, pattern = "^muffle") [17:27:34.589] } [17:27:34.589] } [17:27:34.589] } [17:27:34.589] })) [17:27:34.589] }, error = function(ex) { [17:27:34.589] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.589] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.589] ...future.rng), started = ...future.startTime, [17:27:34.589] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.589] version = "1.8"), class = "FutureResult") [17:27:34.589] }, finally = { [17:27:34.589] if (!identical(...future.workdir, getwd())) [17:27:34.589] setwd(...future.workdir) [17:27:34.589] { [17:27:34.589] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.589] ...future.oldOptions$nwarnings <- NULL [17:27:34.589] } [17:27:34.589] base::options(...future.oldOptions) [17:27:34.589] if (.Platform$OS.type == "windows") { [17:27:34.589] old_names <- names(...future.oldEnvVars) [17:27:34.589] envs <- base::Sys.getenv() [17:27:34.589] names <- names(envs) [17:27:34.589] common <- intersect(names, old_names) [17:27:34.589] added <- setdiff(names, old_names) [17:27:34.589] removed <- setdiff(old_names, names) [17:27:34.589] changed <- common[...future.oldEnvVars[common] != [17:27:34.589] envs[common]] [17:27:34.589] NAMES <- toupper(changed) [17:27:34.589] args <- list() [17:27:34.589] for (kk in seq_along(NAMES)) { [17:27:34.589] name <- changed[[kk]] [17:27:34.589] NAME <- NAMES[[kk]] [17:27:34.589] if (name != NAME && is.element(NAME, old_names)) [17:27:34.589] next [17:27:34.589] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.589] } [17:27:34.589] NAMES <- toupper(added) [17:27:34.589] for (kk in seq_along(NAMES)) { [17:27:34.589] name <- added[[kk]] [17:27:34.589] NAME <- NAMES[[kk]] [17:27:34.589] if (name != NAME && is.element(NAME, old_names)) [17:27:34.589] next [17:27:34.589] args[[name]] <- "" [17:27:34.589] } [17:27:34.589] NAMES <- toupper(removed) [17:27:34.589] for (kk in seq_along(NAMES)) { [17:27:34.589] name <- removed[[kk]] [17:27:34.589] NAME <- NAMES[[kk]] [17:27:34.589] if (name != NAME && is.element(NAME, old_names)) [17:27:34.589] next [17:27:34.589] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.589] } [17:27:34.589] if (length(args) > 0) [17:27:34.589] base::do.call(base::Sys.setenv, args = args) [17:27:34.589] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.589] } [17:27:34.589] else { [17:27:34.589] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.589] } [17:27:34.589] { [17:27:34.589] if (base::length(...future.futureOptionsAdded) > [17:27:34.589] 0L) { [17:27:34.589] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.589] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.589] base::options(opts) [17:27:34.589] } [17:27:34.589] { [17:27:34.589] { [17:27:34.589] NULL [17:27:34.589] RNGkind("Mersenne-Twister") [17:27:34.589] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.589] inherits = FALSE) [17:27:34.589] } [17:27:34.589] options(future.plan = NULL) [17:27:34.589] if (is.na(NA_character_)) [17:27:34.589] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.589] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.589] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.589] .init = FALSE) [17:27:34.589] } [17:27:34.589] } [17:27:34.589] } [17:27:34.589] }) [17:27:34.589] if (TRUE) { [17:27:34.589] base::sink(type = "output", split = FALSE) [17:27:34.589] if (TRUE) { [17:27:34.589] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.589] } [17:27:34.589] else { [17:27:34.589] ...future.result["stdout"] <- base::list(NULL) [17:27:34.589] } [17:27:34.589] base::close(...future.stdout) [17:27:34.589] ...future.stdout <- NULL [17:27:34.589] } [17:27:34.589] ...future.result$conditions <- ...future.conditions [17:27:34.589] ...future.result$finished <- base::Sys.time() [17:27:34.589] ...future.result [17:27:34.589] } [17:27:34.594] plan(): Setting new future strategy stack: [17:27:34.594] List of future strategies: [17:27:34.594] 1. sequential: [17:27:34.594] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.594] - tweaked: FALSE [17:27:34.594] - call: NULL [17:27:34.596] plan(): nbrOfWorkers() = 1 [17:27:34.598] plan(): Setting new future strategy stack: [17:27:34.598] List of future strategies: [17:27:34.598] 1. sequential: [17:27:34.598] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.598] - tweaked: FALSE [17:27:34.598] - call: plan(strategy) [17:27:34.599] plan(): nbrOfWorkers() = 1 [17:27:34.600] SequentialFuture started (and completed) [17:27:34.600] - Launch lazy future ... done [17:27:34.601] run() for 'SequentialFuture' ... done [17:27:34.601] getGlobalsAndPackages() ... [17:27:34.601] Searching for globals... [17:27:34.602] [17:27:34.602] Searching for globals ... DONE [17:27:34.602] - globals: [0] [17:27:34.603] getGlobalsAndPackages() ... DONE [17:27:34.603] run() for 'Future' ... [17:27:34.604] - state: 'created' [17:27:34.604] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.605] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.605] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.605] - Field: 'label' [17:27:34.605] - Field: 'local' [17:27:34.606] - Field: 'owner' [17:27:34.606] - Field: 'envir' [17:27:34.606] - Field: 'packages' [17:27:34.607] - Field: 'gc' [17:27:34.607] - Field: 'conditions' [17:27:34.607] - Field: 'expr' [17:27:34.607] - Field: 'uuid' [17:27:34.608] - Field: 'seed' [17:27:34.608] - Field: 'version' [17:27:34.608] - Field: 'result' [17:27:34.609] - Field: 'asynchronous' [17:27:34.609] - Field: 'calls' [17:27:34.609] - Field: 'globals' [17:27:34.609] - Field: 'stdout' [17:27:34.610] - Field: 'earlySignal' [17:27:34.610] - Field: 'lazy' [17:27:34.610] - Field: 'state' [17:27:34.610] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.610] - Launch lazy future ... [17:27:34.611] Packages needed by the future expression (n = 0): [17:27:34.611] Packages needed by future strategies (n = 0): [17:27:34.615] { [17:27:34.615] { [17:27:34.615] { [17:27:34.615] ...future.startTime <- base::Sys.time() [17:27:34.615] { [17:27:34.615] { [17:27:34.615] { [17:27:34.615] base::local({ [17:27:34.615] has_future <- base::requireNamespace("future", [17:27:34.615] quietly = TRUE) [17:27:34.615] if (has_future) { [17:27:34.615] ns <- base::getNamespace("future") [17:27:34.615] version <- ns[[".package"]][["version"]] [17:27:34.615] if (is.null(version)) [17:27:34.615] version <- utils::packageVersion("future") [17:27:34.615] } [17:27:34.615] else { [17:27:34.615] version <- NULL [17:27:34.615] } [17:27:34.615] if (!has_future || version < "1.8.0") { [17:27:34.615] info <- base::c(r_version = base::gsub("R version ", [17:27:34.615] "", base::R.version$version.string), [17:27:34.615] platform = base::sprintf("%s (%s-bit)", [17:27:34.615] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.615] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.615] "release", "version")], collapse = " "), [17:27:34.615] hostname = base::Sys.info()[["nodename"]]) [17:27:34.615] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.615] info) [17:27:34.615] info <- base::paste(info, collapse = "; ") [17:27:34.615] if (!has_future) { [17:27:34.615] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.615] info) [17:27:34.615] } [17:27:34.615] else { [17:27:34.615] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.615] info, version) [17:27:34.615] } [17:27:34.615] base::stop(msg) [17:27:34.615] } [17:27:34.615] }) [17:27:34.615] } [17:27:34.615] ...future.strategy.old <- future::plan("list") [17:27:34.615] options(future.plan = NULL) [17:27:34.615] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.615] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.615] } [17:27:34.615] ...future.workdir <- getwd() [17:27:34.615] } [17:27:34.615] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.615] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.615] } [17:27:34.615] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.615] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.615] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.615] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.615] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.615] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.615] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.615] base::names(...future.oldOptions)) [17:27:34.615] } [17:27:34.615] if (FALSE) { [17:27:34.615] } [17:27:34.615] else { [17:27:34.615] if (TRUE) { [17:27:34.615] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.615] open = "w") [17:27:34.615] } [17:27:34.615] else { [17:27:34.615] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.615] windows = "NUL", "/dev/null"), open = "w") [17:27:34.615] } [17:27:34.615] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.615] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.615] base::sink(type = "output", split = FALSE) [17:27:34.615] base::close(...future.stdout) [17:27:34.615] }, add = TRUE) [17:27:34.615] } [17:27:34.615] ...future.frame <- base::sys.nframe() [17:27:34.615] ...future.conditions <- base::list() [17:27:34.615] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.615] if (FALSE) { [17:27:34.615] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.615] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.615] } [17:27:34.615] ...future.result <- base::tryCatch({ [17:27:34.615] base::withCallingHandlers({ [17:27:34.615] ...future.value <- base::withVisible(base::local(NULL)) [17:27:34.615] future::FutureResult(value = ...future.value$value, [17:27:34.615] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.615] ...future.rng), globalenv = if (FALSE) [17:27:34.615] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.615] ...future.globalenv.names)) [17:27:34.615] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.615] }, condition = base::local({ [17:27:34.615] c <- base::c [17:27:34.615] inherits <- base::inherits [17:27:34.615] invokeRestart <- base::invokeRestart [17:27:34.615] length <- base::length [17:27:34.615] list <- base::list [17:27:34.615] seq.int <- base::seq.int [17:27:34.615] signalCondition <- base::signalCondition [17:27:34.615] sys.calls <- base::sys.calls [17:27:34.615] `[[` <- base::`[[` [17:27:34.615] `+` <- base::`+` [17:27:34.615] `<<-` <- base::`<<-` [17:27:34.615] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.615] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.615] 3L)] [17:27:34.615] } [17:27:34.615] function(cond) { [17:27:34.615] is_error <- inherits(cond, "error") [17:27:34.615] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.615] NULL) [17:27:34.615] if (is_error) { [17:27:34.615] sessionInformation <- function() { [17:27:34.615] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.615] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.615] search = base::search(), system = base::Sys.info()) [17:27:34.615] } [17:27:34.615] ...future.conditions[[length(...future.conditions) + [17:27:34.615] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.615] cond$call), session = sessionInformation(), [17:27:34.615] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.615] signalCondition(cond) [17:27:34.615] } [17:27:34.615] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.615] "immediateCondition"))) { [17:27:34.615] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.615] ...future.conditions[[length(...future.conditions) + [17:27:34.615] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.615] if (TRUE && !signal) { [17:27:34.615] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.615] { [17:27:34.615] inherits <- base::inherits [17:27:34.615] invokeRestart <- base::invokeRestart [17:27:34.615] is.null <- base::is.null [17:27:34.615] muffled <- FALSE [17:27:34.615] if (inherits(cond, "message")) { [17:27:34.615] muffled <- grepl(pattern, "muffleMessage") [17:27:34.615] if (muffled) [17:27:34.615] invokeRestart("muffleMessage") [17:27:34.615] } [17:27:34.615] else if (inherits(cond, "warning")) { [17:27:34.615] muffled <- grepl(pattern, "muffleWarning") [17:27:34.615] if (muffled) [17:27:34.615] invokeRestart("muffleWarning") [17:27:34.615] } [17:27:34.615] else if (inherits(cond, "condition")) { [17:27:34.615] if (!is.null(pattern)) { [17:27:34.615] computeRestarts <- base::computeRestarts [17:27:34.615] grepl <- base::grepl [17:27:34.615] restarts <- computeRestarts(cond) [17:27:34.615] for (restart in restarts) { [17:27:34.615] name <- restart$name [17:27:34.615] if (is.null(name)) [17:27:34.615] next [17:27:34.615] if (!grepl(pattern, name)) [17:27:34.615] next [17:27:34.615] invokeRestart(restart) [17:27:34.615] muffled <- TRUE [17:27:34.615] break [17:27:34.615] } [17:27:34.615] } [17:27:34.615] } [17:27:34.615] invisible(muffled) [17:27:34.615] } [17:27:34.615] muffleCondition(cond, pattern = "^muffle") [17:27:34.615] } [17:27:34.615] } [17:27:34.615] else { [17:27:34.615] if (TRUE) { [17:27:34.615] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.615] { [17:27:34.615] inherits <- base::inherits [17:27:34.615] invokeRestart <- base::invokeRestart [17:27:34.615] is.null <- base::is.null [17:27:34.615] muffled <- FALSE [17:27:34.615] if (inherits(cond, "message")) { [17:27:34.615] muffled <- grepl(pattern, "muffleMessage") [17:27:34.615] if (muffled) [17:27:34.615] invokeRestart("muffleMessage") [17:27:34.615] } [17:27:34.615] else if (inherits(cond, "warning")) { [17:27:34.615] muffled <- grepl(pattern, "muffleWarning") [17:27:34.615] if (muffled) [17:27:34.615] invokeRestart("muffleWarning") [17:27:34.615] } [17:27:34.615] else if (inherits(cond, "condition")) { [17:27:34.615] if (!is.null(pattern)) { [17:27:34.615] computeRestarts <- base::computeRestarts [17:27:34.615] grepl <- base::grepl [17:27:34.615] restarts <- computeRestarts(cond) [17:27:34.615] for (restart in restarts) { [17:27:34.615] name <- restart$name [17:27:34.615] if (is.null(name)) [17:27:34.615] next [17:27:34.615] if (!grepl(pattern, name)) [17:27:34.615] next [17:27:34.615] invokeRestart(restart) [17:27:34.615] muffled <- TRUE [17:27:34.615] break [17:27:34.615] } [17:27:34.615] } [17:27:34.615] } [17:27:34.615] invisible(muffled) [17:27:34.615] } [17:27:34.615] muffleCondition(cond, pattern = "^muffle") [17:27:34.615] } [17:27:34.615] } [17:27:34.615] } [17:27:34.615] })) [17:27:34.615] }, error = function(ex) { [17:27:34.615] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.615] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.615] ...future.rng), started = ...future.startTime, [17:27:34.615] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.615] version = "1.8"), class = "FutureResult") [17:27:34.615] }, finally = { [17:27:34.615] if (!identical(...future.workdir, getwd())) [17:27:34.615] setwd(...future.workdir) [17:27:34.615] { [17:27:34.615] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.615] ...future.oldOptions$nwarnings <- NULL [17:27:34.615] } [17:27:34.615] base::options(...future.oldOptions) [17:27:34.615] if (.Platform$OS.type == "windows") { [17:27:34.615] old_names <- names(...future.oldEnvVars) [17:27:34.615] envs <- base::Sys.getenv() [17:27:34.615] names <- names(envs) [17:27:34.615] common <- intersect(names, old_names) [17:27:34.615] added <- setdiff(names, old_names) [17:27:34.615] removed <- setdiff(old_names, names) [17:27:34.615] changed <- common[...future.oldEnvVars[common] != [17:27:34.615] envs[common]] [17:27:34.615] NAMES <- toupper(changed) [17:27:34.615] args <- list() [17:27:34.615] for (kk in seq_along(NAMES)) { [17:27:34.615] name <- changed[[kk]] [17:27:34.615] NAME <- NAMES[[kk]] [17:27:34.615] if (name != NAME && is.element(NAME, old_names)) [17:27:34.615] next [17:27:34.615] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.615] } [17:27:34.615] NAMES <- toupper(added) [17:27:34.615] for (kk in seq_along(NAMES)) { [17:27:34.615] name <- added[[kk]] [17:27:34.615] NAME <- NAMES[[kk]] [17:27:34.615] if (name != NAME && is.element(NAME, old_names)) [17:27:34.615] next [17:27:34.615] args[[name]] <- "" [17:27:34.615] } [17:27:34.615] NAMES <- toupper(removed) [17:27:34.615] for (kk in seq_along(NAMES)) { [17:27:34.615] name <- removed[[kk]] [17:27:34.615] NAME <- NAMES[[kk]] [17:27:34.615] if (name != NAME && is.element(NAME, old_names)) [17:27:34.615] next [17:27:34.615] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.615] } [17:27:34.615] if (length(args) > 0) [17:27:34.615] base::do.call(base::Sys.setenv, args = args) [17:27:34.615] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.615] } [17:27:34.615] else { [17:27:34.615] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.615] } [17:27:34.615] { [17:27:34.615] if (base::length(...future.futureOptionsAdded) > [17:27:34.615] 0L) { [17:27:34.615] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.615] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.615] base::options(opts) [17:27:34.615] } [17:27:34.615] { [17:27:34.615] { [17:27:34.615] NULL [17:27:34.615] RNGkind("Mersenne-Twister") [17:27:34.615] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.615] inherits = FALSE) [17:27:34.615] } [17:27:34.615] options(future.plan = NULL) [17:27:34.615] if (is.na(NA_character_)) [17:27:34.615] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.615] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.615] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.615] .init = FALSE) [17:27:34.615] } [17:27:34.615] } [17:27:34.615] } [17:27:34.615] }) [17:27:34.615] if (TRUE) { [17:27:34.615] base::sink(type = "output", split = FALSE) [17:27:34.615] if (TRUE) { [17:27:34.615] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.615] } [17:27:34.615] else { [17:27:34.615] ...future.result["stdout"] <- base::list(NULL) [17:27:34.615] } [17:27:34.615] base::close(...future.stdout) [17:27:34.615] ...future.stdout <- NULL [17:27:34.615] } [17:27:34.615] ...future.result$conditions <- ...future.conditions [17:27:34.615] ...future.result$finished <- base::Sys.time() [17:27:34.615] ...future.result [17:27:34.615] } [17:27:34.621] plan(): Setting new future strategy stack: [17:27:34.622] List of future strategies: [17:27:34.622] 1. sequential: [17:27:34.622] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.622] - tweaked: FALSE [17:27:34.622] - call: NULL [17:27:34.623] plan(): nbrOfWorkers() = 1 [17:27:34.624] plan(): Setting new future strategy stack: [17:27:34.625] List of future strategies: [17:27:34.625] 1. sequential: [17:27:34.625] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.625] - tweaked: FALSE [17:27:34.625] - call: plan(strategy) [17:27:34.626] plan(): nbrOfWorkers() = 1 [17:27:34.626] SequentialFuture started (and completed) [17:27:34.626] - Launch lazy future ... done [17:27:34.627] run() for 'SequentialFuture' ... done List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:3] 2 3 1 - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:34.638] resolved() for 'SequentialFuture' ... [17:27:34.638] - state: 'finished' [17:27:34.638] - run: TRUE [17:27:34.639] - result: 'FutureResult' [17:27:34.639] resolved() for 'SequentialFuture' ... done [17:27:34.640] resolved() for 'SequentialFuture' ... [17:27:34.640] - state: 'finished' [17:27:34.640] - run: TRUE [17:27:34.641] - result: 'FutureResult' [17:27:34.641] resolved() for 'SequentialFuture' ... done logi [1:2, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:34.645] resolve() on list ... [17:27:34.645] recursive: 0 [17:27:34.645] length: 6 [17:27:34.645] elements: 'a', 'b', 'c', '', '', '' [17:27:34.646] signalConditionsASAP(numeric, pos=1) ... [17:27:34.646] - nx: 6 [17:27:34.646] - relay: TRUE [17:27:34.647] - stdout: TRUE [17:27:34.647] - signal: TRUE [17:27:34.647] - resignal: FALSE [17:27:34.647] - force: TRUE [17:27:34.648] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.648] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.648] - until=2 [17:27:34.649] - relaying element #2 [17:27:34.649] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.649] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.650] signalConditionsASAP(NULL, pos=1) ... done [17:27:34.650] length: 5 (resolved future 1) [17:27:34.650] resolved() for 'SequentialFuture' ... [17:27:34.650] - state: 'finished' [17:27:34.651] - run: TRUE [17:27:34.651] - result: 'FutureResult' [17:27:34.651] resolved() for 'SequentialFuture' ... done [17:27:34.652] Future #2 [17:27:34.652] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:34.652] - nx: 6 [17:27:34.653] - relay: TRUE [17:27:34.653] - stdout: TRUE [17:27:34.653] - signal: TRUE [17:27:34.653] - resignal: FALSE [17:27:34.654] - force: TRUE [17:27:34.654] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.654] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.655] - until=2 [17:27:34.655] - relaying element #2 [17:27:34.656] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.656] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.656] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:34.657] length: 4 (resolved future 2) [17:27:34.657] resolved() for 'SequentialFuture' ... [17:27:34.658] - state: 'finished' [17:27:34.658] - run: TRUE [17:27:34.658] - result: 'FutureResult' [17:27:34.659] resolved() for 'SequentialFuture' ... done [17:27:34.659] Future #3 [17:27:34.660] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:34.660] - nx: 6 [17:27:34.660] - relay: TRUE [17:27:34.661] - stdout: TRUE [17:27:34.661] - signal: TRUE [17:27:34.661] - resignal: FALSE [17:27:34.662] - force: TRUE [17:27:34.662] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.662] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.663] - until=3 [17:27:34.663] - relaying element #3 [17:27:34.663] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.664] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.664] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:34.665] length: 3 (resolved future 3) [17:27:34.665] signalConditionsASAP(NULL, pos=4) ... [17:27:34.665] - nx: 6 [17:27:34.665] - relay: TRUE [17:27:34.666] - stdout: TRUE [17:27:34.666] - signal: TRUE [17:27:34.666] - resignal: FALSE [17:27:34.667] - force: TRUE [17:27:34.667] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.667] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.667] - until=5 [17:27:34.668] - relaying element #5 [17:27:34.668] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.668] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.669] signalConditionsASAP(NULL, pos=4) ... done [17:27:34.669] length: 2 (resolved future 4) [17:27:34.669] signalConditionsASAP(NULL, pos=5) ... [17:27:34.669] - nx: 6 [17:27:34.670] - relay: TRUE [17:27:34.670] - stdout: TRUE [17:27:34.670] - signal: TRUE [17:27:34.671] - resignal: FALSE [17:27:34.671] - force: TRUE [17:27:34.671] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.671] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.672] - until=6 [17:27:34.675] - relaying element #6 [17:27:34.675] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.675] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.676] signalConditionsASAP(NULL, pos=5) ... done [17:27:34.676] length: 1 (resolved future 5) [17:27:34.676] signalConditionsASAP(numeric, pos=6) ... [17:27:34.677] - nx: 6 [17:27:34.677] - relay: TRUE [17:27:34.677] - stdout: TRUE [17:27:34.677] - signal: TRUE [17:27:34.678] - resignal: FALSE [17:27:34.678] - force: TRUE [17:27:34.678] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.678] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.679] - until=6 [17:27:34.679] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.679] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.680] signalConditionsASAP(numeric, pos=6) ... done [17:27:34.680] length: 0 (resolved future 6) [17:27:34.680] Relaying remaining futures [17:27:34.681] signalConditionsASAP(NULL, pos=0) ... [17:27:34.681] - nx: 6 [17:27:34.681] - relay: TRUE [17:27:34.681] - stdout: TRUE [17:27:34.682] - signal: TRUE [17:27:34.682] - resignal: FALSE [17:27:34.682] - force: TRUE [17:27:34.682] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.683] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:34.683] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.684] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.684] signalConditionsASAP(NULL, pos=0) ... done [17:27:34.684] resolve() on list ... DONE List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:3] 2 3 1 - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" Dimensions: c(2, 1, 3, 1) [17:27:34.692] getGlobalsAndPackages() ... [17:27:34.692] Searching for globals... [17:27:34.693] [17:27:34.693] Searching for globals ... DONE [17:27:34.693] - globals: [0] [17:27:34.694] getGlobalsAndPackages() ... DONE [17:27:34.694] run() for 'Future' ... [17:27:34.695] - state: 'created' [17:27:34.695] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.696] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.696] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.696] - Field: 'label' [17:27:34.697] - Field: 'local' [17:27:34.697] - Field: 'owner' [17:27:34.697] - Field: 'envir' [17:27:34.698] - Field: 'packages' [17:27:34.698] - Field: 'gc' [17:27:34.698] - Field: 'conditions' [17:27:34.699] - Field: 'expr' [17:27:34.699] - Field: 'uuid' [17:27:34.700] - Field: 'seed' [17:27:34.700] - Field: 'version' [17:27:34.701] - Field: 'result' [17:27:34.701] - Field: 'asynchronous' [17:27:34.701] - Field: 'calls' [17:27:34.702] - Field: 'globals' [17:27:34.702] - Field: 'stdout' [17:27:34.702] - Field: 'earlySignal' [17:27:34.703] - Field: 'lazy' [17:27:34.703] - Field: 'state' [17:27:34.703] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.703] - Launch lazy future ... [17:27:34.704] Packages needed by the future expression (n = 0): [17:27:34.704] Packages needed by future strategies (n = 0): [17:27:34.705] { [17:27:34.705] { [17:27:34.705] { [17:27:34.705] ...future.startTime <- base::Sys.time() [17:27:34.705] { [17:27:34.705] { [17:27:34.705] { [17:27:34.705] base::local({ [17:27:34.705] has_future <- base::requireNamespace("future", [17:27:34.705] quietly = TRUE) [17:27:34.705] if (has_future) { [17:27:34.705] ns <- base::getNamespace("future") [17:27:34.705] version <- ns[[".package"]][["version"]] [17:27:34.705] if (is.null(version)) [17:27:34.705] version <- utils::packageVersion("future") [17:27:34.705] } [17:27:34.705] else { [17:27:34.705] version <- NULL [17:27:34.705] } [17:27:34.705] if (!has_future || version < "1.8.0") { [17:27:34.705] info <- base::c(r_version = base::gsub("R version ", [17:27:34.705] "", base::R.version$version.string), [17:27:34.705] platform = base::sprintf("%s (%s-bit)", [17:27:34.705] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.705] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.705] "release", "version")], collapse = " "), [17:27:34.705] hostname = base::Sys.info()[["nodename"]]) [17:27:34.705] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.705] info) [17:27:34.705] info <- base::paste(info, collapse = "; ") [17:27:34.705] if (!has_future) { [17:27:34.705] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.705] info) [17:27:34.705] } [17:27:34.705] else { [17:27:34.705] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.705] info, version) [17:27:34.705] } [17:27:34.705] base::stop(msg) [17:27:34.705] } [17:27:34.705] }) [17:27:34.705] } [17:27:34.705] ...future.strategy.old <- future::plan("list") [17:27:34.705] options(future.plan = NULL) [17:27:34.705] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.705] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.705] } [17:27:34.705] ...future.workdir <- getwd() [17:27:34.705] } [17:27:34.705] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.705] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.705] } [17:27:34.705] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.705] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.705] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.705] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.705] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.705] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.705] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.705] base::names(...future.oldOptions)) [17:27:34.705] } [17:27:34.705] if (FALSE) { [17:27:34.705] } [17:27:34.705] else { [17:27:34.705] if (TRUE) { [17:27:34.705] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.705] open = "w") [17:27:34.705] } [17:27:34.705] else { [17:27:34.705] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.705] windows = "NUL", "/dev/null"), open = "w") [17:27:34.705] } [17:27:34.705] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.705] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.705] base::sink(type = "output", split = FALSE) [17:27:34.705] base::close(...future.stdout) [17:27:34.705] }, add = TRUE) [17:27:34.705] } [17:27:34.705] ...future.frame <- base::sys.nframe() [17:27:34.705] ...future.conditions <- base::list() [17:27:34.705] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.705] if (FALSE) { [17:27:34.705] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.705] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.705] } [17:27:34.705] ...future.result <- base::tryCatch({ [17:27:34.705] base::withCallingHandlers({ [17:27:34.705] ...future.value <- base::withVisible(base::local(2)) [17:27:34.705] future::FutureResult(value = ...future.value$value, [17:27:34.705] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.705] ...future.rng), globalenv = if (FALSE) [17:27:34.705] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.705] ...future.globalenv.names)) [17:27:34.705] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.705] }, condition = base::local({ [17:27:34.705] c <- base::c [17:27:34.705] inherits <- base::inherits [17:27:34.705] invokeRestart <- base::invokeRestart [17:27:34.705] length <- base::length [17:27:34.705] list <- base::list [17:27:34.705] seq.int <- base::seq.int [17:27:34.705] signalCondition <- base::signalCondition [17:27:34.705] sys.calls <- base::sys.calls [17:27:34.705] `[[` <- base::`[[` [17:27:34.705] `+` <- base::`+` [17:27:34.705] `<<-` <- base::`<<-` [17:27:34.705] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.705] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.705] 3L)] [17:27:34.705] } [17:27:34.705] function(cond) { [17:27:34.705] is_error <- inherits(cond, "error") [17:27:34.705] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.705] NULL) [17:27:34.705] if (is_error) { [17:27:34.705] sessionInformation <- function() { [17:27:34.705] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.705] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.705] search = base::search(), system = base::Sys.info()) [17:27:34.705] } [17:27:34.705] ...future.conditions[[length(...future.conditions) + [17:27:34.705] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.705] cond$call), session = sessionInformation(), [17:27:34.705] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.705] signalCondition(cond) [17:27:34.705] } [17:27:34.705] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.705] "immediateCondition"))) { [17:27:34.705] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.705] ...future.conditions[[length(...future.conditions) + [17:27:34.705] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.705] if (TRUE && !signal) { [17:27:34.705] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.705] { [17:27:34.705] inherits <- base::inherits [17:27:34.705] invokeRestart <- base::invokeRestart [17:27:34.705] is.null <- base::is.null [17:27:34.705] muffled <- FALSE [17:27:34.705] if (inherits(cond, "message")) { [17:27:34.705] muffled <- grepl(pattern, "muffleMessage") [17:27:34.705] if (muffled) [17:27:34.705] invokeRestart("muffleMessage") [17:27:34.705] } [17:27:34.705] else if (inherits(cond, "warning")) { [17:27:34.705] muffled <- grepl(pattern, "muffleWarning") [17:27:34.705] if (muffled) [17:27:34.705] invokeRestart("muffleWarning") [17:27:34.705] } [17:27:34.705] else if (inherits(cond, "condition")) { [17:27:34.705] if (!is.null(pattern)) { [17:27:34.705] computeRestarts <- base::computeRestarts [17:27:34.705] grepl <- base::grepl [17:27:34.705] restarts <- computeRestarts(cond) [17:27:34.705] for (restart in restarts) { [17:27:34.705] name <- restart$name [17:27:34.705] if (is.null(name)) [17:27:34.705] next [17:27:34.705] if (!grepl(pattern, name)) [17:27:34.705] next [17:27:34.705] invokeRestart(restart) [17:27:34.705] muffled <- TRUE [17:27:34.705] break [17:27:34.705] } [17:27:34.705] } [17:27:34.705] } [17:27:34.705] invisible(muffled) [17:27:34.705] } [17:27:34.705] muffleCondition(cond, pattern = "^muffle") [17:27:34.705] } [17:27:34.705] } [17:27:34.705] else { [17:27:34.705] if (TRUE) { [17:27:34.705] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.705] { [17:27:34.705] inherits <- base::inherits [17:27:34.705] invokeRestart <- base::invokeRestart [17:27:34.705] is.null <- base::is.null [17:27:34.705] muffled <- FALSE [17:27:34.705] if (inherits(cond, "message")) { [17:27:34.705] muffled <- grepl(pattern, "muffleMessage") [17:27:34.705] if (muffled) [17:27:34.705] invokeRestart("muffleMessage") [17:27:34.705] } [17:27:34.705] else if (inherits(cond, "warning")) { [17:27:34.705] muffled <- grepl(pattern, "muffleWarning") [17:27:34.705] if (muffled) [17:27:34.705] invokeRestart("muffleWarning") [17:27:34.705] } [17:27:34.705] else if (inherits(cond, "condition")) { [17:27:34.705] if (!is.null(pattern)) { [17:27:34.705] computeRestarts <- base::computeRestarts [17:27:34.705] grepl <- base::grepl [17:27:34.705] restarts <- computeRestarts(cond) [17:27:34.705] for (restart in restarts) { [17:27:34.705] name <- restart$name [17:27:34.705] if (is.null(name)) [17:27:34.705] next [17:27:34.705] if (!grepl(pattern, name)) [17:27:34.705] next [17:27:34.705] invokeRestart(restart) [17:27:34.705] muffled <- TRUE [17:27:34.705] break [17:27:34.705] } [17:27:34.705] } [17:27:34.705] } [17:27:34.705] invisible(muffled) [17:27:34.705] } [17:27:34.705] muffleCondition(cond, pattern = "^muffle") [17:27:34.705] } [17:27:34.705] } [17:27:34.705] } [17:27:34.705] })) [17:27:34.705] }, error = function(ex) { [17:27:34.705] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.705] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.705] ...future.rng), started = ...future.startTime, [17:27:34.705] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.705] version = "1.8"), class = "FutureResult") [17:27:34.705] }, finally = { [17:27:34.705] if (!identical(...future.workdir, getwd())) [17:27:34.705] setwd(...future.workdir) [17:27:34.705] { [17:27:34.705] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.705] ...future.oldOptions$nwarnings <- NULL [17:27:34.705] } [17:27:34.705] base::options(...future.oldOptions) [17:27:34.705] if (.Platform$OS.type == "windows") { [17:27:34.705] old_names <- names(...future.oldEnvVars) [17:27:34.705] envs <- base::Sys.getenv() [17:27:34.705] names <- names(envs) [17:27:34.705] common <- intersect(names, old_names) [17:27:34.705] added <- setdiff(names, old_names) [17:27:34.705] removed <- setdiff(old_names, names) [17:27:34.705] changed <- common[...future.oldEnvVars[common] != [17:27:34.705] envs[common]] [17:27:34.705] NAMES <- toupper(changed) [17:27:34.705] args <- list() [17:27:34.705] for (kk in seq_along(NAMES)) { [17:27:34.705] name <- changed[[kk]] [17:27:34.705] NAME <- NAMES[[kk]] [17:27:34.705] if (name != NAME && is.element(NAME, old_names)) [17:27:34.705] next [17:27:34.705] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.705] } [17:27:34.705] NAMES <- toupper(added) [17:27:34.705] for (kk in seq_along(NAMES)) { [17:27:34.705] name <- added[[kk]] [17:27:34.705] NAME <- NAMES[[kk]] [17:27:34.705] if (name != NAME && is.element(NAME, old_names)) [17:27:34.705] next [17:27:34.705] args[[name]] <- "" [17:27:34.705] } [17:27:34.705] NAMES <- toupper(removed) [17:27:34.705] for (kk in seq_along(NAMES)) { [17:27:34.705] name <- removed[[kk]] [17:27:34.705] NAME <- NAMES[[kk]] [17:27:34.705] if (name != NAME && is.element(NAME, old_names)) [17:27:34.705] next [17:27:34.705] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.705] } [17:27:34.705] if (length(args) > 0) [17:27:34.705] base::do.call(base::Sys.setenv, args = args) [17:27:34.705] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.705] } [17:27:34.705] else { [17:27:34.705] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.705] } [17:27:34.705] { [17:27:34.705] if (base::length(...future.futureOptionsAdded) > [17:27:34.705] 0L) { [17:27:34.705] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.705] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.705] base::options(opts) [17:27:34.705] } [17:27:34.705] { [17:27:34.705] { [17:27:34.705] NULL [17:27:34.705] RNGkind("Mersenne-Twister") [17:27:34.705] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.705] inherits = FALSE) [17:27:34.705] } [17:27:34.705] options(future.plan = NULL) [17:27:34.705] if (is.na(NA_character_)) [17:27:34.705] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.705] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.705] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.705] .init = FALSE) [17:27:34.705] } [17:27:34.705] } [17:27:34.705] } [17:27:34.705] }) [17:27:34.705] if (TRUE) { [17:27:34.705] base::sink(type = "output", split = FALSE) [17:27:34.705] if (TRUE) { [17:27:34.705] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.705] } [17:27:34.705] else { [17:27:34.705] ...future.result["stdout"] <- base::list(NULL) [17:27:34.705] } [17:27:34.705] base::close(...future.stdout) [17:27:34.705] ...future.stdout <- NULL [17:27:34.705] } [17:27:34.705] ...future.result$conditions <- ...future.conditions [17:27:34.705] ...future.result$finished <- base::Sys.time() [17:27:34.705] ...future.result [17:27:34.705] } [17:27:34.712] plan(): Setting new future strategy stack: [17:27:34.712] List of future strategies: [17:27:34.712] 1. sequential: [17:27:34.712] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.712] - tweaked: FALSE [17:27:34.712] - call: NULL [17:27:34.713] plan(): nbrOfWorkers() = 1 [17:27:34.715] plan(): Setting new future strategy stack: [17:27:34.715] List of future strategies: [17:27:34.715] 1. sequential: [17:27:34.715] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.715] - tweaked: FALSE [17:27:34.715] - call: plan(strategy) [17:27:34.716] plan(): nbrOfWorkers() = 1 [17:27:34.717] SequentialFuture started (and completed) [17:27:34.717] - Launch lazy future ... done [17:27:34.717] run() for 'SequentialFuture' ... done [17:27:34.718] getGlobalsAndPackages() ... [17:27:34.718] Searching for globals... [17:27:34.719] [17:27:34.719] Searching for globals ... DONE [17:27:34.719] - globals: [0] [17:27:34.719] getGlobalsAndPackages() ... DONE [17:27:34.720] run() for 'Future' ... [17:27:34.720] - state: 'created' [17:27:34.721] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.721] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.721] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.722] - Field: 'label' [17:27:34.722] - Field: 'local' [17:27:34.722] - Field: 'owner' [17:27:34.723] - Field: 'envir' [17:27:34.723] - Field: 'packages' [17:27:34.723] - Field: 'gc' [17:27:34.723] - Field: 'conditions' [17:27:34.724] - Field: 'expr' [17:27:34.724] - Field: 'uuid' [17:27:34.724] - Field: 'seed' [17:27:34.724] - Field: 'version' [17:27:34.725] - Field: 'result' [17:27:34.725] - Field: 'asynchronous' [17:27:34.725] - Field: 'calls' [17:27:34.725] - Field: 'globals' [17:27:34.726] - Field: 'stdout' [17:27:34.726] - Field: 'earlySignal' [17:27:34.726] - Field: 'lazy' [17:27:34.727] - Field: 'state' [17:27:34.727] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.727] - Launch lazy future ... [17:27:34.727] Packages needed by the future expression (n = 0): [17:27:34.728] Packages needed by future strategies (n = 0): [17:27:34.729] { [17:27:34.729] { [17:27:34.729] { [17:27:34.729] ...future.startTime <- base::Sys.time() [17:27:34.729] { [17:27:34.729] { [17:27:34.729] { [17:27:34.729] base::local({ [17:27:34.729] has_future <- base::requireNamespace("future", [17:27:34.729] quietly = TRUE) [17:27:34.729] if (has_future) { [17:27:34.729] ns <- base::getNamespace("future") [17:27:34.729] version <- ns[[".package"]][["version"]] [17:27:34.729] if (is.null(version)) [17:27:34.729] version <- utils::packageVersion("future") [17:27:34.729] } [17:27:34.729] else { [17:27:34.729] version <- NULL [17:27:34.729] } [17:27:34.729] if (!has_future || version < "1.8.0") { [17:27:34.729] info <- base::c(r_version = base::gsub("R version ", [17:27:34.729] "", base::R.version$version.string), [17:27:34.729] platform = base::sprintf("%s (%s-bit)", [17:27:34.729] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.729] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.729] "release", "version")], collapse = " "), [17:27:34.729] hostname = base::Sys.info()[["nodename"]]) [17:27:34.729] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.729] info) [17:27:34.729] info <- base::paste(info, collapse = "; ") [17:27:34.729] if (!has_future) { [17:27:34.729] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.729] info) [17:27:34.729] } [17:27:34.729] else { [17:27:34.729] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.729] info, version) [17:27:34.729] } [17:27:34.729] base::stop(msg) [17:27:34.729] } [17:27:34.729] }) [17:27:34.729] } [17:27:34.729] ...future.strategy.old <- future::plan("list") [17:27:34.729] options(future.plan = NULL) [17:27:34.729] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.729] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.729] } [17:27:34.729] ...future.workdir <- getwd() [17:27:34.729] } [17:27:34.729] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.729] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.729] } [17:27:34.729] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.729] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.729] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.729] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.729] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.729] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.729] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.729] base::names(...future.oldOptions)) [17:27:34.729] } [17:27:34.729] if (FALSE) { [17:27:34.729] } [17:27:34.729] else { [17:27:34.729] if (TRUE) { [17:27:34.729] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.729] open = "w") [17:27:34.729] } [17:27:34.729] else { [17:27:34.729] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.729] windows = "NUL", "/dev/null"), open = "w") [17:27:34.729] } [17:27:34.729] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.729] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.729] base::sink(type = "output", split = FALSE) [17:27:34.729] base::close(...future.stdout) [17:27:34.729] }, add = TRUE) [17:27:34.729] } [17:27:34.729] ...future.frame <- base::sys.nframe() [17:27:34.729] ...future.conditions <- base::list() [17:27:34.729] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.729] if (FALSE) { [17:27:34.729] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.729] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.729] } [17:27:34.729] ...future.result <- base::tryCatch({ [17:27:34.729] base::withCallingHandlers({ [17:27:34.729] ...future.value <- base::withVisible(base::local(NULL)) [17:27:34.729] future::FutureResult(value = ...future.value$value, [17:27:34.729] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.729] ...future.rng), globalenv = if (FALSE) [17:27:34.729] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.729] ...future.globalenv.names)) [17:27:34.729] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.729] }, condition = base::local({ [17:27:34.729] c <- base::c [17:27:34.729] inherits <- base::inherits [17:27:34.729] invokeRestart <- base::invokeRestart [17:27:34.729] length <- base::length [17:27:34.729] list <- base::list [17:27:34.729] seq.int <- base::seq.int [17:27:34.729] signalCondition <- base::signalCondition [17:27:34.729] sys.calls <- base::sys.calls [17:27:34.729] `[[` <- base::`[[` [17:27:34.729] `+` <- base::`+` [17:27:34.729] `<<-` <- base::`<<-` [17:27:34.729] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.729] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.729] 3L)] [17:27:34.729] } [17:27:34.729] function(cond) { [17:27:34.729] is_error <- inherits(cond, "error") [17:27:34.729] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.729] NULL) [17:27:34.729] if (is_error) { [17:27:34.729] sessionInformation <- function() { [17:27:34.729] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.729] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.729] search = base::search(), system = base::Sys.info()) [17:27:34.729] } [17:27:34.729] ...future.conditions[[length(...future.conditions) + [17:27:34.729] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.729] cond$call), session = sessionInformation(), [17:27:34.729] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.729] signalCondition(cond) [17:27:34.729] } [17:27:34.729] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.729] "immediateCondition"))) { [17:27:34.729] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.729] ...future.conditions[[length(...future.conditions) + [17:27:34.729] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.729] if (TRUE && !signal) { [17:27:34.729] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.729] { [17:27:34.729] inherits <- base::inherits [17:27:34.729] invokeRestart <- base::invokeRestart [17:27:34.729] is.null <- base::is.null [17:27:34.729] muffled <- FALSE [17:27:34.729] if (inherits(cond, "message")) { [17:27:34.729] muffled <- grepl(pattern, "muffleMessage") [17:27:34.729] if (muffled) [17:27:34.729] invokeRestart("muffleMessage") [17:27:34.729] } [17:27:34.729] else if (inherits(cond, "warning")) { [17:27:34.729] muffled <- grepl(pattern, "muffleWarning") [17:27:34.729] if (muffled) [17:27:34.729] invokeRestart("muffleWarning") [17:27:34.729] } [17:27:34.729] else if (inherits(cond, "condition")) { [17:27:34.729] if (!is.null(pattern)) { [17:27:34.729] computeRestarts <- base::computeRestarts [17:27:34.729] grepl <- base::grepl [17:27:34.729] restarts <- computeRestarts(cond) [17:27:34.729] for (restart in restarts) { [17:27:34.729] name <- restart$name [17:27:34.729] if (is.null(name)) [17:27:34.729] next [17:27:34.729] if (!grepl(pattern, name)) [17:27:34.729] next [17:27:34.729] invokeRestart(restart) [17:27:34.729] muffled <- TRUE [17:27:34.729] break [17:27:34.729] } [17:27:34.729] } [17:27:34.729] } [17:27:34.729] invisible(muffled) [17:27:34.729] } [17:27:34.729] muffleCondition(cond, pattern = "^muffle") [17:27:34.729] } [17:27:34.729] } [17:27:34.729] else { [17:27:34.729] if (TRUE) { [17:27:34.729] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.729] { [17:27:34.729] inherits <- base::inherits [17:27:34.729] invokeRestart <- base::invokeRestart [17:27:34.729] is.null <- base::is.null [17:27:34.729] muffled <- FALSE [17:27:34.729] if (inherits(cond, "message")) { [17:27:34.729] muffled <- grepl(pattern, "muffleMessage") [17:27:34.729] if (muffled) [17:27:34.729] invokeRestart("muffleMessage") [17:27:34.729] } [17:27:34.729] else if (inherits(cond, "warning")) { [17:27:34.729] muffled <- grepl(pattern, "muffleWarning") [17:27:34.729] if (muffled) [17:27:34.729] invokeRestart("muffleWarning") [17:27:34.729] } [17:27:34.729] else if (inherits(cond, "condition")) { [17:27:34.729] if (!is.null(pattern)) { [17:27:34.729] computeRestarts <- base::computeRestarts [17:27:34.729] grepl <- base::grepl [17:27:34.729] restarts <- computeRestarts(cond) [17:27:34.729] for (restart in restarts) { [17:27:34.729] name <- restart$name [17:27:34.729] if (is.null(name)) [17:27:34.729] next [17:27:34.729] if (!grepl(pattern, name)) [17:27:34.729] next [17:27:34.729] invokeRestart(restart) [17:27:34.729] muffled <- TRUE [17:27:34.729] break [17:27:34.729] } [17:27:34.729] } [17:27:34.729] } [17:27:34.729] invisible(muffled) [17:27:34.729] } [17:27:34.729] muffleCondition(cond, pattern = "^muffle") [17:27:34.729] } [17:27:34.729] } [17:27:34.729] } [17:27:34.729] })) [17:27:34.729] }, error = function(ex) { [17:27:34.729] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.729] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.729] ...future.rng), started = ...future.startTime, [17:27:34.729] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.729] version = "1.8"), class = "FutureResult") [17:27:34.729] }, finally = { [17:27:34.729] if (!identical(...future.workdir, getwd())) [17:27:34.729] setwd(...future.workdir) [17:27:34.729] { [17:27:34.729] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.729] ...future.oldOptions$nwarnings <- NULL [17:27:34.729] } [17:27:34.729] base::options(...future.oldOptions) [17:27:34.729] if (.Platform$OS.type == "windows") { [17:27:34.729] old_names <- names(...future.oldEnvVars) [17:27:34.729] envs <- base::Sys.getenv() [17:27:34.729] names <- names(envs) [17:27:34.729] common <- intersect(names, old_names) [17:27:34.729] added <- setdiff(names, old_names) [17:27:34.729] removed <- setdiff(old_names, names) [17:27:34.729] changed <- common[...future.oldEnvVars[common] != [17:27:34.729] envs[common]] [17:27:34.729] NAMES <- toupper(changed) [17:27:34.729] args <- list() [17:27:34.729] for (kk in seq_along(NAMES)) { [17:27:34.729] name <- changed[[kk]] [17:27:34.729] NAME <- NAMES[[kk]] [17:27:34.729] if (name != NAME && is.element(NAME, old_names)) [17:27:34.729] next [17:27:34.729] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.729] } [17:27:34.729] NAMES <- toupper(added) [17:27:34.729] for (kk in seq_along(NAMES)) { [17:27:34.729] name <- added[[kk]] [17:27:34.729] NAME <- NAMES[[kk]] [17:27:34.729] if (name != NAME && is.element(NAME, old_names)) [17:27:34.729] next [17:27:34.729] args[[name]] <- "" [17:27:34.729] } [17:27:34.729] NAMES <- toupper(removed) [17:27:34.729] for (kk in seq_along(NAMES)) { [17:27:34.729] name <- removed[[kk]] [17:27:34.729] NAME <- NAMES[[kk]] [17:27:34.729] if (name != NAME && is.element(NAME, old_names)) [17:27:34.729] next [17:27:34.729] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.729] } [17:27:34.729] if (length(args) > 0) [17:27:34.729] base::do.call(base::Sys.setenv, args = args) [17:27:34.729] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.729] } [17:27:34.729] else { [17:27:34.729] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.729] } [17:27:34.729] { [17:27:34.729] if (base::length(...future.futureOptionsAdded) > [17:27:34.729] 0L) { [17:27:34.729] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.729] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.729] base::options(opts) [17:27:34.729] } [17:27:34.729] { [17:27:34.729] { [17:27:34.729] NULL [17:27:34.729] RNGkind("Mersenne-Twister") [17:27:34.729] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.729] inherits = FALSE) [17:27:34.729] } [17:27:34.729] options(future.plan = NULL) [17:27:34.729] if (is.na(NA_character_)) [17:27:34.729] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.729] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.729] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.729] .init = FALSE) [17:27:34.729] } [17:27:34.729] } [17:27:34.729] } [17:27:34.729] }) [17:27:34.729] if (TRUE) { [17:27:34.729] base::sink(type = "output", split = FALSE) [17:27:34.729] if (TRUE) { [17:27:34.729] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.729] } [17:27:34.729] else { [17:27:34.729] ...future.result["stdout"] <- base::list(NULL) [17:27:34.729] } [17:27:34.729] base::close(...future.stdout) [17:27:34.729] ...future.stdout <- NULL [17:27:34.729] } [17:27:34.729] ...future.result$conditions <- ...future.conditions [17:27:34.729] ...future.result$finished <- base::Sys.time() [17:27:34.729] ...future.result [17:27:34.729] } [17:27:34.735] plan(): Setting new future strategy stack: [17:27:34.735] List of future strategies: [17:27:34.735] 1. sequential: [17:27:34.735] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.735] - tweaked: FALSE [17:27:34.735] - call: NULL [17:27:34.736] plan(): nbrOfWorkers() = 1 [17:27:34.742] plan(): Setting new future strategy stack: [17:27:34.742] List of future strategies: [17:27:34.742] 1. sequential: [17:27:34.742] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.742] - tweaked: FALSE [17:27:34.742] - call: plan(strategy) [17:27:34.743] plan(): nbrOfWorkers() = 1 [17:27:34.744] SequentialFuture started (and completed) [17:27:34.744] - Launch lazy future ... done [17:27:34.744] run() for 'SequentialFuture' ... done List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ c:Classes 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:4] 2 1 3 1 - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:34.754] resolved() for 'SequentialFuture' ... [17:27:34.755] - state: 'finished' [17:27:34.755] - run: TRUE [17:27:34.755] - result: 'FutureResult' [17:27:34.756] resolved() for 'SequentialFuture' ... done [17:27:34.756] resolved() for 'SequentialFuture' ... [17:27:34.756] - state: 'finished' [17:27:34.757] - run: TRUE [17:27:34.757] - result: 'FutureResult' [17:27:34.757] resolved() for 'SequentialFuture' ... done logi [1:2, 1, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:34.761] resolve() on list ... [17:27:34.761] recursive: 0 [17:27:34.762] length: 6 [17:27:34.762] elements: 'a', 'b', 'c', '', '', '' [17:27:34.762] signalConditionsASAP(numeric, pos=1) ... [17:27:34.762] - nx: 6 [17:27:34.763] - relay: TRUE [17:27:34.763] - stdout: TRUE [17:27:34.763] - signal: TRUE [17:27:34.763] - resignal: FALSE [17:27:34.763] - force: TRUE [17:27:34.764] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.764] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.764] - until=2 [17:27:34.764] - relaying element #2 [17:27:34.765] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.765] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.765] signalConditionsASAP(NULL, pos=1) ... done [17:27:34.765] length: 5 (resolved future 1) [17:27:34.766] resolved() for 'SequentialFuture' ... [17:27:34.766] - state: 'finished' [17:27:34.766] - run: TRUE [17:27:34.766] - result: 'FutureResult' [17:27:34.767] resolved() for 'SequentialFuture' ... done [17:27:34.767] Future #2 [17:27:34.767] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:34.768] - nx: 6 [17:27:34.768] - relay: TRUE [17:27:34.768] - stdout: TRUE [17:27:34.768] - signal: TRUE [17:27:34.769] - resignal: FALSE [17:27:34.769] - force: TRUE [17:27:34.769] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.769] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:34.770] - until=2 [17:27:34.770] - relaying element #2 [17:27:34.770] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.770] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.771] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:34.771] length: 4 (resolved future 2) [17:27:34.771] resolved() for 'SequentialFuture' ... [17:27:34.772] - state: 'finished' [17:27:34.772] - run: TRUE [17:27:34.772] - result: 'FutureResult' [17:27:34.772] resolved() for 'SequentialFuture' ... done [17:27:34.773] Future #3 [17:27:34.773] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:34.773] - nx: 6 [17:27:34.773] - relay: TRUE [17:27:34.774] - stdout: TRUE [17:27:34.774] - signal: TRUE [17:27:34.774] - resignal: FALSE [17:27:34.774] - force: TRUE [17:27:34.775] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.775] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:34.775] - until=3 [17:27:34.775] - relaying element #3 [17:27:34.776] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.776] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.776] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:34.777] length: 3 (resolved future 3) [17:27:34.777] signalConditionsASAP(NULL, pos=4) ... [17:27:34.777] - nx: 6 [17:27:34.777] - relay: TRUE [17:27:34.778] - stdout: TRUE [17:27:34.778] - signal: TRUE [17:27:34.778] - resignal: FALSE [17:27:34.778] - force: TRUE [17:27:34.778] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.779] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.779] - until=5 [17:27:34.779] - relaying element #5 [17:27:34.779] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.780] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.780] signalConditionsASAP(NULL, pos=4) ... done [17:27:34.780] length: 2 (resolved future 4) [17:27:34.780] signalConditionsASAP(NULL, pos=5) ... [17:27:34.781] - nx: 6 [17:27:34.781] - relay: TRUE [17:27:34.781] - stdout: TRUE [17:27:34.781] - signal: TRUE [17:27:34.782] - resignal: FALSE [17:27:34.782] - force: TRUE [17:27:34.782] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:34.782] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.783] - until=6 [17:27:34.783] - relaying element #6 [17:27:34.783] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.783] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.783] signalConditionsASAP(NULL, pos=5) ... done [17:27:34.783] length: 1 (resolved future 5) [17:27:34.784] signalConditionsASAP(numeric, pos=6) ... [17:27:34.787] - nx: 6 [17:27:34.788] - relay: TRUE [17:27:34.788] - stdout: TRUE [17:27:34.788] - signal: TRUE [17:27:34.788] - resignal: FALSE [17:27:34.789] - force: TRUE [17:27:34.789] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:34.789] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.789] - until=6 [17:27:34.790] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.790] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.790] signalConditionsASAP(numeric, pos=6) ... done [17:27:34.791] length: 0 (resolved future 6) [17:27:34.791] Relaying remaining futures [17:27:34.791] signalConditionsASAP(NULL, pos=0) ... [17:27:34.791] - nx: 6 [17:27:34.792] - relay: TRUE [17:27:34.792] - stdout: TRUE [17:27:34.792] - signal: TRUE [17:27:34.792] - resignal: FALSE [17:27:34.792] - force: TRUE [17:27:34.793] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.793] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:34.793] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:34.794] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:34.794] signalConditionsASAP(NULL, pos=0) ... done [17:27:34.794] resolve() on list ... DONE List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:4] 2 1 3 1 - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" *** futures() - list ... DONE Type of object: environment Type of future: sequential [17:27:34.809] plan(): Setting new future strategy stack: [17:27:34.809] List of future strategies: [17:27:34.809] 1. sequential: [17:27:34.809] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.809] - tweaked: FALSE [17:27:34.809] - call: plan(strategy) [17:27:34.810] plan(): nbrOfWorkers() = 1 Dimensions: NULL [17:27:34.810] getGlobalsAndPackages() ... [17:27:34.810] Searching for globals... [17:27:34.811] [17:27:34.811] Searching for globals ... DONE [17:27:34.811] - globals: [0] [17:27:34.811] getGlobalsAndPackages() ... DONE [17:27:34.812] run() for 'Future' ... [17:27:34.812] - state: 'created' [17:27:34.812] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.813] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.813] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.813] - Field: 'label' [17:27:34.813] - Field: 'local' [17:27:34.814] - Field: 'owner' [17:27:34.814] - Field: 'envir' [17:27:34.814] - Field: 'packages' [17:27:34.815] - Field: 'gc' [17:27:34.815] - Field: 'conditions' [17:27:34.815] - Field: 'expr' [17:27:34.816] - Field: 'uuid' [17:27:34.816] - Field: 'seed' [17:27:34.816] - Field: 'version' [17:27:34.817] - Field: 'result' [17:27:34.817] - Field: 'asynchronous' [17:27:34.817] - Field: 'calls' [17:27:34.818] - Field: 'globals' [17:27:34.818] - Field: 'stdout' [17:27:34.818] - Field: 'earlySignal' [17:27:34.819] - Field: 'lazy' [17:27:34.819] - Field: 'state' [17:27:34.819] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.820] - Launch lazy future ... [17:27:34.820] Packages needed by the future expression (n = 0): [17:27:34.821] Packages needed by future strategies (n = 0): [17:27:34.822] { [17:27:34.822] { [17:27:34.822] { [17:27:34.822] ...future.startTime <- base::Sys.time() [17:27:34.822] { [17:27:34.822] { [17:27:34.822] { [17:27:34.822] base::local({ [17:27:34.822] has_future <- base::requireNamespace("future", [17:27:34.822] quietly = TRUE) [17:27:34.822] if (has_future) { [17:27:34.822] ns <- base::getNamespace("future") [17:27:34.822] version <- ns[[".package"]][["version"]] [17:27:34.822] if (is.null(version)) [17:27:34.822] version <- utils::packageVersion("future") [17:27:34.822] } [17:27:34.822] else { [17:27:34.822] version <- NULL [17:27:34.822] } [17:27:34.822] if (!has_future || version < "1.8.0") { [17:27:34.822] info <- base::c(r_version = base::gsub("R version ", [17:27:34.822] "", base::R.version$version.string), [17:27:34.822] platform = base::sprintf("%s (%s-bit)", [17:27:34.822] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.822] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.822] "release", "version")], collapse = " "), [17:27:34.822] hostname = base::Sys.info()[["nodename"]]) [17:27:34.822] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.822] info) [17:27:34.822] info <- base::paste(info, collapse = "; ") [17:27:34.822] if (!has_future) { [17:27:34.822] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.822] info) [17:27:34.822] } [17:27:34.822] else { [17:27:34.822] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.822] info, version) [17:27:34.822] } [17:27:34.822] base::stop(msg) [17:27:34.822] } [17:27:34.822] }) [17:27:34.822] } [17:27:34.822] ...future.strategy.old <- future::plan("list") [17:27:34.822] options(future.plan = NULL) [17:27:34.822] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.822] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.822] } [17:27:34.822] ...future.workdir <- getwd() [17:27:34.822] } [17:27:34.822] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.822] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.822] } [17:27:34.822] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.822] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.822] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.822] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.822] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.822] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.822] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.822] base::names(...future.oldOptions)) [17:27:34.822] } [17:27:34.822] if (FALSE) { [17:27:34.822] } [17:27:34.822] else { [17:27:34.822] if (TRUE) { [17:27:34.822] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.822] open = "w") [17:27:34.822] } [17:27:34.822] else { [17:27:34.822] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.822] windows = "NUL", "/dev/null"), open = "w") [17:27:34.822] } [17:27:34.822] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.822] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.822] base::sink(type = "output", split = FALSE) [17:27:34.822] base::close(...future.stdout) [17:27:34.822] }, add = TRUE) [17:27:34.822] } [17:27:34.822] ...future.frame <- base::sys.nframe() [17:27:34.822] ...future.conditions <- base::list() [17:27:34.822] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.822] if (FALSE) { [17:27:34.822] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.822] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.822] } [17:27:34.822] ...future.result <- base::tryCatch({ [17:27:34.822] base::withCallingHandlers({ [17:27:34.822] ...future.value <- base::withVisible(base::local(2)) [17:27:34.822] future::FutureResult(value = ...future.value$value, [17:27:34.822] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.822] ...future.rng), globalenv = if (FALSE) [17:27:34.822] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.822] ...future.globalenv.names)) [17:27:34.822] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.822] }, condition = base::local({ [17:27:34.822] c <- base::c [17:27:34.822] inherits <- base::inherits [17:27:34.822] invokeRestart <- base::invokeRestart [17:27:34.822] length <- base::length [17:27:34.822] list <- base::list [17:27:34.822] seq.int <- base::seq.int [17:27:34.822] signalCondition <- base::signalCondition [17:27:34.822] sys.calls <- base::sys.calls [17:27:34.822] `[[` <- base::`[[` [17:27:34.822] `+` <- base::`+` [17:27:34.822] `<<-` <- base::`<<-` [17:27:34.822] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.822] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.822] 3L)] [17:27:34.822] } [17:27:34.822] function(cond) { [17:27:34.822] is_error <- inherits(cond, "error") [17:27:34.822] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.822] NULL) [17:27:34.822] if (is_error) { [17:27:34.822] sessionInformation <- function() { [17:27:34.822] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.822] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.822] search = base::search(), system = base::Sys.info()) [17:27:34.822] } [17:27:34.822] ...future.conditions[[length(...future.conditions) + [17:27:34.822] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.822] cond$call), session = sessionInformation(), [17:27:34.822] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.822] signalCondition(cond) [17:27:34.822] } [17:27:34.822] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.822] "immediateCondition"))) { [17:27:34.822] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.822] ...future.conditions[[length(...future.conditions) + [17:27:34.822] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.822] if (TRUE && !signal) { [17:27:34.822] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.822] { [17:27:34.822] inherits <- base::inherits [17:27:34.822] invokeRestart <- base::invokeRestart [17:27:34.822] is.null <- base::is.null [17:27:34.822] muffled <- FALSE [17:27:34.822] if (inherits(cond, "message")) { [17:27:34.822] muffled <- grepl(pattern, "muffleMessage") [17:27:34.822] if (muffled) [17:27:34.822] invokeRestart("muffleMessage") [17:27:34.822] } [17:27:34.822] else if (inherits(cond, "warning")) { [17:27:34.822] muffled <- grepl(pattern, "muffleWarning") [17:27:34.822] if (muffled) [17:27:34.822] invokeRestart("muffleWarning") [17:27:34.822] } [17:27:34.822] else if (inherits(cond, "condition")) { [17:27:34.822] if (!is.null(pattern)) { [17:27:34.822] computeRestarts <- base::computeRestarts [17:27:34.822] grepl <- base::grepl [17:27:34.822] restarts <- computeRestarts(cond) [17:27:34.822] for (restart in restarts) { [17:27:34.822] name <- restart$name [17:27:34.822] if (is.null(name)) [17:27:34.822] next [17:27:34.822] if (!grepl(pattern, name)) [17:27:34.822] next [17:27:34.822] invokeRestart(restart) [17:27:34.822] muffled <- TRUE [17:27:34.822] break [17:27:34.822] } [17:27:34.822] } [17:27:34.822] } [17:27:34.822] invisible(muffled) [17:27:34.822] } [17:27:34.822] muffleCondition(cond, pattern = "^muffle") [17:27:34.822] } [17:27:34.822] } [17:27:34.822] else { [17:27:34.822] if (TRUE) { [17:27:34.822] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.822] { [17:27:34.822] inherits <- base::inherits [17:27:34.822] invokeRestart <- base::invokeRestart [17:27:34.822] is.null <- base::is.null [17:27:34.822] muffled <- FALSE [17:27:34.822] if (inherits(cond, "message")) { [17:27:34.822] muffled <- grepl(pattern, "muffleMessage") [17:27:34.822] if (muffled) [17:27:34.822] invokeRestart("muffleMessage") [17:27:34.822] } [17:27:34.822] else if (inherits(cond, "warning")) { [17:27:34.822] muffled <- grepl(pattern, "muffleWarning") [17:27:34.822] if (muffled) [17:27:34.822] invokeRestart("muffleWarning") [17:27:34.822] } [17:27:34.822] else if (inherits(cond, "condition")) { [17:27:34.822] if (!is.null(pattern)) { [17:27:34.822] computeRestarts <- base::computeRestarts [17:27:34.822] grepl <- base::grepl [17:27:34.822] restarts <- computeRestarts(cond) [17:27:34.822] for (restart in restarts) { [17:27:34.822] name <- restart$name [17:27:34.822] if (is.null(name)) [17:27:34.822] next [17:27:34.822] if (!grepl(pattern, name)) [17:27:34.822] next [17:27:34.822] invokeRestart(restart) [17:27:34.822] muffled <- TRUE [17:27:34.822] break [17:27:34.822] } [17:27:34.822] } [17:27:34.822] } [17:27:34.822] invisible(muffled) [17:27:34.822] } [17:27:34.822] muffleCondition(cond, pattern = "^muffle") [17:27:34.822] } [17:27:34.822] } [17:27:34.822] } [17:27:34.822] })) [17:27:34.822] }, error = function(ex) { [17:27:34.822] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.822] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.822] ...future.rng), started = ...future.startTime, [17:27:34.822] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.822] version = "1.8"), class = "FutureResult") [17:27:34.822] }, finally = { [17:27:34.822] if (!identical(...future.workdir, getwd())) [17:27:34.822] setwd(...future.workdir) [17:27:34.822] { [17:27:34.822] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.822] ...future.oldOptions$nwarnings <- NULL [17:27:34.822] } [17:27:34.822] base::options(...future.oldOptions) [17:27:34.822] if (.Platform$OS.type == "windows") { [17:27:34.822] old_names <- names(...future.oldEnvVars) [17:27:34.822] envs <- base::Sys.getenv() [17:27:34.822] names <- names(envs) [17:27:34.822] common <- intersect(names, old_names) [17:27:34.822] added <- setdiff(names, old_names) [17:27:34.822] removed <- setdiff(old_names, names) [17:27:34.822] changed <- common[...future.oldEnvVars[common] != [17:27:34.822] envs[common]] [17:27:34.822] NAMES <- toupper(changed) [17:27:34.822] args <- list() [17:27:34.822] for (kk in seq_along(NAMES)) { [17:27:34.822] name <- changed[[kk]] [17:27:34.822] NAME <- NAMES[[kk]] [17:27:34.822] if (name != NAME && is.element(NAME, old_names)) [17:27:34.822] next [17:27:34.822] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.822] } [17:27:34.822] NAMES <- toupper(added) [17:27:34.822] for (kk in seq_along(NAMES)) { [17:27:34.822] name <- added[[kk]] [17:27:34.822] NAME <- NAMES[[kk]] [17:27:34.822] if (name != NAME && is.element(NAME, old_names)) [17:27:34.822] next [17:27:34.822] args[[name]] <- "" [17:27:34.822] } [17:27:34.822] NAMES <- toupper(removed) [17:27:34.822] for (kk in seq_along(NAMES)) { [17:27:34.822] name <- removed[[kk]] [17:27:34.822] NAME <- NAMES[[kk]] [17:27:34.822] if (name != NAME && is.element(NAME, old_names)) [17:27:34.822] next [17:27:34.822] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.822] } [17:27:34.822] if (length(args) > 0) [17:27:34.822] base::do.call(base::Sys.setenv, args = args) [17:27:34.822] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.822] } [17:27:34.822] else { [17:27:34.822] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.822] } [17:27:34.822] { [17:27:34.822] if (base::length(...future.futureOptionsAdded) > [17:27:34.822] 0L) { [17:27:34.822] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.822] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.822] base::options(opts) [17:27:34.822] } [17:27:34.822] { [17:27:34.822] { [17:27:34.822] NULL [17:27:34.822] RNGkind("Mersenne-Twister") [17:27:34.822] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.822] inherits = FALSE) [17:27:34.822] } [17:27:34.822] options(future.plan = NULL) [17:27:34.822] if (is.na(NA_character_)) [17:27:34.822] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.822] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.822] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.822] .init = FALSE) [17:27:34.822] } [17:27:34.822] } [17:27:34.822] } [17:27:34.822] }) [17:27:34.822] if (TRUE) { [17:27:34.822] base::sink(type = "output", split = FALSE) [17:27:34.822] if (TRUE) { [17:27:34.822] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.822] } [17:27:34.822] else { [17:27:34.822] ...future.result["stdout"] <- base::list(NULL) [17:27:34.822] } [17:27:34.822] base::close(...future.stdout) [17:27:34.822] ...future.stdout <- NULL [17:27:34.822] } [17:27:34.822] ...future.result$conditions <- ...future.conditions [17:27:34.822] ...future.result$finished <- base::Sys.time() [17:27:34.822] ...future.result [17:27:34.822] } [17:27:34.829] plan(): Setting new future strategy stack: [17:27:34.829] List of future strategies: [17:27:34.829] 1. sequential: [17:27:34.829] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.829] - tweaked: FALSE [17:27:34.829] - call: NULL [17:27:34.834] plan(): nbrOfWorkers() = 1 [17:27:34.836] plan(): Setting new future strategy stack: [17:27:34.836] List of future strategies: [17:27:34.836] 1. sequential: [17:27:34.836] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.836] - tweaked: FALSE [17:27:34.836] - call: plan(strategy) [17:27:34.837] plan(): nbrOfWorkers() = 1 [17:27:34.838] SequentialFuture started (and completed) [17:27:34.838] - Launch lazy future ... done [17:27:34.838] run() for 'SequentialFuture' ... done [17:27:34.839] getGlobalsAndPackages() ... [17:27:34.839] Searching for globals... [17:27:34.840] [17:27:34.840] Searching for globals ... DONE [17:27:34.840] - globals: [0] [17:27:34.841] getGlobalsAndPackages() ... DONE [17:27:34.841] run() for 'Future' ... [17:27:34.842] - state: 'created' [17:27:34.842] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.843] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.843] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.843] - Field: 'label' [17:27:34.844] - Field: 'local' [17:27:34.844] - Field: 'owner' [17:27:34.844] - Field: 'envir' [17:27:34.845] - Field: 'packages' [17:27:34.845] - Field: 'gc' [17:27:34.845] - Field: 'conditions' [17:27:34.846] - Field: 'expr' [17:27:34.846] - Field: 'uuid' [17:27:34.846] - Field: 'seed' [17:27:34.847] - Field: 'version' [17:27:34.847] - Field: 'result' [17:27:34.847] - Field: 'asynchronous' [17:27:34.848] - Field: 'calls' [17:27:34.848] - Field: 'globals' [17:27:34.848] - Field: 'stdout' [17:27:34.849] - Field: 'earlySignal' [17:27:34.849] - Field: 'lazy' [17:27:34.849] - Field: 'state' [17:27:34.850] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.850] - Launch lazy future ... [17:27:34.850] Packages needed by the future expression (n = 0): [17:27:34.851] Packages needed by future strategies (n = 0): [17:27:34.852] { [17:27:34.852] { [17:27:34.852] { [17:27:34.852] ...future.startTime <- base::Sys.time() [17:27:34.852] { [17:27:34.852] { [17:27:34.852] { [17:27:34.852] base::local({ [17:27:34.852] has_future <- base::requireNamespace("future", [17:27:34.852] quietly = TRUE) [17:27:34.852] if (has_future) { [17:27:34.852] ns <- base::getNamespace("future") [17:27:34.852] version <- ns[[".package"]][["version"]] [17:27:34.852] if (is.null(version)) [17:27:34.852] version <- utils::packageVersion("future") [17:27:34.852] } [17:27:34.852] else { [17:27:34.852] version <- NULL [17:27:34.852] } [17:27:34.852] if (!has_future || version < "1.8.0") { [17:27:34.852] info <- base::c(r_version = base::gsub("R version ", [17:27:34.852] "", base::R.version$version.string), [17:27:34.852] platform = base::sprintf("%s (%s-bit)", [17:27:34.852] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.852] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.852] "release", "version")], collapse = " "), [17:27:34.852] hostname = base::Sys.info()[["nodename"]]) [17:27:34.852] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.852] info) [17:27:34.852] info <- base::paste(info, collapse = "; ") [17:27:34.852] if (!has_future) { [17:27:34.852] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.852] info) [17:27:34.852] } [17:27:34.852] else { [17:27:34.852] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.852] info, version) [17:27:34.852] } [17:27:34.852] base::stop(msg) [17:27:34.852] } [17:27:34.852] }) [17:27:34.852] } [17:27:34.852] ...future.strategy.old <- future::plan("list") [17:27:34.852] options(future.plan = NULL) [17:27:34.852] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.852] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.852] } [17:27:34.852] ...future.workdir <- getwd() [17:27:34.852] } [17:27:34.852] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.852] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.852] } [17:27:34.852] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.852] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.852] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.852] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.852] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.852] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.852] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.852] base::names(...future.oldOptions)) [17:27:34.852] } [17:27:34.852] if (FALSE) { [17:27:34.852] } [17:27:34.852] else { [17:27:34.852] if (TRUE) { [17:27:34.852] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.852] open = "w") [17:27:34.852] } [17:27:34.852] else { [17:27:34.852] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.852] windows = "NUL", "/dev/null"), open = "w") [17:27:34.852] } [17:27:34.852] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.852] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.852] base::sink(type = "output", split = FALSE) [17:27:34.852] base::close(...future.stdout) [17:27:34.852] }, add = TRUE) [17:27:34.852] } [17:27:34.852] ...future.frame <- base::sys.nframe() [17:27:34.852] ...future.conditions <- base::list() [17:27:34.852] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.852] if (FALSE) { [17:27:34.852] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.852] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.852] } [17:27:34.852] ...future.result <- base::tryCatch({ [17:27:34.852] base::withCallingHandlers({ [17:27:34.852] ...future.value <- base::withVisible(base::local(NULL)) [17:27:34.852] future::FutureResult(value = ...future.value$value, [17:27:34.852] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.852] ...future.rng), globalenv = if (FALSE) [17:27:34.852] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.852] ...future.globalenv.names)) [17:27:34.852] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.852] }, condition = base::local({ [17:27:34.852] c <- base::c [17:27:34.852] inherits <- base::inherits [17:27:34.852] invokeRestart <- base::invokeRestart [17:27:34.852] length <- base::length [17:27:34.852] list <- base::list [17:27:34.852] seq.int <- base::seq.int [17:27:34.852] signalCondition <- base::signalCondition [17:27:34.852] sys.calls <- base::sys.calls [17:27:34.852] `[[` <- base::`[[` [17:27:34.852] `+` <- base::`+` [17:27:34.852] `<<-` <- base::`<<-` [17:27:34.852] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.852] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.852] 3L)] [17:27:34.852] } [17:27:34.852] function(cond) { [17:27:34.852] is_error <- inherits(cond, "error") [17:27:34.852] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.852] NULL) [17:27:34.852] if (is_error) { [17:27:34.852] sessionInformation <- function() { [17:27:34.852] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.852] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.852] search = base::search(), system = base::Sys.info()) [17:27:34.852] } [17:27:34.852] ...future.conditions[[length(...future.conditions) + [17:27:34.852] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.852] cond$call), session = sessionInformation(), [17:27:34.852] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.852] signalCondition(cond) [17:27:34.852] } [17:27:34.852] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.852] "immediateCondition"))) { [17:27:34.852] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.852] ...future.conditions[[length(...future.conditions) + [17:27:34.852] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.852] if (TRUE && !signal) { [17:27:34.852] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.852] { [17:27:34.852] inherits <- base::inherits [17:27:34.852] invokeRestart <- base::invokeRestart [17:27:34.852] is.null <- base::is.null [17:27:34.852] muffled <- FALSE [17:27:34.852] if (inherits(cond, "message")) { [17:27:34.852] muffled <- grepl(pattern, "muffleMessage") [17:27:34.852] if (muffled) [17:27:34.852] invokeRestart("muffleMessage") [17:27:34.852] } [17:27:34.852] else if (inherits(cond, "warning")) { [17:27:34.852] muffled <- grepl(pattern, "muffleWarning") [17:27:34.852] if (muffled) [17:27:34.852] invokeRestart("muffleWarning") [17:27:34.852] } [17:27:34.852] else if (inherits(cond, "condition")) { [17:27:34.852] if (!is.null(pattern)) { [17:27:34.852] computeRestarts <- base::computeRestarts [17:27:34.852] grepl <- base::grepl [17:27:34.852] restarts <- computeRestarts(cond) [17:27:34.852] for (restart in restarts) { [17:27:34.852] name <- restart$name [17:27:34.852] if (is.null(name)) [17:27:34.852] next [17:27:34.852] if (!grepl(pattern, name)) [17:27:34.852] next [17:27:34.852] invokeRestart(restart) [17:27:34.852] muffled <- TRUE [17:27:34.852] break [17:27:34.852] } [17:27:34.852] } [17:27:34.852] } [17:27:34.852] invisible(muffled) [17:27:34.852] } [17:27:34.852] muffleCondition(cond, pattern = "^muffle") [17:27:34.852] } [17:27:34.852] } [17:27:34.852] else { [17:27:34.852] if (TRUE) { [17:27:34.852] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.852] { [17:27:34.852] inherits <- base::inherits [17:27:34.852] invokeRestart <- base::invokeRestart [17:27:34.852] is.null <- base::is.null [17:27:34.852] muffled <- FALSE [17:27:34.852] if (inherits(cond, "message")) { [17:27:34.852] muffled <- grepl(pattern, "muffleMessage") [17:27:34.852] if (muffled) [17:27:34.852] invokeRestart("muffleMessage") [17:27:34.852] } [17:27:34.852] else if (inherits(cond, "warning")) { [17:27:34.852] muffled <- grepl(pattern, "muffleWarning") [17:27:34.852] if (muffled) [17:27:34.852] invokeRestart("muffleWarning") [17:27:34.852] } [17:27:34.852] else if (inherits(cond, "condition")) { [17:27:34.852] if (!is.null(pattern)) { [17:27:34.852] computeRestarts <- base::computeRestarts [17:27:34.852] grepl <- base::grepl [17:27:34.852] restarts <- computeRestarts(cond) [17:27:34.852] for (restart in restarts) { [17:27:34.852] name <- restart$name [17:27:34.852] if (is.null(name)) [17:27:34.852] next [17:27:34.852] if (!grepl(pattern, name)) [17:27:34.852] next [17:27:34.852] invokeRestart(restart) [17:27:34.852] muffled <- TRUE [17:27:34.852] break [17:27:34.852] } [17:27:34.852] } [17:27:34.852] } [17:27:34.852] invisible(muffled) [17:27:34.852] } [17:27:34.852] muffleCondition(cond, pattern = "^muffle") [17:27:34.852] } [17:27:34.852] } [17:27:34.852] } [17:27:34.852] })) [17:27:34.852] }, error = function(ex) { [17:27:34.852] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.852] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.852] ...future.rng), started = ...future.startTime, [17:27:34.852] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.852] version = "1.8"), class = "FutureResult") [17:27:34.852] }, finally = { [17:27:34.852] if (!identical(...future.workdir, getwd())) [17:27:34.852] setwd(...future.workdir) [17:27:34.852] { [17:27:34.852] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.852] ...future.oldOptions$nwarnings <- NULL [17:27:34.852] } [17:27:34.852] base::options(...future.oldOptions) [17:27:34.852] if (.Platform$OS.type == "windows") { [17:27:34.852] old_names <- names(...future.oldEnvVars) [17:27:34.852] envs <- base::Sys.getenv() [17:27:34.852] names <- names(envs) [17:27:34.852] common <- intersect(names, old_names) [17:27:34.852] added <- setdiff(names, old_names) [17:27:34.852] removed <- setdiff(old_names, names) [17:27:34.852] changed <- common[...future.oldEnvVars[common] != [17:27:34.852] envs[common]] [17:27:34.852] NAMES <- toupper(changed) [17:27:34.852] args <- list() [17:27:34.852] for (kk in seq_along(NAMES)) { [17:27:34.852] name <- changed[[kk]] [17:27:34.852] NAME <- NAMES[[kk]] [17:27:34.852] if (name != NAME && is.element(NAME, old_names)) [17:27:34.852] next [17:27:34.852] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.852] } [17:27:34.852] NAMES <- toupper(added) [17:27:34.852] for (kk in seq_along(NAMES)) { [17:27:34.852] name <- added[[kk]] [17:27:34.852] NAME <- NAMES[[kk]] [17:27:34.852] if (name != NAME && is.element(NAME, old_names)) [17:27:34.852] next [17:27:34.852] args[[name]] <- "" [17:27:34.852] } [17:27:34.852] NAMES <- toupper(removed) [17:27:34.852] for (kk in seq_along(NAMES)) { [17:27:34.852] name <- removed[[kk]] [17:27:34.852] NAME <- NAMES[[kk]] [17:27:34.852] if (name != NAME && is.element(NAME, old_names)) [17:27:34.852] next [17:27:34.852] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.852] } [17:27:34.852] if (length(args) > 0) [17:27:34.852] base::do.call(base::Sys.setenv, args = args) [17:27:34.852] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.852] } [17:27:34.852] else { [17:27:34.852] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.852] } [17:27:34.852] { [17:27:34.852] if (base::length(...future.futureOptionsAdded) > [17:27:34.852] 0L) { [17:27:34.852] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.852] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.852] base::options(opts) [17:27:34.852] } [17:27:34.852] { [17:27:34.852] { [17:27:34.852] NULL [17:27:34.852] RNGkind("Mersenne-Twister") [17:27:34.852] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.852] inherits = FALSE) [17:27:34.852] } [17:27:34.852] options(future.plan = NULL) [17:27:34.852] if (is.na(NA_character_)) [17:27:34.852] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.852] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.852] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.852] .init = FALSE) [17:27:34.852] } [17:27:34.852] } [17:27:34.852] } [17:27:34.852] }) [17:27:34.852] if (TRUE) { [17:27:34.852] base::sink(type = "output", split = FALSE) [17:27:34.852] if (TRUE) { [17:27:34.852] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.852] } [17:27:34.852] else { [17:27:34.852] ...future.result["stdout"] <- base::list(NULL) [17:27:34.852] } [17:27:34.852] base::close(...future.stdout) [17:27:34.852] ...future.stdout <- NULL [17:27:34.852] } [17:27:34.852] ...future.result$conditions <- ...future.conditions [17:27:34.852] ...future.result$finished <- base::Sys.time() [17:27:34.852] ...future.result [17:27:34.852] } [17:27:34.858] plan(): Setting new future strategy stack: [17:27:34.858] List of future strategies: [17:27:34.858] 1. sequential: [17:27:34.858] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.858] - tweaked: FALSE [17:27:34.858] - call: NULL [17:27:34.859] plan(): nbrOfWorkers() = 1 [17:27:34.861] plan(): Setting new future strategy stack: [17:27:34.862] List of future strategies: [17:27:34.862] 1. sequential: [17:27:34.862] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.862] - tweaked: FALSE [17:27:34.862] - call: plan(strategy) [17:27:34.863] plan(): nbrOfWorkers() = 1 [17:27:34.863] SequentialFuture started (and completed) [17:27:34.863] - Launch lazy future ... done [17:27:34.864] run() for 'SequentialFuture' ... done [17:27:34.866] getGlobalsAndPackages() ... [17:27:34.866] Searching for globals... [17:27:34.868] - globals found: [1] '{' [17:27:34.869] Searching for globals ... DONE [17:27:34.869] Resolving globals: FALSE [17:27:34.870] [17:27:34.870] [17:27:34.870] getGlobalsAndPackages() ... DONE [17:27:34.871] run() for 'Future' ... [17:27:34.871] - state: 'created' [17:27:34.872] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.872] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.873] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.873] - Field: 'label' [17:27:34.873] - Field: 'local' [17:27:34.874] - Field: 'owner' [17:27:34.874] - Field: 'envir' [17:27:34.874] - Field: 'packages' [17:27:34.875] - Field: 'gc' [17:27:34.875] - Field: 'conditions' [17:27:34.875] - Field: 'expr' [17:27:34.876] - Field: 'uuid' [17:27:34.876] - Field: 'seed' [17:27:34.877] - Field: 'version' [17:27:34.877] - Field: 'result' [17:27:34.877] - Field: 'asynchronous' [17:27:34.877] - Field: 'calls' [17:27:34.878] - Field: 'globals' [17:27:34.878] - Field: 'stdout' [17:27:34.878] - Field: 'earlySignal' [17:27:34.879] - Field: 'lazy' [17:27:34.879] - Field: 'state' [17:27:34.879] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.880] - Launch lazy future ... [17:27:34.880] Packages needed by the future expression (n = 0): [17:27:34.881] Packages needed by future strategies (n = 0): [17:27:34.882] { [17:27:34.882] { [17:27:34.882] { [17:27:34.882] ...future.startTime <- base::Sys.time() [17:27:34.882] { [17:27:34.882] { [17:27:34.882] { [17:27:34.882] base::local({ [17:27:34.882] has_future <- base::requireNamespace("future", [17:27:34.882] quietly = TRUE) [17:27:34.882] if (has_future) { [17:27:34.882] ns <- base::getNamespace("future") [17:27:34.882] version <- ns[[".package"]][["version"]] [17:27:34.882] if (is.null(version)) [17:27:34.882] version <- utils::packageVersion("future") [17:27:34.882] } [17:27:34.882] else { [17:27:34.882] version <- NULL [17:27:34.882] } [17:27:34.882] if (!has_future || version < "1.8.0") { [17:27:34.882] info <- base::c(r_version = base::gsub("R version ", [17:27:34.882] "", base::R.version$version.string), [17:27:34.882] platform = base::sprintf("%s (%s-bit)", [17:27:34.882] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.882] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.882] "release", "version")], collapse = " "), [17:27:34.882] hostname = base::Sys.info()[["nodename"]]) [17:27:34.882] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.882] info) [17:27:34.882] info <- base::paste(info, collapse = "; ") [17:27:34.882] if (!has_future) { [17:27:34.882] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.882] info) [17:27:34.882] } [17:27:34.882] else { [17:27:34.882] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.882] info, version) [17:27:34.882] } [17:27:34.882] base::stop(msg) [17:27:34.882] } [17:27:34.882] }) [17:27:34.882] } [17:27:34.882] ...future.strategy.old <- future::plan("list") [17:27:34.882] options(future.plan = NULL) [17:27:34.882] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.882] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.882] } [17:27:34.882] ...future.workdir <- getwd() [17:27:34.882] } [17:27:34.882] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.882] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.882] } [17:27:34.882] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.882] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.882] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.882] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.882] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.882] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.882] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.882] base::names(...future.oldOptions)) [17:27:34.882] } [17:27:34.882] if (FALSE) { [17:27:34.882] } [17:27:34.882] else { [17:27:34.882] if (TRUE) { [17:27:34.882] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.882] open = "w") [17:27:34.882] } [17:27:34.882] else { [17:27:34.882] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.882] windows = "NUL", "/dev/null"), open = "w") [17:27:34.882] } [17:27:34.882] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.882] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.882] base::sink(type = "output", split = FALSE) [17:27:34.882] base::close(...future.stdout) [17:27:34.882] }, add = TRUE) [17:27:34.882] } [17:27:34.882] ...future.frame <- base::sys.nframe() [17:27:34.882] ...future.conditions <- base::list() [17:27:34.882] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.882] if (FALSE) { [17:27:34.882] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.882] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.882] } [17:27:34.882] ...future.result <- base::tryCatch({ [17:27:34.882] base::withCallingHandlers({ [17:27:34.882] ...future.value <- base::withVisible(base::local({ [17:27:34.882] 4 [17:27:34.882] })) [17:27:34.882] future::FutureResult(value = ...future.value$value, [17:27:34.882] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.882] ...future.rng), globalenv = if (FALSE) [17:27:34.882] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.882] ...future.globalenv.names)) [17:27:34.882] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.882] }, condition = base::local({ [17:27:34.882] c <- base::c [17:27:34.882] inherits <- base::inherits [17:27:34.882] invokeRestart <- base::invokeRestart [17:27:34.882] length <- base::length [17:27:34.882] list <- base::list [17:27:34.882] seq.int <- base::seq.int [17:27:34.882] signalCondition <- base::signalCondition [17:27:34.882] sys.calls <- base::sys.calls [17:27:34.882] `[[` <- base::`[[` [17:27:34.882] `+` <- base::`+` [17:27:34.882] `<<-` <- base::`<<-` [17:27:34.882] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.882] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.882] 3L)] [17:27:34.882] } [17:27:34.882] function(cond) { [17:27:34.882] is_error <- inherits(cond, "error") [17:27:34.882] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.882] NULL) [17:27:34.882] if (is_error) { [17:27:34.882] sessionInformation <- function() { [17:27:34.882] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.882] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.882] search = base::search(), system = base::Sys.info()) [17:27:34.882] } [17:27:34.882] ...future.conditions[[length(...future.conditions) + [17:27:34.882] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.882] cond$call), session = sessionInformation(), [17:27:34.882] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.882] signalCondition(cond) [17:27:34.882] } [17:27:34.882] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.882] "immediateCondition"))) { [17:27:34.882] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.882] ...future.conditions[[length(...future.conditions) + [17:27:34.882] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.882] if (TRUE && !signal) { [17:27:34.882] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.882] { [17:27:34.882] inherits <- base::inherits [17:27:34.882] invokeRestart <- base::invokeRestart [17:27:34.882] is.null <- base::is.null [17:27:34.882] muffled <- FALSE [17:27:34.882] if (inherits(cond, "message")) { [17:27:34.882] muffled <- grepl(pattern, "muffleMessage") [17:27:34.882] if (muffled) [17:27:34.882] invokeRestart("muffleMessage") [17:27:34.882] } [17:27:34.882] else if (inherits(cond, "warning")) { [17:27:34.882] muffled <- grepl(pattern, "muffleWarning") [17:27:34.882] if (muffled) [17:27:34.882] invokeRestart("muffleWarning") [17:27:34.882] } [17:27:34.882] else if (inherits(cond, "condition")) { [17:27:34.882] if (!is.null(pattern)) { [17:27:34.882] computeRestarts <- base::computeRestarts [17:27:34.882] grepl <- base::grepl [17:27:34.882] restarts <- computeRestarts(cond) [17:27:34.882] for (restart in restarts) { [17:27:34.882] name <- restart$name [17:27:34.882] if (is.null(name)) [17:27:34.882] next [17:27:34.882] if (!grepl(pattern, name)) [17:27:34.882] next [17:27:34.882] invokeRestart(restart) [17:27:34.882] muffled <- TRUE [17:27:34.882] break [17:27:34.882] } [17:27:34.882] } [17:27:34.882] } [17:27:34.882] invisible(muffled) [17:27:34.882] } [17:27:34.882] muffleCondition(cond, pattern = "^muffle") [17:27:34.882] } [17:27:34.882] } [17:27:34.882] else { [17:27:34.882] if (TRUE) { [17:27:34.882] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.882] { [17:27:34.882] inherits <- base::inherits [17:27:34.882] invokeRestart <- base::invokeRestart [17:27:34.882] is.null <- base::is.null [17:27:34.882] muffled <- FALSE [17:27:34.882] if (inherits(cond, "message")) { [17:27:34.882] muffled <- grepl(pattern, "muffleMessage") [17:27:34.882] if (muffled) [17:27:34.882] invokeRestart("muffleMessage") [17:27:34.882] } [17:27:34.882] else if (inherits(cond, "warning")) { [17:27:34.882] muffled <- grepl(pattern, "muffleWarning") [17:27:34.882] if (muffled) [17:27:34.882] invokeRestart("muffleWarning") [17:27:34.882] } [17:27:34.882] else if (inherits(cond, "condition")) { [17:27:34.882] if (!is.null(pattern)) { [17:27:34.882] computeRestarts <- base::computeRestarts [17:27:34.882] grepl <- base::grepl [17:27:34.882] restarts <- computeRestarts(cond) [17:27:34.882] for (restart in restarts) { [17:27:34.882] name <- restart$name [17:27:34.882] if (is.null(name)) [17:27:34.882] next [17:27:34.882] if (!grepl(pattern, name)) [17:27:34.882] next [17:27:34.882] invokeRestart(restart) [17:27:34.882] muffled <- TRUE [17:27:34.882] break [17:27:34.882] } [17:27:34.882] } [17:27:34.882] } [17:27:34.882] invisible(muffled) [17:27:34.882] } [17:27:34.882] muffleCondition(cond, pattern = "^muffle") [17:27:34.882] } [17:27:34.882] } [17:27:34.882] } [17:27:34.882] })) [17:27:34.882] }, error = function(ex) { [17:27:34.882] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.882] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.882] ...future.rng), started = ...future.startTime, [17:27:34.882] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.882] version = "1.8"), class = "FutureResult") [17:27:34.882] }, finally = { [17:27:34.882] if (!identical(...future.workdir, getwd())) [17:27:34.882] setwd(...future.workdir) [17:27:34.882] { [17:27:34.882] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.882] ...future.oldOptions$nwarnings <- NULL [17:27:34.882] } [17:27:34.882] base::options(...future.oldOptions) [17:27:34.882] if (.Platform$OS.type == "windows") { [17:27:34.882] old_names <- names(...future.oldEnvVars) [17:27:34.882] envs <- base::Sys.getenv() [17:27:34.882] names <- names(envs) [17:27:34.882] common <- intersect(names, old_names) [17:27:34.882] added <- setdiff(names, old_names) [17:27:34.882] removed <- setdiff(old_names, names) [17:27:34.882] changed <- common[...future.oldEnvVars[common] != [17:27:34.882] envs[common]] [17:27:34.882] NAMES <- toupper(changed) [17:27:34.882] args <- list() [17:27:34.882] for (kk in seq_along(NAMES)) { [17:27:34.882] name <- changed[[kk]] [17:27:34.882] NAME <- NAMES[[kk]] [17:27:34.882] if (name != NAME && is.element(NAME, old_names)) [17:27:34.882] next [17:27:34.882] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.882] } [17:27:34.882] NAMES <- toupper(added) [17:27:34.882] for (kk in seq_along(NAMES)) { [17:27:34.882] name <- added[[kk]] [17:27:34.882] NAME <- NAMES[[kk]] [17:27:34.882] if (name != NAME && is.element(NAME, old_names)) [17:27:34.882] next [17:27:34.882] args[[name]] <- "" [17:27:34.882] } [17:27:34.882] NAMES <- toupper(removed) [17:27:34.882] for (kk in seq_along(NAMES)) { [17:27:34.882] name <- removed[[kk]] [17:27:34.882] NAME <- NAMES[[kk]] [17:27:34.882] if (name != NAME && is.element(NAME, old_names)) [17:27:34.882] next [17:27:34.882] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.882] } [17:27:34.882] if (length(args) > 0) [17:27:34.882] base::do.call(base::Sys.setenv, args = args) [17:27:34.882] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.882] } [17:27:34.882] else { [17:27:34.882] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.882] } [17:27:34.882] { [17:27:34.882] if (base::length(...future.futureOptionsAdded) > [17:27:34.882] 0L) { [17:27:34.882] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.882] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.882] base::options(opts) [17:27:34.882] } [17:27:34.882] { [17:27:34.882] { [17:27:34.882] NULL [17:27:34.882] RNGkind("Mersenne-Twister") [17:27:34.882] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.882] inherits = FALSE) [17:27:34.882] } [17:27:34.882] options(future.plan = NULL) [17:27:34.882] if (is.na(NA_character_)) [17:27:34.882] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.882] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.882] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.882] .init = FALSE) [17:27:34.882] } [17:27:34.882] } [17:27:34.882] } [17:27:34.882] }) [17:27:34.882] if (TRUE) { [17:27:34.882] base::sink(type = "output", split = FALSE) [17:27:34.882] if (TRUE) { [17:27:34.882] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.882] } [17:27:34.882] else { [17:27:34.882] ...future.result["stdout"] <- base::list(NULL) [17:27:34.882] } [17:27:34.882] base::close(...future.stdout) [17:27:34.882] ...future.stdout <- NULL [17:27:34.882] } [17:27:34.882] ...future.result$conditions <- ...future.conditions [17:27:34.882] ...future.result$finished <- base::Sys.time() [17:27:34.882] ...future.result [17:27:34.882] } [17:27:34.889] plan(): Setting new future strategy stack: [17:27:34.889] List of future strategies: [17:27:34.889] 1. sequential: [17:27:34.889] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.889] - tweaked: FALSE [17:27:34.889] - call: NULL [17:27:34.890] plan(): nbrOfWorkers() = 1 [17:27:34.893] plan(): Setting new future strategy stack: [17:27:34.893] List of future strategies: [17:27:34.893] 1. sequential: [17:27:34.893] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.893] - tweaked: FALSE [17:27:34.893] - call: plan(strategy) [17:27:34.894] plan(): nbrOfWorkers() = 1 [17:27:34.894] SequentialFuture started (and completed) [17:27:34.895] - Launch lazy future ... done [17:27:34.895] run() for 'SequentialFuture' ... done [17:27:34.898] resolved() for 'SequentialFuture' ... [17:27:34.899] - state: 'finished' [17:27:34.903] - run: TRUE [17:27:34.903] - result: 'FutureResult' [17:27:34.903] resolved() for 'SequentialFuture' ... done [17:27:34.904] resolved() for 'SequentialFuture' ... [17:27:34.904] - state: 'finished' [17:27:34.905] - run: TRUE [17:27:34.905] - result: 'FutureResult' [17:27:34.905] resolved() for 'SequentialFuture' ... done [17:27:34.906] resolved() for 'SequentialFuture' ... [17:27:34.906] - state: 'finished' [17:27:34.906] - run: TRUE [17:27:34.907] - result: 'FutureResult' [17:27:34.907] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:34.910] resolve() on environment ... [17:27:34.910] recursive: 0 [17:27:34.911] elements: [4] 'a', 'b', 'c', 'd' [17:27:34.912] signalConditionsASAP(numeric, pos=1) ... [17:27:34.912] - nx: 4 [17:27:34.912] - relay: TRUE [17:27:34.913] - stdout: TRUE [17:27:34.913] - signal: TRUE [17:27:34.913] - resignal: FALSE [17:27:34.913] - force: TRUE [17:27:34.914] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:34.914] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:34.914] - until=2 [17:27:34.915] - relaying element #2 [17:27:34.915] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:34.915] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:34.916] signalConditionsASAP(NULL, pos=1) ... done [17:27:34.916] length: 3 (resolved future 1) [17:27:34.916] resolved() for 'SequentialFuture' ... [17:27:34.917] - state: 'finished' [17:27:34.917] - run: TRUE [17:27:34.917] - result: 'FutureResult' [17:27:34.918] resolved() for 'SequentialFuture' ... done [17:27:34.918] Future #2 [17:27:34.918] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:34.919] - nx: 4 [17:27:34.919] - relay: TRUE [17:27:34.919] - stdout: TRUE [17:27:34.919] - signal: TRUE [17:27:34.920] - resignal: FALSE [17:27:34.920] - force: TRUE [17:27:34.920] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:34.920] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:34.921] - until=2 [17:27:34.921] - relaying element #2 [17:27:34.922] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:34.922] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:34.922] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:34.922] length: 2 (resolved future 2) [17:27:34.923] resolved() for 'SequentialFuture' ... [17:27:34.923] - state: 'finished' [17:27:34.923] - run: TRUE [17:27:34.923] - result: 'FutureResult' [17:27:34.924] resolved() for 'SequentialFuture' ... done [17:27:34.924] Future #3 [17:27:34.924] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:34.924] - nx: 4 [17:27:34.924] - relay: TRUE [17:27:34.925] - stdout: TRUE [17:27:34.925] - signal: TRUE [17:27:34.925] - resignal: FALSE [17:27:34.925] - force: TRUE [17:27:34.925] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:34.925] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:34.925] - until=3 [17:27:34.926] - relaying element #3 [17:27:34.926] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:34.926] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:34.926] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:34.926] length: 1 (resolved future 3) [17:27:34.927] resolved() for 'SequentialFuture' ... [17:27:34.927] - state: 'finished' [17:27:34.927] - run: TRUE [17:27:34.927] - result: 'FutureResult' [17:27:34.927] resolved() for 'SequentialFuture' ... done [17:27:34.928] Future #4 [17:27:34.928] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:34.928] - nx: 4 [17:27:34.928] - relay: TRUE [17:27:34.928] - stdout: TRUE [17:27:34.928] - signal: TRUE [17:27:34.929] - resignal: FALSE [17:27:34.929] - force: TRUE [17:27:34.929] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:34.929] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:34.929] - until=4 [17:27:34.929] - relaying element #4 [17:27:34.930] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:34.930] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:34.930] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:34.930] length: 0 (resolved future 4) [17:27:34.930] Relaying remaining futures [17:27:34.930] signalConditionsASAP(NULL, pos=0) ... [17:27:34.931] - nx: 4 [17:27:34.931] - relay: TRUE [17:27:34.931] - stdout: TRUE [17:27:34.931] - signal: TRUE [17:27:34.931] - resignal: FALSE [17:27:34.931] - force: TRUE [17:27:34.932] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:34.932] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:34.932] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:34.932] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:34.932] signalConditionsASAP(NULL, pos=0) ... done [17:27:34.933] resolve() on environment ... DONE Dimensions: c(1, 6) [17:27:34.933] getGlobalsAndPackages() ... [17:27:34.933] Searching for globals... [17:27:34.934] [17:27:34.934] Searching for globals ... DONE [17:27:34.934] - globals: [0] [17:27:34.934] getGlobalsAndPackages() ... DONE [17:27:34.935] run() for 'Future' ... [17:27:34.935] - state: 'created' [17:27:34.935] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.936] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.936] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.936] - Field: 'label' [17:27:34.936] - Field: 'local' [17:27:34.936] - Field: 'owner' [17:27:34.937] - Field: 'envir' [17:27:34.937] - Field: 'packages' [17:27:34.937] - Field: 'gc' [17:27:34.937] - Field: 'conditions' [17:27:34.937] - Field: 'expr' [17:27:34.938] - Field: 'uuid' [17:27:34.938] - Field: 'seed' [17:27:34.938] - Field: 'version' [17:27:34.938] - Field: 'result' [17:27:34.938] - Field: 'asynchronous' [17:27:34.939] - Field: 'calls' [17:27:34.939] - Field: 'globals' [17:27:34.939] - Field: 'stdout' [17:27:34.940] - Field: 'earlySignal' [17:27:34.940] - Field: 'lazy' [17:27:34.940] - Field: 'state' [17:27:34.941] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.941] - Launch lazy future ... [17:27:34.941] Packages needed by the future expression (n = 0): [17:27:34.942] Packages needed by future strategies (n = 0): [17:27:34.942] { [17:27:34.942] { [17:27:34.942] { [17:27:34.942] ...future.startTime <- base::Sys.time() [17:27:34.942] { [17:27:34.942] { [17:27:34.942] { [17:27:34.942] base::local({ [17:27:34.942] has_future <- base::requireNamespace("future", [17:27:34.942] quietly = TRUE) [17:27:34.942] if (has_future) { [17:27:34.942] ns <- base::getNamespace("future") [17:27:34.942] version <- ns[[".package"]][["version"]] [17:27:34.942] if (is.null(version)) [17:27:34.942] version <- utils::packageVersion("future") [17:27:34.942] } [17:27:34.942] else { [17:27:34.942] version <- NULL [17:27:34.942] } [17:27:34.942] if (!has_future || version < "1.8.0") { [17:27:34.942] info <- base::c(r_version = base::gsub("R version ", [17:27:34.942] "", base::R.version$version.string), [17:27:34.942] platform = base::sprintf("%s (%s-bit)", [17:27:34.942] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.942] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.942] "release", "version")], collapse = " "), [17:27:34.942] hostname = base::Sys.info()[["nodename"]]) [17:27:34.942] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.942] info) [17:27:34.942] info <- base::paste(info, collapse = "; ") [17:27:34.942] if (!has_future) { [17:27:34.942] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.942] info) [17:27:34.942] } [17:27:34.942] else { [17:27:34.942] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.942] info, version) [17:27:34.942] } [17:27:34.942] base::stop(msg) [17:27:34.942] } [17:27:34.942] }) [17:27:34.942] } [17:27:34.942] ...future.strategy.old <- future::plan("list") [17:27:34.942] options(future.plan = NULL) [17:27:34.942] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.942] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.942] } [17:27:34.942] ...future.workdir <- getwd() [17:27:34.942] } [17:27:34.942] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.942] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.942] } [17:27:34.942] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.942] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.942] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.942] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.942] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.942] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.942] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.942] base::names(...future.oldOptions)) [17:27:34.942] } [17:27:34.942] if (FALSE) { [17:27:34.942] } [17:27:34.942] else { [17:27:34.942] if (TRUE) { [17:27:34.942] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.942] open = "w") [17:27:34.942] } [17:27:34.942] else { [17:27:34.942] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.942] windows = "NUL", "/dev/null"), open = "w") [17:27:34.942] } [17:27:34.942] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.942] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.942] base::sink(type = "output", split = FALSE) [17:27:34.942] base::close(...future.stdout) [17:27:34.942] }, add = TRUE) [17:27:34.942] } [17:27:34.942] ...future.frame <- base::sys.nframe() [17:27:34.942] ...future.conditions <- base::list() [17:27:34.942] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.942] if (FALSE) { [17:27:34.942] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.942] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.942] } [17:27:34.942] ...future.result <- base::tryCatch({ [17:27:34.942] base::withCallingHandlers({ [17:27:34.942] ...future.value <- base::withVisible(base::local(2)) [17:27:34.942] future::FutureResult(value = ...future.value$value, [17:27:34.942] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.942] ...future.rng), globalenv = if (FALSE) [17:27:34.942] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.942] ...future.globalenv.names)) [17:27:34.942] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.942] }, condition = base::local({ [17:27:34.942] c <- base::c [17:27:34.942] inherits <- base::inherits [17:27:34.942] invokeRestart <- base::invokeRestart [17:27:34.942] length <- base::length [17:27:34.942] list <- base::list [17:27:34.942] seq.int <- base::seq.int [17:27:34.942] signalCondition <- base::signalCondition [17:27:34.942] sys.calls <- base::sys.calls [17:27:34.942] `[[` <- base::`[[` [17:27:34.942] `+` <- base::`+` [17:27:34.942] `<<-` <- base::`<<-` [17:27:34.942] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.942] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.942] 3L)] [17:27:34.942] } [17:27:34.942] function(cond) { [17:27:34.942] is_error <- inherits(cond, "error") [17:27:34.942] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.942] NULL) [17:27:34.942] if (is_error) { [17:27:34.942] sessionInformation <- function() { [17:27:34.942] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.942] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.942] search = base::search(), system = base::Sys.info()) [17:27:34.942] } [17:27:34.942] ...future.conditions[[length(...future.conditions) + [17:27:34.942] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.942] cond$call), session = sessionInformation(), [17:27:34.942] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.942] signalCondition(cond) [17:27:34.942] } [17:27:34.942] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.942] "immediateCondition"))) { [17:27:34.942] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.942] ...future.conditions[[length(...future.conditions) + [17:27:34.942] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.942] if (TRUE && !signal) { [17:27:34.942] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.942] { [17:27:34.942] inherits <- base::inherits [17:27:34.942] invokeRestart <- base::invokeRestart [17:27:34.942] is.null <- base::is.null [17:27:34.942] muffled <- FALSE [17:27:34.942] if (inherits(cond, "message")) { [17:27:34.942] muffled <- grepl(pattern, "muffleMessage") [17:27:34.942] if (muffled) [17:27:34.942] invokeRestart("muffleMessage") [17:27:34.942] } [17:27:34.942] else if (inherits(cond, "warning")) { [17:27:34.942] muffled <- grepl(pattern, "muffleWarning") [17:27:34.942] if (muffled) [17:27:34.942] invokeRestart("muffleWarning") [17:27:34.942] } [17:27:34.942] else if (inherits(cond, "condition")) { [17:27:34.942] if (!is.null(pattern)) { [17:27:34.942] computeRestarts <- base::computeRestarts [17:27:34.942] grepl <- base::grepl [17:27:34.942] restarts <- computeRestarts(cond) [17:27:34.942] for (restart in restarts) { [17:27:34.942] name <- restart$name [17:27:34.942] if (is.null(name)) [17:27:34.942] next [17:27:34.942] if (!grepl(pattern, name)) [17:27:34.942] next [17:27:34.942] invokeRestart(restart) [17:27:34.942] muffled <- TRUE [17:27:34.942] break [17:27:34.942] } [17:27:34.942] } [17:27:34.942] } [17:27:34.942] invisible(muffled) [17:27:34.942] } [17:27:34.942] muffleCondition(cond, pattern = "^muffle") [17:27:34.942] } [17:27:34.942] } [17:27:34.942] else { [17:27:34.942] if (TRUE) { [17:27:34.942] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.942] { [17:27:34.942] inherits <- base::inherits [17:27:34.942] invokeRestart <- base::invokeRestart [17:27:34.942] is.null <- base::is.null [17:27:34.942] muffled <- FALSE [17:27:34.942] if (inherits(cond, "message")) { [17:27:34.942] muffled <- grepl(pattern, "muffleMessage") [17:27:34.942] if (muffled) [17:27:34.942] invokeRestart("muffleMessage") [17:27:34.942] } [17:27:34.942] else if (inherits(cond, "warning")) { [17:27:34.942] muffled <- grepl(pattern, "muffleWarning") [17:27:34.942] if (muffled) [17:27:34.942] invokeRestart("muffleWarning") [17:27:34.942] } [17:27:34.942] else if (inherits(cond, "condition")) { [17:27:34.942] if (!is.null(pattern)) { [17:27:34.942] computeRestarts <- base::computeRestarts [17:27:34.942] grepl <- base::grepl [17:27:34.942] restarts <- computeRestarts(cond) [17:27:34.942] for (restart in restarts) { [17:27:34.942] name <- restart$name [17:27:34.942] if (is.null(name)) [17:27:34.942] next [17:27:34.942] if (!grepl(pattern, name)) [17:27:34.942] next [17:27:34.942] invokeRestart(restart) [17:27:34.942] muffled <- TRUE [17:27:34.942] break [17:27:34.942] } [17:27:34.942] } [17:27:34.942] } [17:27:34.942] invisible(muffled) [17:27:34.942] } [17:27:34.942] muffleCondition(cond, pattern = "^muffle") [17:27:34.942] } [17:27:34.942] } [17:27:34.942] } [17:27:34.942] })) [17:27:34.942] }, error = function(ex) { [17:27:34.942] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.942] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.942] ...future.rng), started = ...future.startTime, [17:27:34.942] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.942] version = "1.8"), class = "FutureResult") [17:27:34.942] }, finally = { [17:27:34.942] if (!identical(...future.workdir, getwd())) [17:27:34.942] setwd(...future.workdir) [17:27:34.942] { [17:27:34.942] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.942] ...future.oldOptions$nwarnings <- NULL [17:27:34.942] } [17:27:34.942] base::options(...future.oldOptions) [17:27:34.942] if (.Platform$OS.type == "windows") { [17:27:34.942] old_names <- names(...future.oldEnvVars) [17:27:34.942] envs <- base::Sys.getenv() [17:27:34.942] names <- names(envs) [17:27:34.942] common <- intersect(names, old_names) [17:27:34.942] added <- setdiff(names, old_names) [17:27:34.942] removed <- setdiff(old_names, names) [17:27:34.942] changed <- common[...future.oldEnvVars[common] != [17:27:34.942] envs[common]] [17:27:34.942] NAMES <- toupper(changed) [17:27:34.942] args <- list() [17:27:34.942] for (kk in seq_along(NAMES)) { [17:27:34.942] name <- changed[[kk]] [17:27:34.942] NAME <- NAMES[[kk]] [17:27:34.942] if (name != NAME && is.element(NAME, old_names)) [17:27:34.942] next [17:27:34.942] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.942] } [17:27:34.942] NAMES <- toupper(added) [17:27:34.942] for (kk in seq_along(NAMES)) { [17:27:34.942] name <- added[[kk]] [17:27:34.942] NAME <- NAMES[[kk]] [17:27:34.942] if (name != NAME && is.element(NAME, old_names)) [17:27:34.942] next [17:27:34.942] args[[name]] <- "" [17:27:34.942] } [17:27:34.942] NAMES <- toupper(removed) [17:27:34.942] for (kk in seq_along(NAMES)) { [17:27:34.942] name <- removed[[kk]] [17:27:34.942] NAME <- NAMES[[kk]] [17:27:34.942] if (name != NAME && is.element(NAME, old_names)) [17:27:34.942] next [17:27:34.942] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.942] } [17:27:34.942] if (length(args) > 0) [17:27:34.942] base::do.call(base::Sys.setenv, args = args) [17:27:34.942] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.942] } [17:27:34.942] else { [17:27:34.942] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.942] } [17:27:34.942] { [17:27:34.942] if (base::length(...future.futureOptionsAdded) > [17:27:34.942] 0L) { [17:27:34.942] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.942] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.942] base::options(opts) [17:27:34.942] } [17:27:34.942] { [17:27:34.942] { [17:27:34.942] NULL [17:27:34.942] RNGkind("Mersenne-Twister") [17:27:34.942] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.942] inherits = FALSE) [17:27:34.942] } [17:27:34.942] options(future.plan = NULL) [17:27:34.942] if (is.na(NA_character_)) [17:27:34.942] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.942] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.942] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.942] .init = FALSE) [17:27:34.942] } [17:27:34.942] } [17:27:34.942] } [17:27:34.942] }) [17:27:34.942] if (TRUE) { [17:27:34.942] base::sink(type = "output", split = FALSE) [17:27:34.942] if (TRUE) { [17:27:34.942] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.942] } [17:27:34.942] else { [17:27:34.942] ...future.result["stdout"] <- base::list(NULL) [17:27:34.942] } [17:27:34.942] base::close(...future.stdout) [17:27:34.942] ...future.stdout <- NULL [17:27:34.942] } [17:27:34.942] ...future.result$conditions <- ...future.conditions [17:27:34.942] ...future.result$finished <- base::Sys.time() [17:27:34.942] ...future.result [17:27:34.942] } [17:27:34.949] plan(): Setting new future strategy stack: [17:27:34.950] List of future strategies: [17:27:34.950] 1. sequential: [17:27:34.950] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.950] - tweaked: FALSE [17:27:34.950] - call: NULL [17:27:34.950] plan(): nbrOfWorkers() = 1 [17:27:34.952] plan(): Setting new future strategy stack: [17:27:34.952] List of future strategies: [17:27:34.952] 1. sequential: [17:27:34.952] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.952] - tweaked: FALSE [17:27:34.952] - call: plan(strategy) [17:27:34.953] plan(): nbrOfWorkers() = 1 [17:27:34.953] SequentialFuture started (and completed) [17:27:34.953] - Launch lazy future ... done [17:27:34.953] run() for 'SequentialFuture' ... done [17:27:34.953] getGlobalsAndPackages() ... [17:27:34.954] Searching for globals... [17:27:34.954] [17:27:34.955] Searching for globals ... DONE [17:27:34.955] - globals: [0] [17:27:34.955] getGlobalsAndPackages() ... DONE [17:27:34.956] run() for 'Future' ... [17:27:34.956] - state: 'created' [17:27:34.956] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.957] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.957] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.958] - Field: 'label' [17:27:34.958] - Field: 'local' [17:27:34.958] - Field: 'owner' [17:27:34.959] - Field: 'envir' [17:27:34.959] - Field: 'packages' [17:27:34.959] - Field: 'gc' [17:27:34.960] - Field: 'conditions' [17:27:34.960] - Field: 'expr' [17:27:34.960] - Field: 'uuid' [17:27:34.961] - Field: 'seed' [17:27:34.961] - Field: 'version' [17:27:34.961] - Field: 'result' [17:27:34.962] - Field: 'asynchronous' [17:27:34.962] - Field: 'calls' [17:27:34.962] - Field: 'globals' [17:27:34.963] - Field: 'stdout' [17:27:34.963] - Field: 'earlySignal' [17:27:34.963] - Field: 'lazy' [17:27:34.964] - Field: 'state' [17:27:34.964] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.964] - Launch lazy future ... [17:27:34.965] Packages needed by the future expression (n = 0): [17:27:34.965] Packages needed by future strategies (n = 0): [17:27:34.966] { [17:27:34.966] { [17:27:34.966] { [17:27:34.966] ...future.startTime <- base::Sys.time() [17:27:34.966] { [17:27:34.966] { [17:27:34.966] { [17:27:34.966] base::local({ [17:27:34.966] has_future <- base::requireNamespace("future", [17:27:34.966] quietly = TRUE) [17:27:34.966] if (has_future) { [17:27:34.966] ns <- base::getNamespace("future") [17:27:34.966] version <- ns[[".package"]][["version"]] [17:27:34.966] if (is.null(version)) [17:27:34.966] version <- utils::packageVersion("future") [17:27:34.966] } [17:27:34.966] else { [17:27:34.966] version <- NULL [17:27:34.966] } [17:27:34.966] if (!has_future || version < "1.8.0") { [17:27:34.966] info <- base::c(r_version = base::gsub("R version ", [17:27:34.966] "", base::R.version$version.string), [17:27:34.966] platform = base::sprintf("%s (%s-bit)", [17:27:34.966] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.966] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.966] "release", "version")], collapse = " "), [17:27:34.966] hostname = base::Sys.info()[["nodename"]]) [17:27:34.966] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.966] info) [17:27:34.966] info <- base::paste(info, collapse = "; ") [17:27:34.966] if (!has_future) { [17:27:34.966] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.966] info) [17:27:34.966] } [17:27:34.966] else { [17:27:34.966] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.966] info, version) [17:27:34.966] } [17:27:34.966] base::stop(msg) [17:27:34.966] } [17:27:34.966] }) [17:27:34.966] } [17:27:34.966] ...future.strategy.old <- future::plan("list") [17:27:34.966] options(future.plan = NULL) [17:27:34.966] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.966] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.966] } [17:27:34.966] ...future.workdir <- getwd() [17:27:34.966] } [17:27:34.966] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.966] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.966] } [17:27:34.966] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.966] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.966] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.966] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.966] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.966] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.966] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.966] base::names(...future.oldOptions)) [17:27:34.966] } [17:27:34.966] if (FALSE) { [17:27:34.966] } [17:27:34.966] else { [17:27:34.966] if (TRUE) { [17:27:34.966] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.966] open = "w") [17:27:34.966] } [17:27:34.966] else { [17:27:34.966] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.966] windows = "NUL", "/dev/null"), open = "w") [17:27:34.966] } [17:27:34.966] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.966] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.966] base::sink(type = "output", split = FALSE) [17:27:34.966] base::close(...future.stdout) [17:27:34.966] }, add = TRUE) [17:27:34.966] } [17:27:34.966] ...future.frame <- base::sys.nframe() [17:27:34.966] ...future.conditions <- base::list() [17:27:34.966] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.966] if (FALSE) { [17:27:34.966] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.966] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.966] } [17:27:34.966] ...future.result <- base::tryCatch({ [17:27:34.966] base::withCallingHandlers({ [17:27:34.966] ...future.value <- base::withVisible(base::local(NULL)) [17:27:34.966] future::FutureResult(value = ...future.value$value, [17:27:34.966] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.966] ...future.rng), globalenv = if (FALSE) [17:27:34.966] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.966] ...future.globalenv.names)) [17:27:34.966] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.966] }, condition = base::local({ [17:27:34.966] c <- base::c [17:27:34.966] inherits <- base::inherits [17:27:34.966] invokeRestart <- base::invokeRestart [17:27:34.966] length <- base::length [17:27:34.966] list <- base::list [17:27:34.966] seq.int <- base::seq.int [17:27:34.966] signalCondition <- base::signalCondition [17:27:34.966] sys.calls <- base::sys.calls [17:27:34.966] `[[` <- base::`[[` [17:27:34.966] `+` <- base::`+` [17:27:34.966] `<<-` <- base::`<<-` [17:27:34.966] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.966] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.966] 3L)] [17:27:34.966] } [17:27:34.966] function(cond) { [17:27:34.966] is_error <- inherits(cond, "error") [17:27:34.966] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.966] NULL) [17:27:34.966] if (is_error) { [17:27:34.966] sessionInformation <- function() { [17:27:34.966] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.966] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.966] search = base::search(), system = base::Sys.info()) [17:27:34.966] } [17:27:34.966] ...future.conditions[[length(...future.conditions) + [17:27:34.966] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.966] cond$call), session = sessionInformation(), [17:27:34.966] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.966] signalCondition(cond) [17:27:34.966] } [17:27:34.966] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.966] "immediateCondition"))) { [17:27:34.966] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.966] ...future.conditions[[length(...future.conditions) + [17:27:34.966] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.966] if (TRUE && !signal) { [17:27:34.966] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.966] { [17:27:34.966] inherits <- base::inherits [17:27:34.966] invokeRestart <- base::invokeRestart [17:27:34.966] is.null <- base::is.null [17:27:34.966] muffled <- FALSE [17:27:34.966] if (inherits(cond, "message")) { [17:27:34.966] muffled <- grepl(pattern, "muffleMessage") [17:27:34.966] if (muffled) [17:27:34.966] invokeRestart("muffleMessage") [17:27:34.966] } [17:27:34.966] else if (inherits(cond, "warning")) { [17:27:34.966] muffled <- grepl(pattern, "muffleWarning") [17:27:34.966] if (muffled) [17:27:34.966] invokeRestart("muffleWarning") [17:27:34.966] } [17:27:34.966] else if (inherits(cond, "condition")) { [17:27:34.966] if (!is.null(pattern)) { [17:27:34.966] computeRestarts <- base::computeRestarts [17:27:34.966] grepl <- base::grepl [17:27:34.966] restarts <- computeRestarts(cond) [17:27:34.966] for (restart in restarts) { [17:27:34.966] name <- restart$name [17:27:34.966] if (is.null(name)) [17:27:34.966] next [17:27:34.966] if (!grepl(pattern, name)) [17:27:34.966] next [17:27:34.966] invokeRestart(restart) [17:27:34.966] muffled <- TRUE [17:27:34.966] break [17:27:34.966] } [17:27:34.966] } [17:27:34.966] } [17:27:34.966] invisible(muffled) [17:27:34.966] } [17:27:34.966] muffleCondition(cond, pattern = "^muffle") [17:27:34.966] } [17:27:34.966] } [17:27:34.966] else { [17:27:34.966] if (TRUE) { [17:27:34.966] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.966] { [17:27:34.966] inherits <- base::inherits [17:27:34.966] invokeRestart <- base::invokeRestart [17:27:34.966] is.null <- base::is.null [17:27:34.966] muffled <- FALSE [17:27:34.966] if (inherits(cond, "message")) { [17:27:34.966] muffled <- grepl(pattern, "muffleMessage") [17:27:34.966] if (muffled) [17:27:34.966] invokeRestart("muffleMessage") [17:27:34.966] } [17:27:34.966] else if (inherits(cond, "warning")) { [17:27:34.966] muffled <- grepl(pattern, "muffleWarning") [17:27:34.966] if (muffled) [17:27:34.966] invokeRestart("muffleWarning") [17:27:34.966] } [17:27:34.966] else if (inherits(cond, "condition")) { [17:27:34.966] if (!is.null(pattern)) { [17:27:34.966] computeRestarts <- base::computeRestarts [17:27:34.966] grepl <- base::grepl [17:27:34.966] restarts <- computeRestarts(cond) [17:27:34.966] for (restart in restarts) { [17:27:34.966] name <- restart$name [17:27:34.966] if (is.null(name)) [17:27:34.966] next [17:27:34.966] if (!grepl(pattern, name)) [17:27:34.966] next [17:27:34.966] invokeRestart(restart) [17:27:34.966] muffled <- TRUE [17:27:34.966] break [17:27:34.966] } [17:27:34.966] } [17:27:34.966] } [17:27:34.966] invisible(muffled) [17:27:34.966] } [17:27:34.966] muffleCondition(cond, pattern = "^muffle") [17:27:34.966] } [17:27:34.966] } [17:27:34.966] } [17:27:34.966] })) [17:27:34.966] }, error = function(ex) { [17:27:34.966] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.966] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.966] ...future.rng), started = ...future.startTime, [17:27:34.966] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.966] version = "1.8"), class = "FutureResult") [17:27:34.966] }, finally = { [17:27:34.966] if (!identical(...future.workdir, getwd())) [17:27:34.966] setwd(...future.workdir) [17:27:34.966] { [17:27:34.966] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.966] ...future.oldOptions$nwarnings <- NULL [17:27:34.966] } [17:27:34.966] base::options(...future.oldOptions) [17:27:34.966] if (.Platform$OS.type == "windows") { [17:27:34.966] old_names <- names(...future.oldEnvVars) [17:27:34.966] envs <- base::Sys.getenv() [17:27:34.966] names <- names(envs) [17:27:34.966] common <- intersect(names, old_names) [17:27:34.966] added <- setdiff(names, old_names) [17:27:34.966] removed <- setdiff(old_names, names) [17:27:34.966] changed <- common[...future.oldEnvVars[common] != [17:27:34.966] envs[common]] [17:27:34.966] NAMES <- toupper(changed) [17:27:34.966] args <- list() [17:27:34.966] for (kk in seq_along(NAMES)) { [17:27:34.966] name <- changed[[kk]] [17:27:34.966] NAME <- NAMES[[kk]] [17:27:34.966] if (name != NAME && is.element(NAME, old_names)) [17:27:34.966] next [17:27:34.966] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.966] } [17:27:34.966] NAMES <- toupper(added) [17:27:34.966] for (kk in seq_along(NAMES)) { [17:27:34.966] name <- added[[kk]] [17:27:34.966] NAME <- NAMES[[kk]] [17:27:34.966] if (name != NAME && is.element(NAME, old_names)) [17:27:34.966] next [17:27:34.966] args[[name]] <- "" [17:27:34.966] } [17:27:34.966] NAMES <- toupper(removed) [17:27:34.966] for (kk in seq_along(NAMES)) { [17:27:34.966] name <- removed[[kk]] [17:27:34.966] NAME <- NAMES[[kk]] [17:27:34.966] if (name != NAME && is.element(NAME, old_names)) [17:27:34.966] next [17:27:34.966] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.966] } [17:27:34.966] if (length(args) > 0) [17:27:34.966] base::do.call(base::Sys.setenv, args = args) [17:27:34.966] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.966] } [17:27:34.966] else { [17:27:34.966] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.966] } [17:27:34.966] { [17:27:34.966] if (base::length(...future.futureOptionsAdded) > [17:27:34.966] 0L) { [17:27:34.966] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.966] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.966] base::options(opts) [17:27:34.966] } [17:27:34.966] { [17:27:34.966] { [17:27:34.966] NULL [17:27:34.966] RNGkind("Mersenne-Twister") [17:27:34.966] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.966] inherits = FALSE) [17:27:34.966] } [17:27:34.966] options(future.plan = NULL) [17:27:34.966] if (is.na(NA_character_)) [17:27:34.966] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.966] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.966] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.966] .init = FALSE) [17:27:34.966] } [17:27:34.966] } [17:27:34.966] } [17:27:34.966] }) [17:27:34.966] if (TRUE) { [17:27:34.966] base::sink(type = "output", split = FALSE) [17:27:34.966] if (TRUE) { [17:27:34.966] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.966] } [17:27:34.966] else { [17:27:34.966] ...future.result["stdout"] <- base::list(NULL) [17:27:34.966] } [17:27:34.966] base::close(...future.stdout) [17:27:34.966] ...future.stdout <- NULL [17:27:34.966] } [17:27:34.966] ...future.result$conditions <- ...future.conditions [17:27:34.966] ...future.result$finished <- base::Sys.time() [17:27:34.966] ...future.result [17:27:34.966] } [17:27:34.973] plan(): Setting new future strategy stack: [17:27:34.973] List of future strategies: [17:27:34.973] 1. sequential: [17:27:34.973] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.973] - tweaked: FALSE [17:27:34.973] - call: NULL [17:27:34.975] plan(): nbrOfWorkers() = 1 [17:27:34.977] plan(): Setting new future strategy stack: [17:27:34.977] List of future strategies: [17:27:34.977] 1. sequential: [17:27:34.977] - args: function (..., envir = parent.frame(), workers = "") [17:27:34.977] - tweaked: FALSE [17:27:34.977] - call: plan(strategy) [17:27:34.978] plan(): nbrOfWorkers() = 1 [17:27:34.979] SequentialFuture started (and completed) [17:27:34.979] - Launch lazy future ... done [17:27:34.979] run() for 'SequentialFuture' ... done [17:27:34.980] getGlobalsAndPackages() ... [17:27:34.980] Searching for globals... [17:27:34.982] - globals found: [1] '{' [17:27:34.982] Searching for globals ... DONE [17:27:34.982] Resolving globals: FALSE [17:27:34.983] [17:27:34.983] [17:27:34.984] getGlobalsAndPackages() ... DONE [17:27:34.984] run() for 'Future' ... [17:27:34.985] - state: 'created' [17:27:34.985] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:34.986] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:34.986] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:34.986] - Field: 'label' [17:27:34.987] - Field: 'local' [17:27:34.987] - Field: 'owner' [17:27:34.987] - Field: 'envir' [17:27:34.988] - Field: 'packages' [17:27:34.988] - Field: 'gc' [17:27:34.988] - Field: 'conditions' [17:27:34.988] - Field: 'expr' [17:27:34.989] - Field: 'uuid' [17:27:34.989] - Field: 'seed' [17:27:34.989] - Field: 'version' [17:27:34.990] - Field: 'result' [17:27:34.990] - Field: 'asynchronous' [17:27:34.990] - Field: 'calls' [17:27:34.991] - Field: 'globals' [17:27:34.991] - Field: 'stdout' [17:27:34.991] - Field: 'earlySignal' [17:27:34.991] - Field: 'lazy' [17:27:34.992] - Field: 'state' [17:27:34.992] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:34.992] - Launch lazy future ... [17:27:34.993] Packages needed by the future expression (n = 0): [17:27:34.993] Packages needed by future strategies (n = 0): [17:27:34.994] { [17:27:34.994] { [17:27:34.994] { [17:27:34.994] ...future.startTime <- base::Sys.time() [17:27:34.994] { [17:27:34.994] { [17:27:34.994] { [17:27:34.994] base::local({ [17:27:34.994] has_future <- base::requireNamespace("future", [17:27:34.994] quietly = TRUE) [17:27:34.994] if (has_future) { [17:27:34.994] ns <- base::getNamespace("future") [17:27:34.994] version <- ns[[".package"]][["version"]] [17:27:34.994] if (is.null(version)) [17:27:34.994] version <- utils::packageVersion("future") [17:27:34.994] } [17:27:34.994] else { [17:27:34.994] version <- NULL [17:27:34.994] } [17:27:34.994] if (!has_future || version < "1.8.0") { [17:27:34.994] info <- base::c(r_version = base::gsub("R version ", [17:27:34.994] "", base::R.version$version.string), [17:27:34.994] platform = base::sprintf("%s (%s-bit)", [17:27:34.994] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:34.994] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:34.994] "release", "version")], collapse = " "), [17:27:34.994] hostname = base::Sys.info()[["nodename"]]) [17:27:34.994] info <- base::sprintf("%s: %s", base::names(info), [17:27:34.994] info) [17:27:34.994] info <- base::paste(info, collapse = "; ") [17:27:34.994] if (!has_future) { [17:27:34.994] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:34.994] info) [17:27:34.994] } [17:27:34.994] else { [17:27:34.994] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:34.994] info, version) [17:27:34.994] } [17:27:34.994] base::stop(msg) [17:27:34.994] } [17:27:34.994] }) [17:27:34.994] } [17:27:34.994] ...future.strategy.old <- future::plan("list") [17:27:34.994] options(future.plan = NULL) [17:27:34.994] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.994] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:34.994] } [17:27:34.994] ...future.workdir <- getwd() [17:27:34.994] } [17:27:34.994] ...future.oldOptions <- base::as.list(base::.Options) [17:27:34.994] ...future.oldEnvVars <- base::Sys.getenv() [17:27:34.994] } [17:27:34.994] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:34.994] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:34.994] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:34.994] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:34.994] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:34.994] future.stdout.windows.reencode = NULL, width = 80L) [17:27:34.994] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:34.994] base::names(...future.oldOptions)) [17:27:34.994] } [17:27:34.994] if (FALSE) { [17:27:34.994] } [17:27:34.994] else { [17:27:34.994] if (TRUE) { [17:27:34.994] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:34.994] open = "w") [17:27:34.994] } [17:27:34.994] else { [17:27:34.994] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:34.994] windows = "NUL", "/dev/null"), open = "w") [17:27:34.994] } [17:27:34.994] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:34.994] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:34.994] base::sink(type = "output", split = FALSE) [17:27:34.994] base::close(...future.stdout) [17:27:34.994] }, add = TRUE) [17:27:34.994] } [17:27:34.994] ...future.frame <- base::sys.nframe() [17:27:34.994] ...future.conditions <- base::list() [17:27:34.994] ...future.rng <- base::globalenv()$.Random.seed [17:27:34.994] if (FALSE) { [17:27:34.994] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:34.994] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:34.994] } [17:27:34.994] ...future.result <- base::tryCatch({ [17:27:34.994] base::withCallingHandlers({ [17:27:34.994] ...future.value <- base::withVisible(base::local({ [17:27:34.994] 4 [17:27:34.994] })) [17:27:34.994] future::FutureResult(value = ...future.value$value, [17:27:34.994] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.994] ...future.rng), globalenv = if (FALSE) [17:27:34.994] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:34.994] ...future.globalenv.names)) [17:27:34.994] else NULL, started = ...future.startTime, version = "1.8") [17:27:34.994] }, condition = base::local({ [17:27:34.994] c <- base::c [17:27:34.994] inherits <- base::inherits [17:27:34.994] invokeRestart <- base::invokeRestart [17:27:34.994] length <- base::length [17:27:34.994] list <- base::list [17:27:34.994] seq.int <- base::seq.int [17:27:34.994] signalCondition <- base::signalCondition [17:27:34.994] sys.calls <- base::sys.calls [17:27:34.994] `[[` <- base::`[[` [17:27:34.994] `+` <- base::`+` [17:27:34.994] `<<-` <- base::`<<-` [17:27:34.994] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:34.994] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:34.994] 3L)] [17:27:34.994] } [17:27:34.994] function(cond) { [17:27:34.994] is_error <- inherits(cond, "error") [17:27:34.994] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:34.994] NULL) [17:27:34.994] if (is_error) { [17:27:34.994] sessionInformation <- function() { [17:27:34.994] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:34.994] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:34.994] search = base::search(), system = base::Sys.info()) [17:27:34.994] } [17:27:34.994] ...future.conditions[[length(...future.conditions) + [17:27:34.994] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:34.994] cond$call), session = sessionInformation(), [17:27:34.994] timestamp = base::Sys.time(), signaled = 0L) [17:27:34.994] signalCondition(cond) [17:27:34.994] } [17:27:34.994] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:34.994] "immediateCondition"))) { [17:27:34.994] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:34.994] ...future.conditions[[length(...future.conditions) + [17:27:34.994] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:34.994] if (TRUE && !signal) { [17:27:34.994] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.994] { [17:27:34.994] inherits <- base::inherits [17:27:34.994] invokeRestart <- base::invokeRestart [17:27:34.994] is.null <- base::is.null [17:27:34.994] muffled <- FALSE [17:27:34.994] if (inherits(cond, "message")) { [17:27:34.994] muffled <- grepl(pattern, "muffleMessage") [17:27:34.994] if (muffled) [17:27:34.994] invokeRestart("muffleMessage") [17:27:34.994] } [17:27:34.994] else if (inherits(cond, "warning")) { [17:27:34.994] muffled <- grepl(pattern, "muffleWarning") [17:27:34.994] if (muffled) [17:27:34.994] invokeRestart("muffleWarning") [17:27:34.994] } [17:27:34.994] else if (inherits(cond, "condition")) { [17:27:34.994] if (!is.null(pattern)) { [17:27:34.994] computeRestarts <- base::computeRestarts [17:27:34.994] grepl <- base::grepl [17:27:34.994] restarts <- computeRestarts(cond) [17:27:34.994] for (restart in restarts) { [17:27:34.994] name <- restart$name [17:27:34.994] if (is.null(name)) [17:27:34.994] next [17:27:34.994] if (!grepl(pattern, name)) [17:27:34.994] next [17:27:34.994] invokeRestart(restart) [17:27:34.994] muffled <- TRUE [17:27:34.994] break [17:27:34.994] } [17:27:34.994] } [17:27:34.994] } [17:27:34.994] invisible(muffled) [17:27:34.994] } [17:27:34.994] muffleCondition(cond, pattern = "^muffle") [17:27:34.994] } [17:27:34.994] } [17:27:34.994] else { [17:27:34.994] if (TRUE) { [17:27:34.994] muffleCondition <- function (cond, pattern = "^muffle") [17:27:34.994] { [17:27:34.994] inherits <- base::inherits [17:27:34.994] invokeRestart <- base::invokeRestart [17:27:34.994] is.null <- base::is.null [17:27:34.994] muffled <- FALSE [17:27:34.994] if (inherits(cond, "message")) { [17:27:34.994] muffled <- grepl(pattern, "muffleMessage") [17:27:34.994] if (muffled) [17:27:34.994] invokeRestart("muffleMessage") [17:27:34.994] } [17:27:34.994] else if (inherits(cond, "warning")) { [17:27:34.994] muffled <- grepl(pattern, "muffleWarning") [17:27:34.994] if (muffled) [17:27:34.994] invokeRestart("muffleWarning") [17:27:34.994] } [17:27:34.994] else if (inherits(cond, "condition")) { [17:27:34.994] if (!is.null(pattern)) { [17:27:34.994] computeRestarts <- base::computeRestarts [17:27:34.994] grepl <- base::grepl [17:27:34.994] restarts <- computeRestarts(cond) [17:27:34.994] for (restart in restarts) { [17:27:34.994] name <- restart$name [17:27:34.994] if (is.null(name)) [17:27:34.994] next [17:27:34.994] if (!grepl(pattern, name)) [17:27:34.994] next [17:27:34.994] invokeRestart(restart) [17:27:34.994] muffled <- TRUE [17:27:34.994] break [17:27:34.994] } [17:27:34.994] } [17:27:34.994] } [17:27:34.994] invisible(muffled) [17:27:34.994] } [17:27:34.994] muffleCondition(cond, pattern = "^muffle") [17:27:34.994] } [17:27:34.994] } [17:27:34.994] } [17:27:34.994] })) [17:27:34.994] }, error = function(ex) { [17:27:34.994] base::structure(base::list(value = NULL, visible = NULL, [17:27:34.994] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:34.994] ...future.rng), started = ...future.startTime, [17:27:34.994] finished = Sys.time(), session_uuid = NA_character_, [17:27:34.994] version = "1.8"), class = "FutureResult") [17:27:34.994] }, finally = { [17:27:34.994] if (!identical(...future.workdir, getwd())) [17:27:34.994] setwd(...future.workdir) [17:27:34.994] { [17:27:34.994] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:34.994] ...future.oldOptions$nwarnings <- NULL [17:27:34.994] } [17:27:34.994] base::options(...future.oldOptions) [17:27:34.994] if (.Platform$OS.type == "windows") { [17:27:34.994] old_names <- names(...future.oldEnvVars) [17:27:34.994] envs <- base::Sys.getenv() [17:27:34.994] names <- names(envs) [17:27:34.994] common <- intersect(names, old_names) [17:27:34.994] added <- setdiff(names, old_names) [17:27:34.994] removed <- setdiff(old_names, names) [17:27:34.994] changed <- common[...future.oldEnvVars[common] != [17:27:34.994] envs[common]] [17:27:34.994] NAMES <- toupper(changed) [17:27:34.994] args <- list() [17:27:34.994] for (kk in seq_along(NAMES)) { [17:27:34.994] name <- changed[[kk]] [17:27:34.994] NAME <- NAMES[[kk]] [17:27:34.994] if (name != NAME && is.element(NAME, old_names)) [17:27:34.994] next [17:27:34.994] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.994] } [17:27:34.994] NAMES <- toupper(added) [17:27:34.994] for (kk in seq_along(NAMES)) { [17:27:34.994] name <- added[[kk]] [17:27:34.994] NAME <- NAMES[[kk]] [17:27:34.994] if (name != NAME && is.element(NAME, old_names)) [17:27:34.994] next [17:27:34.994] args[[name]] <- "" [17:27:34.994] } [17:27:34.994] NAMES <- toupper(removed) [17:27:34.994] for (kk in seq_along(NAMES)) { [17:27:34.994] name <- removed[[kk]] [17:27:34.994] NAME <- NAMES[[kk]] [17:27:34.994] if (name != NAME && is.element(NAME, old_names)) [17:27:34.994] next [17:27:34.994] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:34.994] } [17:27:34.994] if (length(args) > 0) [17:27:34.994] base::do.call(base::Sys.setenv, args = args) [17:27:34.994] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:34.994] } [17:27:34.994] else { [17:27:34.994] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:34.994] } [17:27:34.994] { [17:27:34.994] if (base::length(...future.futureOptionsAdded) > [17:27:34.994] 0L) { [17:27:34.994] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:34.994] base::names(opts) <- ...future.futureOptionsAdded [17:27:34.994] base::options(opts) [17:27:34.994] } [17:27:34.994] { [17:27:34.994] { [17:27:34.994] NULL [17:27:34.994] RNGkind("Mersenne-Twister") [17:27:34.994] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:34.994] inherits = FALSE) [17:27:34.994] } [17:27:34.994] options(future.plan = NULL) [17:27:34.994] if (is.na(NA_character_)) [17:27:34.994] Sys.unsetenv("R_FUTURE_PLAN") [17:27:34.994] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:34.994] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:34.994] .init = FALSE) [17:27:34.994] } [17:27:34.994] } [17:27:34.994] } [17:27:34.994] }) [17:27:34.994] if (TRUE) { [17:27:34.994] base::sink(type = "output", split = FALSE) [17:27:34.994] if (TRUE) { [17:27:34.994] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:34.994] } [17:27:34.994] else { [17:27:34.994] ...future.result["stdout"] <- base::list(NULL) [17:27:34.994] } [17:27:34.994] base::close(...future.stdout) [17:27:34.994] ...future.stdout <- NULL [17:27:34.994] } [17:27:34.994] ...future.result$conditions <- ...future.conditions [17:27:34.994] ...future.result$finished <- base::Sys.time() [17:27:34.994] ...future.result [17:27:34.994] } [17:27:35.001] plan(): Setting new future strategy stack: [17:27:35.002] List of future strategies: [17:27:35.002] 1. sequential: [17:27:35.002] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.002] - tweaked: FALSE [17:27:35.002] - call: NULL [17:27:35.003] plan(): nbrOfWorkers() = 1 [17:27:35.005] plan(): Setting new future strategy stack: [17:27:35.005] List of future strategies: [17:27:35.005] 1. sequential: [17:27:35.005] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.005] - tweaked: FALSE [17:27:35.005] - call: plan(strategy) [17:27:35.006] plan(): nbrOfWorkers() = 1 [17:27:35.007] SequentialFuture started (and completed) [17:27:35.007] - Launch lazy future ... done [17:27:35.007] run() for 'SequentialFuture' ... done [17:27:35.014] resolved() for 'SequentialFuture' ... [17:27:35.014] - state: 'finished' [17:27:35.014] - run: TRUE [17:27:35.015] - result: 'FutureResult' [17:27:35.015] resolved() for 'SequentialFuture' ... done [17:27:35.016] resolved() for 'SequentialFuture' ... [17:27:35.016] - state: 'finished' [17:27:35.016] - run: TRUE [17:27:35.016] - result: 'FutureResult' [17:27:35.017] resolved() for 'SequentialFuture' ... done [17:27:35.017] resolved() for 'SequentialFuture' ... [17:27:35.017] - state: 'finished' [17:27:35.018] - run: TRUE [17:27:35.018] - result: 'FutureResult' [17:27:35.018] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:35.021] resolve() on environment ... [17:27:35.021] recursive: 0 [17:27:35.022] elements: [4] 'a', 'b', 'c', 'd' [17:27:35.023] signalConditionsASAP(numeric, pos=1) ... [17:27:35.023] - nx: 4 [17:27:35.023] - relay: TRUE [17:27:35.024] - stdout: TRUE [17:27:35.024] - signal: TRUE [17:27:35.024] - resignal: FALSE [17:27:35.024] - force: TRUE [17:27:35.025] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.025] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.025] - until=2 [17:27:35.026] - relaying element #2 [17:27:35.026] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.026] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.026] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.027] length: 3 (resolved future 1) [17:27:35.027] resolved() for 'SequentialFuture' ... [17:27:35.027] - state: 'finished' [17:27:35.027] - run: TRUE [17:27:35.028] - result: 'FutureResult' [17:27:35.028] resolved() for 'SequentialFuture' ... done [17:27:35.028] Future #2 [17:27:35.029] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.029] - nx: 4 [17:27:35.029] - relay: TRUE [17:27:35.030] - stdout: TRUE [17:27:35.030] - signal: TRUE [17:27:35.030] - resignal: FALSE [17:27:35.031] - force: TRUE [17:27:35.031] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.031] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.031] - until=2 [17:27:35.032] - relaying element #2 [17:27:35.032] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.033] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.033] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.033] length: 2 (resolved future 2) [17:27:35.033] resolved() for 'SequentialFuture' ... [17:27:35.034] - state: 'finished' [17:27:35.034] - run: TRUE [17:27:35.035] - result: 'FutureResult' [17:27:35.035] resolved() for 'SequentialFuture' ... done [17:27:35.035] Future #3 [17:27:35.036] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.036] - nx: 4 [17:27:35.036] - relay: TRUE [17:27:35.036] - stdout: TRUE [17:27:35.037] - signal: TRUE [17:27:35.037] - resignal: FALSE [17:27:35.037] - force: TRUE [17:27:35.038] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.038] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.038] - until=3 [17:27:35.039] - relaying element #3 [17:27:35.039] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.039] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.040] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.040] length: 1 (resolved future 3) [17:27:35.040] resolved() for 'SequentialFuture' ... [17:27:35.041] - state: 'finished' [17:27:35.041] - run: TRUE [17:27:35.041] - result: 'FutureResult' [17:27:35.042] resolved() for 'SequentialFuture' ... done [17:27:35.042] Future #4 [17:27:35.042] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.043] - nx: 4 [17:27:35.043] - relay: TRUE [17:27:35.043] - stdout: TRUE [17:27:35.044] - signal: TRUE [17:27:35.044] - resignal: FALSE [17:27:35.044] - force: TRUE [17:27:35.044] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.045] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.045] - until=4 [17:27:35.045] - relaying element #4 [17:27:35.046] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.046] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.046] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.047] length: 0 (resolved future 4) [17:27:35.047] Relaying remaining futures [17:27:35.047] signalConditionsASAP(NULL, pos=0) ... [17:27:35.048] - nx: 4 [17:27:35.048] - relay: TRUE [17:27:35.048] - stdout: TRUE [17:27:35.049] - signal: TRUE [17:27:35.049] - resignal: FALSE [17:27:35.049] - force: TRUE [17:27:35.049] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.050] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:35.050] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.050] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.051] signalConditionsASAP(NULL, pos=0) ... done [17:27:35.051] resolve() on environment ... DONE Dimensions: c(2, 3) [17:27:35.052] getGlobalsAndPackages() ... [17:27:35.052] Searching for globals... [17:27:35.053] [17:27:35.054] Searching for globals ... DONE [17:27:35.054] - globals: [0] [17:27:35.054] getGlobalsAndPackages() ... DONE [17:27:35.055] run() for 'Future' ... [17:27:35.055] - state: 'created' [17:27:35.055] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.056] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.056] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.056] - Field: 'label' [17:27:35.056] - Field: 'local' [17:27:35.057] - Field: 'owner' [17:27:35.057] - Field: 'envir' [17:27:35.057] - Field: 'packages' [17:27:35.057] - Field: 'gc' [17:27:35.057] - Field: 'conditions' [17:27:35.057] - Field: 'expr' [17:27:35.058] - Field: 'uuid' [17:27:35.058] - Field: 'seed' [17:27:35.058] - Field: 'version' [17:27:35.058] - Field: 'result' [17:27:35.058] - Field: 'asynchronous' [17:27:35.058] - Field: 'calls' [17:27:35.059] - Field: 'globals' [17:27:35.059] - Field: 'stdout' [17:27:35.059] - Field: 'earlySignal' [17:27:35.059] - Field: 'lazy' [17:27:35.062] - Field: 'state' [17:27:35.063] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.063] - Launch lazy future ... [17:27:35.063] Packages needed by the future expression (n = 0): [17:27:35.064] Packages needed by future strategies (n = 0): [17:27:35.065] { [17:27:35.065] { [17:27:35.065] { [17:27:35.065] ...future.startTime <- base::Sys.time() [17:27:35.065] { [17:27:35.065] { [17:27:35.065] { [17:27:35.065] base::local({ [17:27:35.065] has_future <- base::requireNamespace("future", [17:27:35.065] quietly = TRUE) [17:27:35.065] if (has_future) { [17:27:35.065] ns <- base::getNamespace("future") [17:27:35.065] version <- ns[[".package"]][["version"]] [17:27:35.065] if (is.null(version)) [17:27:35.065] version <- utils::packageVersion("future") [17:27:35.065] } [17:27:35.065] else { [17:27:35.065] version <- NULL [17:27:35.065] } [17:27:35.065] if (!has_future || version < "1.8.0") { [17:27:35.065] info <- base::c(r_version = base::gsub("R version ", [17:27:35.065] "", base::R.version$version.string), [17:27:35.065] platform = base::sprintf("%s (%s-bit)", [17:27:35.065] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.065] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.065] "release", "version")], collapse = " "), [17:27:35.065] hostname = base::Sys.info()[["nodename"]]) [17:27:35.065] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.065] info) [17:27:35.065] info <- base::paste(info, collapse = "; ") [17:27:35.065] if (!has_future) { [17:27:35.065] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.065] info) [17:27:35.065] } [17:27:35.065] else { [17:27:35.065] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.065] info, version) [17:27:35.065] } [17:27:35.065] base::stop(msg) [17:27:35.065] } [17:27:35.065] }) [17:27:35.065] } [17:27:35.065] ...future.strategy.old <- future::plan("list") [17:27:35.065] options(future.plan = NULL) [17:27:35.065] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.065] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.065] } [17:27:35.065] ...future.workdir <- getwd() [17:27:35.065] } [17:27:35.065] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.065] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.065] } [17:27:35.065] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.065] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.065] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.065] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.065] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.065] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.065] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.065] base::names(...future.oldOptions)) [17:27:35.065] } [17:27:35.065] if (FALSE) { [17:27:35.065] } [17:27:35.065] else { [17:27:35.065] if (TRUE) { [17:27:35.065] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.065] open = "w") [17:27:35.065] } [17:27:35.065] else { [17:27:35.065] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.065] windows = "NUL", "/dev/null"), open = "w") [17:27:35.065] } [17:27:35.065] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.065] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.065] base::sink(type = "output", split = FALSE) [17:27:35.065] base::close(...future.stdout) [17:27:35.065] }, add = TRUE) [17:27:35.065] } [17:27:35.065] ...future.frame <- base::sys.nframe() [17:27:35.065] ...future.conditions <- base::list() [17:27:35.065] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.065] if (FALSE) { [17:27:35.065] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.065] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.065] } [17:27:35.065] ...future.result <- base::tryCatch({ [17:27:35.065] base::withCallingHandlers({ [17:27:35.065] ...future.value <- base::withVisible(base::local(2)) [17:27:35.065] future::FutureResult(value = ...future.value$value, [17:27:35.065] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.065] ...future.rng), globalenv = if (FALSE) [17:27:35.065] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.065] ...future.globalenv.names)) [17:27:35.065] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.065] }, condition = base::local({ [17:27:35.065] c <- base::c [17:27:35.065] inherits <- base::inherits [17:27:35.065] invokeRestart <- base::invokeRestart [17:27:35.065] length <- base::length [17:27:35.065] list <- base::list [17:27:35.065] seq.int <- base::seq.int [17:27:35.065] signalCondition <- base::signalCondition [17:27:35.065] sys.calls <- base::sys.calls [17:27:35.065] `[[` <- base::`[[` [17:27:35.065] `+` <- base::`+` [17:27:35.065] `<<-` <- base::`<<-` [17:27:35.065] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.065] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.065] 3L)] [17:27:35.065] } [17:27:35.065] function(cond) { [17:27:35.065] is_error <- inherits(cond, "error") [17:27:35.065] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.065] NULL) [17:27:35.065] if (is_error) { [17:27:35.065] sessionInformation <- function() { [17:27:35.065] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.065] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.065] search = base::search(), system = base::Sys.info()) [17:27:35.065] } [17:27:35.065] ...future.conditions[[length(...future.conditions) + [17:27:35.065] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.065] cond$call), session = sessionInformation(), [17:27:35.065] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.065] signalCondition(cond) [17:27:35.065] } [17:27:35.065] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.065] "immediateCondition"))) { [17:27:35.065] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.065] ...future.conditions[[length(...future.conditions) + [17:27:35.065] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.065] if (TRUE && !signal) { [17:27:35.065] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.065] { [17:27:35.065] inherits <- base::inherits [17:27:35.065] invokeRestart <- base::invokeRestart [17:27:35.065] is.null <- base::is.null [17:27:35.065] muffled <- FALSE [17:27:35.065] if (inherits(cond, "message")) { [17:27:35.065] muffled <- grepl(pattern, "muffleMessage") [17:27:35.065] if (muffled) [17:27:35.065] invokeRestart("muffleMessage") [17:27:35.065] } [17:27:35.065] else if (inherits(cond, "warning")) { [17:27:35.065] muffled <- grepl(pattern, "muffleWarning") [17:27:35.065] if (muffled) [17:27:35.065] invokeRestart("muffleWarning") [17:27:35.065] } [17:27:35.065] else if (inherits(cond, "condition")) { [17:27:35.065] if (!is.null(pattern)) { [17:27:35.065] computeRestarts <- base::computeRestarts [17:27:35.065] grepl <- base::grepl [17:27:35.065] restarts <- computeRestarts(cond) [17:27:35.065] for (restart in restarts) { [17:27:35.065] name <- restart$name [17:27:35.065] if (is.null(name)) [17:27:35.065] next [17:27:35.065] if (!grepl(pattern, name)) [17:27:35.065] next [17:27:35.065] invokeRestart(restart) [17:27:35.065] muffled <- TRUE [17:27:35.065] break [17:27:35.065] } [17:27:35.065] } [17:27:35.065] } [17:27:35.065] invisible(muffled) [17:27:35.065] } [17:27:35.065] muffleCondition(cond, pattern = "^muffle") [17:27:35.065] } [17:27:35.065] } [17:27:35.065] else { [17:27:35.065] if (TRUE) { [17:27:35.065] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.065] { [17:27:35.065] inherits <- base::inherits [17:27:35.065] invokeRestart <- base::invokeRestart [17:27:35.065] is.null <- base::is.null [17:27:35.065] muffled <- FALSE [17:27:35.065] if (inherits(cond, "message")) { [17:27:35.065] muffled <- grepl(pattern, "muffleMessage") [17:27:35.065] if (muffled) [17:27:35.065] invokeRestart("muffleMessage") [17:27:35.065] } [17:27:35.065] else if (inherits(cond, "warning")) { [17:27:35.065] muffled <- grepl(pattern, "muffleWarning") [17:27:35.065] if (muffled) [17:27:35.065] invokeRestart("muffleWarning") [17:27:35.065] } [17:27:35.065] else if (inherits(cond, "condition")) { [17:27:35.065] if (!is.null(pattern)) { [17:27:35.065] computeRestarts <- base::computeRestarts [17:27:35.065] grepl <- base::grepl [17:27:35.065] restarts <- computeRestarts(cond) [17:27:35.065] for (restart in restarts) { [17:27:35.065] name <- restart$name [17:27:35.065] if (is.null(name)) [17:27:35.065] next [17:27:35.065] if (!grepl(pattern, name)) [17:27:35.065] next [17:27:35.065] invokeRestart(restart) [17:27:35.065] muffled <- TRUE [17:27:35.065] break [17:27:35.065] } [17:27:35.065] } [17:27:35.065] } [17:27:35.065] invisible(muffled) [17:27:35.065] } [17:27:35.065] muffleCondition(cond, pattern = "^muffle") [17:27:35.065] } [17:27:35.065] } [17:27:35.065] } [17:27:35.065] })) [17:27:35.065] }, error = function(ex) { [17:27:35.065] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.065] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.065] ...future.rng), started = ...future.startTime, [17:27:35.065] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.065] version = "1.8"), class = "FutureResult") [17:27:35.065] }, finally = { [17:27:35.065] if (!identical(...future.workdir, getwd())) [17:27:35.065] setwd(...future.workdir) [17:27:35.065] { [17:27:35.065] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.065] ...future.oldOptions$nwarnings <- NULL [17:27:35.065] } [17:27:35.065] base::options(...future.oldOptions) [17:27:35.065] if (.Platform$OS.type == "windows") { [17:27:35.065] old_names <- names(...future.oldEnvVars) [17:27:35.065] envs <- base::Sys.getenv() [17:27:35.065] names <- names(envs) [17:27:35.065] common <- intersect(names, old_names) [17:27:35.065] added <- setdiff(names, old_names) [17:27:35.065] removed <- setdiff(old_names, names) [17:27:35.065] changed <- common[...future.oldEnvVars[common] != [17:27:35.065] envs[common]] [17:27:35.065] NAMES <- toupper(changed) [17:27:35.065] args <- list() [17:27:35.065] for (kk in seq_along(NAMES)) { [17:27:35.065] name <- changed[[kk]] [17:27:35.065] NAME <- NAMES[[kk]] [17:27:35.065] if (name != NAME && is.element(NAME, old_names)) [17:27:35.065] next [17:27:35.065] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.065] } [17:27:35.065] NAMES <- toupper(added) [17:27:35.065] for (kk in seq_along(NAMES)) { [17:27:35.065] name <- added[[kk]] [17:27:35.065] NAME <- NAMES[[kk]] [17:27:35.065] if (name != NAME && is.element(NAME, old_names)) [17:27:35.065] next [17:27:35.065] args[[name]] <- "" [17:27:35.065] } [17:27:35.065] NAMES <- toupper(removed) [17:27:35.065] for (kk in seq_along(NAMES)) { [17:27:35.065] name <- removed[[kk]] [17:27:35.065] NAME <- NAMES[[kk]] [17:27:35.065] if (name != NAME && is.element(NAME, old_names)) [17:27:35.065] next [17:27:35.065] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.065] } [17:27:35.065] if (length(args) > 0) [17:27:35.065] base::do.call(base::Sys.setenv, args = args) [17:27:35.065] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.065] } [17:27:35.065] else { [17:27:35.065] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.065] } [17:27:35.065] { [17:27:35.065] if (base::length(...future.futureOptionsAdded) > [17:27:35.065] 0L) { [17:27:35.065] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.065] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.065] base::options(opts) [17:27:35.065] } [17:27:35.065] { [17:27:35.065] { [17:27:35.065] NULL [17:27:35.065] RNGkind("Mersenne-Twister") [17:27:35.065] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.065] inherits = FALSE) [17:27:35.065] } [17:27:35.065] options(future.plan = NULL) [17:27:35.065] if (is.na(NA_character_)) [17:27:35.065] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.065] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.065] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.065] .init = FALSE) [17:27:35.065] } [17:27:35.065] } [17:27:35.065] } [17:27:35.065] }) [17:27:35.065] if (TRUE) { [17:27:35.065] base::sink(type = "output", split = FALSE) [17:27:35.065] if (TRUE) { [17:27:35.065] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.065] } [17:27:35.065] else { [17:27:35.065] ...future.result["stdout"] <- base::list(NULL) [17:27:35.065] } [17:27:35.065] base::close(...future.stdout) [17:27:35.065] ...future.stdout <- NULL [17:27:35.065] } [17:27:35.065] ...future.result$conditions <- ...future.conditions [17:27:35.065] ...future.result$finished <- base::Sys.time() [17:27:35.065] ...future.result [17:27:35.065] } [17:27:35.072] plan(): Setting new future strategy stack: [17:27:35.072] List of future strategies: [17:27:35.072] 1. sequential: [17:27:35.072] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.072] - tweaked: FALSE [17:27:35.072] - call: NULL [17:27:35.073] plan(): nbrOfWorkers() = 1 [17:27:35.075] plan(): Setting new future strategy stack: [17:27:35.076] List of future strategies: [17:27:35.076] 1. sequential: [17:27:35.076] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.076] - tweaked: FALSE [17:27:35.076] - call: plan(strategy) [17:27:35.077] plan(): nbrOfWorkers() = 1 [17:27:35.077] SequentialFuture started (and completed) [17:27:35.078] - Launch lazy future ... done [17:27:35.078] run() for 'SequentialFuture' ... done [17:27:35.078] getGlobalsAndPackages() ... [17:27:35.079] Searching for globals... [17:27:35.079] [17:27:35.080] Searching for globals ... DONE [17:27:35.080] - globals: [0] [17:27:35.080] getGlobalsAndPackages() ... DONE [17:27:35.081] run() for 'Future' ... [17:27:35.081] - state: 'created' [17:27:35.082] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.082] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.083] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.083] - Field: 'label' [17:27:35.083] - Field: 'local' [17:27:35.084] - Field: 'owner' [17:27:35.084] - Field: 'envir' [17:27:35.084] - Field: 'packages' [17:27:35.085] - Field: 'gc' [17:27:35.085] - Field: 'conditions' [17:27:35.085] - Field: 'expr' [17:27:35.086] - Field: 'uuid' [17:27:35.086] - Field: 'seed' [17:27:35.086] - Field: 'version' [17:27:35.087] - Field: 'result' [17:27:35.087] - Field: 'asynchronous' [17:27:35.087] - Field: 'calls' [17:27:35.088] - Field: 'globals' [17:27:35.088] - Field: 'stdout' [17:27:35.088] - Field: 'earlySignal' [17:27:35.089] - Field: 'lazy' [17:27:35.089] - Field: 'state' [17:27:35.089] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.090] - Launch lazy future ... [17:27:35.090] Packages needed by the future expression (n = 0): [17:27:35.090] Packages needed by future strategies (n = 0): [17:27:35.091] { [17:27:35.091] { [17:27:35.091] { [17:27:35.091] ...future.startTime <- base::Sys.time() [17:27:35.091] { [17:27:35.091] { [17:27:35.091] { [17:27:35.091] base::local({ [17:27:35.091] has_future <- base::requireNamespace("future", [17:27:35.091] quietly = TRUE) [17:27:35.091] if (has_future) { [17:27:35.091] ns <- base::getNamespace("future") [17:27:35.091] version <- ns[[".package"]][["version"]] [17:27:35.091] if (is.null(version)) [17:27:35.091] version <- utils::packageVersion("future") [17:27:35.091] } [17:27:35.091] else { [17:27:35.091] version <- NULL [17:27:35.091] } [17:27:35.091] if (!has_future || version < "1.8.0") { [17:27:35.091] info <- base::c(r_version = base::gsub("R version ", [17:27:35.091] "", base::R.version$version.string), [17:27:35.091] platform = base::sprintf("%s (%s-bit)", [17:27:35.091] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.091] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.091] "release", "version")], collapse = " "), [17:27:35.091] hostname = base::Sys.info()[["nodename"]]) [17:27:35.091] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.091] info) [17:27:35.091] info <- base::paste(info, collapse = "; ") [17:27:35.091] if (!has_future) { [17:27:35.091] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.091] info) [17:27:35.091] } [17:27:35.091] else { [17:27:35.091] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.091] info, version) [17:27:35.091] } [17:27:35.091] base::stop(msg) [17:27:35.091] } [17:27:35.091] }) [17:27:35.091] } [17:27:35.091] ...future.strategy.old <- future::plan("list") [17:27:35.091] options(future.plan = NULL) [17:27:35.091] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.091] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.091] } [17:27:35.091] ...future.workdir <- getwd() [17:27:35.091] } [17:27:35.091] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.091] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.091] } [17:27:35.091] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.091] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.091] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.091] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.091] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.091] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.091] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.091] base::names(...future.oldOptions)) [17:27:35.091] } [17:27:35.091] if (FALSE) { [17:27:35.091] } [17:27:35.091] else { [17:27:35.091] if (TRUE) { [17:27:35.091] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.091] open = "w") [17:27:35.091] } [17:27:35.091] else { [17:27:35.091] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.091] windows = "NUL", "/dev/null"), open = "w") [17:27:35.091] } [17:27:35.091] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.091] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.091] base::sink(type = "output", split = FALSE) [17:27:35.091] base::close(...future.stdout) [17:27:35.091] }, add = TRUE) [17:27:35.091] } [17:27:35.091] ...future.frame <- base::sys.nframe() [17:27:35.091] ...future.conditions <- base::list() [17:27:35.091] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.091] if (FALSE) { [17:27:35.091] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.091] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.091] } [17:27:35.091] ...future.result <- base::tryCatch({ [17:27:35.091] base::withCallingHandlers({ [17:27:35.091] ...future.value <- base::withVisible(base::local(NULL)) [17:27:35.091] future::FutureResult(value = ...future.value$value, [17:27:35.091] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.091] ...future.rng), globalenv = if (FALSE) [17:27:35.091] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.091] ...future.globalenv.names)) [17:27:35.091] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.091] }, condition = base::local({ [17:27:35.091] c <- base::c [17:27:35.091] inherits <- base::inherits [17:27:35.091] invokeRestart <- base::invokeRestart [17:27:35.091] length <- base::length [17:27:35.091] list <- base::list [17:27:35.091] seq.int <- base::seq.int [17:27:35.091] signalCondition <- base::signalCondition [17:27:35.091] sys.calls <- base::sys.calls [17:27:35.091] `[[` <- base::`[[` [17:27:35.091] `+` <- base::`+` [17:27:35.091] `<<-` <- base::`<<-` [17:27:35.091] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.091] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.091] 3L)] [17:27:35.091] } [17:27:35.091] function(cond) { [17:27:35.091] is_error <- inherits(cond, "error") [17:27:35.091] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.091] NULL) [17:27:35.091] if (is_error) { [17:27:35.091] sessionInformation <- function() { [17:27:35.091] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.091] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.091] search = base::search(), system = base::Sys.info()) [17:27:35.091] } [17:27:35.091] ...future.conditions[[length(...future.conditions) + [17:27:35.091] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.091] cond$call), session = sessionInformation(), [17:27:35.091] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.091] signalCondition(cond) [17:27:35.091] } [17:27:35.091] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.091] "immediateCondition"))) { [17:27:35.091] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.091] ...future.conditions[[length(...future.conditions) + [17:27:35.091] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.091] if (TRUE && !signal) { [17:27:35.091] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.091] { [17:27:35.091] inherits <- base::inherits [17:27:35.091] invokeRestart <- base::invokeRestart [17:27:35.091] is.null <- base::is.null [17:27:35.091] muffled <- FALSE [17:27:35.091] if (inherits(cond, "message")) { [17:27:35.091] muffled <- grepl(pattern, "muffleMessage") [17:27:35.091] if (muffled) [17:27:35.091] invokeRestart("muffleMessage") [17:27:35.091] } [17:27:35.091] else if (inherits(cond, "warning")) { [17:27:35.091] muffled <- grepl(pattern, "muffleWarning") [17:27:35.091] if (muffled) [17:27:35.091] invokeRestart("muffleWarning") [17:27:35.091] } [17:27:35.091] else if (inherits(cond, "condition")) { [17:27:35.091] if (!is.null(pattern)) { [17:27:35.091] computeRestarts <- base::computeRestarts [17:27:35.091] grepl <- base::grepl [17:27:35.091] restarts <- computeRestarts(cond) [17:27:35.091] for (restart in restarts) { [17:27:35.091] name <- restart$name [17:27:35.091] if (is.null(name)) [17:27:35.091] next [17:27:35.091] if (!grepl(pattern, name)) [17:27:35.091] next [17:27:35.091] invokeRestart(restart) [17:27:35.091] muffled <- TRUE [17:27:35.091] break [17:27:35.091] } [17:27:35.091] } [17:27:35.091] } [17:27:35.091] invisible(muffled) [17:27:35.091] } [17:27:35.091] muffleCondition(cond, pattern = "^muffle") [17:27:35.091] } [17:27:35.091] } [17:27:35.091] else { [17:27:35.091] if (TRUE) { [17:27:35.091] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.091] { [17:27:35.091] inherits <- base::inherits [17:27:35.091] invokeRestart <- base::invokeRestart [17:27:35.091] is.null <- base::is.null [17:27:35.091] muffled <- FALSE [17:27:35.091] if (inherits(cond, "message")) { [17:27:35.091] muffled <- grepl(pattern, "muffleMessage") [17:27:35.091] if (muffled) [17:27:35.091] invokeRestart("muffleMessage") [17:27:35.091] } [17:27:35.091] else if (inherits(cond, "warning")) { [17:27:35.091] muffled <- grepl(pattern, "muffleWarning") [17:27:35.091] if (muffled) [17:27:35.091] invokeRestart("muffleWarning") [17:27:35.091] } [17:27:35.091] else if (inherits(cond, "condition")) { [17:27:35.091] if (!is.null(pattern)) { [17:27:35.091] computeRestarts <- base::computeRestarts [17:27:35.091] grepl <- base::grepl [17:27:35.091] restarts <- computeRestarts(cond) [17:27:35.091] for (restart in restarts) { [17:27:35.091] name <- restart$name [17:27:35.091] if (is.null(name)) [17:27:35.091] next [17:27:35.091] if (!grepl(pattern, name)) [17:27:35.091] next [17:27:35.091] invokeRestart(restart) [17:27:35.091] muffled <- TRUE [17:27:35.091] break [17:27:35.091] } [17:27:35.091] } [17:27:35.091] } [17:27:35.091] invisible(muffled) [17:27:35.091] } [17:27:35.091] muffleCondition(cond, pattern = "^muffle") [17:27:35.091] } [17:27:35.091] } [17:27:35.091] } [17:27:35.091] })) [17:27:35.091] }, error = function(ex) { [17:27:35.091] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.091] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.091] ...future.rng), started = ...future.startTime, [17:27:35.091] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.091] version = "1.8"), class = "FutureResult") [17:27:35.091] }, finally = { [17:27:35.091] if (!identical(...future.workdir, getwd())) [17:27:35.091] setwd(...future.workdir) [17:27:35.091] { [17:27:35.091] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.091] ...future.oldOptions$nwarnings <- NULL [17:27:35.091] } [17:27:35.091] base::options(...future.oldOptions) [17:27:35.091] if (.Platform$OS.type == "windows") { [17:27:35.091] old_names <- names(...future.oldEnvVars) [17:27:35.091] envs <- base::Sys.getenv() [17:27:35.091] names <- names(envs) [17:27:35.091] common <- intersect(names, old_names) [17:27:35.091] added <- setdiff(names, old_names) [17:27:35.091] removed <- setdiff(old_names, names) [17:27:35.091] changed <- common[...future.oldEnvVars[common] != [17:27:35.091] envs[common]] [17:27:35.091] NAMES <- toupper(changed) [17:27:35.091] args <- list() [17:27:35.091] for (kk in seq_along(NAMES)) { [17:27:35.091] name <- changed[[kk]] [17:27:35.091] NAME <- NAMES[[kk]] [17:27:35.091] if (name != NAME && is.element(NAME, old_names)) [17:27:35.091] next [17:27:35.091] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.091] } [17:27:35.091] NAMES <- toupper(added) [17:27:35.091] for (kk in seq_along(NAMES)) { [17:27:35.091] name <- added[[kk]] [17:27:35.091] NAME <- NAMES[[kk]] [17:27:35.091] if (name != NAME && is.element(NAME, old_names)) [17:27:35.091] next [17:27:35.091] args[[name]] <- "" [17:27:35.091] } [17:27:35.091] NAMES <- toupper(removed) [17:27:35.091] for (kk in seq_along(NAMES)) { [17:27:35.091] name <- removed[[kk]] [17:27:35.091] NAME <- NAMES[[kk]] [17:27:35.091] if (name != NAME && is.element(NAME, old_names)) [17:27:35.091] next [17:27:35.091] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.091] } [17:27:35.091] if (length(args) > 0) [17:27:35.091] base::do.call(base::Sys.setenv, args = args) [17:27:35.091] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.091] } [17:27:35.091] else { [17:27:35.091] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.091] } [17:27:35.091] { [17:27:35.091] if (base::length(...future.futureOptionsAdded) > [17:27:35.091] 0L) { [17:27:35.091] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.091] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.091] base::options(opts) [17:27:35.091] } [17:27:35.091] { [17:27:35.091] { [17:27:35.091] NULL [17:27:35.091] RNGkind("Mersenne-Twister") [17:27:35.091] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.091] inherits = FALSE) [17:27:35.091] } [17:27:35.091] options(future.plan = NULL) [17:27:35.091] if (is.na(NA_character_)) [17:27:35.091] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.091] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.091] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.091] .init = FALSE) [17:27:35.091] } [17:27:35.091] } [17:27:35.091] } [17:27:35.091] }) [17:27:35.091] if (TRUE) { [17:27:35.091] base::sink(type = "output", split = FALSE) [17:27:35.091] if (TRUE) { [17:27:35.091] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.091] } [17:27:35.091] else { [17:27:35.091] ...future.result["stdout"] <- base::list(NULL) [17:27:35.091] } [17:27:35.091] base::close(...future.stdout) [17:27:35.091] ...future.stdout <- NULL [17:27:35.091] } [17:27:35.091] ...future.result$conditions <- ...future.conditions [17:27:35.091] ...future.result$finished <- base::Sys.time() [17:27:35.091] ...future.result [17:27:35.091] } [17:27:35.098] plan(): Setting new future strategy stack: [17:27:35.099] List of future strategies: [17:27:35.099] 1. sequential: [17:27:35.099] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.099] - tweaked: FALSE [17:27:35.099] - call: NULL [17:27:35.100] plan(): nbrOfWorkers() = 1 [17:27:35.102] plan(): Setting new future strategy stack: [17:27:35.102] List of future strategies: [17:27:35.102] 1. sequential: [17:27:35.102] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.102] - tweaked: FALSE [17:27:35.102] - call: plan(strategy) [17:27:35.103] plan(): nbrOfWorkers() = 1 [17:27:35.104] SequentialFuture started (and completed) [17:27:35.104] - Launch lazy future ... done [17:27:35.104] run() for 'SequentialFuture' ... done [17:27:35.105] getGlobalsAndPackages() ... [17:27:35.106] Searching for globals... [17:27:35.107] - globals found: [1] '{' [17:27:35.107] Searching for globals ... DONE [17:27:35.108] Resolving globals: FALSE [17:27:35.108] [17:27:35.108] [17:27:35.109] getGlobalsAndPackages() ... DONE [17:27:35.109] run() for 'Future' ... [17:27:35.110] - state: 'created' [17:27:35.110] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.111] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.111] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.111] - Field: 'label' [17:27:35.112] - Field: 'local' [17:27:35.112] - Field: 'owner' [17:27:35.112] - Field: 'envir' [17:27:35.113] - Field: 'packages' [17:27:35.113] - Field: 'gc' [17:27:35.113] - Field: 'conditions' [17:27:35.114] - Field: 'expr' [17:27:35.114] - Field: 'uuid' [17:27:35.114] - Field: 'seed' [17:27:35.115] - Field: 'version' [17:27:35.115] - Field: 'result' [17:27:35.115] - Field: 'asynchronous' [17:27:35.116] - Field: 'calls' [17:27:35.116] - Field: 'globals' [17:27:35.116] - Field: 'stdout' [17:27:35.117] - Field: 'earlySignal' [17:27:35.117] - Field: 'lazy' [17:27:35.117] - Field: 'state' [17:27:35.118] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.118] - Launch lazy future ... [17:27:35.118] Packages needed by the future expression (n = 0): [17:27:35.119] Packages needed by future strategies (n = 0): [17:27:35.120] { [17:27:35.120] { [17:27:35.120] { [17:27:35.120] ...future.startTime <- base::Sys.time() [17:27:35.120] { [17:27:35.120] { [17:27:35.120] { [17:27:35.120] base::local({ [17:27:35.120] has_future <- base::requireNamespace("future", [17:27:35.120] quietly = TRUE) [17:27:35.120] if (has_future) { [17:27:35.120] ns <- base::getNamespace("future") [17:27:35.120] version <- ns[[".package"]][["version"]] [17:27:35.120] if (is.null(version)) [17:27:35.120] version <- utils::packageVersion("future") [17:27:35.120] } [17:27:35.120] else { [17:27:35.120] version <- NULL [17:27:35.120] } [17:27:35.120] if (!has_future || version < "1.8.0") { [17:27:35.120] info <- base::c(r_version = base::gsub("R version ", [17:27:35.120] "", base::R.version$version.string), [17:27:35.120] platform = base::sprintf("%s (%s-bit)", [17:27:35.120] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.120] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.120] "release", "version")], collapse = " "), [17:27:35.120] hostname = base::Sys.info()[["nodename"]]) [17:27:35.120] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.120] info) [17:27:35.120] info <- base::paste(info, collapse = "; ") [17:27:35.120] if (!has_future) { [17:27:35.120] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.120] info) [17:27:35.120] } [17:27:35.120] else { [17:27:35.120] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.120] info, version) [17:27:35.120] } [17:27:35.120] base::stop(msg) [17:27:35.120] } [17:27:35.120] }) [17:27:35.120] } [17:27:35.120] ...future.strategy.old <- future::plan("list") [17:27:35.120] options(future.plan = NULL) [17:27:35.120] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.120] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.120] } [17:27:35.120] ...future.workdir <- getwd() [17:27:35.120] } [17:27:35.120] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.120] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.120] } [17:27:35.120] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.120] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.120] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.120] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.120] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.120] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.120] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.120] base::names(...future.oldOptions)) [17:27:35.120] } [17:27:35.120] if (FALSE) { [17:27:35.120] } [17:27:35.120] else { [17:27:35.120] if (TRUE) { [17:27:35.120] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.120] open = "w") [17:27:35.120] } [17:27:35.120] else { [17:27:35.120] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.120] windows = "NUL", "/dev/null"), open = "w") [17:27:35.120] } [17:27:35.120] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.120] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.120] base::sink(type = "output", split = FALSE) [17:27:35.120] base::close(...future.stdout) [17:27:35.120] }, add = TRUE) [17:27:35.120] } [17:27:35.120] ...future.frame <- base::sys.nframe() [17:27:35.120] ...future.conditions <- base::list() [17:27:35.120] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.120] if (FALSE) { [17:27:35.120] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.120] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.120] } [17:27:35.120] ...future.result <- base::tryCatch({ [17:27:35.120] base::withCallingHandlers({ [17:27:35.120] ...future.value <- base::withVisible(base::local({ [17:27:35.120] 4 [17:27:35.120] })) [17:27:35.120] future::FutureResult(value = ...future.value$value, [17:27:35.120] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.120] ...future.rng), globalenv = if (FALSE) [17:27:35.120] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.120] ...future.globalenv.names)) [17:27:35.120] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.120] }, condition = base::local({ [17:27:35.120] c <- base::c [17:27:35.120] inherits <- base::inherits [17:27:35.120] invokeRestart <- base::invokeRestart [17:27:35.120] length <- base::length [17:27:35.120] list <- base::list [17:27:35.120] seq.int <- base::seq.int [17:27:35.120] signalCondition <- base::signalCondition [17:27:35.120] sys.calls <- base::sys.calls [17:27:35.120] `[[` <- base::`[[` [17:27:35.120] `+` <- base::`+` [17:27:35.120] `<<-` <- base::`<<-` [17:27:35.120] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.120] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.120] 3L)] [17:27:35.120] } [17:27:35.120] function(cond) { [17:27:35.120] is_error <- inherits(cond, "error") [17:27:35.120] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.120] NULL) [17:27:35.120] if (is_error) { [17:27:35.120] sessionInformation <- function() { [17:27:35.120] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.120] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.120] search = base::search(), system = base::Sys.info()) [17:27:35.120] } [17:27:35.120] ...future.conditions[[length(...future.conditions) + [17:27:35.120] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.120] cond$call), session = sessionInformation(), [17:27:35.120] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.120] signalCondition(cond) [17:27:35.120] } [17:27:35.120] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.120] "immediateCondition"))) { [17:27:35.120] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.120] ...future.conditions[[length(...future.conditions) + [17:27:35.120] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.120] if (TRUE && !signal) { [17:27:35.120] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.120] { [17:27:35.120] inherits <- base::inherits [17:27:35.120] invokeRestart <- base::invokeRestart [17:27:35.120] is.null <- base::is.null [17:27:35.120] muffled <- FALSE [17:27:35.120] if (inherits(cond, "message")) { [17:27:35.120] muffled <- grepl(pattern, "muffleMessage") [17:27:35.120] if (muffled) [17:27:35.120] invokeRestart("muffleMessage") [17:27:35.120] } [17:27:35.120] else if (inherits(cond, "warning")) { [17:27:35.120] muffled <- grepl(pattern, "muffleWarning") [17:27:35.120] if (muffled) [17:27:35.120] invokeRestart("muffleWarning") [17:27:35.120] } [17:27:35.120] else if (inherits(cond, "condition")) { [17:27:35.120] if (!is.null(pattern)) { [17:27:35.120] computeRestarts <- base::computeRestarts [17:27:35.120] grepl <- base::grepl [17:27:35.120] restarts <- computeRestarts(cond) [17:27:35.120] for (restart in restarts) { [17:27:35.120] name <- restart$name [17:27:35.120] if (is.null(name)) [17:27:35.120] next [17:27:35.120] if (!grepl(pattern, name)) [17:27:35.120] next [17:27:35.120] invokeRestart(restart) [17:27:35.120] muffled <- TRUE [17:27:35.120] break [17:27:35.120] } [17:27:35.120] } [17:27:35.120] } [17:27:35.120] invisible(muffled) [17:27:35.120] } [17:27:35.120] muffleCondition(cond, pattern = "^muffle") [17:27:35.120] } [17:27:35.120] } [17:27:35.120] else { [17:27:35.120] if (TRUE) { [17:27:35.120] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.120] { [17:27:35.120] inherits <- base::inherits [17:27:35.120] invokeRestart <- base::invokeRestart [17:27:35.120] is.null <- base::is.null [17:27:35.120] muffled <- FALSE [17:27:35.120] if (inherits(cond, "message")) { [17:27:35.120] muffled <- grepl(pattern, "muffleMessage") [17:27:35.120] if (muffled) [17:27:35.120] invokeRestart("muffleMessage") [17:27:35.120] } [17:27:35.120] else if (inherits(cond, "warning")) { [17:27:35.120] muffled <- grepl(pattern, "muffleWarning") [17:27:35.120] if (muffled) [17:27:35.120] invokeRestart("muffleWarning") [17:27:35.120] } [17:27:35.120] else if (inherits(cond, "condition")) { [17:27:35.120] if (!is.null(pattern)) { [17:27:35.120] computeRestarts <- base::computeRestarts [17:27:35.120] grepl <- base::grepl [17:27:35.120] restarts <- computeRestarts(cond) [17:27:35.120] for (restart in restarts) { [17:27:35.120] name <- restart$name [17:27:35.120] if (is.null(name)) [17:27:35.120] next [17:27:35.120] if (!grepl(pattern, name)) [17:27:35.120] next [17:27:35.120] invokeRestart(restart) [17:27:35.120] muffled <- TRUE [17:27:35.120] break [17:27:35.120] } [17:27:35.120] } [17:27:35.120] } [17:27:35.120] invisible(muffled) [17:27:35.120] } [17:27:35.120] muffleCondition(cond, pattern = "^muffle") [17:27:35.120] } [17:27:35.120] } [17:27:35.120] } [17:27:35.120] })) [17:27:35.120] }, error = function(ex) { [17:27:35.120] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.120] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.120] ...future.rng), started = ...future.startTime, [17:27:35.120] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.120] version = "1.8"), class = "FutureResult") [17:27:35.120] }, finally = { [17:27:35.120] if (!identical(...future.workdir, getwd())) [17:27:35.120] setwd(...future.workdir) [17:27:35.120] { [17:27:35.120] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.120] ...future.oldOptions$nwarnings <- NULL [17:27:35.120] } [17:27:35.120] base::options(...future.oldOptions) [17:27:35.120] if (.Platform$OS.type == "windows") { [17:27:35.120] old_names <- names(...future.oldEnvVars) [17:27:35.120] envs <- base::Sys.getenv() [17:27:35.120] names <- names(envs) [17:27:35.120] common <- intersect(names, old_names) [17:27:35.120] added <- setdiff(names, old_names) [17:27:35.120] removed <- setdiff(old_names, names) [17:27:35.120] changed <- common[...future.oldEnvVars[common] != [17:27:35.120] envs[common]] [17:27:35.120] NAMES <- toupper(changed) [17:27:35.120] args <- list() [17:27:35.120] for (kk in seq_along(NAMES)) { [17:27:35.120] name <- changed[[kk]] [17:27:35.120] NAME <- NAMES[[kk]] [17:27:35.120] if (name != NAME && is.element(NAME, old_names)) [17:27:35.120] next [17:27:35.120] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.120] } [17:27:35.120] NAMES <- toupper(added) [17:27:35.120] for (kk in seq_along(NAMES)) { [17:27:35.120] name <- added[[kk]] [17:27:35.120] NAME <- NAMES[[kk]] [17:27:35.120] if (name != NAME && is.element(NAME, old_names)) [17:27:35.120] next [17:27:35.120] args[[name]] <- "" [17:27:35.120] } [17:27:35.120] NAMES <- toupper(removed) [17:27:35.120] for (kk in seq_along(NAMES)) { [17:27:35.120] name <- removed[[kk]] [17:27:35.120] NAME <- NAMES[[kk]] [17:27:35.120] if (name != NAME && is.element(NAME, old_names)) [17:27:35.120] next [17:27:35.120] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.120] } [17:27:35.120] if (length(args) > 0) [17:27:35.120] base::do.call(base::Sys.setenv, args = args) [17:27:35.120] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.120] } [17:27:35.120] else { [17:27:35.120] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.120] } [17:27:35.120] { [17:27:35.120] if (base::length(...future.futureOptionsAdded) > [17:27:35.120] 0L) { [17:27:35.120] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.120] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.120] base::options(opts) [17:27:35.120] } [17:27:35.120] { [17:27:35.120] { [17:27:35.120] NULL [17:27:35.120] RNGkind("Mersenne-Twister") [17:27:35.120] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.120] inherits = FALSE) [17:27:35.120] } [17:27:35.120] options(future.plan = NULL) [17:27:35.120] if (is.na(NA_character_)) [17:27:35.120] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.120] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.120] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.120] .init = FALSE) [17:27:35.120] } [17:27:35.120] } [17:27:35.120] } [17:27:35.120] }) [17:27:35.120] if (TRUE) { [17:27:35.120] base::sink(type = "output", split = FALSE) [17:27:35.120] if (TRUE) { [17:27:35.120] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.120] } [17:27:35.120] else { [17:27:35.120] ...future.result["stdout"] <- base::list(NULL) [17:27:35.120] } [17:27:35.120] base::close(...future.stdout) [17:27:35.120] ...future.stdout <- NULL [17:27:35.120] } [17:27:35.120] ...future.result$conditions <- ...future.conditions [17:27:35.120] ...future.result$finished <- base::Sys.time() [17:27:35.120] ...future.result [17:27:35.120] } [17:27:35.126] plan(): Setting new future strategy stack: [17:27:35.127] List of future strategies: [17:27:35.127] 1. sequential: [17:27:35.127] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.127] - tweaked: FALSE [17:27:35.127] - call: NULL [17:27:35.128] plan(): nbrOfWorkers() = 1 [17:27:35.130] plan(): Setting new future strategy stack: [17:27:35.130] List of future strategies: [17:27:35.130] 1. sequential: [17:27:35.130] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.130] - tweaked: FALSE [17:27:35.130] - call: plan(strategy) [17:27:35.135] plan(): nbrOfWorkers() = 1 [17:27:35.135] SequentialFuture started (and completed) [17:27:35.136] - Launch lazy future ... done [17:27:35.136] run() for 'SequentialFuture' ... done [17:27:35.139] resolved() for 'SequentialFuture' ... [17:27:35.139] - state: 'finished' [17:27:35.139] - run: TRUE [17:27:35.140] - result: 'FutureResult' [17:27:35.140] resolved() for 'SequentialFuture' ... done [17:27:35.141] resolved() for 'SequentialFuture' ... [17:27:35.141] - state: 'finished' [17:27:35.141] - run: TRUE [17:27:35.142] - result: 'FutureResult' [17:27:35.142] resolved() for 'SequentialFuture' ... done [17:27:35.142] resolved() for 'SequentialFuture' ... [17:27:35.143] - state: 'finished' [17:27:35.143] - run: TRUE [17:27:35.143] - result: 'FutureResult' [17:27:35.143] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:35.146] resolve() on environment ... [17:27:35.146] recursive: 0 [17:27:35.147] elements: [4] 'a', 'b', 'c', 'd' [17:27:35.147] signalConditionsASAP(numeric, pos=1) ... [17:27:35.147] - nx: 4 [17:27:35.148] - relay: TRUE [17:27:35.148] - stdout: TRUE [17:27:35.148] - signal: TRUE [17:27:35.148] - resignal: FALSE [17:27:35.149] - force: TRUE [17:27:35.149] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.149] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.149] - until=2 [17:27:35.150] - relaying element #2 [17:27:35.150] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.150] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.150] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.150] length: 3 (resolved future 1) [17:27:35.151] resolved() for 'SequentialFuture' ... [17:27:35.151] - state: 'finished' [17:27:35.151] - run: TRUE [17:27:35.152] - result: 'FutureResult' [17:27:35.152] resolved() for 'SequentialFuture' ... done [17:27:35.152] Future #2 [17:27:35.153] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.153] - nx: 4 [17:27:35.153] - relay: TRUE [17:27:35.153] - stdout: TRUE [17:27:35.153] - signal: TRUE [17:27:35.154] - resignal: FALSE [17:27:35.154] - force: TRUE [17:27:35.154] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.154] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.155] - until=2 [17:27:35.155] - relaying element #2 [17:27:35.155] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.155] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.156] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.156] length: 2 (resolved future 2) [17:27:35.156] resolved() for 'SequentialFuture' ... [17:27:35.157] - state: 'finished' [17:27:35.157] - run: TRUE [17:27:35.157] - result: 'FutureResult' [17:27:35.157] resolved() for 'SequentialFuture' ... done [17:27:35.158] Future #3 [17:27:35.158] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.158] - nx: 4 [17:27:35.158] - relay: TRUE [17:27:35.159] - stdout: TRUE [17:27:35.159] - signal: TRUE [17:27:35.159] - resignal: FALSE [17:27:35.159] - force: TRUE [17:27:35.160] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.160] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.160] - until=3 [17:27:35.160] - relaying element #3 [17:27:35.161] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.161] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.161] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.161] length: 1 (resolved future 3) [17:27:35.162] resolved() for 'SequentialFuture' ... [17:27:35.162] - state: 'finished' [17:27:35.162] - run: TRUE [17:27:35.162] - result: 'FutureResult' [17:27:35.163] resolved() for 'SequentialFuture' ... done [17:27:35.163] Future #4 [17:27:35.163] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.164] - nx: 4 [17:27:35.164] - relay: TRUE [17:27:35.164] - stdout: TRUE [17:27:35.164] - signal: TRUE [17:27:35.164] - resignal: FALSE [17:27:35.165] - force: TRUE [17:27:35.165] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.165] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.165] - until=4 [17:27:35.166] - relaying element #4 [17:27:35.166] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.166] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.166] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.167] length: 0 (resolved future 4) [17:27:35.167] Relaying remaining futures [17:27:35.167] signalConditionsASAP(NULL, pos=0) ... [17:27:35.167] - nx: 4 [17:27:35.168] - relay: TRUE [17:27:35.168] - stdout: TRUE [17:27:35.168] - signal: TRUE [17:27:35.168] - resignal: FALSE [17:27:35.168] - force: TRUE [17:27:35.169] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.169] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:35.169] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.170] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.170] signalConditionsASAP(NULL, pos=0) ... done [17:27:35.170] resolve() on environment ... DONE Dimensions: c(2, 3, 1) [17:27:35.171] getGlobalsAndPackages() ... [17:27:35.171] Searching for globals... [17:27:35.172] [17:27:35.172] Searching for globals ... DONE [17:27:35.173] - globals: [0] [17:27:35.173] getGlobalsAndPackages() ... DONE [17:27:35.173] run() for 'Future' ... [17:27:35.174] - state: 'created' [17:27:35.174] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.175] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.175] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.175] - Field: 'label' [17:27:35.211] - Field: 'local' [17:27:35.212] - Field: 'owner' [17:27:35.212] - Field: 'envir' [17:27:35.212] - Field: 'packages' [17:27:35.213] - Field: 'gc' [17:27:35.213] - Field: 'conditions' [17:27:35.213] - Field: 'expr' [17:27:35.214] - Field: 'uuid' [17:27:35.214] - Field: 'seed' [17:27:35.214] - Field: 'version' [17:27:35.215] - Field: 'result' [17:27:35.215] - Field: 'asynchronous' [17:27:35.215] - Field: 'calls' [17:27:35.216] - Field: 'globals' [17:27:35.216] - Field: 'stdout' [17:27:35.216] - Field: 'earlySignal' [17:27:35.217] - Field: 'lazy' [17:27:35.217] - Field: 'state' [17:27:35.217] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.218] - Launch lazy future ... [17:27:35.218] Packages needed by the future expression (n = 0): [17:27:35.219] Packages needed by future strategies (n = 0): [17:27:35.220] { [17:27:35.220] { [17:27:35.220] { [17:27:35.220] ...future.startTime <- base::Sys.time() [17:27:35.220] { [17:27:35.220] { [17:27:35.220] { [17:27:35.220] base::local({ [17:27:35.220] has_future <- base::requireNamespace("future", [17:27:35.220] quietly = TRUE) [17:27:35.220] if (has_future) { [17:27:35.220] ns <- base::getNamespace("future") [17:27:35.220] version <- ns[[".package"]][["version"]] [17:27:35.220] if (is.null(version)) [17:27:35.220] version <- utils::packageVersion("future") [17:27:35.220] } [17:27:35.220] else { [17:27:35.220] version <- NULL [17:27:35.220] } [17:27:35.220] if (!has_future || version < "1.8.0") { [17:27:35.220] info <- base::c(r_version = base::gsub("R version ", [17:27:35.220] "", base::R.version$version.string), [17:27:35.220] platform = base::sprintf("%s (%s-bit)", [17:27:35.220] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.220] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.220] "release", "version")], collapse = " "), [17:27:35.220] hostname = base::Sys.info()[["nodename"]]) [17:27:35.220] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.220] info) [17:27:35.220] info <- base::paste(info, collapse = "; ") [17:27:35.220] if (!has_future) { [17:27:35.220] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.220] info) [17:27:35.220] } [17:27:35.220] else { [17:27:35.220] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.220] info, version) [17:27:35.220] } [17:27:35.220] base::stop(msg) [17:27:35.220] } [17:27:35.220] }) [17:27:35.220] } [17:27:35.220] ...future.strategy.old <- future::plan("list") [17:27:35.220] options(future.plan = NULL) [17:27:35.220] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.220] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.220] } [17:27:35.220] ...future.workdir <- getwd() [17:27:35.220] } [17:27:35.220] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.220] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.220] } [17:27:35.220] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.220] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.220] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.220] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.220] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.220] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.220] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.220] base::names(...future.oldOptions)) [17:27:35.220] } [17:27:35.220] if (FALSE) { [17:27:35.220] } [17:27:35.220] else { [17:27:35.220] if (TRUE) { [17:27:35.220] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.220] open = "w") [17:27:35.220] } [17:27:35.220] else { [17:27:35.220] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.220] windows = "NUL", "/dev/null"), open = "w") [17:27:35.220] } [17:27:35.220] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.220] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.220] base::sink(type = "output", split = FALSE) [17:27:35.220] base::close(...future.stdout) [17:27:35.220] }, add = TRUE) [17:27:35.220] } [17:27:35.220] ...future.frame <- base::sys.nframe() [17:27:35.220] ...future.conditions <- base::list() [17:27:35.220] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.220] if (FALSE) { [17:27:35.220] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.220] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.220] } [17:27:35.220] ...future.result <- base::tryCatch({ [17:27:35.220] base::withCallingHandlers({ [17:27:35.220] ...future.value <- base::withVisible(base::local(2)) [17:27:35.220] future::FutureResult(value = ...future.value$value, [17:27:35.220] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.220] ...future.rng), globalenv = if (FALSE) [17:27:35.220] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.220] ...future.globalenv.names)) [17:27:35.220] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.220] }, condition = base::local({ [17:27:35.220] c <- base::c [17:27:35.220] inherits <- base::inherits [17:27:35.220] invokeRestart <- base::invokeRestart [17:27:35.220] length <- base::length [17:27:35.220] list <- base::list [17:27:35.220] seq.int <- base::seq.int [17:27:35.220] signalCondition <- base::signalCondition [17:27:35.220] sys.calls <- base::sys.calls [17:27:35.220] `[[` <- base::`[[` [17:27:35.220] `+` <- base::`+` [17:27:35.220] `<<-` <- base::`<<-` [17:27:35.220] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.220] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.220] 3L)] [17:27:35.220] } [17:27:35.220] function(cond) { [17:27:35.220] is_error <- inherits(cond, "error") [17:27:35.220] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.220] NULL) [17:27:35.220] if (is_error) { [17:27:35.220] sessionInformation <- function() { [17:27:35.220] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.220] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.220] search = base::search(), system = base::Sys.info()) [17:27:35.220] } [17:27:35.220] ...future.conditions[[length(...future.conditions) + [17:27:35.220] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.220] cond$call), session = sessionInformation(), [17:27:35.220] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.220] signalCondition(cond) [17:27:35.220] } [17:27:35.220] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.220] "immediateCondition"))) { [17:27:35.220] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.220] ...future.conditions[[length(...future.conditions) + [17:27:35.220] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.220] if (TRUE && !signal) { [17:27:35.220] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.220] { [17:27:35.220] inherits <- base::inherits [17:27:35.220] invokeRestart <- base::invokeRestart [17:27:35.220] is.null <- base::is.null [17:27:35.220] muffled <- FALSE [17:27:35.220] if (inherits(cond, "message")) { [17:27:35.220] muffled <- grepl(pattern, "muffleMessage") [17:27:35.220] if (muffled) [17:27:35.220] invokeRestart("muffleMessage") [17:27:35.220] } [17:27:35.220] else if (inherits(cond, "warning")) { [17:27:35.220] muffled <- grepl(pattern, "muffleWarning") [17:27:35.220] if (muffled) [17:27:35.220] invokeRestart("muffleWarning") [17:27:35.220] } [17:27:35.220] else if (inherits(cond, "condition")) { [17:27:35.220] if (!is.null(pattern)) { [17:27:35.220] computeRestarts <- base::computeRestarts [17:27:35.220] grepl <- base::grepl [17:27:35.220] restarts <- computeRestarts(cond) [17:27:35.220] for (restart in restarts) { [17:27:35.220] name <- restart$name [17:27:35.220] if (is.null(name)) [17:27:35.220] next [17:27:35.220] if (!grepl(pattern, name)) [17:27:35.220] next [17:27:35.220] invokeRestart(restart) [17:27:35.220] muffled <- TRUE [17:27:35.220] break [17:27:35.220] } [17:27:35.220] } [17:27:35.220] } [17:27:35.220] invisible(muffled) [17:27:35.220] } [17:27:35.220] muffleCondition(cond, pattern = "^muffle") [17:27:35.220] } [17:27:35.220] } [17:27:35.220] else { [17:27:35.220] if (TRUE) { [17:27:35.220] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.220] { [17:27:35.220] inherits <- base::inherits [17:27:35.220] invokeRestart <- base::invokeRestart [17:27:35.220] is.null <- base::is.null [17:27:35.220] muffled <- FALSE [17:27:35.220] if (inherits(cond, "message")) { [17:27:35.220] muffled <- grepl(pattern, "muffleMessage") [17:27:35.220] if (muffled) [17:27:35.220] invokeRestart("muffleMessage") [17:27:35.220] } [17:27:35.220] else if (inherits(cond, "warning")) { [17:27:35.220] muffled <- grepl(pattern, "muffleWarning") [17:27:35.220] if (muffled) [17:27:35.220] invokeRestart("muffleWarning") [17:27:35.220] } [17:27:35.220] else if (inherits(cond, "condition")) { [17:27:35.220] if (!is.null(pattern)) { [17:27:35.220] computeRestarts <- base::computeRestarts [17:27:35.220] grepl <- base::grepl [17:27:35.220] restarts <- computeRestarts(cond) [17:27:35.220] for (restart in restarts) { [17:27:35.220] name <- restart$name [17:27:35.220] if (is.null(name)) [17:27:35.220] next [17:27:35.220] if (!grepl(pattern, name)) [17:27:35.220] next [17:27:35.220] invokeRestart(restart) [17:27:35.220] muffled <- TRUE [17:27:35.220] break [17:27:35.220] } [17:27:35.220] } [17:27:35.220] } [17:27:35.220] invisible(muffled) [17:27:35.220] } [17:27:35.220] muffleCondition(cond, pattern = "^muffle") [17:27:35.220] } [17:27:35.220] } [17:27:35.220] } [17:27:35.220] })) [17:27:35.220] }, error = function(ex) { [17:27:35.220] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.220] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.220] ...future.rng), started = ...future.startTime, [17:27:35.220] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.220] version = "1.8"), class = "FutureResult") [17:27:35.220] }, finally = { [17:27:35.220] if (!identical(...future.workdir, getwd())) [17:27:35.220] setwd(...future.workdir) [17:27:35.220] { [17:27:35.220] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.220] ...future.oldOptions$nwarnings <- NULL [17:27:35.220] } [17:27:35.220] base::options(...future.oldOptions) [17:27:35.220] if (.Platform$OS.type == "windows") { [17:27:35.220] old_names <- names(...future.oldEnvVars) [17:27:35.220] envs <- base::Sys.getenv() [17:27:35.220] names <- names(envs) [17:27:35.220] common <- intersect(names, old_names) [17:27:35.220] added <- setdiff(names, old_names) [17:27:35.220] removed <- setdiff(old_names, names) [17:27:35.220] changed <- common[...future.oldEnvVars[common] != [17:27:35.220] envs[common]] [17:27:35.220] NAMES <- toupper(changed) [17:27:35.220] args <- list() [17:27:35.220] for (kk in seq_along(NAMES)) { [17:27:35.220] name <- changed[[kk]] [17:27:35.220] NAME <- NAMES[[kk]] [17:27:35.220] if (name != NAME && is.element(NAME, old_names)) [17:27:35.220] next [17:27:35.220] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.220] } [17:27:35.220] NAMES <- toupper(added) [17:27:35.220] for (kk in seq_along(NAMES)) { [17:27:35.220] name <- added[[kk]] [17:27:35.220] NAME <- NAMES[[kk]] [17:27:35.220] if (name != NAME && is.element(NAME, old_names)) [17:27:35.220] next [17:27:35.220] args[[name]] <- "" [17:27:35.220] } [17:27:35.220] NAMES <- toupper(removed) [17:27:35.220] for (kk in seq_along(NAMES)) { [17:27:35.220] name <- removed[[kk]] [17:27:35.220] NAME <- NAMES[[kk]] [17:27:35.220] if (name != NAME && is.element(NAME, old_names)) [17:27:35.220] next [17:27:35.220] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.220] } [17:27:35.220] if (length(args) > 0) [17:27:35.220] base::do.call(base::Sys.setenv, args = args) [17:27:35.220] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.220] } [17:27:35.220] else { [17:27:35.220] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.220] } [17:27:35.220] { [17:27:35.220] if (base::length(...future.futureOptionsAdded) > [17:27:35.220] 0L) { [17:27:35.220] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.220] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.220] base::options(opts) [17:27:35.220] } [17:27:35.220] { [17:27:35.220] { [17:27:35.220] NULL [17:27:35.220] RNGkind("Mersenne-Twister") [17:27:35.220] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.220] inherits = FALSE) [17:27:35.220] } [17:27:35.220] options(future.plan = NULL) [17:27:35.220] if (is.na(NA_character_)) [17:27:35.220] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.220] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.220] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.220] .init = FALSE) [17:27:35.220] } [17:27:35.220] } [17:27:35.220] } [17:27:35.220] }) [17:27:35.220] if (TRUE) { [17:27:35.220] base::sink(type = "output", split = FALSE) [17:27:35.220] if (TRUE) { [17:27:35.220] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.220] } [17:27:35.220] else { [17:27:35.220] ...future.result["stdout"] <- base::list(NULL) [17:27:35.220] } [17:27:35.220] base::close(...future.stdout) [17:27:35.220] ...future.stdout <- NULL [17:27:35.220] } [17:27:35.220] ...future.result$conditions <- ...future.conditions [17:27:35.220] ...future.result$finished <- base::Sys.time() [17:27:35.220] ...future.result [17:27:35.220] } [17:27:35.226] plan(): Setting new future strategy stack: [17:27:35.226] List of future strategies: [17:27:35.226] 1. sequential: [17:27:35.226] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.226] - tweaked: FALSE [17:27:35.226] - call: NULL [17:27:35.227] plan(): nbrOfWorkers() = 1 [17:27:35.229] plan(): Setting new future strategy stack: [17:27:35.230] List of future strategies: [17:27:35.230] 1. sequential: [17:27:35.230] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.230] - tweaked: FALSE [17:27:35.230] - call: plan(strategy) [17:27:35.231] plan(): nbrOfWorkers() = 1 [17:27:35.231] SequentialFuture started (and completed) [17:27:35.231] - Launch lazy future ... done [17:27:35.232] run() for 'SequentialFuture' ... done [17:27:35.232] getGlobalsAndPackages() ... [17:27:35.232] Searching for globals... [17:27:35.233] [17:27:35.233] Searching for globals ... DONE [17:27:35.234] - globals: [0] [17:27:35.234] getGlobalsAndPackages() ... DONE [17:27:35.235] run() for 'Future' ... [17:27:35.235] - state: 'created' [17:27:35.235] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.236] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.237] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.237] - Field: 'label' [17:27:35.237] - Field: 'local' [17:27:35.238] - Field: 'owner' [17:27:35.238] - Field: 'envir' [17:27:35.238] - Field: 'packages' [17:27:35.238] - Field: 'gc' [17:27:35.239] - Field: 'conditions' [17:27:35.239] - Field: 'expr' [17:27:35.239] - Field: 'uuid' [17:27:35.240] - Field: 'seed' [17:27:35.240] - Field: 'version' [17:27:35.240] - Field: 'result' [17:27:35.240] - Field: 'asynchronous' [17:27:35.241] - Field: 'calls' [17:27:35.241] - Field: 'globals' [17:27:35.241] - Field: 'stdout' [17:27:35.241] - Field: 'earlySignal' [17:27:35.242] - Field: 'lazy' [17:27:35.242] - Field: 'state' [17:27:35.242] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.242] - Launch lazy future ... [17:27:35.243] Packages needed by the future expression (n = 0): [17:27:35.243] Packages needed by future strategies (n = 0): [17:27:35.244] { [17:27:35.244] { [17:27:35.244] { [17:27:35.244] ...future.startTime <- base::Sys.time() [17:27:35.244] { [17:27:35.244] { [17:27:35.244] { [17:27:35.244] base::local({ [17:27:35.244] has_future <- base::requireNamespace("future", [17:27:35.244] quietly = TRUE) [17:27:35.244] if (has_future) { [17:27:35.244] ns <- base::getNamespace("future") [17:27:35.244] version <- ns[[".package"]][["version"]] [17:27:35.244] if (is.null(version)) [17:27:35.244] version <- utils::packageVersion("future") [17:27:35.244] } [17:27:35.244] else { [17:27:35.244] version <- NULL [17:27:35.244] } [17:27:35.244] if (!has_future || version < "1.8.0") { [17:27:35.244] info <- base::c(r_version = base::gsub("R version ", [17:27:35.244] "", base::R.version$version.string), [17:27:35.244] platform = base::sprintf("%s (%s-bit)", [17:27:35.244] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.244] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.244] "release", "version")], collapse = " "), [17:27:35.244] hostname = base::Sys.info()[["nodename"]]) [17:27:35.244] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.244] info) [17:27:35.244] info <- base::paste(info, collapse = "; ") [17:27:35.244] if (!has_future) { [17:27:35.244] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.244] info) [17:27:35.244] } [17:27:35.244] else { [17:27:35.244] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.244] info, version) [17:27:35.244] } [17:27:35.244] base::stop(msg) [17:27:35.244] } [17:27:35.244] }) [17:27:35.244] } [17:27:35.244] ...future.strategy.old <- future::plan("list") [17:27:35.244] options(future.plan = NULL) [17:27:35.244] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.244] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.244] } [17:27:35.244] ...future.workdir <- getwd() [17:27:35.244] } [17:27:35.244] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.244] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.244] } [17:27:35.244] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.244] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.244] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.244] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.244] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.244] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.244] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.244] base::names(...future.oldOptions)) [17:27:35.244] } [17:27:35.244] if (FALSE) { [17:27:35.244] } [17:27:35.244] else { [17:27:35.244] if (TRUE) { [17:27:35.244] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.244] open = "w") [17:27:35.244] } [17:27:35.244] else { [17:27:35.244] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.244] windows = "NUL", "/dev/null"), open = "w") [17:27:35.244] } [17:27:35.244] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.244] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.244] base::sink(type = "output", split = FALSE) [17:27:35.244] base::close(...future.stdout) [17:27:35.244] }, add = TRUE) [17:27:35.244] } [17:27:35.244] ...future.frame <- base::sys.nframe() [17:27:35.244] ...future.conditions <- base::list() [17:27:35.244] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.244] if (FALSE) { [17:27:35.244] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.244] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.244] } [17:27:35.244] ...future.result <- base::tryCatch({ [17:27:35.244] base::withCallingHandlers({ [17:27:35.244] ...future.value <- base::withVisible(base::local(NULL)) [17:27:35.244] future::FutureResult(value = ...future.value$value, [17:27:35.244] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.244] ...future.rng), globalenv = if (FALSE) [17:27:35.244] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.244] ...future.globalenv.names)) [17:27:35.244] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.244] }, condition = base::local({ [17:27:35.244] c <- base::c [17:27:35.244] inherits <- base::inherits [17:27:35.244] invokeRestart <- base::invokeRestart [17:27:35.244] length <- base::length [17:27:35.244] list <- base::list [17:27:35.244] seq.int <- base::seq.int [17:27:35.244] signalCondition <- base::signalCondition [17:27:35.244] sys.calls <- base::sys.calls [17:27:35.244] `[[` <- base::`[[` [17:27:35.244] `+` <- base::`+` [17:27:35.244] `<<-` <- base::`<<-` [17:27:35.244] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.244] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.244] 3L)] [17:27:35.244] } [17:27:35.244] function(cond) { [17:27:35.244] is_error <- inherits(cond, "error") [17:27:35.244] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.244] NULL) [17:27:35.244] if (is_error) { [17:27:35.244] sessionInformation <- function() { [17:27:35.244] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.244] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.244] search = base::search(), system = base::Sys.info()) [17:27:35.244] } [17:27:35.244] ...future.conditions[[length(...future.conditions) + [17:27:35.244] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.244] cond$call), session = sessionInformation(), [17:27:35.244] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.244] signalCondition(cond) [17:27:35.244] } [17:27:35.244] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.244] "immediateCondition"))) { [17:27:35.244] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.244] ...future.conditions[[length(...future.conditions) + [17:27:35.244] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.244] if (TRUE && !signal) { [17:27:35.244] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.244] { [17:27:35.244] inherits <- base::inherits [17:27:35.244] invokeRestart <- base::invokeRestart [17:27:35.244] is.null <- base::is.null [17:27:35.244] muffled <- FALSE [17:27:35.244] if (inherits(cond, "message")) { [17:27:35.244] muffled <- grepl(pattern, "muffleMessage") [17:27:35.244] if (muffled) [17:27:35.244] invokeRestart("muffleMessage") [17:27:35.244] } [17:27:35.244] else if (inherits(cond, "warning")) { [17:27:35.244] muffled <- grepl(pattern, "muffleWarning") [17:27:35.244] if (muffled) [17:27:35.244] invokeRestart("muffleWarning") [17:27:35.244] } [17:27:35.244] else if (inherits(cond, "condition")) { [17:27:35.244] if (!is.null(pattern)) { [17:27:35.244] computeRestarts <- base::computeRestarts [17:27:35.244] grepl <- base::grepl [17:27:35.244] restarts <- computeRestarts(cond) [17:27:35.244] for (restart in restarts) { [17:27:35.244] name <- restart$name [17:27:35.244] if (is.null(name)) [17:27:35.244] next [17:27:35.244] if (!grepl(pattern, name)) [17:27:35.244] next [17:27:35.244] invokeRestart(restart) [17:27:35.244] muffled <- TRUE [17:27:35.244] break [17:27:35.244] } [17:27:35.244] } [17:27:35.244] } [17:27:35.244] invisible(muffled) [17:27:35.244] } [17:27:35.244] muffleCondition(cond, pattern = "^muffle") [17:27:35.244] } [17:27:35.244] } [17:27:35.244] else { [17:27:35.244] if (TRUE) { [17:27:35.244] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.244] { [17:27:35.244] inherits <- base::inherits [17:27:35.244] invokeRestart <- base::invokeRestart [17:27:35.244] is.null <- base::is.null [17:27:35.244] muffled <- FALSE [17:27:35.244] if (inherits(cond, "message")) { [17:27:35.244] muffled <- grepl(pattern, "muffleMessage") [17:27:35.244] if (muffled) [17:27:35.244] invokeRestart("muffleMessage") [17:27:35.244] } [17:27:35.244] else if (inherits(cond, "warning")) { [17:27:35.244] muffled <- grepl(pattern, "muffleWarning") [17:27:35.244] if (muffled) [17:27:35.244] invokeRestart("muffleWarning") [17:27:35.244] } [17:27:35.244] else if (inherits(cond, "condition")) { [17:27:35.244] if (!is.null(pattern)) { [17:27:35.244] computeRestarts <- base::computeRestarts [17:27:35.244] grepl <- base::grepl [17:27:35.244] restarts <- computeRestarts(cond) [17:27:35.244] for (restart in restarts) { [17:27:35.244] name <- restart$name [17:27:35.244] if (is.null(name)) [17:27:35.244] next [17:27:35.244] if (!grepl(pattern, name)) [17:27:35.244] next [17:27:35.244] invokeRestart(restart) [17:27:35.244] muffled <- TRUE [17:27:35.244] break [17:27:35.244] } [17:27:35.244] } [17:27:35.244] } [17:27:35.244] invisible(muffled) [17:27:35.244] } [17:27:35.244] muffleCondition(cond, pattern = "^muffle") [17:27:35.244] } [17:27:35.244] } [17:27:35.244] } [17:27:35.244] })) [17:27:35.244] }, error = function(ex) { [17:27:35.244] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.244] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.244] ...future.rng), started = ...future.startTime, [17:27:35.244] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.244] version = "1.8"), class = "FutureResult") [17:27:35.244] }, finally = { [17:27:35.244] if (!identical(...future.workdir, getwd())) [17:27:35.244] setwd(...future.workdir) [17:27:35.244] { [17:27:35.244] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.244] ...future.oldOptions$nwarnings <- NULL [17:27:35.244] } [17:27:35.244] base::options(...future.oldOptions) [17:27:35.244] if (.Platform$OS.type == "windows") { [17:27:35.244] old_names <- names(...future.oldEnvVars) [17:27:35.244] envs <- base::Sys.getenv() [17:27:35.244] names <- names(envs) [17:27:35.244] common <- intersect(names, old_names) [17:27:35.244] added <- setdiff(names, old_names) [17:27:35.244] removed <- setdiff(old_names, names) [17:27:35.244] changed <- common[...future.oldEnvVars[common] != [17:27:35.244] envs[common]] [17:27:35.244] NAMES <- toupper(changed) [17:27:35.244] args <- list() [17:27:35.244] for (kk in seq_along(NAMES)) { [17:27:35.244] name <- changed[[kk]] [17:27:35.244] NAME <- NAMES[[kk]] [17:27:35.244] if (name != NAME && is.element(NAME, old_names)) [17:27:35.244] next [17:27:35.244] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.244] } [17:27:35.244] NAMES <- toupper(added) [17:27:35.244] for (kk in seq_along(NAMES)) { [17:27:35.244] name <- added[[kk]] [17:27:35.244] NAME <- NAMES[[kk]] [17:27:35.244] if (name != NAME && is.element(NAME, old_names)) [17:27:35.244] next [17:27:35.244] args[[name]] <- "" [17:27:35.244] } [17:27:35.244] NAMES <- toupper(removed) [17:27:35.244] for (kk in seq_along(NAMES)) { [17:27:35.244] name <- removed[[kk]] [17:27:35.244] NAME <- NAMES[[kk]] [17:27:35.244] if (name != NAME && is.element(NAME, old_names)) [17:27:35.244] next [17:27:35.244] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.244] } [17:27:35.244] if (length(args) > 0) [17:27:35.244] base::do.call(base::Sys.setenv, args = args) [17:27:35.244] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.244] } [17:27:35.244] else { [17:27:35.244] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.244] } [17:27:35.244] { [17:27:35.244] if (base::length(...future.futureOptionsAdded) > [17:27:35.244] 0L) { [17:27:35.244] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.244] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.244] base::options(opts) [17:27:35.244] } [17:27:35.244] { [17:27:35.244] { [17:27:35.244] NULL [17:27:35.244] RNGkind("Mersenne-Twister") [17:27:35.244] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.244] inherits = FALSE) [17:27:35.244] } [17:27:35.244] options(future.plan = NULL) [17:27:35.244] if (is.na(NA_character_)) [17:27:35.244] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.244] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.244] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.244] .init = FALSE) [17:27:35.244] } [17:27:35.244] } [17:27:35.244] } [17:27:35.244] }) [17:27:35.244] if (TRUE) { [17:27:35.244] base::sink(type = "output", split = FALSE) [17:27:35.244] if (TRUE) { [17:27:35.244] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.244] } [17:27:35.244] else { [17:27:35.244] ...future.result["stdout"] <- base::list(NULL) [17:27:35.244] } [17:27:35.244] base::close(...future.stdout) [17:27:35.244] ...future.stdout <- NULL [17:27:35.244] } [17:27:35.244] ...future.result$conditions <- ...future.conditions [17:27:35.244] ...future.result$finished <- base::Sys.time() [17:27:35.244] ...future.result [17:27:35.244] } [17:27:35.250] plan(): Setting new future strategy stack: [17:27:35.250] List of future strategies: [17:27:35.250] 1. sequential: [17:27:35.250] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.250] - tweaked: FALSE [17:27:35.250] - call: NULL [17:27:35.251] plan(): nbrOfWorkers() = 1 [17:27:35.255] plan(): Setting new future strategy stack: [17:27:35.256] List of future strategies: [17:27:35.256] 1. sequential: [17:27:35.256] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.256] - tweaked: FALSE [17:27:35.256] - call: plan(strategy) [17:27:35.257] plan(): nbrOfWorkers() = 1 [17:27:35.257] SequentialFuture started (and completed) [17:27:35.257] - Launch lazy future ... done [17:27:35.258] run() for 'SequentialFuture' ... done [17:27:35.258] getGlobalsAndPackages() ... [17:27:35.259] Searching for globals... [17:27:35.260] - globals found: [1] '{' [17:27:35.260] Searching for globals ... DONE [17:27:35.261] Resolving globals: FALSE [17:27:35.261] [17:27:35.261] [17:27:35.262] getGlobalsAndPackages() ... DONE [17:27:35.262] run() for 'Future' ... [17:27:35.262] - state: 'created' [17:27:35.263] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.263] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.264] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.264] - Field: 'label' [17:27:35.264] - Field: 'local' [17:27:35.264] - Field: 'owner' [17:27:35.265] - Field: 'envir' [17:27:35.265] - Field: 'packages' [17:27:35.265] - Field: 'gc' [17:27:35.265] - Field: 'conditions' [17:27:35.266] - Field: 'expr' [17:27:35.266] - Field: 'uuid' [17:27:35.266] - Field: 'seed' [17:27:35.267] - Field: 'version' [17:27:35.267] - Field: 'result' [17:27:35.267] - Field: 'asynchronous' [17:27:35.267] - Field: 'calls' [17:27:35.268] - Field: 'globals' [17:27:35.268] - Field: 'stdout' [17:27:35.268] - Field: 'earlySignal' [17:27:35.268] - Field: 'lazy' [17:27:35.269] - Field: 'state' [17:27:35.269] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.269] - Launch lazy future ... [17:27:35.270] Packages needed by the future expression (n = 0): [17:27:35.270] Packages needed by future strategies (n = 0): [17:27:35.271] { [17:27:35.271] { [17:27:35.271] { [17:27:35.271] ...future.startTime <- base::Sys.time() [17:27:35.271] { [17:27:35.271] { [17:27:35.271] { [17:27:35.271] base::local({ [17:27:35.271] has_future <- base::requireNamespace("future", [17:27:35.271] quietly = TRUE) [17:27:35.271] if (has_future) { [17:27:35.271] ns <- base::getNamespace("future") [17:27:35.271] version <- ns[[".package"]][["version"]] [17:27:35.271] if (is.null(version)) [17:27:35.271] version <- utils::packageVersion("future") [17:27:35.271] } [17:27:35.271] else { [17:27:35.271] version <- NULL [17:27:35.271] } [17:27:35.271] if (!has_future || version < "1.8.0") { [17:27:35.271] info <- base::c(r_version = base::gsub("R version ", [17:27:35.271] "", base::R.version$version.string), [17:27:35.271] platform = base::sprintf("%s (%s-bit)", [17:27:35.271] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.271] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.271] "release", "version")], collapse = " "), [17:27:35.271] hostname = base::Sys.info()[["nodename"]]) [17:27:35.271] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.271] info) [17:27:35.271] info <- base::paste(info, collapse = "; ") [17:27:35.271] if (!has_future) { [17:27:35.271] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.271] info) [17:27:35.271] } [17:27:35.271] else { [17:27:35.271] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.271] info, version) [17:27:35.271] } [17:27:35.271] base::stop(msg) [17:27:35.271] } [17:27:35.271] }) [17:27:35.271] } [17:27:35.271] ...future.strategy.old <- future::plan("list") [17:27:35.271] options(future.plan = NULL) [17:27:35.271] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.271] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.271] } [17:27:35.271] ...future.workdir <- getwd() [17:27:35.271] } [17:27:35.271] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.271] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.271] } [17:27:35.271] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.271] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.271] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.271] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.271] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.271] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.271] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.271] base::names(...future.oldOptions)) [17:27:35.271] } [17:27:35.271] if (FALSE) { [17:27:35.271] } [17:27:35.271] else { [17:27:35.271] if (TRUE) { [17:27:35.271] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.271] open = "w") [17:27:35.271] } [17:27:35.271] else { [17:27:35.271] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.271] windows = "NUL", "/dev/null"), open = "w") [17:27:35.271] } [17:27:35.271] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.271] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.271] base::sink(type = "output", split = FALSE) [17:27:35.271] base::close(...future.stdout) [17:27:35.271] }, add = TRUE) [17:27:35.271] } [17:27:35.271] ...future.frame <- base::sys.nframe() [17:27:35.271] ...future.conditions <- base::list() [17:27:35.271] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.271] if (FALSE) { [17:27:35.271] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.271] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.271] } [17:27:35.271] ...future.result <- base::tryCatch({ [17:27:35.271] base::withCallingHandlers({ [17:27:35.271] ...future.value <- base::withVisible(base::local({ [17:27:35.271] 4 [17:27:35.271] })) [17:27:35.271] future::FutureResult(value = ...future.value$value, [17:27:35.271] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.271] ...future.rng), globalenv = if (FALSE) [17:27:35.271] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.271] ...future.globalenv.names)) [17:27:35.271] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.271] }, condition = base::local({ [17:27:35.271] c <- base::c [17:27:35.271] inherits <- base::inherits [17:27:35.271] invokeRestart <- base::invokeRestart [17:27:35.271] length <- base::length [17:27:35.271] list <- base::list [17:27:35.271] seq.int <- base::seq.int [17:27:35.271] signalCondition <- base::signalCondition [17:27:35.271] sys.calls <- base::sys.calls [17:27:35.271] `[[` <- base::`[[` [17:27:35.271] `+` <- base::`+` [17:27:35.271] `<<-` <- base::`<<-` [17:27:35.271] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.271] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.271] 3L)] [17:27:35.271] } [17:27:35.271] function(cond) { [17:27:35.271] is_error <- inherits(cond, "error") [17:27:35.271] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.271] NULL) [17:27:35.271] if (is_error) { [17:27:35.271] sessionInformation <- function() { [17:27:35.271] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.271] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.271] search = base::search(), system = base::Sys.info()) [17:27:35.271] } [17:27:35.271] ...future.conditions[[length(...future.conditions) + [17:27:35.271] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.271] cond$call), session = sessionInformation(), [17:27:35.271] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.271] signalCondition(cond) [17:27:35.271] } [17:27:35.271] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.271] "immediateCondition"))) { [17:27:35.271] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.271] ...future.conditions[[length(...future.conditions) + [17:27:35.271] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.271] if (TRUE && !signal) { [17:27:35.271] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.271] { [17:27:35.271] inherits <- base::inherits [17:27:35.271] invokeRestart <- base::invokeRestart [17:27:35.271] is.null <- base::is.null [17:27:35.271] muffled <- FALSE [17:27:35.271] if (inherits(cond, "message")) { [17:27:35.271] muffled <- grepl(pattern, "muffleMessage") [17:27:35.271] if (muffled) [17:27:35.271] invokeRestart("muffleMessage") [17:27:35.271] } [17:27:35.271] else if (inherits(cond, "warning")) { [17:27:35.271] muffled <- grepl(pattern, "muffleWarning") [17:27:35.271] if (muffled) [17:27:35.271] invokeRestart("muffleWarning") [17:27:35.271] } [17:27:35.271] else if (inherits(cond, "condition")) { [17:27:35.271] if (!is.null(pattern)) { [17:27:35.271] computeRestarts <- base::computeRestarts [17:27:35.271] grepl <- base::grepl [17:27:35.271] restarts <- computeRestarts(cond) [17:27:35.271] for (restart in restarts) { [17:27:35.271] name <- restart$name [17:27:35.271] if (is.null(name)) [17:27:35.271] next [17:27:35.271] if (!grepl(pattern, name)) [17:27:35.271] next [17:27:35.271] invokeRestart(restart) [17:27:35.271] muffled <- TRUE [17:27:35.271] break [17:27:35.271] } [17:27:35.271] } [17:27:35.271] } [17:27:35.271] invisible(muffled) [17:27:35.271] } [17:27:35.271] muffleCondition(cond, pattern = "^muffle") [17:27:35.271] } [17:27:35.271] } [17:27:35.271] else { [17:27:35.271] if (TRUE) { [17:27:35.271] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.271] { [17:27:35.271] inherits <- base::inherits [17:27:35.271] invokeRestart <- base::invokeRestart [17:27:35.271] is.null <- base::is.null [17:27:35.271] muffled <- FALSE [17:27:35.271] if (inherits(cond, "message")) { [17:27:35.271] muffled <- grepl(pattern, "muffleMessage") [17:27:35.271] if (muffled) [17:27:35.271] invokeRestart("muffleMessage") [17:27:35.271] } [17:27:35.271] else if (inherits(cond, "warning")) { [17:27:35.271] muffled <- grepl(pattern, "muffleWarning") [17:27:35.271] if (muffled) [17:27:35.271] invokeRestart("muffleWarning") [17:27:35.271] } [17:27:35.271] else if (inherits(cond, "condition")) { [17:27:35.271] if (!is.null(pattern)) { [17:27:35.271] computeRestarts <- base::computeRestarts [17:27:35.271] grepl <- base::grepl [17:27:35.271] restarts <- computeRestarts(cond) [17:27:35.271] for (restart in restarts) { [17:27:35.271] name <- restart$name [17:27:35.271] if (is.null(name)) [17:27:35.271] next [17:27:35.271] if (!grepl(pattern, name)) [17:27:35.271] next [17:27:35.271] invokeRestart(restart) [17:27:35.271] muffled <- TRUE [17:27:35.271] break [17:27:35.271] } [17:27:35.271] } [17:27:35.271] } [17:27:35.271] invisible(muffled) [17:27:35.271] } [17:27:35.271] muffleCondition(cond, pattern = "^muffle") [17:27:35.271] } [17:27:35.271] } [17:27:35.271] } [17:27:35.271] })) [17:27:35.271] }, error = function(ex) { [17:27:35.271] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.271] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.271] ...future.rng), started = ...future.startTime, [17:27:35.271] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.271] version = "1.8"), class = "FutureResult") [17:27:35.271] }, finally = { [17:27:35.271] if (!identical(...future.workdir, getwd())) [17:27:35.271] setwd(...future.workdir) [17:27:35.271] { [17:27:35.271] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.271] ...future.oldOptions$nwarnings <- NULL [17:27:35.271] } [17:27:35.271] base::options(...future.oldOptions) [17:27:35.271] if (.Platform$OS.type == "windows") { [17:27:35.271] old_names <- names(...future.oldEnvVars) [17:27:35.271] envs <- base::Sys.getenv() [17:27:35.271] names <- names(envs) [17:27:35.271] common <- intersect(names, old_names) [17:27:35.271] added <- setdiff(names, old_names) [17:27:35.271] removed <- setdiff(old_names, names) [17:27:35.271] changed <- common[...future.oldEnvVars[common] != [17:27:35.271] envs[common]] [17:27:35.271] NAMES <- toupper(changed) [17:27:35.271] args <- list() [17:27:35.271] for (kk in seq_along(NAMES)) { [17:27:35.271] name <- changed[[kk]] [17:27:35.271] NAME <- NAMES[[kk]] [17:27:35.271] if (name != NAME && is.element(NAME, old_names)) [17:27:35.271] next [17:27:35.271] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.271] } [17:27:35.271] NAMES <- toupper(added) [17:27:35.271] for (kk in seq_along(NAMES)) { [17:27:35.271] name <- added[[kk]] [17:27:35.271] NAME <- NAMES[[kk]] [17:27:35.271] if (name != NAME && is.element(NAME, old_names)) [17:27:35.271] next [17:27:35.271] args[[name]] <- "" [17:27:35.271] } [17:27:35.271] NAMES <- toupper(removed) [17:27:35.271] for (kk in seq_along(NAMES)) { [17:27:35.271] name <- removed[[kk]] [17:27:35.271] NAME <- NAMES[[kk]] [17:27:35.271] if (name != NAME && is.element(NAME, old_names)) [17:27:35.271] next [17:27:35.271] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.271] } [17:27:35.271] if (length(args) > 0) [17:27:35.271] base::do.call(base::Sys.setenv, args = args) [17:27:35.271] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.271] } [17:27:35.271] else { [17:27:35.271] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.271] } [17:27:35.271] { [17:27:35.271] if (base::length(...future.futureOptionsAdded) > [17:27:35.271] 0L) { [17:27:35.271] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.271] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.271] base::options(opts) [17:27:35.271] } [17:27:35.271] { [17:27:35.271] { [17:27:35.271] NULL [17:27:35.271] RNGkind("Mersenne-Twister") [17:27:35.271] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.271] inherits = FALSE) [17:27:35.271] } [17:27:35.271] options(future.plan = NULL) [17:27:35.271] if (is.na(NA_character_)) [17:27:35.271] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.271] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.271] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.271] .init = FALSE) [17:27:35.271] } [17:27:35.271] } [17:27:35.271] } [17:27:35.271] }) [17:27:35.271] if (TRUE) { [17:27:35.271] base::sink(type = "output", split = FALSE) [17:27:35.271] if (TRUE) { [17:27:35.271] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.271] } [17:27:35.271] else { [17:27:35.271] ...future.result["stdout"] <- base::list(NULL) [17:27:35.271] } [17:27:35.271] base::close(...future.stdout) [17:27:35.271] ...future.stdout <- NULL [17:27:35.271] } [17:27:35.271] ...future.result$conditions <- ...future.conditions [17:27:35.271] ...future.result$finished <- base::Sys.time() [17:27:35.271] ...future.result [17:27:35.271] } [17:27:35.278] plan(): Setting new future strategy stack: [17:27:35.279] List of future strategies: [17:27:35.279] 1. sequential: [17:27:35.279] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.279] - tweaked: FALSE [17:27:35.279] - call: NULL [17:27:35.280] plan(): nbrOfWorkers() = 1 [17:27:35.282] plan(): Setting new future strategy stack: [17:27:35.282] List of future strategies: [17:27:35.282] 1. sequential: [17:27:35.282] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.282] - tweaked: FALSE [17:27:35.282] - call: plan(strategy) [17:27:35.283] plan(): nbrOfWorkers() = 1 [17:27:35.284] SequentialFuture started (and completed) [17:27:35.284] - Launch lazy future ... done [17:27:35.284] run() for 'SequentialFuture' ... done [17:27:35.290] resolved() for 'SequentialFuture' ... [17:27:35.290] - state: 'finished' [17:27:35.291] - run: TRUE [17:27:35.291] - result: 'FutureResult' [17:27:35.292] resolved() for 'SequentialFuture' ... done [17:27:35.292] resolved() for 'SequentialFuture' ... [17:27:35.292] - state: 'finished' [17:27:35.293] - run: TRUE [17:27:35.293] - result: 'FutureResult' [17:27:35.293] resolved() for 'SequentialFuture' ... done [17:27:35.294] resolved() for 'SequentialFuture' ... [17:27:35.294] - state: 'finished' [17:27:35.294] - run: TRUE [17:27:35.294] - result: 'FutureResult' [17:27:35.295] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:35.297] resolve() on environment ... [17:27:35.297] recursive: 0 [17:27:35.299] elements: [4] 'a', 'b', 'c', 'd' [17:27:35.299] signalConditionsASAP(numeric, pos=1) ... [17:27:35.299] - nx: 4 [17:27:35.300] - relay: TRUE [17:27:35.300] - stdout: TRUE [17:27:35.300] - signal: TRUE [17:27:35.300] - resignal: FALSE [17:27:35.301] - force: TRUE [17:27:35.301] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.301] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.301] - until=2 [17:27:35.302] - relaying element #2 [17:27:35.302] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.302] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.302] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.303] length: 3 (resolved future 1) [17:27:35.303] resolved() for 'SequentialFuture' ... [17:27:35.303] - state: 'finished' [17:27:35.304] - run: TRUE [17:27:35.304] - result: 'FutureResult' [17:27:35.304] resolved() for 'SequentialFuture' ... done [17:27:35.305] Future #2 [17:27:35.305] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.305] - nx: 4 [17:27:35.306] - relay: TRUE [17:27:35.306] - stdout: TRUE [17:27:35.306] - signal: TRUE [17:27:35.306] - resignal: FALSE [17:27:35.307] - force: TRUE [17:27:35.307] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.307] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.307] - until=2 [17:27:35.308] - relaying element #2 [17:27:35.308] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.308] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.309] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.309] length: 2 (resolved future 2) [17:27:35.309] resolved() for 'SequentialFuture' ... [17:27:35.310] - state: 'finished' [17:27:35.310] - run: TRUE [17:27:35.310] - result: 'FutureResult' [17:27:35.310] resolved() for 'SequentialFuture' ... done [17:27:35.311] Future #3 [17:27:35.311] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.311] - nx: 4 [17:27:35.312] - relay: TRUE [17:27:35.312] - stdout: TRUE [17:27:35.312] - signal: TRUE [17:27:35.312] - resignal: FALSE [17:27:35.313] - force: TRUE [17:27:35.313] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.313] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.313] - until=3 [17:27:35.314] - relaying element #3 [17:27:35.314] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.314] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.315] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.315] length: 1 (resolved future 3) [17:27:35.315] resolved() for 'SequentialFuture' ... [17:27:35.316] - state: 'finished' [17:27:35.316] - run: TRUE [17:27:35.316] - result: 'FutureResult' [17:27:35.317] resolved() for 'SequentialFuture' ... done [17:27:35.317] Future #4 [17:27:35.317] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.317] - nx: 4 [17:27:35.318] - relay: TRUE [17:27:35.318] - stdout: TRUE [17:27:35.318] - signal: TRUE [17:27:35.318] - resignal: FALSE [17:27:35.319] - force: TRUE [17:27:35.319] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.319] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.320] - until=4 [17:27:35.320] - relaying element #4 [17:27:35.320] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.320] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.321] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.321] length: 0 (resolved future 4) [17:27:35.321] Relaying remaining futures [17:27:35.322] signalConditionsASAP(NULL, pos=0) ... [17:27:35.322] - nx: 4 [17:27:35.322] - relay: TRUE [17:27:35.322] - stdout: TRUE [17:27:35.323] - signal: TRUE [17:27:35.323] - resignal: FALSE [17:27:35.323] - force: TRUE [17:27:35.323] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.324] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:35.324] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.324] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.325] signalConditionsASAP(NULL, pos=0) ... done [17:27:35.325] resolve() on environment ... DONE Dimensions: c(2, 1, 3, 1) [17:27:35.326] getGlobalsAndPackages() ... [17:27:35.326] Searching for globals... [17:27:35.327] [17:27:35.327] Searching for globals ... DONE [17:27:35.328] - globals: [0] [17:27:35.328] getGlobalsAndPackages() ... DONE [17:27:35.329] run() for 'Future' ... [17:27:35.329] - state: 'created' [17:27:35.329] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.330] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.330] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.330] - Field: 'label' [17:27:35.331] - Field: 'local' [17:27:35.331] - Field: 'owner' [17:27:35.331] - Field: 'envir' [17:27:35.332] - Field: 'packages' [17:27:35.332] - Field: 'gc' [17:27:35.332] - Field: 'conditions' [17:27:35.332] - Field: 'expr' [17:27:35.333] - Field: 'uuid' [17:27:35.333] - Field: 'seed' [17:27:35.333] - Field: 'version' [17:27:35.334] - Field: 'result' [17:27:35.334] - Field: 'asynchronous' [17:27:35.334] - Field: 'calls' [17:27:35.335] - Field: 'globals' [17:27:35.335] - Field: 'stdout' [17:27:35.335] - Field: 'earlySignal' [17:27:35.335] - Field: 'lazy' [17:27:35.336] - Field: 'state' [17:27:35.336] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.336] - Launch lazy future ... [17:27:35.337] Packages needed by the future expression (n = 0): [17:27:35.337] Packages needed by future strategies (n = 0): [17:27:35.338] { [17:27:35.338] { [17:27:35.338] { [17:27:35.338] ...future.startTime <- base::Sys.time() [17:27:35.338] { [17:27:35.338] { [17:27:35.338] { [17:27:35.338] base::local({ [17:27:35.338] has_future <- base::requireNamespace("future", [17:27:35.338] quietly = TRUE) [17:27:35.338] if (has_future) { [17:27:35.338] ns <- base::getNamespace("future") [17:27:35.338] version <- ns[[".package"]][["version"]] [17:27:35.338] if (is.null(version)) [17:27:35.338] version <- utils::packageVersion("future") [17:27:35.338] } [17:27:35.338] else { [17:27:35.338] version <- NULL [17:27:35.338] } [17:27:35.338] if (!has_future || version < "1.8.0") { [17:27:35.338] info <- base::c(r_version = base::gsub("R version ", [17:27:35.338] "", base::R.version$version.string), [17:27:35.338] platform = base::sprintf("%s (%s-bit)", [17:27:35.338] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.338] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.338] "release", "version")], collapse = " "), [17:27:35.338] hostname = base::Sys.info()[["nodename"]]) [17:27:35.338] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.338] info) [17:27:35.338] info <- base::paste(info, collapse = "; ") [17:27:35.338] if (!has_future) { [17:27:35.338] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.338] info) [17:27:35.338] } [17:27:35.338] else { [17:27:35.338] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.338] info, version) [17:27:35.338] } [17:27:35.338] base::stop(msg) [17:27:35.338] } [17:27:35.338] }) [17:27:35.338] } [17:27:35.338] ...future.strategy.old <- future::plan("list") [17:27:35.338] options(future.plan = NULL) [17:27:35.338] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.338] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.338] } [17:27:35.338] ...future.workdir <- getwd() [17:27:35.338] } [17:27:35.338] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.338] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.338] } [17:27:35.338] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.338] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.338] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.338] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.338] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.338] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.338] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.338] base::names(...future.oldOptions)) [17:27:35.338] } [17:27:35.338] if (FALSE) { [17:27:35.338] } [17:27:35.338] else { [17:27:35.338] if (TRUE) { [17:27:35.338] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.338] open = "w") [17:27:35.338] } [17:27:35.338] else { [17:27:35.338] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.338] windows = "NUL", "/dev/null"), open = "w") [17:27:35.338] } [17:27:35.338] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.338] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.338] base::sink(type = "output", split = FALSE) [17:27:35.338] base::close(...future.stdout) [17:27:35.338] }, add = TRUE) [17:27:35.338] } [17:27:35.338] ...future.frame <- base::sys.nframe() [17:27:35.338] ...future.conditions <- base::list() [17:27:35.338] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.338] if (FALSE) { [17:27:35.338] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.338] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.338] } [17:27:35.338] ...future.result <- base::tryCatch({ [17:27:35.338] base::withCallingHandlers({ [17:27:35.338] ...future.value <- base::withVisible(base::local(2)) [17:27:35.338] future::FutureResult(value = ...future.value$value, [17:27:35.338] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.338] ...future.rng), globalenv = if (FALSE) [17:27:35.338] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.338] ...future.globalenv.names)) [17:27:35.338] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.338] }, condition = base::local({ [17:27:35.338] c <- base::c [17:27:35.338] inherits <- base::inherits [17:27:35.338] invokeRestart <- base::invokeRestart [17:27:35.338] length <- base::length [17:27:35.338] list <- base::list [17:27:35.338] seq.int <- base::seq.int [17:27:35.338] signalCondition <- base::signalCondition [17:27:35.338] sys.calls <- base::sys.calls [17:27:35.338] `[[` <- base::`[[` [17:27:35.338] `+` <- base::`+` [17:27:35.338] `<<-` <- base::`<<-` [17:27:35.338] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.338] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.338] 3L)] [17:27:35.338] } [17:27:35.338] function(cond) { [17:27:35.338] is_error <- inherits(cond, "error") [17:27:35.338] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.338] NULL) [17:27:35.338] if (is_error) { [17:27:35.338] sessionInformation <- function() { [17:27:35.338] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.338] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.338] search = base::search(), system = base::Sys.info()) [17:27:35.338] } [17:27:35.338] ...future.conditions[[length(...future.conditions) + [17:27:35.338] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.338] cond$call), session = sessionInformation(), [17:27:35.338] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.338] signalCondition(cond) [17:27:35.338] } [17:27:35.338] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.338] "immediateCondition"))) { [17:27:35.338] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.338] ...future.conditions[[length(...future.conditions) + [17:27:35.338] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.338] if (TRUE && !signal) { [17:27:35.338] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.338] { [17:27:35.338] inherits <- base::inherits [17:27:35.338] invokeRestart <- base::invokeRestart [17:27:35.338] is.null <- base::is.null [17:27:35.338] muffled <- FALSE [17:27:35.338] if (inherits(cond, "message")) { [17:27:35.338] muffled <- grepl(pattern, "muffleMessage") [17:27:35.338] if (muffled) [17:27:35.338] invokeRestart("muffleMessage") [17:27:35.338] } [17:27:35.338] else if (inherits(cond, "warning")) { [17:27:35.338] muffled <- grepl(pattern, "muffleWarning") [17:27:35.338] if (muffled) [17:27:35.338] invokeRestart("muffleWarning") [17:27:35.338] } [17:27:35.338] else if (inherits(cond, "condition")) { [17:27:35.338] if (!is.null(pattern)) { [17:27:35.338] computeRestarts <- base::computeRestarts [17:27:35.338] grepl <- base::grepl [17:27:35.338] restarts <- computeRestarts(cond) [17:27:35.338] for (restart in restarts) { [17:27:35.338] name <- restart$name [17:27:35.338] if (is.null(name)) [17:27:35.338] next [17:27:35.338] if (!grepl(pattern, name)) [17:27:35.338] next [17:27:35.338] invokeRestart(restart) [17:27:35.338] muffled <- TRUE [17:27:35.338] break [17:27:35.338] } [17:27:35.338] } [17:27:35.338] } [17:27:35.338] invisible(muffled) [17:27:35.338] } [17:27:35.338] muffleCondition(cond, pattern = "^muffle") [17:27:35.338] } [17:27:35.338] } [17:27:35.338] else { [17:27:35.338] if (TRUE) { [17:27:35.338] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.338] { [17:27:35.338] inherits <- base::inherits [17:27:35.338] invokeRestart <- base::invokeRestart [17:27:35.338] is.null <- base::is.null [17:27:35.338] muffled <- FALSE [17:27:35.338] if (inherits(cond, "message")) { [17:27:35.338] muffled <- grepl(pattern, "muffleMessage") [17:27:35.338] if (muffled) [17:27:35.338] invokeRestart("muffleMessage") [17:27:35.338] } [17:27:35.338] else if (inherits(cond, "warning")) { [17:27:35.338] muffled <- grepl(pattern, "muffleWarning") [17:27:35.338] if (muffled) [17:27:35.338] invokeRestart("muffleWarning") [17:27:35.338] } [17:27:35.338] else if (inherits(cond, "condition")) { [17:27:35.338] if (!is.null(pattern)) { [17:27:35.338] computeRestarts <- base::computeRestarts [17:27:35.338] grepl <- base::grepl [17:27:35.338] restarts <- computeRestarts(cond) [17:27:35.338] for (restart in restarts) { [17:27:35.338] name <- restart$name [17:27:35.338] if (is.null(name)) [17:27:35.338] next [17:27:35.338] if (!grepl(pattern, name)) [17:27:35.338] next [17:27:35.338] invokeRestart(restart) [17:27:35.338] muffled <- TRUE [17:27:35.338] break [17:27:35.338] } [17:27:35.338] } [17:27:35.338] } [17:27:35.338] invisible(muffled) [17:27:35.338] } [17:27:35.338] muffleCondition(cond, pattern = "^muffle") [17:27:35.338] } [17:27:35.338] } [17:27:35.338] } [17:27:35.338] })) [17:27:35.338] }, error = function(ex) { [17:27:35.338] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.338] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.338] ...future.rng), started = ...future.startTime, [17:27:35.338] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.338] version = "1.8"), class = "FutureResult") [17:27:35.338] }, finally = { [17:27:35.338] if (!identical(...future.workdir, getwd())) [17:27:35.338] setwd(...future.workdir) [17:27:35.338] { [17:27:35.338] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.338] ...future.oldOptions$nwarnings <- NULL [17:27:35.338] } [17:27:35.338] base::options(...future.oldOptions) [17:27:35.338] if (.Platform$OS.type == "windows") { [17:27:35.338] old_names <- names(...future.oldEnvVars) [17:27:35.338] envs <- base::Sys.getenv() [17:27:35.338] names <- names(envs) [17:27:35.338] common <- intersect(names, old_names) [17:27:35.338] added <- setdiff(names, old_names) [17:27:35.338] removed <- setdiff(old_names, names) [17:27:35.338] changed <- common[...future.oldEnvVars[common] != [17:27:35.338] envs[common]] [17:27:35.338] NAMES <- toupper(changed) [17:27:35.338] args <- list() [17:27:35.338] for (kk in seq_along(NAMES)) { [17:27:35.338] name <- changed[[kk]] [17:27:35.338] NAME <- NAMES[[kk]] [17:27:35.338] if (name != NAME && is.element(NAME, old_names)) [17:27:35.338] next [17:27:35.338] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.338] } [17:27:35.338] NAMES <- toupper(added) [17:27:35.338] for (kk in seq_along(NAMES)) { [17:27:35.338] name <- added[[kk]] [17:27:35.338] NAME <- NAMES[[kk]] [17:27:35.338] if (name != NAME && is.element(NAME, old_names)) [17:27:35.338] next [17:27:35.338] args[[name]] <- "" [17:27:35.338] } [17:27:35.338] NAMES <- toupper(removed) [17:27:35.338] for (kk in seq_along(NAMES)) { [17:27:35.338] name <- removed[[kk]] [17:27:35.338] NAME <- NAMES[[kk]] [17:27:35.338] if (name != NAME && is.element(NAME, old_names)) [17:27:35.338] next [17:27:35.338] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.338] } [17:27:35.338] if (length(args) > 0) [17:27:35.338] base::do.call(base::Sys.setenv, args = args) [17:27:35.338] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.338] } [17:27:35.338] else { [17:27:35.338] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.338] } [17:27:35.338] { [17:27:35.338] if (base::length(...future.futureOptionsAdded) > [17:27:35.338] 0L) { [17:27:35.338] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.338] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.338] base::options(opts) [17:27:35.338] } [17:27:35.338] { [17:27:35.338] { [17:27:35.338] NULL [17:27:35.338] RNGkind("Mersenne-Twister") [17:27:35.338] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.338] inherits = FALSE) [17:27:35.338] } [17:27:35.338] options(future.plan = NULL) [17:27:35.338] if (is.na(NA_character_)) [17:27:35.338] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.338] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.338] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.338] .init = FALSE) [17:27:35.338] } [17:27:35.338] } [17:27:35.338] } [17:27:35.338] }) [17:27:35.338] if (TRUE) { [17:27:35.338] base::sink(type = "output", split = FALSE) [17:27:35.338] if (TRUE) { [17:27:35.338] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.338] } [17:27:35.338] else { [17:27:35.338] ...future.result["stdout"] <- base::list(NULL) [17:27:35.338] } [17:27:35.338] base::close(...future.stdout) [17:27:35.338] ...future.stdout <- NULL [17:27:35.338] } [17:27:35.338] ...future.result$conditions <- ...future.conditions [17:27:35.338] ...future.result$finished <- base::Sys.time() [17:27:35.338] ...future.result [17:27:35.338] } [17:27:35.344] plan(): Setting new future strategy stack: [17:27:35.344] List of future strategies: [17:27:35.344] 1. sequential: [17:27:35.344] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.344] - tweaked: FALSE [17:27:35.344] - call: NULL [17:27:35.345] plan(): nbrOfWorkers() = 1 [17:27:35.349] plan(): Setting new future strategy stack: [17:27:35.349] List of future strategies: [17:27:35.349] 1. sequential: [17:27:35.349] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.349] - tweaked: FALSE [17:27:35.349] - call: plan(strategy) [17:27:35.351] plan(): nbrOfWorkers() = 1 [17:27:35.351] SequentialFuture started (and completed) [17:27:35.351] - Launch lazy future ... done [17:27:35.352] run() for 'SequentialFuture' ... done [17:27:35.352] getGlobalsAndPackages() ... [17:27:35.352] Searching for globals... [17:27:35.353] [17:27:35.353] Searching for globals ... DONE [17:27:35.354] - globals: [0] [17:27:35.354] getGlobalsAndPackages() ... DONE [17:27:35.354] run() for 'Future' ... [17:27:35.355] - state: 'created' [17:27:35.355] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.356] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.356] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.356] - Field: 'label' [17:27:35.356] - Field: 'local' [17:27:35.357] - Field: 'owner' [17:27:35.357] - Field: 'envir' [17:27:35.357] - Field: 'packages' [17:27:35.358] - Field: 'gc' [17:27:35.358] - Field: 'conditions' [17:27:35.358] - Field: 'expr' [17:27:35.358] - Field: 'uuid' [17:27:35.359] - Field: 'seed' [17:27:35.359] - Field: 'version' [17:27:35.359] - Field: 'result' [17:27:35.360] - Field: 'asynchronous' [17:27:35.360] - Field: 'calls' [17:27:35.360] - Field: 'globals' [17:27:35.361] - Field: 'stdout' [17:27:35.361] - Field: 'earlySignal' [17:27:35.361] - Field: 'lazy' [17:27:35.361] - Field: 'state' [17:27:35.362] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.362] - Launch lazy future ... [17:27:35.362] Packages needed by the future expression (n = 0): [17:27:35.363] Packages needed by future strategies (n = 0): [17:27:35.364] { [17:27:35.364] { [17:27:35.364] { [17:27:35.364] ...future.startTime <- base::Sys.time() [17:27:35.364] { [17:27:35.364] { [17:27:35.364] { [17:27:35.364] base::local({ [17:27:35.364] has_future <- base::requireNamespace("future", [17:27:35.364] quietly = TRUE) [17:27:35.364] if (has_future) { [17:27:35.364] ns <- base::getNamespace("future") [17:27:35.364] version <- ns[[".package"]][["version"]] [17:27:35.364] if (is.null(version)) [17:27:35.364] version <- utils::packageVersion("future") [17:27:35.364] } [17:27:35.364] else { [17:27:35.364] version <- NULL [17:27:35.364] } [17:27:35.364] if (!has_future || version < "1.8.0") { [17:27:35.364] info <- base::c(r_version = base::gsub("R version ", [17:27:35.364] "", base::R.version$version.string), [17:27:35.364] platform = base::sprintf("%s (%s-bit)", [17:27:35.364] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.364] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.364] "release", "version")], collapse = " "), [17:27:35.364] hostname = base::Sys.info()[["nodename"]]) [17:27:35.364] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.364] info) [17:27:35.364] info <- base::paste(info, collapse = "; ") [17:27:35.364] if (!has_future) { [17:27:35.364] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.364] info) [17:27:35.364] } [17:27:35.364] else { [17:27:35.364] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.364] info, version) [17:27:35.364] } [17:27:35.364] base::stop(msg) [17:27:35.364] } [17:27:35.364] }) [17:27:35.364] } [17:27:35.364] ...future.strategy.old <- future::plan("list") [17:27:35.364] options(future.plan = NULL) [17:27:35.364] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.364] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.364] } [17:27:35.364] ...future.workdir <- getwd() [17:27:35.364] } [17:27:35.364] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.364] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.364] } [17:27:35.364] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.364] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.364] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.364] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.364] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.364] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.364] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.364] base::names(...future.oldOptions)) [17:27:35.364] } [17:27:35.364] if (FALSE) { [17:27:35.364] } [17:27:35.364] else { [17:27:35.364] if (TRUE) { [17:27:35.364] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.364] open = "w") [17:27:35.364] } [17:27:35.364] else { [17:27:35.364] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.364] windows = "NUL", "/dev/null"), open = "w") [17:27:35.364] } [17:27:35.364] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.364] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.364] base::sink(type = "output", split = FALSE) [17:27:35.364] base::close(...future.stdout) [17:27:35.364] }, add = TRUE) [17:27:35.364] } [17:27:35.364] ...future.frame <- base::sys.nframe() [17:27:35.364] ...future.conditions <- base::list() [17:27:35.364] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.364] if (FALSE) { [17:27:35.364] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.364] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.364] } [17:27:35.364] ...future.result <- base::tryCatch({ [17:27:35.364] base::withCallingHandlers({ [17:27:35.364] ...future.value <- base::withVisible(base::local(NULL)) [17:27:35.364] future::FutureResult(value = ...future.value$value, [17:27:35.364] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.364] ...future.rng), globalenv = if (FALSE) [17:27:35.364] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.364] ...future.globalenv.names)) [17:27:35.364] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.364] }, condition = base::local({ [17:27:35.364] c <- base::c [17:27:35.364] inherits <- base::inherits [17:27:35.364] invokeRestart <- base::invokeRestart [17:27:35.364] length <- base::length [17:27:35.364] list <- base::list [17:27:35.364] seq.int <- base::seq.int [17:27:35.364] signalCondition <- base::signalCondition [17:27:35.364] sys.calls <- base::sys.calls [17:27:35.364] `[[` <- base::`[[` [17:27:35.364] `+` <- base::`+` [17:27:35.364] `<<-` <- base::`<<-` [17:27:35.364] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.364] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.364] 3L)] [17:27:35.364] } [17:27:35.364] function(cond) { [17:27:35.364] is_error <- inherits(cond, "error") [17:27:35.364] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.364] NULL) [17:27:35.364] if (is_error) { [17:27:35.364] sessionInformation <- function() { [17:27:35.364] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.364] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.364] search = base::search(), system = base::Sys.info()) [17:27:35.364] } [17:27:35.364] ...future.conditions[[length(...future.conditions) + [17:27:35.364] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.364] cond$call), session = sessionInformation(), [17:27:35.364] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.364] signalCondition(cond) [17:27:35.364] } [17:27:35.364] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.364] "immediateCondition"))) { [17:27:35.364] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.364] ...future.conditions[[length(...future.conditions) + [17:27:35.364] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.364] if (TRUE && !signal) { [17:27:35.364] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.364] { [17:27:35.364] inherits <- base::inherits [17:27:35.364] invokeRestart <- base::invokeRestart [17:27:35.364] is.null <- base::is.null [17:27:35.364] muffled <- FALSE [17:27:35.364] if (inherits(cond, "message")) { [17:27:35.364] muffled <- grepl(pattern, "muffleMessage") [17:27:35.364] if (muffled) [17:27:35.364] invokeRestart("muffleMessage") [17:27:35.364] } [17:27:35.364] else if (inherits(cond, "warning")) { [17:27:35.364] muffled <- grepl(pattern, "muffleWarning") [17:27:35.364] if (muffled) [17:27:35.364] invokeRestart("muffleWarning") [17:27:35.364] } [17:27:35.364] else if (inherits(cond, "condition")) { [17:27:35.364] if (!is.null(pattern)) { [17:27:35.364] computeRestarts <- base::computeRestarts [17:27:35.364] grepl <- base::grepl [17:27:35.364] restarts <- computeRestarts(cond) [17:27:35.364] for (restart in restarts) { [17:27:35.364] name <- restart$name [17:27:35.364] if (is.null(name)) [17:27:35.364] next [17:27:35.364] if (!grepl(pattern, name)) [17:27:35.364] next [17:27:35.364] invokeRestart(restart) [17:27:35.364] muffled <- TRUE [17:27:35.364] break [17:27:35.364] } [17:27:35.364] } [17:27:35.364] } [17:27:35.364] invisible(muffled) [17:27:35.364] } [17:27:35.364] muffleCondition(cond, pattern = "^muffle") [17:27:35.364] } [17:27:35.364] } [17:27:35.364] else { [17:27:35.364] if (TRUE) { [17:27:35.364] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.364] { [17:27:35.364] inherits <- base::inherits [17:27:35.364] invokeRestart <- base::invokeRestart [17:27:35.364] is.null <- base::is.null [17:27:35.364] muffled <- FALSE [17:27:35.364] if (inherits(cond, "message")) { [17:27:35.364] muffled <- grepl(pattern, "muffleMessage") [17:27:35.364] if (muffled) [17:27:35.364] invokeRestart("muffleMessage") [17:27:35.364] } [17:27:35.364] else if (inherits(cond, "warning")) { [17:27:35.364] muffled <- grepl(pattern, "muffleWarning") [17:27:35.364] if (muffled) [17:27:35.364] invokeRestart("muffleWarning") [17:27:35.364] } [17:27:35.364] else if (inherits(cond, "condition")) { [17:27:35.364] if (!is.null(pattern)) { [17:27:35.364] computeRestarts <- base::computeRestarts [17:27:35.364] grepl <- base::grepl [17:27:35.364] restarts <- computeRestarts(cond) [17:27:35.364] for (restart in restarts) { [17:27:35.364] name <- restart$name [17:27:35.364] if (is.null(name)) [17:27:35.364] next [17:27:35.364] if (!grepl(pattern, name)) [17:27:35.364] next [17:27:35.364] invokeRestart(restart) [17:27:35.364] muffled <- TRUE [17:27:35.364] break [17:27:35.364] } [17:27:35.364] } [17:27:35.364] } [17:27:35.364] invisible(muffled) [17:27:35.364] } [17:27:35.364] muffleCondition(cond, pattern = "^muffle") [17:27:35.364] } [17:27:35.364] } [17:27:35.364] } [17:27:35.364] })) [17:27:35.364] }, error = function(ex) { [17:27:35.364] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.364] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.364] ...future.rng), started = ...future.startTime, [17:27:35.364] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.364] version = "1.8"), class = "FutureResult") [17:27:35.364] }, finally = { [17:27:35.364] if (!identical(...future.workdir, getwd())) [17:27:35.364] setwd(...future.workdir) [17:27:35.364] { [17:27:35.364] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.364] ...future.oldOptions$nwarnings <- NULL [17:27:35.364] } [17:27:35.364] base::options(...future.oldOptions) [17:27:35.364] if (.Platform$OS.type == "windows") { [17:27:35.364] old_names <- names(...future.oldEnvVars) [17:27:35.364] envs <- base::Sys.getenv() [17:27:35.364] names <- names(envs) [17:27:35.364] common <- intersect(names, old_names) [17:27:35.364] added <- setdiff(names, old_names) [17:27:35.364] removed <- setdiff(old_names, names) [17:27:35.364] changed <- common[...future.oldEnvVars[common] != [17:27:35.364] envs[common]] [17:27:35.364] NAMES <- toupper(changed) [17:27:35.364] args <- list() [17:27:35.364] for (kk in seq_along(NAMES)) { [17:27:35.364] name <- changed[[kk]] [17:27:35.364] NAME <- NAMES[[kk]] [17:27:35.364] if (name != NAME && is.element(NAME, old_names)) [17:27:35.364] next [17:27:35.364] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.364] } [17:27:35.364] NAMES <- toupper(added) [17:27:35.364] for (kk in seq_along(NAMES)) { [17:27:35.364] name <- added[[kk]] [17:27:35.364] NAME <- NAMES[[kk]] [17:27:35.364] if (name != NAME && is.element(NAME, old_names)) [17:27:35.364] next [17:27:35.364] args[[name]] <- "" [17:27:35.364] } [17:27:35.364] NAMES <- toupper(removed) [17:27:35.364] for (kk in seq_along(NAMES)) { [17:27:35.364] name <- removed[[kk]] [17:27:35.364] NAME <- NAMES[[kk]] [17:27:35.364] if (name != NAME && is.element(NAME, old_names)) [17:27:35.364] next [17:27:35.364] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.364] } [17:27:35.364] if (length(args) > 0) [17:27:35.364] base::do.call(base::Sys.setenv, args = args) [17:27:35.364] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.364] } [17:27:35.364] else { [17:27:35.364] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.364] } [17:27:35.364] { [17:27:35.364] if (base::length(...future.futureOptionsAdded) > [17:27:35.364] 0L) { [17:27:35.364] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.364] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.364] base::options(opts) [17:27:35.364] } [17:27:35.364] { [17:27:35.364] { [17:27:35.364] NULL [17:27:35.364] RNGkind("Mersenne-Twister") [17:27:35.364] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.364] inherits = FALSE) [17:27:35.364] } [17:27:35.364] options(future.plan = NULL) [17:27:35.364] if (is.na(NA_character_)) [17:27:35.364] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.364] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.364] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.364] .init = FALSE) [17:27:35.364] } [17:27:35.364] } [17:27:35.364] } [17:27:35.364] }) [17:27:35.364] if (TRUE) { [17:27:35.364] base::sink(type = "output", split = FALSE) [17:27:35.364] if (TRUE) { [17:27:35.364] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.364] } [17:27:35.364] else { [17:27:35.364] ...future.result["stdout"] <- base::list(NULL) [17:27:35.364] } [17:27:35.364] base::close(...future.stdout) [17:27:35.364] ...future.stdout <- NULL [17:27:35.364] } [17:27:35.364] ...future.result$conditions <- ...future.conditions [17:27:35.364] ...future.result$finished <- base::Sys.time() [17:27:35.364] ...future.result [17:27:35.364] } [17:27:35.369] plan(): Setting new future strategy stack: [17:27:35.370] List of future strategies: [17:27:35.370] 1. sequential: [17:27:35.370] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.370] - tweaked: FALSE [17:27:35.370] - call: NULL [17:27:35.371] plan(): nbrOfWorkers() = 1 [17:27:35.373] plan(): Setting new future strategy stack: [17:27:35.373] List of future strategies: [17:27:35.373] 1. sequential: [17:27:35.373] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.373] - tweaked: FALSE [17:27:35.373] - call: plan(strategy) [17:27:35.374] plan(): nbrOfWorkers() = 1 [17:27:35.374] SequentialFuture started (and completed) [17:27:35.374] - Launch lazy future ... done [17:27:35.375] run() for 'SequentialFuture' ... done [17:27:35.375] getGlobalsAndPackages() ... [17:27:35.376] Searching for globals... [17:27:35.377] - globals found: [1] '{' [17:27:35.377] Searching for globals ... DONE [17:27:35.377] Resolving globals: FALSE [17:27:35.378] [17:27:35.378] [17:27:35.379] getGlobalsAndPackages() ... DONE [17:27:35.379] run() for 'Future' ... [17:27:35.379] - state: 'created' [17:27:35.380] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.380] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.381] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.381] - Field: 'label' [17:27:35.381] - Field: 'local' [17:27:35.382] - Field: 'owner' [17:27:35.382] - Field: 'envir' [17:27:35.382] - Field: 'packages' [17:27:35.382] - Field: 'gc' [17:27:35.383] - Field: 'conditions' [17:27:35.383] - Field: 'expr' [17:27:35.383] - Field: 'uuid' [17:27:35.384] - Field: 'seed' [17:27:35.384] - Field: 'version' [17:27:35.384] - Field: 'result' [17:27:35.384] - Field: 'asynchronous' [17:27:35.385] - Field: 'calls' [17:27:35.385] - Field: 'globals' [17:27:35.385] - Field: 'stdout' [17:27:35.386] - Field: 'earlySignal' [17:27:35.386] - Field: 'lazy' [17:27:35.386] - Field: 'state' [17:27:35.386] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.387] - Launch lazy future ... [17:27:35.387] Packages needed by the future expression (n = 0): [17:27:35.387] Packages needed by future strategies (n = 0): [17:27:35.388] { [17:27:35.388] { [17:27:35.388] { [17:27:35.388] ...future.startTime <- base::Sys.time() [17:27:35.388] { [17:27:35.388] { [17:27:35.388] { [17:27:35.388] base::local({ [17:27:35.388] has_future <- base::requireNamespace("future", [17:27:35.388] quietly = TRUE) [17:27:35.388] if (has_future) { [17:27:35.388] ns <- base::getNamespace("future") [17:27:35.388] version <- ns[[".package"]][["version"]] [17:27:35.388] if (is.null(version)) [17:27:35.388] version <- utils::packageVersion("future") [17:27:35.388] } [17:27:35.388] else { [17:27:35.388] version <- NULL [17:27:35.388] } [17:27:35.388] if (!has_future || version < "1.8.0") { [17:27:35.388] info <- base::c(r_version = base::gsub("R version ", [17:27:35.388] "", base::R.version$version.string), [17:27:35.388] platform = base::sprintf("%s (%s-bit)", [17:27:35.388] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.388] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.388] "release", "version")], collapse = " "), [17:27:35.388] hostname = base::Sys.info()[["nodename"]]) [17:27:35.388] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.388] info) [17:27:35.388] info <- base::paste(info, collapse = "; ") [17:27:35.388] if (!has_future) { [17:27:35.388] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.388] info) [17:27:35.388] } [17:27:35.388] else { [17:27:35.388] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.388] info, version) [17:27:35.388] } [17:27:35.388] base::stop(msg) [17:27:35.388] } [17:27:35.388] }) [17:27:35.388] } [17:27:35.388] ...future.strategy.old <- future::plan("list") [17:27:35.388] options(future.plan = NULL) [17:27:35.388] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.388] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.388] } [17:27:35.388] ...future.workdir <- getwd() [17:27:35.388] } [17:27:35.388] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.388] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.388] } [17:27:35.388] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.388] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.388] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.388] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.388] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.388] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.388] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.388] base::names(...future.oldOptions)) [17:27:35.388] } [17:27:35.388] if (FALSE) { [17:27:35.388] } [17:27:35.388] else { [17:27:35.388] if (TRUE) { [17:27:35.388] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.388] open = "w") [17:27:35.388] } [17:27:35.388] else { [17:27:35.388] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.388] windows = "NUL", "/dev/null"), open = "w") [17:27:35.388] } [17:27:35.388] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.388] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.388] base::sink(type = "output", split = FALSE) [17:27:35.388] base::close(...future.stdout) [17:27:35.388] }, add = TRUE) [17:27:35.388] } [17:27:35.388] ...future.frame <- base::sys.nframe() [17:27:35.388] ...future.conditions <- base::list() [17:27:35.388] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.388] if (FALSE) { [17:27:35.388] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.388] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.388] } [17:27:35.388] ...future.result <- base::tryCatch({ [17:27:35.388] base::withCallingHandlers({ [17:27:35.388] ...future.value <- base::withVisible(base::local({ [17:27:35.388] 4 [17:27:35.388] })) [17:27:35.388] future::FutureResult(value = ...future.value$value, [17:27:35.388] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.388] ...future.rng), globalenv = if (FALSE) [17:27:35.388] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.388] ...future.globalenv.names)) [17:27:35.388] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.388] }, condition = base::local({ [17:27:35.388] c <- base::c [17:27:35.388] inherits <- base::inherits [17:27:35.388] invokeRestart <- base::invokeRestart [17:27:35.388] length <- base::length [17:27:35.388] list <- base::list [17:27:35.388] seq.int <- base::seq.int [17:27:35.388] signalCondition <- base::signalCondition [17:27:35.388] sys.calls <- base::sys.calls [17:27:35.388] `[[` <- base::`[[` [17:27:35.388] `+` <- base::`+` [17:27:35.388] `<<-` <- base::`<<-` [17:27:35.388] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.388] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.388] 3L)] [17:27:35.388] } [17:27:35.388] function(cond) { [17:27:35.388] is_error <- inherits(cond, "error") [17:27:35.388] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.388] NULL) [17:27:35.388] if (is_error) { [17:27:35.388] sessionInformation <- function() { [17:27:35.388] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.388] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.388] search = base::search(), system = base::Sys.info()) [17:27:35.388] } [17:27:35.388] ...future.conditions[[length(...future.conditions) + [17:27:35.388] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.388] cond$call), session = sessionInformation(), [17:27:35.388] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.388] signalCondition(cond) [17:27:35.388] } [17:27:35.388] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.388] "immediateCondition"))) { [17:27:35.388] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.388] ...future.conditions[[length(...future.conditions) + [17:27:35.388] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.388] if (TRUE && !signal) { [17:27:35.388] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.388] { [17:27:35.388] inherits <- base::inherits [17:27:35.388] invokeRestart <- base::invokeRestart [17:27:35.388] is.null <- base::is.null [17:27:35.388] muffled <- FALSE [17:27:35.388] if (inherits(cond, "message")) { [17:27:35.388] muffled <- grepl(pattern, "muffleMessage") [17:27:35.388] if (muffled) [17:27:35.388] invokeRestart("muffleMessage") [17:27:35.388] } [17:27:35.388] else if (inherits(cond, "warning")) { [17:27:35.388] muffled <- grepl(pattern, "muffleWarning") [17:27:35.388] if (muffled) [17:27:35.388] invokeRestart("muffleWarning") [17:27:35.388] } [17:27:35.388] else if (inherits(cond, "condition")) { [17:27:35.388] if (!is.null(pattern)) { [17:27:35.388] computeRestarts <- base::computeRestarts [17:27:35.388] grepl <- base::grepl [17:27:35.388] restarts <- computeRestarts(cond) [17:27:35.388] for (restart in restarts) { [17:27:35.388] name <- restart$name [17:27:35.388] if (is.null(name)) [17:27:35.388] next [17:27:35.388] if (!grepl(pattern, name)) [17:27:35.388] next [17:27:35.388] invokeRestart(restart) [17:27:35.388] muffled <- TRUE [17:27:35.388] break [17:27:35.388] } [17:27:35.388] } [17:27:35.388] } [17:27:35.388] invisible(muffled) [17:27:35.388] } [17:27:35.388] muffleCondition(cond, pattern = "^muffle") [17:27:35.388] } [17:27:35.388] } [17:27:35.388] else { [17:27:35.388] if (TRUE) { [17:27:35.388] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.388] { [17:27:35.388] inherits <- base::inherits [17:27:35.388] invokeRestart <- base::invokeRestart [17:27:35.388] is.null <- base::is.null [17:27:35.388] muffled <- FALSE [17:27:35.388] if (inherits(cond, "message")) { [17:27:35.388] muffled <- grepl(pattern, "muffleMessage") [17:27:35.388] if (muffled) [17:27:35.388] invokeRestart("muffleMessage") [17:27:35.388] } [17:27:35.388] else if (inherits(cond, "warning")) { [17:27:35.388] muffled <- grepl(pattern, "muffleWarning") [17:27:35.388] if (muffled) [17:27:35.388] invokeRestart("muffleWarning") [17:27:35.388] } [17:27:35.388] else if (inherits(cond, "condition")) { [17:27:35.388] if (!is.null(pattern)) { [17:27:35.388] computeRestarts <- base::computeRestarts [17:27:35.388] grepl <- base::grepl [17:27:35.388] restarts <- computeRestarts(cond) [17:27:35.388] for (restart in restarts) { [17:27:35.388] name <- restart$name [17:27:35.388] if (is.null(name)) [17:27:35.388] next [17:27:35.388] if (!grepl(pattern, name)) [17:27:35.388] next [17:27:35.388] invokeRestart(restart) [17:27:35.388] muffled <- TRUE [17:27:35.388] break [17:27:35.388] } [17:27:35.388] } [17:27:35.388] } [17:27:35.388] invisible(muffled) [17:27:35.388] } [17:27:35.388] muffleCondition(cond, pattern = "^muffle") [17:27:35.388] } [17:27:35.388] } [17:27:35.388] } [17:27:35.388] })) [17:27:35.388] }, error = function(ex) { [17:27:35.388] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.388] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.388] ...future.rng), started = ...future.startTime, [17:27:35.388] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.388] version = "1.8"), class = "FutureResult") [17:27:35.388] }, finally = { [17:27:35.388] if (!identical(...future.workdir, getwd())) [17:27:35.388] setwd(...future.workdir) [17:27:35.388] { [17:27:35.388] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.388] ...future.oldOptions$nwarnings <- NULL [17:27:35.388] } [17:27:35.388] base::options(...future.oldOptions) [17:27:35.388] if (.Platform$OS.type == "windows") { [17:27:35.388] old_names <- names(...future.oldEnvVars) [17:27:35.388] envs <- base::Sys.getenv() [17:27:35.388] names <- names(envs) [17:27:35.388] common <- intersect(names, old_names) [17:27:35.388] added <- setdiff(names, old_names) [17:27:35.388] removed <- setdiff(old_names, names) [17:27:35.388] changed <- common[...future.oldEnvVars[common] != [17:27:35.388] envs[common]] [17:27:35.388] NAMES <- toupper(changed) [17:27:35.388] args <- list() [17:27:35.388] for (kk in seq_along(NAMES)) { [17:27:35.388] name <- changed[[kk]] [17:27:35.388] NAME <- NAMES[[kk]] [17:27:35.388] if (name != NAME && is.element(NAME, old_names)) [17:27:35.388] next [17:27:35.388] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.388] } [17:27:35.388] NAMES <- toupper(added) [17:27:35.388] for (kk in seq_along(NAMES)) { [17:27:35.388] name <- added[[kk]] [17:27:35.388] NAME <- NAMES[[kk]] [17:27:35.388] if (name != NAME && is.element(NAME, old_names)) [17:27:35.388] next [17:27:35.388] args[[name]] <- "" [17:27:35.388] } [17:27:35.388] NAMES <- toupper(removed) [17:27:35.388] for (kk in seq_along(NAMES)) { [17:27:35.388] name <- removed[[kk]] [17:27:35.388] NAME <- NAMES[[kk]] [17:27:35.388] if (name != NAME && is.element(NAME, old_names)) [17:27:35.388] next [17:27:35.388] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.388] } [17:27:35.388] if (length(args) > 0) [17:27:35.388] base::do.call(base::Sys.setenv, args = args) [17:27:35.388] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.388] } [17:27:35.388] else { [17:27:35.388] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.388] } [17:27:35.388] { [17:27:35.388] if (base::length(...future.futureOptionsAdded) > [17:27:35.388] 0L) { [17:27:35.388] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.388] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.388] base::options(opts) [17:27:35.388] } [17:27:35.388] { [17:27:35.388] { [17:27:35.388] NULL [17:27:35.388] RNGkind("Mersenne-Twister") [17:27:35.388] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.388] inherits = FALSE) [17:27:35.388] } [17:27:35.388] options(future.plan = NULL) [17:27:35.388] if (is.na(NA_character_)) [17:27:35.388] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.388] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.388] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.388] .init = FALSE) [17:27:35.388] } [17:27:35.388] } [17:27:35.388] } [17:27:35.388] }) [17:27:35.388] if (TRUE) { [17:27:35.388] base::sink(type = "output", split = FALSE) [17:27:35.388] if (TRUE) { [17:27:35.388] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.388] } [17:27:35.388] else { [17:27:35.388] ...future.result["stdout"] <- base::list(NULL) [17:27:35.388] } [17:27:35.388] base::close(...future.stdout) [17:27:35.388] ...future.stdout <- NULL [17:27:35.388] } [17:27:35.388] ...future.result$conditions <- ...future.conditions [17:27:35.388] ...future.result$finished <- base::Sys.time() [17:27:35.388] ...future.result [17:27:35.388] } [17:27:35.392] plan(): Setting new future strategy stack: [17:27:35.392] List of future strategies: [17:27:35.392] 1. sequential: [17:27:35.392] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.392] - tweaked: FALSE [17:27:35.392] - call: NULL [17:27:35.393] plan(): nbrOfWorkers() = 1 [17:27:35.395] plan(): Setting new future strategy stack: [17:27:35.395] List of future strategies: [17:27:35.395] 1. sequential: [17:27:35.395] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.395] - tweaked: FALSE [17:27:35.395] - call: plan(strategy) [17:27:35.396] plan(): nbrOfWorkers() = 1 [17:27:35.396] SequentialFuture started (and completed) [17:27:35.397] - Launch lazy future ... done [17:27:35.397] run() for 'SequentialFuture' ... done [17:27:35.399] resolved() for 'SequentialFuture' ... [17:27:35.400] - state: 'finished' [17:27:35.400] - run: TRUE [17:27:35.400] - result: 'FutureResult' [17:27:35.400] resolved() for 'SequentialFuture' ... done [17:27:35.401] resolved() for 'SequentialFuture' ... [17:27:35.401] - state: 'finished' [17:27:35.401] - run: TRUE [17:27:35.402] - result: 'FutureResult' [17:27:35.402] resolved() for 'SequentialFuture' ... done [17:27:35.402] resolved() for 'SequentialFuture' ... [17:27:35.403] - state: 'finished' [17:27:35.403] - run: TRUE [17:27:35.403] - result: 'FutureResult' [17:27:35.404] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:35.409] resolve() on environment ... [17:27:35.409] recursive: 0 [17:27:35.410] elements: [4] 'a', 'b', 'c', 'd' [17:27:35.411] signalConditionsASAP(numeric, pos=1) ... [17:27:35.411] - nx: 4 [17:27:35.411] - relay: TRUE [17:27:35.412] - stdout: TRUE [17:27:35.412] - signal: TRUE [17:27:35.412] - resignal: FALSE [17:27:35.412] - force: TRUE [17:27:35.413] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.413] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.413] - until=2 [17:27:35.414] - relaying element #2 [17:27:35.414] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.414] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.414] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.415] length: 3 (resolved future 1) [17:27:35.415] resolved() for 'SequentialFuture' ... [17:27:35.415] - state: 'finished' [17:27:35.416] - run: TRUE [17:27:35.416] - result: 'FutureResult' [17:27:35.416] resolved() for 'SequentialFuture' ... done [17:27:35.417] Future #2 [17:27:35.417] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.418] - nx: 4 [17:27:35.418] - relay: TRUE [17:27:35.418] - stdout: TRUE [17:27:35.418] - signal: TRUE [17:27:35.419] - resignal: FALSE [17:27:35.419] - force: TRUE [17:27:35.419] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:35.419] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:35.420] - until=2 [17:27:35.420] - relaying element #2 [17:27:35.421] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.421] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.421] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.422] length: 2 (resolved future 2) [17:27:35.422] resolved() for 'SequentialFuture' ... [17:27:35.422] - state: 'finished' [17:27:35.423] - run: TRUE [17:27:35.423] - result: 'FutureResult' [17:27:35.423] resolved() for 'SequentialFuture' ... done [17:27:35.424] Future #3 [17:27:35.424] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.424] - nx: 4 [17:27:35.424] - relay: TRUE [17:27:35.425] - stdout: TRUE [17:27:35.425] - signal: TRUE [17:27:35.425] - resignal: FALSE [17:27:35.426] - force: TRUE [17:27:35.426] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:35.426] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:35.426] - until=3 [17:27:35.427] - relaying element #3 [17:27:35.427] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.428] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.428] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.428] length: 1 (resolved future 3) [17:27:35.428] resolved() for 'SequentialFuture' ... [17:27:35.429] - state: 'finished' [17:27:35.429] - run: TRUE [17:27:35.429] - result: 'FutureResult' [17:27:35.430] resolved() for 'SequentialFuture' ... done [17:27:35.430] Future #4 [17:27:35.431] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.431] - nx: 4 [17:27:35.431] - relay: TRUE [17:27:35.431] - stdout: TRUE [17:27:35.432] - signal: TRUE [17:27:35.432] - resignal: FALSE [17:27:35.432] - force: TRUE [17:27:35.432] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:35.433] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:35.433] - until=4 [17:27:35.433] - relaying element #4 [17:27:35.434] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.434] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.434] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.435] length: 0 (resolved future 4) [17:27:35.435] Relaying remaining futures [17:27:35.435] signalConditionsASAP(NULL, pos=0) ... [17:27:35.436] - nx: 4 [17:27:35.436] - relay: TRUE [17:27:35.436] - stdout: TRUE [17:27:35.436] - signal: TRUE [17:27:35.437] - resignal: FALSE [17:27:35.437] - force: TRUE [17:27:35.437] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.437] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:35.438] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:35.438] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:35.438] signalConditionsASAP(NULL, pos=0) ... done [17:27:35.439] resolve() on environment ... DONE *** futures() - environment ... DONE Type of object: listenv Type of future: sequential [17:27:35.441] plan(): Setting new future strategy stack: [17:27:35.441] List of future strategies: [17:27:35.441] 1. sequential: [17:27:35.441] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.441] - tweaked: FALSE [17:27:35.441] - call: plan(strategy) [17:27:35.442] plan(): nbrOfWorkers() = 1 Dimensions: NULL [17:27:35.443] getGlobalsAndPackages() ... [17:27:35.443] Searching for globals... [17:27:35.444] [17:27:35.444] Searching for globals ... DONE [17:27:35.444] - globals: [0] [17:27:35.445] getGlobalsAndPackages() ... DONE [17:27:35.445] run() for 'Future' ... [17:27:35.445] - state: 'created' [17:27:35.446] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.446] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.446] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.447] - Field: 'label' [17:27:35.447] - Field: 'local' [17:27:35.447] - Field: 'owner' [17:27:35.448] - Field: 'envir' [17:27:35.448] - Field: 'packages' [17:27:35.448] - Field: 'gc' [17:27:35.448] - Field: 'conditions' [17:27:35.449] - Field: 'expr' [17:27:35.449] - Field: 'uuid' [17:27:35.449] - Field: 'seed' [17:27:35.450] - Field: 'version' [17:27:35.450] - Field: 'result' [17:27:35.450] - Field: 'asynchronous' [17:27:35.451] - Field: 'calls' [17:27:35.451] - Field: 'globals' [17:27:35.451] - Field: 'stdout' [17:27:35.452] - Field: 'earlySignal' [17:27:35.452] - Field: 'lazy' [17:27:35.452] - Field: 'state' [17:27:35.452] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.453] - Launch lazy future ... [17:27:35.453] Packages needed by the future expression (n = 0): [17:27:35.454] Packages needed by future strategies (n = 0): [17:27:35.455] { [17:27:35.455] { [17:27:35.455] { [17:27:35.455] ...future.startTime <- base::Sys.time() [17:27:35.455] { [17:27:35.455] { [17:27:35.455] { [17:27:35.455] base::local({ [17:27:35.455] has_future <- base::requireNamespace("future", [17:27:35.455] quietly = TRUE) [17:27:35.455] if (has_future) { [17:27:35.455] ns <- base::getNamespace("future") [17:27:35.455] version <- ns[[".package"]][["version"]] [17:27:35.455] if (is.null(version)) [17:27:35.455] version <- utils::packageVersion("future") [17:27:35.455] } [17:27:35.455] else { [17:27:35.455] version <- NULL [17:27:35.455] } [17:27:35.455] if (!has_future || version < "1.8.0") { [17:27:35.455] info <- base::c(r_version = base::gsub("R version ", [17:27:35.455] "", base::R.version$version.string), [17:27:35.455] platform = base::sprintf("%s (%s-bit)", [17:27:35.455] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.455] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.455] "release", "version")], collapse = " "), [17:27:35.455] hostname = base::Sys.info()[["nodename"]]) [17:27:35.455] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.455] info) [17:27:35.455] info <- base::paste(info, collapse = "; ") [17:27:35.455] if (!has_future) { [17:27:35.455] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.455] info) [17:27:35.455] } [17:27:35.455] else { [17:27:35.455] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.455] info, version) [17:27:35.455] } [17:27:35.455] base::stop(msg) [17:27:35.455] } [17:27:35.455] }) [17:27:35.455] } [17:27:35.455] ...future.strategy.old <- future::plan("list") [17:27:35.455] options(future.plan = NULL) [17:27:35.455] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.455] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.455] } [17:27:35.455] ...future.workdir <- getwd() [17:27:35.455] } [17:27:35.455] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.455] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.455] } [17:27:35.455] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.455] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.455] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.455] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.455] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.455] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.455] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.455] base::names(...future.oldOptions)) [17:27:35.455] } [17:27:35.455] if (FALSE) { [17:27:35.455] } [17:27:35.455] else { [17:27:35.455] if (TRUE) { [17:27:35.455] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.455] open = "w") [17:27:35.455] } [17:27:35.455] else { [17:27:35.455] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.455] windows = "NUL", "/dev/null"), open = "w") [17:27:35.455] } [17:27:35.455] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.455] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.455] base::sink(type = "output", split = FALSE) [17:27:35.455] base::close(...future.stdout) [17:27:35.455] }, add = TRUE) [17:27:35.455] } [17:27:35.455] ...future.frame <- base::sys.nframe() [17:27:35.455] ...future.conditions <- base::list() [17:27:35.455] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.455] if (FALSE) { [17:27:35.455] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.455] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.455] } [17:27:35.455] ...future.result <- base::tryCatch({ [17:27:35.455] base::withCallingHandlers({ [17:27:35.455] ...future.value <- base::withVisible(base::local(2)) [17:27:35.455] future::FutureResult(value = ...future.value$value, [17:27:35.455] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.455] ...future.rng), globalenv = if (FALSE) [17:27:35.455] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.455] ...future.globalenv.names)) [17:27:35.455] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.455] }, condition = base::local({ [17:27:35.455] c <- base::c [17:27:35.455] inherits <- base::inherits [17:27:35.455] invokeRestart <- base::invokeRestart [17:27:35.455] length <- base::length [17:27:35.455] list <- base::list [17:27:35.455] seq.int <- base::seq.int [17:27:35.455] signalCondition <- base::signalCondition [17:27:35.455] sys.calls <- base::sys.calls [17:27:35.455] `[[` <- base::`[[` [17:27:35.455] `+` <- base::`+` [17:27:35.455] `<<-` <- base::`<<-` [17:27:35.455] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.455] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.455] 3L)] [17:27:35.455] } [17:27:35.455] function(cond) { [17:27:35.455] is_error <- inherits(cond, "error") [17:27:35.455] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.455] NULL) [17:27:35.455] if (is_error) { [17:27:35.455] sessionInformation <- function() { [17:27:35.455] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.455] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.455] search = base::search(), system = base::Sys.info()) [17:27:35.455] } [17:27:35.455] ...future.conditions[[length(...future.conditions) + [17:27:35.455] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.455] cond$call), session = sessionInformation(), [17:27:35.455] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.455] signalCondition(cond) [17:27:35.455] } [17:27:35.455] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.455] "immediateCondition"))) { [17:27:35.455] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.455] ...future.conditions[[length(...future.conditions) + [17:27:35.455] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.455] if (TRUE && !signal) { [17:27:35.455] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.455] { [17:27:35.455] inherits <- base::inherits [17:27:35.455] invokeRestart <- base::invokeRestart [17:27:35.455] is.null <- base::is.null [17:27:35.455] muffled <- FALSE [17:27:35.455] if (inherits(cond, "message")) { [17:27:35.455] muffled <- grepl(pattern, "muffleMessage") [17:27:35.455] if (muffled) [17:27:35.455] invokeRestart("muffleMessage") [17:27:35.455] } [17:27:35.455] else if (inherits(cond, "warning")) { [17:27:35.455] muffled <- grepl(pattern, "muffleWarning") [17:27:35.455] if (muffled) [17:27:35.455] invokeRestart("muffleWarning") [17:27:35.455] } [17:27:35.455] else if (inherits(cond, "condition")) { [17:27:35.455] if (!is.null(pattern)) { [17:27:35.455] computeRestarts <- base::computeRestarts [17:27:35.455] grepl <- base::grepl [17:27:35.455] restarts <- computeRestarts(cond) [17:27:35.455] for (restart in restarts) { [17:27:35.455] name <- restart$name [17:27:35.455] if (is.null(name)) [17:27:35.455] next [17:27:35.455] if (!grepl(pattern, name)) [17:27:35.455] next [17:27:35.455] invokeRestart(restart) [17:27:35.455] muffled <- TRUE [17:27:35.455] break [17:27:35.455] } [17:27:35.455] } [17:27:35.455] } [17:27:35.455] invisible(muffled) [17:27:35.455] } [17:27:35.455] muffleCondition(cond, pattern = "^muffle") [17:27:35.455] } [17:27:35.455] } [17:27:35.455] else { [17:27:35.455] if (TRUE) { [17:27:35.455] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.455] { [17:27:35.455] inherits <- base::inherits [17:27:35.455] invokeRestart <- base::invokeRestart [17:27:35.455] is.null <- base::is.null [17:27:35.455] muffled <- FALSE [17:27:35.455] if (inherits(cond, "message")) { [17:27:35.455] muffled <- grepl(pattern, "muffleMessage") [17:27:35.455] if (muffled) [17:27:35.455] invokeRestart("muffleMessage") [17:27:35.455] } [17:27:35.455] else if (inherits(cond, "warning")) { [17:27:35.455] muffled <- grepl(pattern, "muffleWarning") [17:27:35.455] if (muffled) [17:27:35.455] invokeRestart("muffleWarning") [17:27:35.455] } [17:27:35.455] else if (inherits(cond, "condition")) { [17:27:35.455] if (!is.null(pattern)) { [17:27:35.455] computeRestarts <- base::computeRestarts [17:27:35.455] grepl <- base::grepl [17:27:35.455] restarts <- computeRestarts(cond) [17:27:35.455] for (restart in restarts) { [17:27:35.455] name <- restart$name [17:27:35.455] if (is.null(name)) [17:27:35.455] next [17:27:35.455] if (!grepl(pattern, name)) [17:27:35.455] next [17:27:35.455] invokeRestart(restart) [17:27:35.455] muffled <- TRUE [17:27:35.455] break [17:27:35.455] } [17:27:35.455] } [17:27:35.455] } [17:27:35.455] invisible(muffled) [17:27:35.455] } [17:27:35.455] muffleCondition(cond, pattern = "^muffle") [17:27:35.455] } [17:27:35.455] } [17:27:35.455] } [17:27:35.455] })) [17:27:35.455] }, error = function(ex) { [17:27:35.455] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.455] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.455] ...future.rng), started = ...future.startTime, [17:27:35.455] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.455] version = "1.8"), class = "FutureResult") [17:27:35.455] }, finally = { [17:27:35.455] if (!identical(...future.workdir, getwd())) [17:27:35.455] setwd(...future.workdir) [17:27:35.455] { [17:27:35.455] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.455] ...future.oldOptions$nwarnings <- NULL [17:27:35.455] } [17:27:35.455] base::options(...future.oldOptions) [17:27:35.455] if (.Platform$OS.type == "windows") { [17:27:35.455] old_names <- names(...future.oldEnvVars) [17:27:35.455] envs <- base::Sys.getenv() [17:27:35.455] names <- names(envs) [17:27:35.455] common <- intersect(names, old_names) [17:27:35.455] added <- setdiff(names, old_names) [17:27:35.455] removed <- setdiff(old_names, names) [17:27:35.455] changed <- common[...future.oldEnvVars[common] != [17:27:35.455] envs[common]] [17:27:35.455] NAMES <- toupper(changed) [17:27:35.455] args <- list() [17:27:35.455] for (kk in seq_along(NAMES)) { [17:27:35.455] name <- changed[[kk]] [17:27:35.455] NAME <- NAMES[[kk]] [17:27:35.455] if (name != NAME && is.element(NAME, old_names)) [17:27:35.455] next [17:27:35.455] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.455] } [17:27:35.455] NAMES <- toupper(added) [17:27:35.455] for (kk in seq_along(NAMES)) { [17:27:35.455] name <- added[[kk]] [17:27:35.455] NAME <- NAMES[[kk]] [17:27:35.455] if (name != NAME && is.element(NAME, old_names)) [17:27:35.455] next [17:27:35.455] args[[name]] <- "" [17:27:35.455] } [17:27:35.455] NAMES <- toupper(removed) [17:27:35.455] for (kk in seq_along(NAMES)) { [17:27:35.455] name <- removed[[kk]] [17:27:35.455] NAME <- NAMES[[kk]] [17:27:35.455] if (name != NAME && is.element(NAME, old_names)) [17:27:35.455] next [17:27:35.455] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.455] } [17:27:35.455] if (length(args) > 0) [17:27:35.455] base::do.call(base::Sys.setenv, args = args) [17:27:35.455] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.455] } [17:27:35.455] else { [17:27:35.455] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.455] } [17:27:35.455] { [17:27:35.455] if (base::length(...future.futureOptionsAdded) > [17:27:35.455] 0L) { [17:27:35.455] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.455] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.455] base::options(opts) [17:27:35.455] } [17:27:35.455] { [17:27:35.455] { [17:27:35.455] NULL [17:27:35.455] RNGkind("Mersenne-Twister") [17:27:35.455] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.455] inherits = FALSE) [17:27:35.455] } [17:27:35.455] options(future.plan = NULL) [17:27:35.455] if (is.na(NA_character_)) [17:27:35.455] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.455] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.455] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.455] .init = FALSE) [17:27:35.455] } [17:27:35.455] } [17:27:35.455] } [17:27:35.455] }) [17:27:35.455] if (TRUE) { [17:27:35.455] base::sink(type = "output", split = FALSE) [17:27:35.455] if (TRUE) { [17:27:35.455] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.455] } [17:27:35.455] else { [17:27:35.455] ...future.result["stdout"] <- base::list(NULL) [17:27:35.455] } [17:27:35.455] base::close(...future.stdout) [17:27:35.455] ...future.stdout <- NULL [17:27:35.455] } [17:27:35.455] ...future.result$conditions <- ...future.conditions [17:27:35.455] ...future.result$finished <- base::Sys.time() [17:27:35.455] ...future.result [17:27:35.455] } [17:27:35.461] plan(): Setting new future strategy stack: [17:27:35.461] List of future strategies: [17:27:35.461] 1. sequential: [17:27:35.461] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.461] - tweaked: FALSE [17:27:35.461] - call: NULL [17:27:35.462] plan(): nbrOfWorkers() = 1 [17:27:35.464] plan(): Setting new future strategy stack: [17:27:35.464] List of future strategies: [17:27:35.464] 1. sequential: [17:27:35.464] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.464] - tweaked: FALSE [17:27:35.464] - call: plan(strategy) [17:27:35.465] plan(): nbrOfWorkers() = 1 [17:27:35.466] SequentialFuture started (and completed) [17:27:35.466] - Launch lazy future ... done [17:27:35.466] run() for 'SequentialFuture' ... done [17:27:35.467] getGlobalsAndPackages() ... [17:27:35.467] Searching for globals... [17:27:35.470] [17:27:35.470] Searching for globals ... DONE [17:27:35.471] - globals: [0] [17:27:35.471] getGlobalsAndPackages() ... DONE [17:27:35.472] run() for 'Future' ... [17:27:35.472] - state: 'created' [17:27:35.472] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.473] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.473] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.474] - Field: 'label' [17:27:35.474] - Field: 'local' [17:27:35.474] - Field: 'owner' [17:27:35.475] - Field: 'envir' [17:27:35.475] - Field: 'packages' [17:27:35.475] - Field: 'gc' [17:27:35.475] - Field: 'conditions' [17:27:35.476] - Field: 'expr' [17:27:35.476] - Field: 'uuid' [17:27:35.476] - Field: 'seed' [17:27:35.477] - Field: 'version' [17:27:35.477] - Field: 'result' [17:27:35.477] - Field: 'asynchronous' [17:27:35.478] - Field: 'calls' [17:27:35.478] - Field: 'globals' [17:27:35.478] - Field: 'stdout' [17:27:35.479] - Field: 'earlySignal' [17:27:35.479] - Field: 'lazy' [17:27:35.479] - Field: 'state' [17:27:35.479] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.480] - Launch lazy future ... [17:27:35.480] Packages needed by the future expression (n = 0): [17:27:35.480] Packages needed by future strategies (n = 0): [17:27:35.481] { [17:27:35.481] { [17:27:35.481] { [17:27:35.481] ...future.startTime <- base::Sys.time() [17:27:35.481] { [17:27:35.481] { [17:27:35.481] { [17:27:35.481] base::local({ [17:27:35.481] has_future <- base::requireNamespace("future", [17:27:35.481] quietly = TRUE) [17:27:35.481] if (has_future) { [17:27:35.481] ns <- base::getNamespace("future") [17:27:35.481] version <- ns[[".package"]][["version"]] [17:27:35.481] if (is.null(version)) [17:27:35.481] version <- utils::packageVersion("future") [17:27:35.481] } [17:27:35.481] else { [17:27:35.481] version <- NULL [17:27:35.481] } [17:27:35.481] if (!has_future || version < "1.8.0") { [17:27:35.481] info <- base::c(r_version = base::gsub("R version ", [17:27:35.481] "", base::R.version$version.string), [17:27:35.481] platform = base::sprintf("%s (%s-bit)", [17:27:35.481] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.481] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.481] "release", "version")], collapse = " "), [17:27:35.481] hostname = base::Sys.info()[["nodename"]]) [17:27:35.481] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.481] info) [17:27:35.481] info <- base::paste(info, collapse = "; ") [17:27:35.481] if (!has_future) { [17:27:35.481] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.481] info) [17:27:35.481] } [17:27:35.481] else { [17:27:35.481] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.481] info, version) [17:27:35.481] } [17:27:35.481] base::stop(msg) [17:27:35.481] } [17:27:35.481] }) [17:27:35.481] } [17:27:35.481] ...future.strategy.old <- future::plan("list") [17:27:35.481] options(future.plan = NULL) [17:27:35.481] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.481] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.481] } [17:27:35.481] ...future.workdir <- getwd() [17:27:35.481] } [17:27:35.481] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.481] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.481] } [17:27:35.481] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.481] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.481] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.481] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.481] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.481] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.481] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.481] base::names(...future.oldOptions)) [17:27:35.481] } [17:27:35.481] if (FALSE) { [17:27:35.481] } [17:27:35.481] else { [17:27:35.481] if (TRUE) { [17:27:35.481] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.481] open = "w") [17:27:35.481] } [17:27:35.481] else { [17:27:35.481] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.481] windows = "NUL", "/dev/null"), open = "w") [17:27:35.481] } [17:27:35.481] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.481] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.481] base::sink(type = "output", split = FALSE) [17:27:35.481] base::close(...future.stdout) [17:27:35.481] }, add = TRUE) [17:27:35.481] } [17:27:35.481] ...future.frame <- base::sys.nframe() [17:27:35.481] ...future.conditions <- base::list() [17:27:35.481] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.481] if (FALSE) { [17:27:35.481] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.481] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.481] } [17:27:35.481] ...future.result <- base::tryCatch({ [17:27:35.481] base::withCallingHandlers({ [17:27:35.481] ...future.value <- base::withVisible(base::local(NULL)) [17:27:35.481] future::FutureResult(value = ...future.value$value, [17:27:35.481] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.481] ...future.rng), globalenv = if (FALSE) [17:27:35.481] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.481] ...future.globalenv.names)) [17:27:35.481] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.481] }, condition = base::local({ [17:27:35.481] c <- base::c [17:27:35.481] inherits <- base::inherits [17:27:35.481] invokeRestart <- base::invokeRestart [17:27:35.481] length <- base::length [17:27:35.481] list <- base::list [17:27:35.481] seq.int <- base::seq.int [17:27:35.481] signalCondition <- base::signalCondition [17:27:35.481] sys.calls <- base::sys.calls [17:27:35.481] `[[` <- base::`[[` [17:27:35.481] `+` <- base::`+` [17:27:35.481] `<<-` <- base::`<<-` [17:27:35.481] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.481] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.481] 3L)] [17:27:35.481] } [17:27:35.481] function(cond) { [17:27:35.481] is_error <- inherits(cond, "error") [17:27:35.481] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.481] NULL) [17:27:35.481] if (is_error) { [17:27:35.481] sessionInformation <- function() { [17:27:35.481] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.481] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.481] search = base::search(), system = base::Sys.info()) [17:27:35.481] } [17:27:35.481] ...future.conditions[[length(...future.conditions) + [17:27:35.481] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.481] cond$call), session = sessionInformation(), [17:27:35.481] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.481] signalCondition(cond) [17:27:35.481] } [17:27:35.481] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.481] "immediateCondition"))) { [17:27:35.481] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.481] ...future.conditions[[length(...future.conditions) + [17:27:35.481] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.481] if (TRUE && !signal) { [17:27:35.481] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.481] { [17:27:35.481] inherits <- base::inherits [17:27:35.481] invokeRestart <- base::invokeRestart [17:27:35.481] is.null <- base::is.null [17:27:35.481] muffled <- FALSE [17:27:35.481] if (inherits(cond, "message")) { [17:27:35.481] muffled <- grepl(pattern, "muffleMessage") [17:27:35.481] if (muffled) [17:27:35.481] invokeRestart("muffleMessage") [17:27:35.481] } [17:27:35.481] else if (inherits(cond, "warning")) { [17:27:35.481] muffled <- grepl(pattern, "muffleWarning") [17:27:35.481] if (muffled) [17:27:35.481] invokeRestart("muffleWarning") [17:27:35.481] } [17:27:35.481] else if (inherits(cond, "condition")) { [17:27:35.481] if (!is.null(pattern)) { [17:27:35.481] computeRestarts <- base::computeRestarts [17:27:35.481] grepl <- base::grepl [17:27:35.481] restarts <- computeRestarts(cond) [17:27:35.481] for (restart in restarts) { [17:27:35.481] name <- restart$name [17:27:35.481] if (is.null(name)) [17:27:35.481] next [17:27:35.481] if (!grepl(pattern, name)) [17:27:35.481] next [17:27:35.481] invokeRestart(restart) [17:27:35.481] muffled <- TRUE [17:27:35.481] break [17:27:35.481] } [17:27:35.481] } [17:27:35.481] } [17:27:35.481] invisible(muffled) [17:27:35.481] } [17:27:35.481] muffleCondition(cond, pattern = "^muffle") [17:27:35.481] } [17:27:35.481] } [17:27:35.481] else { [17:27:35.481] if (TRUE) { [17:27:35.481] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.481] { [17:27:35.481] inherits <- base::inherits [17:27:35.481] invokeRestart <- base::invokeRestart [17:27:35.481] is.null <- base::is.null [17:27:35.481] muffled <- FALSE [17:27:35.481] if (inherits(cond, "message")) { [17:27:35.481] muffled <- grepl(pattern, "muffleMessage") [17:27:35.481] if (muffled) [17:27:35.481] invokeRestart("muffleMessage") [17:27:35.481] } [17:27:35.481] else if (inherits(cond, "warning")) { [17:27:35.481] muffled <- grepl(pattern, "muffleWarning") [17:27:35.481] if (muffled) [17:27:35.481] invokeRestart("muffleWarning") [17:27:35.481] } [17:27:35.481] else if (inherits(cond, "condition")) { [17:27:35.481] if (!is.null(pattern)) { [17:27:35.481] computeRestarts <- base::computeRestarts [17:27:35.481] grepl <- base::grepl [17:27:35.481] restarts <- computeRestarts(cond) [17:27:35.481] for (restart in restarts) { [17:27:35.481] name <- restart$name [17:27:35.481] if (is.null(name)) [17:27:35.481] next [17:27:35.481] if (!grepl(pattern, name)) [17:27:35.481] next [17:27:35.481] invokeRestart(restart) [17:27:35.481] muffled <- TRUE [17:27:35.481] break [17:27:35.481] } [17:27:35.481] } [17:27:35.481] } [17:27:35.481] invisible(muffled) [17:27:35.481] } [17:27:35.481] muffleCondition(cond, pattern = "^muffle") [17:27:35.481] } [17:27:35.481] } [17:27:35.481] } [17:27:35.481] })) [17:27:35.481] }, error = function(ex) { [17:27:35.481] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.481] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.481] ...future.rng), started = ...future.startTime, [17:27:35.481] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.481] version = "1.8"), class = "FutureResult") [17:27:35.481] }, finally = { [17:27:35.481] if (!identical(...future.workdir, getwd())) [17:27:35.481] setwd(...future.workdir) [17:27:35.481] { [17:27:35.481] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.481] ...future.oldOptions$nwarnings <- NULL [17:27:35.481] } [17:27:35.481] base::options(...future.oldOptions) [17:27:35.481] if (.Platform$OS.type == "windows") { [17:27:35.481] old_names <- names(...future.oldEnvVars) [17:27:35.481] envs <- base::Sys.getenv() [17:27:35.481] names <- names(envs) [17:27:35.481] common <- intersect(names, old_names) [17:27:35.481] added <- setdiff(names, old_names) [17:27:35.481] removed <- setdiff(old_names, names) [17:27:35.481] changed <- common[...future.oldEnvVars[common] != [17:27:35.481] envs[common]] [17:27:35.481] NAMES <- toupper(changed) [17:27:35.481] args <- list() [17:27:35.481] for (kk in seq_along(NAMES)) { [17:27:35.481] name <- changed[[kk]] [17:27:35.481] NAME <- NAMES[[kk]] [17:27:35.481] if (name != NAME && is.element(NAME, old_names)) [17:27:35.481] next [17:27:35.481] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.481] } [17:27:35.481] NAMES <- toupper(added) [17:27:35.481] for (kk in seq_along(NAMES)) { [17:27:35.481] name <- added[[kk]] [17:27:35.481] NAME <- NAMES[[kk]] [17:27:35.481] if (name != NAME && is.element(NAME, old_names)) [17:27:35.481] next [17:27:35.481] args[[name]] <- "" [17:27:35.481] } [17:27:35.481] NAMES <- toupper(removed) [17:27:35.481] for (kk in seq_along(NAMES)) { [17:27:35.481] name <- removed[[kk]] [17:27:35.481] NAME <- NAMES[[kk]] [17:27:35.481] if (name != NAME && is.element(NAME, old_names)) [17:27:35.481] next [17:27:35.481] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.481] } [17:27:35.481] if (length(args) > 0) [17:27:35.481] base::do.call(base::Sys.setenv, args = args) [17:27:35.481] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.481] } [17:27:35.481] else { [17:27:35.481] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.481] } [17:27:35.481] { [17:27:35.481] if (base::length(...future.futureOptionsAdded) > [17:27:35.481] 0L) { [17:27:35.481] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.481] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.481] base::options(opts) [17:27:35.481] } [17:27:35.481] { [17:27:35.481] { [17:27:35.481] NULL [17:27:35.481] RNGkind("Mersenne-Twister") [17:27:35.481] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.481] inherits = FALSE) [17:27:35.481] } [17:27:35.481] options(future.plan = NULL) [17:27:35.481] if (is.na(NA_character_)) [17:27:35.481] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.481] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.481] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.481] .init = FALSE) [17:27:35.481] } [17:27:35.481] } [17:27:35.481] } [17:27:35.481] }) [17:27:35.481] if (TRUE) { [17:27:35.481] base::sink(type = "output", split = FALSE) [17:27:35.481] if (TRUE) { [17:27:35.481] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.481] } [17:27:35.481] else { [17:27:35.481] ...future.result["stdout"] <- base::list(NULL) [17:27:35.481] } [17:27:35.481] base::close(...future.stdout) [17:27:35.481] ...future.stdout <- NULL [17:27:35.481] } [17:27:35.481] ...future.result$conditions <- ...future.conditions [17:27:35.481] ...future.result$finished <- base::Sys.time() [17:27:35.481] ...future.result [17:27:35.481] } [17:27:35.488] plan(): Setting new future strategy stack: [17:27:35.488] List of future strategies: [17:27:35.488] 1. sequential: [17:27:35.488] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.488] - tweaked: FALSE [17:27:35.488] - call: NULL [17:27:35.489] plan(): nbrOfWorkers() = 1 [17:27:35.491] plan(): Setting new future strategy stack: [17:27:35.491] List of future strategies: [17:27:35.491] 1. sequential: [17:27:35.491] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.491] - tweaked: FALSE [17:27:35.491] - call: plan(strategy) [17:27:35.493] plan(): nbrOfWorkers() = 1 [17:27:35.493] SequentialFuture started (and completed) [17:27:35.493] - Launch lazy future ... done [17:27:35.494] run() for 'SequentialFuture' ... done [17:27:35.495] getGlobalsAndPackages() ... [17:27:35.495] Searching for globals... [17:27:35.497] - globals found: [1] '{' [17:27:35.497] Searching for globals ... DONE [17:27:35.497] Resolving globals: FALSE [17:27:35.498] [17:27:35.498] [17:27:35.499] getGlobalsAndPackages() ... DONE [17:27:35.499] run() for 'Future' ... [17:27:35.500] - state: 'created' [17:27:35.500] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.501] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.501] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.502] - Field: 'label' [17:27:35.502] - Field: 'local' [17:27:35.502] - Field: 'owner' [17:27:35.503] - Field: 'envir' [17:27:35.503] - Field: 'packages' [17:27:35.503] - Field: 'gc' [17:27:35.504] - Field: 'conditions' [17:27:35.504] - Field: 'expr' [17:27:35.504] - Field: 'uuid' [17:27:35.505] - Field: 'seed' [17:27:35.505] - Field: 'version' [17:27:35.505] - Field: 'result' [17:27:35.506] - Field: 'asynchronous' [17:27:35.506] - Field: 'calls' [17:27:35.506] - Field: 'globals' [17:27:35.507] - Field: 'stdout' [17:27:35.507] - Field: 'earlySignal' [17:27:35.507] - Field: 'lazy' [17:27:35.508] - Field: 'state' [17:27:35.508] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.508] - Launch lazy future ... [17:27:35.509] Packages needed by the future expression (n = 0): [17:27:35.509] Packages needed by future strategies (n = 0): [17:27:35.510] { [17:27:35.510] { [17:27:35.510] { [17:27:35.510] ...future.startTime <- base::Sys.time() [17:27:35.510] { [17:27:35.510] { [17:27:35.510] { [17:27:35.510] base::local({ [17:27:35.510] has_future <- base::requireNamespace("future", [17:27:35.510] quietly = TRUE) [17:27:35.510] if (has_future) { [17:27:35.510] ns <- base::getNamespace("future") [17:27:35.510] version <- ns[[".package"]][["version"]] [17:27:35.510] if (is.null(version)) [17:27:35.510] version <- utils::packageVersion("future") [17:27:35.510] } [17:27:35.510] else { [17:27:35.510] version <- NULL [17:27:35.510] } [17:27:35.510] if (!has_future || version < "1.8.0") { [17:27:35.510] info <- base::c(r_version = base::gsub("R version ", [17:27:35.510] "", base::R.version$version.string), [17:27:35.510] platform = base::sprintf("%s (%s-bit)", [17:27:35.510] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.510] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.510] "release", "version")], collapse = " "), [17:27:35.510] hostname = base::Sys.info()[["nodename"]]) [17:27:35.510] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.510] info) [17:27:35.510] info <- base::paste(info, collapse = "; ") [17:27:35.510] if (!has_future) { [17:27:35.510] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.510] info) [17:27:35.510] } [17:27:35.510] else { [17:27:35.510] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.510] info, version) [17:27:35.510] } [17:27:35.510] base::stop(msg) [17:27:35.510] } [17:27:35.510] }) [17:27:35.510] } [17:27:35.510] ...future.strategy.old <- future::plan("list") [17:27:35.510] options(future.plan = NULL) [17:27:35.510] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.510] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.510] } [17:27:35.510] ...future.workdir <- getwd() [17:27:35.510] } [17:27:35.510] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.510] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.510] } [17:27:35.510] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.510] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.510] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.510] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.510] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.510] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.510] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.510] base::names(...future.oldOptions)) [17:27:35.510] } [17:27:35.510] if (FALSE) { [17:27:35.510] } [17:27:35.510] else { [17:27:35.510] if (TRUE) { [17:27:35.510] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.510] open = "w") [17:27:35.510] } [17:27:35.510] else { [17:27:35.510] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.510] windows = "NUL", "/dev/null"), open = "w") [17:27:35.510] } [17:27:35.510] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.510] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.510] base::sink(type = "output", split = FALSE) [17:27:35.510] base::close(...future.stdout) [17:27:35.510] }, add = TRUE) [17:27:35.510] } [17:27:35.510] ...future.frame <- base::sys.nframe() [17:27:35.510] ...future.conditions <- base::list() [17:27:35.510] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.510] if (FALSE) { [17:27:35.510] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.510] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.510] } [17:27:35.510] ...future.result <- base::tryCatch({ [17:27:35.510] base::withCallingHandlers({ [17:27:35.510] ...future.value <- base::withVisible(base::local({ [17:27:35.510] 4 [17:27:35.510] })) [17:27:35.510] future::FutureResult(value = ...future.value$value, [17:27:35.510] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.510] ...future.rng), globalenv = if (FALSE) [17:27:35.510] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.510] ...future.globalenv.names)) [17:27:35.510] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.510] }, condition = base::local({ [17:27:35.510] c <- base::c [17:27:35.510] inherits <- base::inherits [17:27:35.510] invokeRestart <- base::invokeRestart [17:27:35.510] length <- base::length [17:27:35.510] list <- base::list [17:27:35.510] seq.int <- base::seq.int [17:27:35.510] signalCondition <- base::signalCondition [17:27:35.510] sys.calls <- base::sys.calls [17:27:35.510] `[[` <- base::`[[` [17:27:35.510] `+` <- base::`+` [17:27:35.510] `<<-` <- base::`<<-` [17:27:35.510] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.510] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.510] 3L)] [17:27:35.510] } [17:27:35.510] function(cond) { [17:27:35.510] is_error <- inherits(cond, "error") [17:27:35.510] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.510] NULL) [17:27:35.510] if (is_error) { [17:27:35.510] sessionInformation <- function() { [17:27:35.510] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.510] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.510] search = base::search(), system = base::Sys.info()) [17:27:35.510] } [17:27:35.510] ...future.conditions[[length(...future.conditions) + [17:27:35.510] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.510] cond$call), session = sessionInformation(), [17:27:35.510] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.510] signalCondition(cond) [17:27:35.510] } [17:27:35.510] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.510] "immediateCondition"))) { [17:27:35.510] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.510] ...future.conditions[[length(...future.conditions) + [17:27:35.510] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.510] if (TRUE && !signal) { [17:27:35.510] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.510] { [17:27:35.510] inherits <- base::inherits [17:27:35.510] invokeRestart <- base::invokeRestart [17:27:35.510] is.null <- base::is.null [17:27:35.510] muffled <- FALSE [17:27:35.510] if (inherits(cond, "message")) { [17:27:35.510] muffled <- grepl(pattern, "muffleMessage") [17:27:35.510] if (muffled) [17:27:35.510] invokeRestart("muffleMessage") [17:27:35.510] } [17:27:35.510] else if (inherits(cond, "warning")) { [17:27:35.510] muffled <- grepl(pattern, "muffleWarning") [17:27:35.510] if (muffled) [17:27:35.510] invokeRestart("muffleWarning") [17:27:35.510] } [17:27:35.510] else if (inherits(cond, "condition")) { [17:27:35.510] if (!is.null(pattern)) { [17:27:35.510] computeRestarts <- base::computeRestarts [17:27:35.510] grepl <- base::grepl [17:27:35.510] restarts <- computeRestarts(cond) [17:27:35.510] for (restart in restarts) { [17:27:35.510] name <- restart$name [17:27:35.510] if (is.null(name)) [17:27:35.510] next [17:27:35.510] if (!grepl(pattern, name)) [17:27:35.510] next [17:27:35.510] invokeRestart(restart) [17:27:35.510] muffled <- TRUE [17:27:35.510] break [17:27:35.510] } [17:27:35.510] } [17:27:35.510] } [17:27:35.510] invisible(muffled) [17:27:35.510] } [17:27:35.510] muffleCondition(cond, pattern = "^muffle") [17:27:35.510] } [17:27:35.510] } [17:27:35.510] else { [17:27:35.510] if (TRUE) { [17:27:35.510] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.510] { [17:27:35.510] inherits <- base::inherits [17:27:35.510] invokeRestart <- base::invokeRestart [17:27:35.510] is.null <- base::is.null [17:27:35.510] muffled <- FALSE [17:27:35.510] if (inherits(cond, "message")) { [17:27:35.510] muffled <- grepl(pattern, "muffleMessage") [17:27:35.510] if (muffled) [17:27:35.510] invokeRestart("muffleMessage") [17:27:35.510] } [17:27:35.510] else if (inherits(cond, "warning")) { [17:27:35.510] muffled <- grepl(pattern, "muffleWarning") [17:27:35.510] if (muffled) [17:27:35.510] invokeRestart("muffleWarning") [17:27:35.510] } [17:27:35.510] else if (inherits(cond, "condition")) { [17:27:35.510] if (!is.null(pattern)) { [17:27:35.510] computeRestarts <- base::computeRestarts [17:27:35.510] grepl <- base::grepl [17:27:35.510] restarts <- computeRestarts(cond) [17:27:35.510] for (restart in restarts) { [17:27:35.510] name <- restart$name [17:27:35.510] if (is.null(name)) [17:27:35.510] next [17:27:35.510] if (!grepl(pattern, name)) [17:27:35.510] next [17:27:35.510] invokeRestart(restart) [17:27:35.510] muffled <- TRUE [17:27:35.510] break [17:27:35.510] } [17:27:35.510] } [17:27:35.510] } [17:27:35.510] invisible(muffled) [17:27:35.510] } [17:27:35.510] muffleCondition(cond, pattern = "^muffle") [17:27:35.510] } [17:27:35.510] } [17:27:35.510] } [17:27:35.510] })) [17:27:35.510] }, error = function(ex) { [17:27:35.510] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.510] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.510] ...future.rng), started = ...future.startTime, [17:27:35.510] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.510] version = "1.8"), class = "FutureResult") [17:27:35.510] }, finally = { [17:27:35.510] if (!identical(...future.workdir, getwd())) [17:27:35.510] setwd(...future.workdir) [17:27:35.510] { [17:27:35.510] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.510] ...future.oldOptions$nwarnings <- NULL [17:27:35.510] } [17:27:35.510] base::options(...future.oldOptions) [17:27:35.510] if (.Platform$OS.type == "windows") { [17:27:35.510] old_names <- names(...future.oldEnvVars) [17:27:35.510] envs <- base::Sys.getenv() [17:27:35.510] names <- names(envs) [17:27:35.510] common <- intersect(names, old_names) [17:27:35.510] added <- setdiff(names, old_names) [17:27:35.510] removed <- setdiff(old_names, names) [17:27:35.510] changed <- common[...future.oldEnvVars[common] != [17:27:35.510] envs[common]] [17:27:35.510] NAMES <- toupper(changed) [17:27:35.510] args <- list() [17:27:35.510] for (kk in seq_along(NAMES)) { [17:27:35.510] name <- changed[[kk]] [17:27:35.510] NAME <- NAMES[[kk]] [17:27:35.510] if (name != NAME && is.element(NAME, old_names)) [17:27:35.510] next [17:27:35.510] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.510] } [17:27:35.510] NAMES <- toupper(added) [17:27:35.510] for (kk in seq_along(NAMES)) { [17:27:35.510] name <- added[[kk]] [17:27:35.510] NAME <- NAMES[[kk]] [17:27:35.510] if (name != NAME && is.element(NAME, old_names)) [17:27:35.510] next [17:27:35.510] args[[name]] <- "" [17:27:35.510] } [17:27:35.510] NAMES <- toupper(removed) [17:27:35.510] for (kk in seq_along(NAMES)) { [17:27:35.510] name <- removed[[kk]] [17:27:35.510] NAME <- NAMES[[kk]] [17:27:35.510] if (name != NAME && is.element(NAME, old_names)) [17:27:35.510] next [17:27:35.510] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.510] } [17:27:35.510] if (length(args) > 0) [17:27:35.510] base::do.call(base::Sys.setenv, args = args) [17:27:35.510] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.510] } [17:27:35.510] else { [17:27:35.510] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.510] } [17:27:35.510] { [17:27:35.510] if (base::length(...future.futureOptionsAdded) > [17:27:35.510] 0L) { [17:27:35.510] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.510] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.510] base::options(opts) [17:27:35.510] } [17:27:35.510] { [17:27:35.510] { [17:27:35.510] NULL [17:27:35.510] RNGkind("Mersenne-Twister") [17:27:35.510] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.510] inherits = FALSE) [17:27:35.510] } [17:27:35.510] options(future.plan = NULL) [17:27:35.510] if (is.na(NA_character_)) [17:27:35.510] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.510] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.510] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.510] .init = FALSE) [17:27:35.510] } [17:27:35.510] } [17:27:35.510] } [17:27:35.510] }) [17:27:35.510] if (TRUE) { [17:27:35.510] base::sink(type = "output", split = FALSE) [17:27:35.510] if (TRUE) { [17:27:35.510] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.510] } [17:27:35.510] else { [17:27:35.510] ...future.result["stdout"] <- base::list(NULL) [17:27:35.510] } [17:27:35.510] base::close(...future.stdout) [17:27:35.510] ...future.stdout <- NULL [17:27:35.510] } [17:27:35.510] ...future.result$conditions <- ...future.conditions [17:27:35.510] ...future.result$finished <- base::Sys.time() [17:27:35.510] ...future.result [17:27:35.510] } [17:27:35.518] plan(): Setting new future strategy stack: [17:27:35.518] List of future strategies: [17:27:35.518] 1. sequential: [17:27:35.518] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.518] - tweaked: FALSE [17:27:35.518] - call: NULL [17:27:35.519] plan(): nbrOfWorkers() = 1 [17:27:35.521] plan(): Setting new future strategy stack: [17:27:35.522] List of future strategies: [17:27:35.522] 1. sequential: [17:27:35.522] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.522] - tweaked: FALSE [17:27:35.522] - call: plan(strategy) [17:27:35.523] plan(): nbrOfWorkers() = 1 [17:27:35.523] SequentialFuture started (and completed) [17:27:35.523] - Launch lazy future ... done [17:27:35.524] run() for 'SequentialFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' [17:27:35.530] resolved() for 'SequentialFuture' ... [17:27:35.531] - state: 'finished' [17:27:35.531] - run: TRUE [17:27:35.531] - result: 'FutureResult' [17:27:35.532] resolved() for 'SequentialFuture' ... done [17:27:35.532] resolved() for 'SequentialFuture' ... [17:27:35.533] - state: 'finished' [17:27:35.533] - run: TRUE [17:27:35.533] - result: 'FutureResult' [17:27:35.534] resolved() for 'SequentialFuture' ... done [17:27:35.534] resolved() for 'SequentialFuture' ... [17:27:35.534] - state: 'finished' [17:27:35.535] - run: TRUE [17:27:35.535] - result: 'FutureResult' [17:27:35.535] resolved() for 'SequentialFuture' ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:35.543] resolve() on list environment ... [17:27:35.543] recursive: 0 [17:27:35.545] length: 6 [17:27:35.545] elements: 'a', 'b', 'c', 'd', '', '' [17:27:35.546] signalConditionsASAP(numeric, pos=1) ... [17:27:35.546] - nx: 6 [17:27:35.546] - relay: TRUE [17:27:35.546] - stdout: TRUE [17:27:35.547] - signal: TRUE [17:27:35.547] - resignal: FALSE [17:27:35.547] - force: TRUE [17:27:35.547] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.548] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.548] - until=2 [17:27:35.548] - relaying element #2 [17:27:35.549] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.549] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.549] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.549] length: 5 (resolved future 1) [17:27:35.550] resolved() for 'SequentialFuture' ... [17:27:35.550] - state: 'finished' [17:27:35.550] - run: TRUE [17:27:35.551] - result: 'FutureResult' [17:27:35.551] resolved() for 'SequentialFuture' ... done [17:27:35.551] Future #2 [17:27:35.552] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.552] - nx: 6 [17:27:35.552] - relay: TRUE [17:27:35.553] - stdout: TRUE [17:27:35.553] - signal: TRUE [17:27:35.553] - resignal: FALSE [17:27:35.553] - force: TRUE [17:27:35.554] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.554] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.554] - until=2 [17:27:35.555] - relaying element #2 [17:27:35.555] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.555] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.556] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.556] length: 4 (resolved future 2) [17:27:35.556] resolved() for 'SequentialFuture' ... [17:27:35.557] - state: 'finished' [17:27:35.557] - run: TRUE [17:27:35.557] - result: 'FutureResult' [17:27:35.558] resolved() for 'SequentialFuture' ... done [17:27:35.558] Future #3 [17:27:35.558] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.559] - nx: 6 [17:27:35.559] - relay: TRUE [17:27:35.559] - stdout: TRUE [17:27:35.560] - signal: TRUE [17:27:35.560] - resignal: FALSE [17:27:35.560] - force: TRUE [17:27:35.561] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.561] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.561] - until=3 [17:27:35.561] - relaying element #3 [17:27:35.562] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.562] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.563] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.563] length: 3 (resolved future 3) [17:27:35.563] resolved() for 'SequentialFuture' ... [17:27:35.564] - state: 'finished' [17:27:35.564] - run: TRUE [17:27:35.565] - result: 'FutureResult' [17:27:35.565] resolved() for 'SequentialFuture' ... done [17:27:35.565] Future #4 [17:27:35.566] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.566] - nx: 6 [17:27:35.566] - relay: TRUE [17:27:35.567] - stdout: TRUE [17:27:35.567] - signal: TRUE [17:27:35.567] - resignal: FALSE [17:27:35.568] - force: TRUE [17:27:35.568] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.568] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.569] - until=4 [17:27:35.569] - relaying element #4 [17:27:35.569] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.570] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.570] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.570] length: 2 (resolved future 4) [17:27:35.571] signalConditionsASAP(NULL, pos=5) ... [17:27:35.571] - nx: 6 [17:27:35.571] - relay: TRUE [17:27:35.572] - stdout: TRUE [17:27:35.572] - signal: TRUE [17:27:35.572] - resignal: FALSE [17:27:35.572] - force: TRUE [17:27:35.573] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.573] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.573] - until=6 [17:27:35.574] - relaying element #6 [17:27:35.574] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:35.574] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.575] signalConditionsASAP(NULL, pos=5) ... done [17:27:35.575] length: 1 (resolved future 5) [17:27:35.575] signalConditionsASAP(numeric, pos=6) ... [17:27:35.576] - nx: 6 [17:27:35.576] - relay: TRUE [17:27:35.576] - stdout: TRUE [17:27:35.577] - signal: TRUE [17:27:35.577] - resignal: FALSE [17:27:35.577] - force: TRUE [17:27:35.577] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:35.578] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.578] - until=6 [17:27:35.578] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.579] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.579] signalConditionsASAP(numeric, pos=6) ... done [17:27:35.579] length: 0 (resolved future 6) [17:27:35.579] Relaying remaining futures [17:27:35.580] signalConditionsASAP(NULL, pos=0) ... [17:27:35.580] - nx: 6 [17:27:35.580] - relay: TRUE [17:27:35.580] - stdout: TRUE [17:27:35.581] - signal: TRUE [17:27:35.581] - resignal: FALSE [17:27:35.581] - force: TRUE [17:27:35.581] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.582] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:35.582] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.582] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.583] signalConditionsASAP(NULL, pos=0) ... done [17:27:35.583] resolve() on list environment ... DONE Classes 'listenv', 'environment' Dimensions: c(1, 6) [17:27:35.585] getGlobalsAndPackages() ... [17:27:35.585] Searching for globals... [17:27:35.586] [17:27:35.587] Searching for globals ... DONE [17:27:35.587] - globals: [0] [17:27:35.587] getGlobalsAndPackages() ... DONE [17:27:35.588] run() for 'Future' ... [17:27:35.588] - state: 'created' [17:27:35.589] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.589] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.590] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.590] - Field: 'label' [17:27:35.590] - Field: 'local' [17:27:35.591] - Field: 'owner' [17:27:35.591] - Field: 'envir' [17:27:35.591] - Field: 'packages' [17:27:35.592] - Field: 'gc' [17:27:35.592] - Field: 'conditions' [17:27:35.592] - Field: 'expr' [17:27:35.595] - Field: 'uuid' [17:27:35.596] - Field: 'seed' [17:27:35.596] - Field: 'version' [17:27:35.596] - Field: 'result' [17:27:35.597] - Field: 'asynchronous' [17:27:35.597] - Field: 'calls' [17:27:35.597] - Field: 'globals' [17:27:35.598] - Field: 'stdout' [17:27:35.598] - Field: 'earlySignal' [17:27:35.599] - Field: 'lazy' [17:27:35.599] - Field: 'state' [17:27:35.599] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.600] - Launch lazy future ... [17:27:35.600] Packages needed by the future expression (n = 0): [17:27:35.601] Packages needed by future strategies (n = 0): [17:27:35.602] { [17:27:35.602] { [17:27:35.602] { [17:27:35.602] ...future.startTime <- base::Sys.time() [17:27:35.602] { [17:27:35.602] { [17:27:35.602] { [17:27:35.602] base::local({ [17:27:35.602] has_future <- base::requireNamespace("future", [17:27:35.602] quietly = TRUE) [17:27:35.602] if (has_future) { [17:27:35.602] ns <- base::getNamespace("future") [17:27:35.602] version <- ns[[".package"]][["version"]] [17:27:35.602] if (is.null(version)) [17:27:35.602] version <- utils::packageVersion("future") [17:27:35.602] } [17:27:35.602] else { [17:27:35.602] version <- NULL [17:27:35.602] } [17:27:35.602] if (!has_future || version < "1.8.0") { [17:27:35.602] info <- base::c(r_version = base::gsub("R version ", [17:27:35.602] "", base::R.version$version.string), [17:27:35.602] platform = base::sprintf("%s (%s-bit)", [17:27:35.602] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.602] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.602] "release", "version")], collapse = " "), [17:27:35.602] hostname = base::Sys.info()[["nodename"]]) [17:27:35.602] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.602] info) [17:27:35.602] info <- base::paste(info, collapse = "; ") [17:27:35.602] if (!has_future) { [17:27:35.602] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.602] info) [17:27:35.602] } [17:27:35.602] else { [17:27:35.602] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.602] info, version) [17:27:35.602] } [17:27:35.602] base::stop(msg) [17:27:35.602] } [17:27:35.602] }) [17:27:35.602] } [17:27:35.602] ...future.strategy.old <- future::plan("list") [17:27:35.602] options(future.plan = NULL) [17:27:35.602] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.602] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.602] } [17:27:35.602] ...future.workdir <- getwd() [17:27:35.602] } [17:27:35.602] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.602] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.602] } [17:27:35.602] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.602] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.602] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.602] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.602] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.602] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.602] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.602] base::names(...future.oldOptions)) [17:27:35.602] } [17:27:35.602] if (FALSE) { [17:27:35.602] } [17:27:35.602] else { [17:27:35.602] if (TRUE) { [17:27:35.602] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.602] open = "w") [17:27:35.602] } [17:27:35.602] else { [17:27:35.602] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.602] windows = "NUL", "/dev/null"), open = "w") [17:27:35.602] } [17:27:35.602] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.602] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.602] base::sink(type = "output", split = FALSE) [17:27:35.602] base::close(...future.stdout) [17:27:35.602] }, add = TRUE) [17:27:35.602] } [17:27:35.602] ...future.frame <- base::sys.nframe() [17:27:35.602] ...future.conditions <- base::list() [17:27:35.602] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.602] if (FALSE) { [17:27:35.602] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.602] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.602] } [17:27:35.602] ...future.result <- base::tryCatch({ [17:27:35.602] base::withCallingHandlers({ [17:27:35.602] ...future.value <- base::withVisible(base::local(2)) [17:27:35.602] future::FutureResult(value = ...future.value$value, [17:27:35.602] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.602] ...future.rng), globalenv = if (FALSE) [17:27:35.602] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.602] ...future.globalenv.names)) [17:27:35.602] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.602] }, condition = base::local({ [17:27:35.602] c <- base::c [17:27:35.602] inherits <- base::inherits [17:27:35.602] invokeRestart <- base::invokeRestart [17:27:35.602] length <- base::length [17:27:35.602] list <- base::list [17:27:35.602] seq.int <- base::seq.int [17:27:35.602] signalCondition <- base::signalCondition [17:27:35.602] sys.calls <- base::sys.calls [17:27:35.602] `[[` <- base::`[[` [17:27:35.602] `+` <- base::`+` [17:27:35.602] `<<-` <- base::`<<-` [17:27:35.602] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.602] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.602] 3L)] [17:27:35.602] } [17:27:35.602] function(cond) { [17:27:35.602] is_error <- inherits(cond, "error") [17:27:35.602] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.602] NULL) [17:27:35.602] if (is_error) { [17:27:35.602] sessionInformation <- function() { [17:27:35.602] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.602] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.602] search = base::search(), system = base::Sys.info()) [17:27:35.602] } [17:27:35.602] ...future.conditions[[length(...future.conditions) + [17:27:35.602] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.602] cond$call), session = sessionInformation(), [17:27:35.602] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.602] signalCondition(cond) [17:27:35.602] } [17:27:35.602] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.602] "immediateCondition"))) { [17:27:35.602] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.602] ...future.conditions[[length(...future.conditions) + [17:27:35.602] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.602] if (TRUE && !signal) { [17:27:35.602] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.602] { [17:27:35.602] inherits <- base::inherits [17:27:35.602] invokeRestart <- base::invokeRestart [17:27:35.602] is.null <- base::is.null [17:27:35.602] muffled <- FALSE [17:27:35.602] if (inherits(cond, "message")) { [17:27:35.602] muffled <- grepl(pattern, "muffleMessage") [17:27:35.602] if (muffled) [17:27:35.602] invokeRestart("muffleMessage") [17:27:35.602] } [17:27:35.602] else if (inherits(cond, "warning")) { [17:27:35.602] muffled <- grepl(pattern, "muffleWarning") [17:27:35.602] if (muffled) [17:27:35.602] invokeRestart("muffleWarning") [17:27:35.602] } [17:27:35.602] else if (inherits(cond, "condition")) { [17:27:35.602] if (!is.null(pattern)) { [17:27:35.602] computeRestarts <- base::computeRestarts [17:27:35.602] grepl <- base::grepl [17:27:35.602] restarts <- computeRestarts(cond) [17:27:35.602] for (restart in restarts) { [17:27:35.602] name <- restart$name [17:27:35.602] if (is.null(name)) [17:27:35.602] next [17:27:35.602] if (!grepl(pattern, name)) [17:27:35.602] next [17:27:35.602] invokeRestart(restart) [17:27:35.602] muffled <- TRUE [17:27:35.602] break [17:27:35.602] } [17:27:35.602] } [17:27:35.602] } [17:27:35.602] invisible(muffled) [17:27:35.602] } [17:27:35.602] muffleCondition(cond, pattern = "^muffle") [17:27:35.602] } [17:27:35.602] } [17:27:35.602] else { [17:27:35.602] if (TRUE) { [17:27:35.602] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.602] { [17:27:35.602] inherits <- base::inherits [17:27:35.602] invokeRestart <- base::invokeRestart [17:27:35.602] is.null <- base::is.null [17:27:35.602] muffled <- FALSE [17:27:35.602] if (inherits(cond, "message")) { [17:27:35.602] muffled <- grepl(pattern, "muffleMessage") [17:27:35.602] if (muffled) [17:27:35.602] invokeRestart("muffleMessage") [17:27:35.602] } [17:27:35.602] else if (inherits(cond, "warning")) { [17:27:35.602] muffled <- grepl(pattern, "muffleWarning") [17:27:35.602] if (muffled) [17:27:35.602] invokeRestart("muffleWarning") [17:27:35.602] } [17:27:35.602] else if (inherits(cond, "condition")) { [17:27:35.602] if (!is.null(pattern)) { [17:27:35.602] computeRestarts <- base::computeRestarts [17:27:35.602] grepl <- base::grepl [17:27:35.602] restarts <- computeRestarts(cond) [17:27:35.602] for (restart in restarts) { [17:27:35.602] name <- restart$name [17:27:35.602] if (is.null(name)) [17:27:35.602] next [17:27:35.602] if (!grepl(pattern, name)) [17:27:35.602] next [17:27:35.602] invokeRestart(restart) [17:27:35.602] muffled <- TRUE [17:27:35.602] break [17:27:35.602] } [17:27:35.602] } [17:27:35.602] } [17:27:35.602] invisible(muffled) [17:27:35.602] } [17:27:35.602] muffleCondition(cond, pattern = "^muffle") [17:27:35.602] } [17:27:35.602] } [17:27:35.602] } [17:27:35.602] })) [17:27:35.602] }, error = function(ex) { [17:27:35.602] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.602] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.602] ...future.rng), started = ...future.startTime, [17:27:35.602] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.602] version = "1.8"), class = "FutureResult") [17:27:35.602] }, finally = { [17:27:35.602] if (!identical(...future.workdir, getwd())) [17:27:35.602] setwd(...future.workdir) [17:27:35.602] { [17:27:35.602] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.602] ...future.oldOptions$nwarnings <- NULL [17:27:35.602] } [17:27:35.602] base::options(...future.oldOptions) [17:27:35.602] if (.Platform$OS.type == "windows") { [17:27:35.602] old_names <- names(...future.oldEnvVars) [17:27:35.602] envs <- base::Sys.getenv() [17:27:35.602] names <- names(envs) [17:27:35.602] common <- intersect(names, old_names) [17:27:35.602] added <- setdiff(names, old_names) [17:27:35.602] removed <- setdiff(old_names, names) [17:27:35.602] changed <- common[...future.oldEnvVars[common] != [17:27:35.602] envs[common]] [17:27:35.602] NAMES <- toupper(changed) [17:27:35.602] args <- list() [17:27:35.602] for (kk in seq_along(NAMES)) { [17:27:35.602] name <- changed[[kk]] [17:27:35.602] NAME <- NAMES[[kk]] [17:27:35.602] if (name != NAME && is.element(NAME, old_names)) [17:27:35.602] next [17:27:35.602] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.602] } [17:27:35.602] NAMES <- toupper(added) [17:27:35.602] for (kk in seq_along(NAMES)) { [17:27:35.602] name <- added[[kk]] [17:27:35.602] NAME <- NAMES[[kk]] [17:27:35.602] if (name != NAME && is.element(NAME, old_names)) [17:27:35.602] next [17:27:35.602] args[[name]] <- "" [17:27:35.602] } [17:27:35.602] NAMES <- toupper(removed) [17:27:35.602] for (kk in seq_along(NAMES)) { [17:27:35.602] name <- removed[[kk]] [17:27:35.602] NAME <- NAMES[[kk]] [17:27:35.602] if (name != NAME && is.element(NAME, old_names)) [17:27:35.602] next [17:27:35.602] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.602] } [17:27:35.602] if (length(args) > 0) [17:27:35.602] base::do.call(base::Sys.setenv, args = args) [17:27:35.602] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.602] } [17:27:35.602] else { [17:27:35.602] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.602] } [17:27:35.602] { [17:27:35.602] if (base::length(...future.futureOptionsAdded) > [17:27:35.602] 0L) { [17:27:35.602] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.602] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.602] base::options(opts) [17:27:35.602] } [17:27:35.602] { [17:27:35.602] { [17:27:35.602] NULL [17:27:35.602] RNGkind("Mersenne-Twister") [17:27:35.602] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.602] inherits = FALSE) [17:27:35.602] } [17:27:35.602] options(future.plan = NULL) [17:27:35.602] if (is.na(NA_character_)) [17:27:35.602] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.602] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.602] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.602] .init = FALSE) [17:27:35.602] } [17:27:35.602] } [17:27:35.602] } [17:27:35.602] }) [17:27:35.602] if (TRUE) { [17:27:35.602] base::sink(type = "output", split = FALSE) [17:27:35.602] if (TRUE) { [17:27:35.602] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.602] } [17:27:35.602] else { [17:27:35.602] ...future.result["stdout"] <- base::list(NULL) [17:27:35.602] } [17:27:35.602] base::close(...future.stdout) [17:27:35.602] ...future.stdout <- NULL [17:27:35.602] } [17:27:35.602] ...future.result$conditions <- ...future.conditions [17:27:35.602] ...future.result$finished <- base::Sys.time() [17:27:35.602] ...future.result [17:27:35.602] } [17:27:35.609] plan(): Setting new future strategy stack: [17:27:35.609] List of future strategies: [17:27:35.609] 1. sequential: [17:27:35.609] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.609] - tweaked: FALSE [17:27:35.609] - call: NULL [17:27:35.610] plan(): nbrOfWorkers() = 1 [17:27:35.612] plan(): Setting new future strategy stack: [17:27:35.613] List of future strategies: [17:27:35.613] 1. sequential: [17:27:35.613] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.613] - tweaked: FALSE [17:27:35.613] - call: plan(strategy) [17:27:35.613] plan(): nbrOfWorkers() = 1 [17:27:35.614] SequentialFuture started (and completed) [17:27:35.614] - Launch lazy future ... done [17:27:35.614] run() for 'SequentialFuture' ... done [17:27:35.615] getGlobalsAndPackages() ... [17:27:35.615] Searching for globals... [17:27:35.616] [17:27:35.616] Searching for globals ... DONE [17:27:35.616] - globals: [0] [17:27:35.617] getGlobalsAndPackages() ... DONE [17:27:35.617] run() for 'Future' ... [17:27:35.618] - state: 'created' [17:27:35.618] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.618] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.619] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.619] - Field: 'label' [17:27:35.619] - Field: 'local' [17:27:35.620] - Field: 'owner' [17:27:35.620] - Field: 'envir' [17:27:35.620] - Field: 'packages' [17:27:35.621] - Field: 'gc' [17:27:35.621] - Field: 'conditions' [17:27:35.621] - Field: 'expr' [17:27:35.621] - Field: 'uuid' [17:27:35.622] - Field: 'seed' [17:27:35.622] - Field: 'version' [17:27:35.622] - Field: 'result' [17:27:35.623] - Field: 'asynchronous' [17:27:35.623] - Field: 'calls' [17:27:35.623] - Field: 'globals' [17:27:35.624] - Field: 'stdout' [17:27:35.624] - Field: 'earlySignal' [17:27:35.624] - Field: 'lazy' [17:27:35.625] - Field: 'state' [17:27:35.625] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.625] - Launch lazy future ... [17:27:35.626] Packages needed by the future expression (n = 0): [17:27:35.626] Packages needed by future strategies (n = 0): [17:27:35.627] { [17:27:35.627] { [17:27:35.627] { [17:27:35.627] ...future.startTime <- base::Sys.time() [17:27:35.627] { [17:27:35.627] { [17:27:35.627] { [17:27:35.627] base::local({ [17:27:35.627] has_future <- base::requireNamespace("future", [17:27:35.627] quietly = TRUE) [17:27:35.627] if (has_future) { [17:27:35.627] ns <- base::getNamespace("future") [17:27:35.627] version <- ns[[".package"]][["version"]] [17:27:35.627] if (is.null(version)) [17:27:35.627] version <- utils::packageVersion("future") [17:27:35.627] } [17:27:35.627] else { [17:27:35.627] version <- NULL [17:27:35.627] } [17:27:35.627] if (!has_future || version < "1.8.0") { [17:27:35.627] info <- base::c(r_version = base::gsub("R version ", [17:27:35.627] "", base::R.version$version.string), [17:27:35.627] platform = base::sprintf("%s (%s-bit)", [17:27:35.627] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.627] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.627] "release", "version")], collapse = " "), [17:27:35.627] hostname = base::Sys.info()[["nodename"]]) [17:27:35.627] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.627] info) [17:27:35.627] info <- base::paste(info, collapse = "; ") [17:27:35.627] if (!has_future) { [17:27:35.627] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.627] info) [17:27:35.627] } [17:27:35.627] else { [17:27:35.627] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.627] info, version) [17:27:35.627] } [17:27:35.627] base::stop(msg) [17:27:35.627] } [17:27:35.627] }) [17:27:35.627] } [17:27:35.627] ...future.strategy.old <- future::plan("list") [17:27:35.627] options(future.plan = NULL) [17:27:35.627] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.627] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.627] } [17:27:35.627] ...future.workdir <- getwd() [17:27:35.627] } [17:27:35.627] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.627] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.627] } [17:27:35.627] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.627] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.627] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.627] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.627] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.627] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.627] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.627] base::names(...future.oldOptions)) [17:27:35.627] } [17:27:35.627] if (FALSE) { [17:27:35.627] } [17:27:35.627] else { [17:27:35.627] if (TRUE) { [17:27:35.627] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.627] open = "w") [17:27:35.627] } [17:27:35.627] else { [17:27:35.627] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.627] windows = "NUL", "/dev/null"), open = "w") [17:27:35.627] } [17:27:35.627] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.627] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.627] base::sink(type = "output", split = FALSE) [17:27:35.627] base::close(...future.stdout) [17:27:35.627] }, add = TRUE) [17:27:35.627] } [17:27:35.627] ...future.frame <- base::sys.nframe() [17:27:35.627] ...future.conditions <- base::list() [17:27:35.627] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.627] if (FALSE) { [17:27:35.627] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.627] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.627] } [17:27:35.627] ...future.result <- base::tryCatch({ [17:27:35.627] base::withCallingHandlers({ [17:27:35.627] ...future.value <- base::withVisible(base::local(NULL)) [17:27:35.627] future::FutureResult(value = ...future.value$value, [17:27:35.627] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.627] ...future.rng), globalenv = if (FALSE) [17:27:35.627] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.627] ...future.globalenv.names)) [17:27:35.627] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.627] }, condition = base::local({ [17:27:35.627] c <- base::c [17:27:35.627] inherits <- base::inherits [17:27:35.627] invokeRestart <- base::invokeRestart [17:27:35.627] length <- base::length [17:27:35.627] list <- base::list [17:27:35.627] seq.int <- base::seq.int [17:27:35.627] signalCondition <- base::signalCondition [17:27:35.627] sys.calls <- base::sys.calls [17:27:35.627] `[[` <- base::`[[` [17:27:35.627] `+` <- base::`+` [17:27:35.627] `<<-` <- base::`<<-` [17:27:35.627] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.627] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.627] 3L)] [17:27:35.627] } [17:27:35.627] function(cond) { [17:27:35.627] is_error <- inherits(cond, "error") [17:27:35.627] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.627] NULL) [17:27:35.627] if (is_error) { [17:27:35.627] sessionInformation <- function() { [17:27:35.627] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.627] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.627] search = base::search(), system = base::Sys.info()) [17:27:35.627] } [17:27:35.627] ...future.conditions[[length(...future.conditions) + [17:27:35.627] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.627] cond$call), session = sessionInformation(), [17:27:35.627] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.627] signalCondition(cond) [17:27:35.627] } [17:27:35.627] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.627] "immediateCondition"))) { [17:27:35.627] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.627] ...future.conditions[[length(...future.conditions) + [17:27:35.627] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.627] if (TRUE && !signal) { [17:27:35.627] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.627] { [17:27:35.627] inherits <- base::inherits [17:27:35.627] invokeRestart <- base::invokeRestart [17:27:35.627] is.null <- base::is.null [17:27:35.627] muffled <- FALSE [17:27:35.627] if (inherits(cond, "message")) { [17:27:35.627] muffled <- grepl(pattern, "muffleMessage") [17:27:35.627] if (muffled) [17:27:35.627] invokeRestart("muffleMessage") [17:27:35.627] } [17:27:35.627] else if (inherits(cond, "warning")) { [17:27:35.627] muffled <- grepl(pattern, "muffleWarning") [17:27:35.627] if (muffled) [17:27:35.627] invokeRestart("muffleWarning") [17:27:35.627] } [17:27:35.627] else if (inherits(cond, "condition")) { [17:27:35.627] if (!is.null(pattern)) { [17:27:35.627] computeRestarts <- base::computeRestarts [17:27:35.627] grepl <- base::grepl [17:27:35.627] restarts <- computeRestarts(cond) [17:27:35.627] for (restart in restarts) { [17:27:35.627] name <- restart$name [17:27:35.627] if (is.null(name)) [17:27:35.627] next [17:27:35.627] if (!grepl(pattern, name)) [17:27:35.627] next [17:27:35.627] invokeRestart(restart) [17:27:35.627] muffled <- TRUE [17:27:35.627] break [17:27:35.627] } [17:27:35.627] } [17:27:35.627] } [17:27:35.627] invisible(muffled) [17:27:35.627] } [17:27:35.627] muffleCondition(cond, pattern = "^muffle") [17:27:35.627] } [17:27:35.627] } [17:27:35.627] else { [17:27:35.627] if (TRUE) { [17:27:35.627] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.627] { [17:27:35.627] inherits <- base::inherits [17:27:35.627] invokeRestart <- base::invokeRestart [17:27:35.627] is.null <- base::is.null [17:27:35.627] muffled <- FALSE [17:27:35.627] if (inherits(cond, "message")) { [17:27:35.627] muffled <- grepl(pattern, "muffleMessage") [17:27:35.627] if (muffled) [17:27:35.627] invokeRestart("muffleMessage") [17:27:35.627] } [17:27:35.627] else if (inherits(cond, "warning")) { [17:27:35.627] muffled <- grepl(pattern, "muffleWarning") [17:27:35.627] if (muffled) [17:27:35.627] invokeRestart("muffleWarning") [17:27:35.627] } [17:27:35.627] else if (inherits(cond, "condition")) { [17:27:35.627] if (!is.null(pattern)) { [17:27:35.627] computeRestarts <- base::computeRestarts [17:27:35.627] grepl <- base::grepl [17:27:35.627] restarts <- computeRestarts(cond) [17:27:35.627] for (restart in restarts) { [17:27:35.627] name <- restart$name [17:27:35.627] if (is.null(name)) [17:27:35.627] next [17:27:35.627] if (!grepl(pattern, name)) [17:27:35.627] next [17:27:35.627] invokeRestart(restart) [17:27:35.627] muffled <- TRUE [17:27:35.627] break [17:27:35.627] } [17:27:35.627] } [17:27:35.627] } [17:27:35.627] invisible(muffled) [17:27:35.627] } [17:27:35.627] muffleCondition(cond, pattern = "^muffle") [17:27:35.627] } [17:27:35.627] } [17:27:35.627] } [17:27:35.627] })) [17:27:35.627] }, error = function(ex) { [17:27:35.627] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.627] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.627] ...future.rng), started = ...future.startTime, [17:27:35.627] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.627] version = "1.8"), class = "FutureResult") [17:27:35.627] }, finally = { [17:27:35.627] if (!identical(...future.workdir, getwd())) [17:27:35.627] setwd(...future.workdir) [17:27:35.627] { [17:27:35.627] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.627] ...future.oldOptions$nwarnings <- NULL [17:27:35.627] } [17:27:35.627] base::options(...future.oldOptions) [17:27:35.627] if (.Platform$OS.type == "windows") { [17:27:35.627] old_names <- names(...future.oldEnvVars) [17:27:35.627] envs <- base::Sys.getenv() [17:27:35.627] names <- names(envs) [17:27:35.627] common <- intersect(names, old_names) [17:27:35.627] added <- setdiff(names, old_names) [17:27:35.627] removed <- setdiff(old_names, names) [17:27:35.627] changed <- common[...future.oldEnvVars[common] != [17:27:35.627] envs[common]] [17:27:35.627] NAMES <- toupper(changed) [17:27:35.627] args <- list() [17:27:35.627] for (kk in seq_along(NAMES)) { [17:27:35.627] name <- changed[[kk]] [17:27:35.627] NAME <- NAMES[[kk]] [17:27:35.627] if (name != NAME && is.element(NAME, old_names)) [17:27:35.627] next [17:27:35.627] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.627] } [17:27:35.627] NAMES <- toupper(added) [17:27:35.627] for (kk in seq_along(NAMES)) { [17:27:35.627] name <- added[[kk]] [17:27:35.627] NAME <- NAMES[[kk]] [17:27:35.627] if (name != NAME && is.element(NAME, old_names)) [17:27:35.627] next [17:27:35.627] args[[name]] <- "" [17:27:35.627] } [17:27:35.627] NAMES <- toupper(removed) [17:27:35.627] for (kk in seq_along(NAMES)) { [17:27:35.627] name <- removed[[kk]] [17:27:35.627] NAME <- NAMES[[kk]] [17:27:35.627] if (name != NAME && is.element(NAME, old_names)) [17:27:35.627] next [17:27:35.627] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.627] } [17:27:35.627] if (length(args) > 0) [17:27:35.627] base::do.call(base::Sys.setenv, args = args) [17:27:35.627] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.627] } [17:27:35.627] else { [17:27:35.627] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.627] } [17:27:35.627] { [17:27:35.627] if (base::length(...future.futureOptionsAdded) > [17:27:35.627] 0L) { [17:27:35.627] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.627] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.627] base::options(opts) [17:27:35.627] } [17:27:35.627] { [17:27:35.627] { [17:27:35.627] NULL [17:27:35.627] RNGkind("Mersenne-Twister") [17:27:35.627] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.627] inherits = FALSE) [17:27:35.627] } [17:27:35.627] options(future.plan = NULL) [17:27:35.627] if (is.na(NA_character_)) [17:27:35.627] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.627] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.627] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.627] .init = FALSE) [17:27:35.627] } [17:27:35.627] } [17:27:35.627] } [17:27:35.627] }) [17:27:35.627] if (TRUE) { [17:27:35.627] base::sink(type = "output", split = FALSE) [17:27:35.627] if (TRUE) { [17:27:35.627] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.627] } [17:27:35.627] else { [17:27:35.627] ...future.result["stdout"] <- base::list(NULL) [17:27:35.627] } [17:27:35.627] base::close(...future.stdout) [17:27:35.627] ...future.stdout <- NULL [17:27:35.627] } [17:27:35.627] ...future.result$conditions <- ...future.conditions [17:27:35.627] ...future.result$finished <- base::Sys.time() [17:27:35.627] ...future.result [17:27:35.627] } [17:27:35.634] plan(): Setting new future strategy stack: [17:27:35.634] List of future strategies: [17:27:35.634] 1. sequential: [17:27:35.634] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.634] - tweaked: FALSE [17:27:35.634] - call: NULL [17:27:35.635] plan(): nbrOfWorkers() = 1 [17:27:35.638] plan(): Setting new future strategy stack: [17:27:35.638] List of future strategies: [17:27:35.638] 1. sequential: [17:27:35.638] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.638] - tweaked: FALSE [17:27:35.638] - call: plan(strategy) [17:27:35.639] plan(): nbrOfWorkers() = 1 [17:27:35.640] SequentialFuture started (and completed) [17:27:35.640] - Launch lazy future ... done [17:27:35.640] run() for 'SequentialFuture' ... done [17:27:35.641] getGlobalsAndPackages() ... [17:27:35.642] Searching for globals... [17:27:35.643] - globals found: [1] '{' [17:27:35.643] Searching for globals ... DONE [17:27:35.644] Resolving globals: FALSE [17:27:35.644] [17:27:35.645] [17:27:35.645] getGlobalsAndPackages() ... DONE [17:27:35.645] run() for 'Future' ... [17:27:35.646] - state: 'created' [17:27:35.646] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.647] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.647] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.648] - Field: 'label' [17:27:35.648] - Field: 'local' [17:27:35.648] - Field: 'owner' [17:27:35.649] - Field: 'envir' [17:27:35.649] - Field: 'packages' [17:27:35.650] - Field: 'gc' [17:27:35.650] - Field: 'conditions' [17:27:35.650] - Field: 'expr' [17:27:35.651] - Field: 'uuid' [17:27:35.651] - Field: 'seed' [17:27:35.651] - Field: 'version' [17:27:35.652] - Field: 'result' [17:27:35.652] - Field: 'asynchronous' [17:27:35.652] - Field: 'calls' [17:27:35.653] - Field: 'globals' [17:27:35.653] - Field: 'stdout' [17:27:35.653] - Field: 'earlySignal' [17:27:35.654] - Field: 'lazy' [17:27:35.654] - Field: 'state' [17:27:35.654] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.655] - Launch lazy future ... [17:27:35.655] Packages needed by the future expression (n = 0): [17:27:35.655] Packages needed by future strategies (n = 0): [17:27:35.657] { [17:27:35.657] { [17:27:35.657] { [17:27:35.657] ...future.startTime <- base::Sys.time() [17:27:35.657] { [17:27:35.657] { [17:27:35.657] { [17:27:35.657] base::local({ [17:27:35.657] has_future <- base::requireNamespace("future", [17:27:35.657] quietly = TRUE) [17:27:35.657] if (has_future) { [17:27:35.657] ns <- base::getNamespace("future") [17:27:35.657] version <- ns[[".package"]][["version"]] [17:27:35.657] if (is.null(version)) [17:27:35.657] version <- utils::packageVersion("future") [17:27:35.657] } [17:27:35.657] else { [17:27:35.657] version <- NULL [17:27:35.657] } [17:27:35.657] if (!has_future || version < "1.8.0") { [17:27:35.657] info <- base::c(r_version = base::gsub("R version ", [17:27:35.657] "", base::R.version$version.string), [17:27:35.657] platform = base::sprintf("%s (%s-bit)", [17:27:35.657] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.657] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.657] "release", "version")], collapse = " "), [17:27:35.657] hostname = base::Sys.info()[["nodename"]]) [17:27:35.657] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.657] info) [17:27:35.657] info <- base::paste(info, collapse = "; ") [17:27:35.657] if (!has_future) { [17:27:35.657] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.657] info) [17:27:35.657] } [17:27:35.657] else { [17:27:35.657] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.657] info, version) [17:27:35.657] } [17:27:35.657] base::stop(msg) [17:27:35.657] } [17:27:35.657] }) [17:27:35.657] } [17:27:35.657] ...future.strategy.old <- future::plan("list") [17:27:35.657] options(future.plan = NULL) [17:27:35.657] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.657] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.657] } [17:27:35.657] ...future.workdir <- getwd() [17:27:35.657] } [17:27:35.657] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.657] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.657] } [17:27:35.657] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.657] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.657] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.657] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.657] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.657] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.657] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.657] base::names(...future.oldOptions)) [17:27:35.657] } [17:27:35.657] if (FALSE) { [17:27:35.657] } [17:27:35.657] else { [17:27:35.657] if (TRUE) { [17:27:35.657] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.657] open = "w") [17:27:35.657] } [17:27:35.657] else { [17:27:35.657] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.657] windows = "NUL", "/dev/null"), open = "w") [17:27:35.657] } [17:27:35.657] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.657] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.657] base::sink(type = "output", split = FALSE) [17:27:35.657] base::close(...future.stdout) [17:27:35.657] }, add = TRUE) [17:27:35.657] } [17:27:35.657] ...future.frame <- base::sys.nframe() [17:27:35.657] ...future.conditions <- base::list() [17:27:35.657] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.657] if (FALSE) { [17:27:35.657] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.657] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.657] } [17:27:35.657] ...future.result <- base::tryCatch({ [17:27:35.657] base::withCallingHandlers({ [17:27:35.657] ...future.value <- base::withVisible(base::local({ [17:27:35.657] 4 [17:27:35.657] })) [17:27:35.657] future::FutureResult(value = ...future.value$value, [17:27:35.657] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.657] ...future.rng), globalenv = if (FALSE) [17:27:35.657] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.657] ...future.globalenv.names)) [17:27:35.657] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.657] }, condition = base::local({ [17:27:35.657] c <- base::c [17:27:35.657] inherits <- base::inherits [17:27:35.657] invokeRestart <- base::invokeRestart [17:27:35.657] length <- base::length [17:27:35.657] list <- base::list [17:27:35.657] seq.int <- base::seq.int [17:27:35.657] signalCondition <- base::signalCondition [17:27:35.657] sys.calls <- base::sys.calls [17:27:35.657] `[[` <- base::`[[` [17:27:35.657] `+` <- base::`+` [17:27:35.657] `<<-` <- base::`<<-` [17:27:35.657] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.657] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.657] 3L)] [17:27:35.657] } [17:27:35.657] function(cond) { [17:27:35.657] is_error <- inherits(cond, "error") [17:27:35.657] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.657] NULL) [17:27:35.657] if (is_error) { [17:27:35.657] sessionInformation <- function() { [17:27:35.657] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.657] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.657] search = base::search(), system = base::Sys.info()) [17:27:35.657] } [17:27:35.657] ...future.conditions[[length(...future.conditions) + [17:27:35.657] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.657] cond$call), session = sessionInformation(), [17:27:35.657] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.657] signalCondition(cond) [17:27:35.657] } [17:27:35.657] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.657] "immediateCondition"))) { [17:27:35.657] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.657] ...future.conditions[[length(...future.conditions) + [17:27:35.657] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.657] if (TRUE && !signal) { [17:27:35.657] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.657] { [17:27:35.657] inherits <- base::inherits [17:27:35.657] invokeRestart <- base::invokeRestart [17:27:35.657] is.null <- base::is.null [17:27:35.657] muffled <- FALSE [17:27:35.657] if (inherits(cond, "message")) { [17:27:35.657] muffled <- grepl(pattern, "muffleMessage") [17:27:35.657] if (muffled) [17:27:35.657] invokeRestart("muffleMessage") [17:27:35.657] } [17:27:35.657] else if (inherits(cond, "warning")) { [17:27:35.657] muffled <- grepl(pattern, "muffleWarning") [17:27:35.657] if (muffled) [17:27:35.657] invokeRestart("muffleWarning") [17:27:35.657] } [17:27:35.657] else if (inherits(cond, "condition")) { [17:27:35.657] if (!is.null(pattern)) { [17:27:35.657] computeRestarts <- base::computeRestarts [17:27:35.657] grepl <- base::grepl [17:27:35.657] restarts <- computeRestarts(cond) [17:27:35.657] for (restart in restarts) { [17:27:35.657] name <- restart$name [17:27:35.657] if (is.null(name)) [17:27:35.657] next [17:27:35.657] if (!grepl(pattern, name)) [17:27:35.657] next [17:27:35.657] invokeRestart(restart) [17:27:35.657] muffled <- TRUE [17:27:35.657] break [17:27:35.657] } [17:27:35.657] } [17:27:35.657] } [17:27:35.657] invisible(muffled) [17:27:35.657] } [17:27:35.657] muffleCondition(cond, pattern = "^muffle") [17:27:35.657] } [17:27:35.657] } [17:27:35.657] else { [17:27:35.657] if (TRUE) { [17:27:35.657] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.657] { [17:27:35.657] inherits <- base::inherits [17:27:35.657] invokeRestart <- base::invokeRestart [17:27:35.657] is.null <- base::is.null [17:27:35.657] muffled <- FALSE [17:27:35.657] if (inherits(cond, "message")) { [17:27:35.657] muffled <- grepl(pattern, "muffleMessage") [17:27:35.657] if (muffled) [17:27:35.657] invokeRestart("muffleMessage") [17:27:35.657] } [17:27:35.657] else if (inherits(cond, "warning")) { [17:27:35.657] muffled <- grepl(pattern, "muffleWarning") [17:27:35.657] if (muffled) [17:27:35.657] invokeRestart("muffleWarning") [17:27:35.657] } [17:27:35.657] else if (inherits(cond, "condition")) { [17:27:35.657] if (!is.null(pattern)) { [17:27:35.657] computeRestarts <- base::computeRestarts [17:27:35.657] grepl <- base::grepl [17:27:35.657] restarts <- computeRestarts(cond) [17:27:35.657] for (restart in restarts) { [17:27:35.657] name <- restart$name [17:27:35.657] if (is.null(name)) [17:27:35.657] next [17:27:35.657] if (!grepl(pattern, name)) [17:27:35.657] next [17:27:35.657] invokeRestart(restart) [17:27:35.657] muffled <- TRUE [17:27:35.657] break [17:27:35.657] } [17:27:35.657] } [17:27:35.657] } [17:27:35.657] invisible(muffled) [17:27:35.657] } [17:27:35.657] muffleCondition(cond, pattern = "^muffle") [17:27:35.657] } [17:27:35.657] } [17:27:35.657] } [17:27:35.657] })) [17:27:35.657] }, error = function(ex) { [17:27:35.657] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.657] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.657] ...future.rng), started = ...future.startTime, [17:27:35.657] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.657] version = "1.8"), class = "FutureResult") [17:27:35.657] }, finally = { [17:27:35.657] if (!identical(...future.workdir, getwd())) [17:27:35.657] setwd(...future.workdir) [17:27:35.657] { [17:27:35.657] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.657] ...future.oldOptions$nwarnings <- NULL [17:27:35.657] } [17:27:35.657] base::options(...future.oldOptions) [17:27:35.657] if (.Platform$OS.type == "windows") { [17:27:35.657] old_names <- names(...future.oldEnvVars) [17:27:35.657] envs <- base::Sys.getenv() [17:27:35.657] names <- names(envs) [17:27:35.657] common <- intersect(names, old_names) [17:27:35.657] added <- setdiff(names, old_names) [17:27:35.657] removed <- setdiff(old_names, names) [17:27:35.657] changed <- common[...future.oldEnvVars[common] != [17:27:35.657] envs[common]] [17:27:35.657] NAMES <- toupper(changed) [17:27:35.657] args <- list() [17:27:35.657] for (kk in seq_along(NAMES)) { [17:27:35.657] name <- changed[[kk]] [17:27:35.657] NAME <- NAMES[[kk]] [17:27:35.657] if (name != NAME && is.element(NAME, old_names)) [17:27:35.657] next [17:27:35.657] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.657] } [17:27:35.657] NAMES <- toupper(added) [17:27:35.657] for (kk in seq_along(NAMES)) { [17:27:35.657] name <- added[[kk]] [17:27:35.657] NAME <- NAMES[[kk]] [17:27:35.657] if (name != NAME && is.element(NAME, old_names)) [17:27:35.657] next [17:27:35.657] args[[name]] <- "" [17:27:35.657] } [17:27:35.657] NAMES <- toupper(removed) [17:27:35.657] for (kk in seq_along(NAMES)) { [17:27:35.657] name <- removed[[kk]] [17:27:35.657] NAME <- NAMES[[kk]] [17:27:35.657] if (name != NAME && is.element(NAME, old_names)) [17:27:35.657] next [17:27:35.657] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.657] } [17:27:35.657] if (length(args) > 0) [17:27:35.657] base::do.call(base::Sys.setenv, args = args) [17:27:35.657] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.657] } [17:27:35.657] else { [17:27:35.657] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.657] } [17:27:35.657] { [17:27:35.657] if (base::length(...future.futureOptionsAdded) > [17:27:35.657] 0L) { [17:27:35.657] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.657] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.657] base::options(opts) [17:27:35.657] } [17:27:35.657] { [17:27:35.657] { [17:27:35.657] NULL [17:27:35.657] RNGkind("Mersenne-Twister") [17:27:35.657] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.657] inherits = FALSE) [17:27:35.657] } [17:27:35.657] options(future.plan = NULL) [17:27:35.657] if (is.na(NA_character_)) [17:27:35.657] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.657] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.657] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.657] .init = FALSE) [17:27:35.657] } [17:27:35.657] } [17:27:35.657] } [17:27:35.657] }) [17:27:35.657] if (TRUE) { [17:27:35.657] base::sink(type = "output", split = FALSE) [17:27:35.657] if (TRUE) { [17:27:35.657] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.657] } [17:27:35.657] else { [17:27:35.657] ...future.result["stdout"] <- base::list(NULL) [17:27:35.657] } [17:27:35.657] base::close(...future.stdout) [17:27:35.657] ...future.stdout <- NULL [17:27:35.657] } [17:27:35.657] ...future.result$conditions <- ...future.conditions [17:27:35.657] ...future.result$finished <- base::Sys.time() [17:27:35.657] ...future.result [17:27:35.657] } [17:27:35.663] plan(): Setting new future strategy stack: [17:27:35.664] List of future strategies: [17:27:35.664] 1. sequential: [17:27:35.664] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.664] - tweaked: FALSE [17:27:35.664] - call: NULL [17:27:35.665] plan(): nbrOfWorkers() = 1 [17:27:35.667] plan(): Setting new future strategy stack: [17:27:35.667] List of future strategies: [17:27:35.667] 1. sequential: [17:27:35.667] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.667] - tweaked: FALSE [17:27:35.667] - call: plan(strategy) [17:27:35.671] plan(): nbrOfWorkers() = 1 [17:27:35.672] SequentialFuture started (and completed) [17:27:35.672] - Launch lazy future ... done [17:27:35.673] run() for 'SequentialFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 1 6 - attr(*, "dimnames.")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... [17:27:35.680] resolved() for 'SequentialFuture' ... [17:27:35.680] - state: 'finished' [17:27:35.680] - run: TRUE [17:27:35.681] - result: 'FutureResult' [17:27:35.681] resolved() for 'SequentialFuture' ... done [17:27:35.682] resolved() for 'SequentialFuture' ... [17:27:35.682] - state: 'finished' [17:27:35.682] - run: TRUE [17:27:35.683] - result: 'FutureResult' [17:27:35.683] resolved() for 'SequentialFuture' ... done [17:27:35.683] resolved() for 'SequentialFuture' ... [17:27:35.684] - state: 'finished' [17:27:35.684] - run: TRUE [17:27:35.684] - result: 'FutureResult' [17:27:35.685] resolved() for 'SequentialFuture' ... done logi [1, 1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:35.690] resolve() on list environment ... [17:27:35.690] recursive: 0 [17:27:35.692] length: 6 [17:27:35.692] elements: 'a', 'b', 'c', 'd', '', '' [17:27:35.693] signalConditionsASAP(numeric, pos=1) ... [17:27:35.693] - nx: 6 [17:27:35.693] - relay: TRUE [17:27:35.694] - stdout: TRUE [17:27:35.694] - signal: TRUE [17:27:35.694] - resignal: FALSE [17:27:35.694] - force: TRUE [17:27:35.695] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.695] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.696] - until=2 [17:27:35.696] - relaying element #2 [17:27:35.696] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.696] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.697] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.697] length: 5 (resolved future 1) [17:27:35.697] resolved() for 'SequentialFuture' ... [17:27:35.698] - state: 'finished' [17:27:35.698] - run: TRUE [17:27:35.699] - result: 'FutureResult' [17:27:35.699] resolved() for 'SequentialFuture' ... done [17:27:35.699] Future #2 [17:27:35.700] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.700] - nx: 6 [17:27:35.700] - relay: TRUE [17:27:35.701] - stdout: TRUE [17:27:35.701] - signal: TRUE [17:27:35.701] - resignal: FALSE [17:27:35.701] - force: TRUE [17:27:35.702] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.702] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.702] - until=2 [17:27:35.703] - relaying element #2 [17:27:35.703] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.703] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.703] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.703] length: 4 (resolved future 2) [17:27:35.704] resolved() for 'SequentialFuture' ... [17:27:35.704] - state: 'finished' [17:27:35.704] - run: TRUE [17:27:35.704] - result: 'FutureResult' [17:27:35.705] resolved() for 'SequentialFuture' ... done [17:27:35.705] Future #3 [17:27:35.706] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.706] - nx: 6 [17:27:35.706] - relay: TRUE [17:27:35.706] - stdout: TRUE [17:27:35.707] - signal: TRUE [17:27:35.707] - resignal: FALSE [17:27:35.707] - force: TRUE [17:27:35.708] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.708] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.708] - until=3 [17:27:35.709] - relaying element #3 [17:27:35.709] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.709] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.710] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.710] length: 3 (resolved future 3) [17:27:35.710] resolved() for 'SequentialFuture' ... [17:27:35.711] - state: 'finished' [17:27:35.711] - run: TRUE [17:27:35.711] - result: 'FutureResult' [17:27:35.712] resolved() for 'SequentialFuture' ... done [17:27:35.712] Future #4 [17:27:35.712] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.713] - nx: 6 [17:27:35.713] - relay: TRUE [17:27:35.713] - stdout: TRUE [17:27:35.713] - signal: TRUE [17:27:35.714] - resignal: FALSE [17:27:35.714] - force: TRUE [17:27:35.714] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.714] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.715] - until=4 [17:27:35.715] - relaying element #4 [17:27:35.718] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.719] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.719] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.720] length: 2 (resolved future 4) [17:27:35.720] signalConditionsASAP(NULL, pos=5) ... [17:27:35.720] - nx: 6 [17:27:35.721] - relay: TRUE [17:27:35.721] - stdout: TRUE [17:27:35.721] - signal: TRUE [17:27:35.722] - resignal: FALSE [17:27:35.722] - force: TRUE [17:27:35.722] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.723] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.723] - until=6 [17:27:35.723] - relaying element #6 [17:27:35.723] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:35.723] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.724] signalConditionsASAP(NULL, pos=5) ... done [17:27:35.724] length: 1 (resolved future 5) [17:27:35.724] signalConditionsASAP(numeric, pos=6) ... [17:27:35.724] - nx: 6 [17:27:35.724] - relay: TRUE [17:27:35.725] - stdout: TRUE [17:27:35.725] - signal: TRUE [17:27:35.725] - resignal: FALSE [17:27:35.725] - force: TRUE [17:27:35.725] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:35.726] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.726] - until=6 [17:27:35.726] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.727] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.727] signalConditionsASAP(numeric, pos=6) ... done [17:27:35.727] length: 0 (resolved future 6) [17:27:35.727] Relaying remaining futures [17:27:35.728] signalConditionsASAP(NULL, pos=0) ... [17:27:35.728] - nx: 6 [17:27:35.728] - relay: TRUE [17:27:35.729] - stdout: TRUE [17:27:35.729] - signal: TRUE [17:27:35.729] - resignal: FALSE [17:27:35.729] - force: TRUE [17:27:35.730] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.730] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:35.731] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.731] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.731] signalConditionsASAP(NULL, pos=0) ... done [17:27:35.731] resolve() on list environment ... DONE Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 1 6 - attr(*, "dimnames.")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... Dimensions: c(2, 3) [17:27:35.738] getGlobalsAndPackages() ... [17:27:35.738] Searching for globals... [17:27:35.739] [17:27:35.739] Searching for globals ... DONE [17:27:35.740] - globals: [0] [17:27:35.740] getGlobalsAndPackages() ... DONE [17:27:35.740] run() for 'Future' ... [17:27:35.741] - state: 'created' [17:27:35.741] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.742] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.742] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.743] - Field: 'label' [17:27:35.743] - Field: 'local' [17:27:35.743] - Field: 'owner' [17:27:35.744] - Field: 'envir' [17:27:35.744] - Field: 'packages' [17:27:35.744] - Field: 'gc' [17:27:35.745] - Field: 'conditions' [17:27:35.745] - Field: 'expr' [17:27:35.745] - Field: 'uuid' [17:27:35.745] - Field: 'seed' [17:27:35.746] - Field: 'version' [17:27:35.746] - Field: 'result' [17:27:35.746] - Field: 'asynchronous' [17:27:35.747] - Field: 'calls' [17:27:35.747] - Field: 'globals' [17:27:35.747] - Field: 'stdout' [17:27:35.748] - Field: 'earlySignal' [17:27:35.748] - Field: 'lazy' [17:27:35.748] - Field: 'state' [17:27:35.749] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.749] - Launch lazy future ... [17:27:35.750] Packages needed by the future expression (n = 0): [17:27:35.750] Packages needed by future strategies (n = 0): [17:27:35.751] { [17:27:35.751] { [17:27:35.751] { [17:27:35.751] ...future.startTime <- base::Sys.time() [17:27:35.751] { [17:27:35.751] { [17:27:35.751] { [17:27:35.751] base::local({ [17:27:35.751] has_future <- base::requireNamespace("future", [17:27:35.751] quietly = TRUE) [17:27:35.751] if (has_future) { [17:27:35.751] ns <- base::getNamespace("future") [17:27:35.751] version <- ns[[".package"]][["version"]] [17:27:35.751] if (is.null(version)) [17:27:35.751] version <- utils::packageVersion("future") [17:27:35.751] } [17:27:35.751] else { [17:27:35.751] version <- NULL [17:27:35.751] } [17:27:35.751] if (!has_future || version < "1.8.0") { [17:27:35.751] info <- base::c(r_version = base::gsub("R version ", [17:27:35.751] "", base::R.version$version.string), [17:27:35.751] platform = base::sprintf("%s (%s-bit)", [17:27:35.751] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.751] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.751] "release", "version")], collapse = " "), [17:27:35.751] hostname = base::Sys.info()[["nodename"]]) [17:27:35.751] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.751] info) [17:27:35.751] info <- base::paste(info, collapse = "; ") [17:27:35.751] if (!has_future) { [17:27:35.751] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.751] info) [17:27:35.751] } [17:27:35.751] else { [17:27:35.751] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.751] info, version) [17:27:35.751] } [17:27:35.751] base::stop(msg) [17:27:35.751] } [17:27:35.751] }) [17:27:35.751] } [17:27:35.751] ...future.strategy.old <- future::plan("list") [17:27:35.751] options(future.plan = NULL) [17:27:35.751] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.751] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.751] } [17:27:35.751] ...future.workdir <- getwd() [17:27:35.751] } [17:27:35.751] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.751] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.751] } [17:27:35.751] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.751] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.751] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.751] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.751] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.751] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.751] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.751] base::names(...future.oldOptions)) [17:27:35.751] } [17:27:35.751] if (FALSE) { [17:27:35.751] } [17:27:35.751] else { [17:27:35.751] if (TRUE) { [17:27:35.751] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.751] open = "w") [17:27:35.751] } [17:27:35.751] else { [17:27:35.751] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.751] windows = "NUL", "/dev/null"), open = "w") [17:27:35.751] } [17:27:35.751] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.751] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.751] base::sink(type = "output", split = FALSE) [17:27:35.751] base::close(...future.stdout) [17:27:35.751] }, add = TRUE) [17:27:35.751] } [17:27:35.751] ...future.frame <- base::sys.nframe() [17:27:35.751] ...future.conditions <- base::list() [17:27:35.751] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.751] if (FALSE) { [17:27:35.751] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.751] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.751] } [17:27:35.751] ...future.result <- base::tryCatch({ [17:27:35.751] base::withCallingHandlers({ [17:27:35.751] ...future.value <- base::withVisible(base::local(2)) [17:27:35.751] future::FutureResult(value = ...future.value$value, [17:27:35.751] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.751] ...future.rng), globalenv = if (FALSE) [17:27:35.751] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.751] ...future.globalenv.names)) [17:27:35.751] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.751] }, condition = base::local({ [17:27:35.751] c <- base::c [17:27:35.751] inherits <- base::inherits [17:27:35.751] invokeRestart <- base::invokeRestart [17:27:35.751] length <- base::length [17:27:35.751] list <- base::list [17:27:35.751] seq.int <- base::seq.int [17:27:35.751] signalCondition <- base::signalCondition [17:27:35.751] sys.calls <- base::sys.calls [17:27:35.751] `[[` <- base::`[[` [17:27:35.751] `+` <- base::`+` [17:27:35.751] `<<-` <- base::`<<-` [17:27:35.751] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.751] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.751] 3L)] [17:27:35.751] } [17:27:35.751] function(cond) { [17:27:35.751] is_error <- inherits(cond, "error") [17:27:35.751] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.751] NULL) [17:27:35.751] if (is_error) { [17:27:35.751] sessionInformation <- function() { [17:27:35.751] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.751] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.751] search = base::search(), system = base::Sys.info()) [17:27:35.751] } [17:27:35.751] ...future.conditions[[length(...future.conditions) + [17:27:35.751] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.751] cond$call), session = sessionInformation(), [17:27:35.751] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.751] signalCondition(cond) [17:27:35.751] } [17:27:35.751] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.751] "immediateCondition"))) { [17:27:35.751] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.751] ...future.conditions[[length(...future.conditions) + [17:27:35.751] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.751] if (TRUE && !signal) { [17:27:35.751] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.751] { [17:27:35.751] inherits <- base::inherits [17:27:35.751] invokeRestart <- base::invokeRestart [17:27:35.751] is.null <- base::is.null [17:27:35.751] muffled <- FALSE [17:27:35.751] if (inherits(cond, "message")) { [17:27:35.751] muffled <- grepl(pattern, "muffleMessage") [17:27:35.751] if (muffled) [17:27:35.751] invokeRestart("muffleMessage") [17:27:35.751] } [17:27:35.751] else if (inherits(cond, "warning")) { [17:27:35.751] muffled <- grepl(pattern, "muffleWarning") [17:27:35.751] if (muffled) [17:27:35.751] invokeRestart("muffleWarning") [17:27:35.751] } [17:27:35.751] else if (inherits(cond, "condition")) { [17:27:35.751] if (!is.null(pattern)) { [17:27:35.751] computeRestarts <- base::computeRestarts [17:27:35.751] grepl <- base::grepl [17:27:35.751] restarts <- computeRestarts(cond) [17:27:35.751] for (restart in restarts) { [17:27:35.751] name <- restart$name [17:27:35.751] if (is.null(name)) [17:27:35.751] next [17:27:35.751] if (!grepl(pattern, name)) [17:27:35.751] next [17:27:35.751] invokeRestart(restart) [17:27:35.751] muffled <- TRUE [17:27:35.751] break [17:27:35.751] } [17:27:35.751] } [17:27:35.751] } [17:27:35.751] invisible(muffled) [17:27:35.751] } [17:27:35.751] muffleCondition(cond, pattern = "^muffle") [17:27:35.751] } [17:27:35.751] } [17:27:35.751] else { [17:27:35.751] if (TRUE) { [17:27:35.751] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.751] { [17:27:35.751] inherits <- base::inherits [17:27:35.751] invokeRestart <- base::invokeRestart [17:27:35.751] is.null <- base::is.null [17:27:35.751] muffled <- FALSE [17:27:35.751] if (inherits(cond, "message")) { [17:27:35.751] muffled <- grepl(pattern, "muffleMessage") [17:27:35.751] if (muffled) [17:27:35.751] invokeRestart("muffleMessage") [17:27:35.751] } [17:27:35.751] else if (inherits(cond, "warning")) { [17:27:35.751] muffled <- grepl(pattern, "muffleWarning") [17:27:35.751] if (muffled) [17:27:35.751] invokeRestart("muffleWarning") [17:27:35.751] } [17:27:35.751] else if (inherits(cond, "condition")) { [17:27:35.751] if (!is.null(pattern)) { [17:27:35.751] computeRestarts <- base::computeRestarts [17:27:35.751] grepl <- base::grepl [17:27:35.751] restarts <- computeRestarts(cond) [17:27:35.751] for (restart in restarts) { [17:27:35.751] name <- restart$name [17:27:35.751] if (is.null(name)) [17:27:35.751] next [17:27:35.751] if (!grepl(pattern, name)) [17:27:35.751] next [17:27:35.751] invokeRestart(restart) [17:27:35.751] muffled <- TRUE [17:27:35.751] break [17:27:35.751] } [17:27:35.751] } [17:27:35.751] } [17:27:35.751] invisible(muffled) [17:27:35.751] } [17:27:35.751] muffleCondition(cond, pattern = "^muffle") [17:27:35.751] } [17:27:35.751] } [17:27:35.751] } [17:27:35.751] })) [17:27:35.751] }, error = function(ex) { [17:27:35.751] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.751] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.751] ...future.rng), started = ...future.startTime, [17:27:35.751] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.751] version = "1.8"), class = "FutureResult") [17:27:35.751] }, finally = { [17:27:35.751] if (!identical(...future.workdir, getwd())) [17:27:35.751] setwd(...future.workdir) [17:27:35.751] { [17:27:35.751] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.751] ...future.oldOptions$nwarnings <- NULL [17:27:35.751] } [17:27:35.751] base::options(...future.oldOptions) [17:27:35.751] if (.Platform$OS.type == "windows") { [17:27:35.751] old_names <- names(...future.oldEnvVars) [17:27:35.751] envs <- base::Sys.getenv() [17:27:35.751] names <- names(envs) [17:27:35.751] common <- intersect(names, old_names) [17:27:35.751] added <- setdiff(names, old_names) [17:27:35.751] removed <- setdiff(old_names, names) [17:27:35.751] changed <- common[...future.oldEnvVars[common] != [17:27:35.751] envs[common]] [17:27:35.751] NAMES <- toupper(changed) [17:27:35.751] args <- list() [17:27:35.751] for (kk in seq_along(NAMES)) { [17:27:35.751] name <- changed[[kk]] [17:27:35.751] NAME <- NAMES[[kk]] [17:27:35.751] if (name != NAME && is.element(NAME, old_names)) [17:27:35.751] next [17:27:35.751] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.751] } [17:27:35.751] NAMES <- toupper(added) [17:27:35.751] for (kk in seq_along(NAMES)) { [17:27:35.751] name <- added[[kk]] [17:27:35.751] NAME <- NAMES[[kk]] [17:27:35.751] if (name != NAME && is.element(NAME, old_names)) [17:27:35.751] next [17:27:35.751] args[[name]] <- "" [17:27:35.751] } [17:27:35.751] NAMES <- toupper(removed) [17:27:35.751] for (kk in seq_along(NAMES)) { [17:27:35.751] name <- removed[[kk]] [17:27:35.751] NAME <- NAMES[[kk]] [17:27:35.751] if (name != NAME && is.element(NAME, old_names)) [17:27:35.751] next [17:27:35.751] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.751] } [17:27:35.751] if (length(args) > 0) [17:27:35.751] base::do.call(base::Sys.setenv, args = args) [17:27:35.751] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.751] } [17:27:35.751] else { [17:27:35.751] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.751] } [17:27:35.751] { [17:27:35.751] if (base::length(...future.futureOptionsAdded) > [17:27:35.751] 0L) { [17:27:35.751] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.751] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.751] base::options(opts) [17:27:35.751] } [17:27:35.751] { [17:27:35.751] { [17:27:35.751] NULL [17:27:35.751] RNGkind("Mersenne-Twister") [17:27:35.751] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.751] inherits = FALSE) [17:27:35.751] } [17:27:35.751] options(future.plan = NULL) [17:27:35.751] if (is.na(NA_character_)) [17:27:35.751] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.751] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.751] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.751] .init = FALSE) [17:27:35.751] } [17:27:35.751] } [17:27:35.751] } [17:27:35.751] }) [17:27:35.751] if (TRUE) { [17:27:35.751] base::sink(type = "output", split = FALSE) [17:27:35.751] if (TRUE) { [17:27:35.751] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.751] } [17:27:35.751] else { [17:27:35.751] ...future.result["stdout"] <- base::list(NULL) [17:27:35.751] } [17:27:35.751] base::close(...future.stdout) [17:27:35.751] ...future.stdout <- NULL [17:27:35.751] } [17:27:35.751] ...future.result$conditions <- ...future.conditions [17:27:35.751] ...future.result$finished <- base::Sys.time() [17:27:35.751] ...future.result [17:27:35.751] } [17:27:35.758] plan(): Setting new future strategy stack: [17:27:35.758] List of future strategies: [17:27:35.758] 1. sequential: [17:27:35.758] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.758] - tweaked: FALSE [17:27:35.758] - call: NULL [17:27:35.759] plan(): nbrOfWorkers() = 1 [17:27:35.762] plan(): Setting new future strategy stack: [17:27:35.762] List of future strategies: [17:27:35.762] 1. sequential: [17:27:35.762] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.762] - tweaked: FALSE [17:27:35.762] - call: plan(strategy) [17:27:35.763] plan(): nbrOfWorkers() = 1 [17:27:35.763] SequentialFuture started (and completed) [17:27:35.764] - Launch lazy future ... done [17:27:35.764] run() for 'SequentialFuture' ... done [17:27:35.765] getGlobalsAndPackages() ... [17:27:35.765] Searching for globals... [17:27:35.766] [17:27:35.766] Searching for globals ... DONE [17:27:35.766] - globals: [0] [17:27:35.766] getGlobalsAndPackages() ... DONE [17:27:35.767] run() for 'Future' ... [17:27:35.767] - state: 'created' [17:27:35.768] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.768] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.769] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.769] - Field: 'label' [17:27:35.769] - Field: 'local' [17:27:35.770] - Field: 'owner' [17:27:35.770] - Field: 'envir' [17:27:35.770] - Field: 'packages' [17:27:35.771] - Field: 'gc' [17:27:35.771] - Field: 'conditions' [17:27:35.771] - Field: 'expr' [17:27:35.772] - Field: 'uuid' [17:27:35.772] - Field: 'seed' [17:27:35.772] - Field: 'version' [17:27:35.772] - Field: 'result' [17:27:35.773] - Field: 'asynchronous' [17:27:35.773] - Field: 'calls' [17:27:35.773] - Field: 'globals' [17:27:35.774] - Field: 'stdout' [17:27:35.774] - Field: 'earlySignal' [17:27:35.774] - Field: 'lazy' [17:27:35.775] - Field: 'state' [17:27:35.775] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.775] - Launch lazy future ... [17:27:35.776] Packages needed by the future expression (n = 0): [17:27:35.776] Packages needed by future strategies (n = 0): [17:27:35.777] { [17:27:35.777] { [17:27:35.777] { [17:27:35.777] ...future.startTime <- base::Sys.time() [17:27:35.777] { [17:27:35.777] { [17:27:35.777] { [17:27:35.777] base::local({ [17:27:35.777] has_future <- base::requireNamespace("future", [17:27:35.777] quietly = TRUE) [17:27:35.777] if (has_future) { [17:27:35.777] ns <- base::getNamespace("future") [17:27:35.777] version <- ns[[".package"]][["version"]] [17:27:35.777] if (is.null(version)) [17:27:35.777] version <- utils::packageVersion("future") [17:27:35.777] } [17:27:35.777] else { [17:27:35.777] version <- NULL [17:27:35.777] } [17:27:35.777] if (!has_future || version < "1.8.0") { [17:27:35.777] info <- base::c(r_version = base::gsub("R version ", [17:27:35.777] "", base::R.version$version.string), [17:27:35.777] platform = base::sprintf("%s (%s-bit)", [17:27:35.777] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.777] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.777] "release", "version")], collapse = " "), [17:27:35.777] hostname = base::Sys.info()[["nodename"]]) [17:27:35.777] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.777] info) [17:27:35.777] info <- base::paste(info, collapse = "; ") [17:27:35.777] if (!has_future) { [17:27:35.777] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.777] info) [17:27:35.777] } [17:27:35.777] else { [17:27:35.777] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.777] info, version) [17:27:35.777] } [17:27:35.777] base::stop(msg) [17:27:35.777] } [17:27:35.777] }) [17:27:35.777] } [17:27:35.777] ...future.strategy.old <- future::plan("list") [17:27:35.777] options(future.plan = NULL) [17:27:35.777] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.777] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.777] } [17:27:35.777] ...future.workdir <- getwd() [17:27:35.777] } [17:27:35.777] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.777] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.777] } [17:27:35.777] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.777] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.777] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.777] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.777] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.777] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.777] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.777] base::names(...future.oldOptions)) [17:27:35.777] } [17:27:35.777] if (FALSE) { [17:27:35.777] } [17:27:35.777] else { [17:27:35.777] if (TRUE) { [17:27:35.777] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.777] open = "w") [17:27:35.777] } [17:27:35.777] else { [17:27:35.777] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.777] windows = "NUL", "/dev/null"), open = "w") [17:27:35.777] } [17:27:35.777] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.777] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.777] base::sink(type = "output", split = FALSE) [17:27:35.777] base::close(...future.stdout) [17:27:35.777] }, add = TRUE) [17:27:35.777] } [17:27:35.777] ...future.frame <- base::sys.nframe() [17:27:35.777] ...future.conditions <- base::list() [17:27:35.777] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.777] if (FALSE) { [17:27:35.777] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.777] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.777] } [17:27:35.777] ...future.result <- base::tryCatch({ [17:27:35.777] base::withCallingHandlers({ [17:27:35.777] ...future.value <- base::withVisible(base::local(NULL)) [17:27:35.777] future::FutureResult(value = ...future.value$value, [17:27:35.777] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.777] ...future.rng), globalenv = if (FALSE) [17:27:35.777] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.777] ...future.globalenv.names)) [17:27:35.777] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.777] }, condition = base::local({ [17:27:35.777] c <- base::c [17:27:35.777] inherits <- base::inherits [17:27:35.777] invokeRestart <- base::invokeRestart [17:27:35.777] length <- base::length [17:27:35.777] list <- base::list [17:27:35.777] seq.int <- base::seq.int [17:27:35.777] signalCondition <- base::signalCondition [17:27:35.777] sys.calls <- base::sys.calls [17:27:35.777] `[[` <- base::`[[` [17:27:35.777] `+` <- base::`+` [17:27:35.777] `<<-` <- base::`<<-` [17:27:35.777] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.777] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.777] 3L)] [17:27:35.777] } [17:27:35.777] function(cond) { [17:27:35.777] is_error <- inherits(cond, "error") [17:27:35.777] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.777] NULL) [17:27:35.777] if (is_error) { [17:27:35.777] sessionInformation <- function() { [17:27:35.777] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.777] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.777] search = base::search(), system = base::Sys.info()) [17:27:35.777] } [17:27:35.777] ...future.conditions[[length(...future.conditions) + [17:27:35.777] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.777] cond$call), session = sessionInformation(), [17:27:35.777] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.777] signalCondition(cond) [17:27:35.777] } [17:27:35.777] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.777] "immediateCondition"))) { [17:27:35.777] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.777] ...future.conditions[[length(...future.conditions) + [17:27:35.777] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.777] if (TRUE && !signal) { [17:27:35.777] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.777] { [17:27:35.777] inherits <- base::inherits [17:27:35.777] invokeRestart <- base::invokeRestart [17:27:35.777] is.null <- base::is.null [17:27:35.777] muffled <- FALSE [17:27:35.777] if (inherits(cond, "message")) { [17:27:35.777] muffled <- grepl(pattern, "muffleMessage") [17:27:35.777] if (muffled) [17:27:35.777] invokeRestart("muffleMessage") [17:27:35.777] } [17:27:35.777] else if (inherits(cond, "warning")) { [17:27:35.777] muffled <- grepl(pattern, "muffleWarning") [17:27:35.777] if (muffled) [17:27:35.777] invokeRestart("muffleWarning") [17:27:35.777] } [17:27:35.777] else if (inherits(cond, "condition")) { [17:27:35.777] if (!is.null(pattern)) { [17:27:35.777] computeRestarts <- base::computeRestarts [17:27:35.777] grepl <- base::grepl [17:27:35.777] restarts <- computeRestarts(cond) [17:27:35.777] for (restart in restarts) { [17:27:35.777] name <- restart$name [17:27:35.777] if (is.null(name)) [17:27:35.777] next [17:27:35.777] if (!grepl(pattern, name)) [17:27:35.777] next [17:27:35.777] invokeRestart(restart) [17:27:35.777] muffled <- TRUE [17:27:35.777] break [17:27:35.777] } [17:27:35.777] } [17:27:35.777] } [17:27:35.777] invisible(muffled) [17:27:35.777] } [17:27:35.777] muffleCondition(cond, pattern = "^muffle") [17:27:35.777] } [17:27:35.777] } [17:27:35.777] else { [17:27:35.777] if (TRUE) { [17:27:35.777] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.777] { [17:27:35.777] inherits <- base::inherits [17:27:35.777] invokeRestart <- base::invokeRestart [17:27:35.777] is.null <- base::is.null [17:27:35.777] muffled <- FALSE [17:27:35.777] if (inherits(cond, "message")) { [17:27:35.777] muffled <- grepl(pattern, "muffleMessage") [17:27:35.777] if (muffled) [17:27:35.777] invokeRestart("muffleMessage") [17:27:35.777] } [17:27:35.777] else if (inherits(cond, "warning")) { [17:27:35.777] muffled <- grepl(pattern, "muffleWarning") [17:27:35.777] if (muffled) [17:27:35.777] invokeRestart("muffleWarning") [17:27:35.777] } [17:27:35.777] else if (inherits(cond, "condition")) { [17:27:35.777] if (!is.null(pattern)) { [17:27:35.777] computeRestarts <- base::computeRestarts [17:27:35.777] grepl <- base::grepl [17:27:35.777] restarts <- computeRestarts(cond) [17:27:35.777] for (restart in restarts) { [17:27:35.777] name <- restart$name [17:27:35.777] if (is.null(name)) [17:27:35.777] next [17:27:35.777] if (!grepl(pattern, name)) [17:27:35.777] next [17:27:35.777] invokeRestart(restart) [17:27:35.777] muffled <- TRUE [17:27:35.777] break [17:27:35.777] } [17:27:35.777] } [17:27:35.777] } [17:27:35.777] invisible(muffled) [17:27:35.777] } [17:27:35.777] muffleCondition(cond, pattern = "^muffle") [17:27:35.777] } [17:27:35.777] } [17:27:35.777] } [17:27:35.777] })) [17:27:35.777] }, error = function(ex) { [17:27:35.777] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.777] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.777] ...future.rng), started = ...future.startTime, [17:27:35.777] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.777] version = "1.8"), class = "FutureResult") [17:27:35.777] }, finally = { [17:27:35.777] if (!identical(...future.workdir, getwd())) [17:27:35.777] setwd(...future.workdir) [17:27:35.777] { [17:27:35.777] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.777] ...future.oldOptions$nwarnings <- NULL [17:27:35.777] } [17:27:35.777] base::options(...future.oldOptions) [17:27:35.777] if (.Platform$OS.type == "windows") { [17:27:35.777] old_names <- names(...future.oldEnvVars) [17:27:35.777] envs <- base::Sys.getenv() [17:27:35.777] names <- names(envs) [17:27:35.777] common <- intersect(names, old_names) [17:27:35.777] added <- setdiff(names, old_names) [17:27:35.777] removed <- setdiff(old_names, names) [17:27:35.777] changed <- common[...future.oldEnvVars[common] != [17:27:35.777] envs[common]] [17:27:35.777] NAMES <- toupper(changed) [17:27:35.777] args <- list() [17:27:35.777] for (kk in seq_along(NAMES)) { [17:27:35.777] name <- changed[[kk]] [17:27:35.777] NAME <- NAMES[[kk]] [17:27:35.777] if (name != NAME && is.element(NAME, old_names)) [17:27:35.777] next [17:27:35.777] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.777] } [17:27:35.777] NAMES <- toupper(added) [17:27:35.777] for (kk in seq_along(NAMES)) { [17:27:35.777] name <- added[[kk]] [17:27:35.777] NAME <- NAMES[[kk]] [17:27:35.777] if (name != NAME && is.element(NAME, old_names)) [17:27:35.777] next [17:27:35.777] args[[name]] <- "" [17:27:35.777] } [17:27:35.777] NAMES <- toupper(removed) [17:27:35.777] for (kk in seq_along(NAMES)) { [17:27:35.777] name <- removed[[kk]] [17:27:35.777] NAME <- NAMES[[kk]] [17:27:35.777] if (name != NAME && is.element(NAME, old_names)) [17:27:35.777] next [17:27:35.777] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.777] } [17:27:35.777] if (length(args) > 0) [17:27:35.777] base::do.call(base::Sys.setenv, args = args) [17:27:35.777] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.777] } [17:27:35.777] else { [17:27:35.777] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.777] } [17:27:35.777] { [17:27:35.777] if (base::length(...future.futureOptionsAdded) > [17:27:35.777] 0L) { [17:27:35.777] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.777] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.777] base::options(opts) [17:27:35.777] } [17:27:35.777] { [17:27:35.777] { [17:27:35.777] NULL [17:27:35.777] RNGkind("Mersenne-Twister") [17:27:35.777] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.777] inherits = FALSE) [17:27:35.777] } [17:27:35.777] options(future.plan = NULL) [17:27:35.777] if (is.na(NA_character_)) [17:27:35.777] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.777] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.777] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.777] .init = FALSE) [17:27:35.777] } [17:27:35.777] } [17:27:35.777] } [17:27:35.777] }) [17:27:35.777] if (TRUE) { [17:27:35.777] base::sink(type = "output", split = FALSE) [17:27:35.777] if (TRUE) { [17:27:35.777] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.777] } [17:27:35.777] else { [17:27:35.777] ...future.result["stdout"] <- base::list(NULL) [17:27:35.777] } [17:27:35.777] base::close(...future.stdout) [17:27:35.777] ...future.stdout <- NULL [17:27:35.777] } [17:27:35.777] ...future.result$conditions <- ...future.conditions [17:27:35.777] ...future.result$finished <- base::Sys.time() [17:27:35.777] ...future.result [17:27:35.777] } [17:27:35.787] plan(): Setting new future strategy stack: [17:27:35.787] List of future strategies: [17:27:35.787] 1. sequential: [17:27:35.787] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.787] - tweaked: FALSE [17:27:35.787] - call: NULL [17:27:35.788] plan(): nbrOfWorkers() = 1 [17:27:35.791] plan(): Setting new future strategy stack: [17:27:35.791] List of future strategies: [17:27:35.791] 1. sequential: [17:27:35.791] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.791] - tweaked: FALSE [17:27:35.791] - call: plan(strategy) [17:27:35.792] plan(): nbrOfWorkers() = 1 [17:27:35.793] SequentialFuture started (and completed) [17:27:35.793] - Launch lazy future ... done [17:27:35.793] run() for 'SequentialFuture' ... done [17:27:35.794] getGlobalsAndPackages() ... [17:27:35.795] Searching for globals... [17:27:35.796] - globals found: [1] '{' [17:27:35.796] Searching for globals ... DONE [17:27:35.797] Resolving globals: FALSE [17:27:35.797] [17:27:35.797] [17:27:35.798] getGlobalsAndPackages() ... DONE [17:27:35.798] run() for 'Future' ... [17:27:35.799] - state: 'created' [17:27:35.799] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.800] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.800] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.800] - Field: 'label' [17:27:35.801] - Field: 'local' [17:27:35.801] - Field: 'owner' [17:27:35.801] - Field: 'envir' [17:27:35.802] - Field: 'packages' [17:27:35.802] - Field: 'gc' [17:27:35.802] - Field: 'conditions' [17:27:35.803] - Field: 'expr' [17:27:35.803] - Field: 'uuid' [17:27:35.803] - Field: 'seed' [17:27:35.803] - Field: 'version' [17:27:35.804] - Field: 'result' [17:27:35.804] - Field: 'asynchronous' [17:27:35.804] - Field: 'calls' [17:27:35.805] - Field: 'globals' [17:27:35.805] - Field: 'stdout' [17:27:35.805] - Field: 'earlySignal' [17:27:35.806] - Field: 'lazy' [17:27:35.806] - Field: 'state' [17:27:35.806] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.807] - Launch lazy future ... [17:27:35.807] Packages needed by the future expression (n = 0): [17:27:35.807] Packages needed by future strategies (n = 0): [17:27:35.808] { [17:27:35.808] { [17:27:35.808] { [17:27:35.808] ...future.startTime <- base::Sys.time() [17:27:35.808] { [17:27:35.808] { [17:27:35.808] { [17:27:35.808] base::local({ [17:27:35.808] has_future <- base::requireNamespace("future", [17:27:35.808] quietly = TRUE) [17:27:35.808] if (has_future) { [17:27:35.808] ns <- base::getNamespace("future") [17:27:35.808] version <- ns[[".package"]][["version"]] [17:27:35.808] if (is.null(version)) [17:27:35.808] version <- utils::packageVersion("future") [17:27:35.808] } [17:27:35.808] else { [17:27:35.808] version <- NULL [17:27:35.808] } [17:27:35.808] if (!has_future || version < "1.8.0") { [17:27:35.808] info <- base::c(r_version = base::gsub("R version ", [17:27:35.808] "", base::R.version$version.string), [17:27:35.808] platform = base::sprintf("%s (%s-bit)", [17:27:35.808] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.808] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.808] "release", "version")], collapse = " "), [17:27:35.808] hostname = base::Sys.info()[["nodename"]]) [17:27:35.808] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.808] info) [17:27:35.808] info <- base::paste(info, collapse = "; ") [17:27:35.808] if (!has_future) { [17:27:35.808] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.808] info) [17:27:35.808] } [17:27:35.808] else { [17:27:35.808] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.808] info, version) [17:27:35.808] } [17:27:35.808] base::stop(msg) [17:27:35.808] } [17:27:35.808] }) [17:27:35.808] } [17:27:35.808] ...future.strategy.old <- future::plan("list") [17:27:35.808] options(future.plan = NULL) [17:27:35.808] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.808] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.808] } [17:27:35.808] ...future.workdir <- getwd() [17:27:35.808] } [17:27:35.808] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.808] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.808] } [17:27:35.808] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.808] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.808] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.808] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.808] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.808] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.808] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.808] base::names(...future.oldOptions)) [17:27:35.808] } [17:27:35.808] if (FALSE) { [17:27:35.808] } [17:27:35.808] else { [17:27:35.808] if (TRUE) { [17:27:35.808] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.808] open = "w") [17:27:35.808] } [17:27:35.808] else { [17:27:35.808] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.808] windows = "NUL", "/dev/null"), open = "w") [17:27:35.808] } [17:27:35.808] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.808] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.808] base::sink(type = "output", split = FALSE) [17:27:35.808] base::close(...future.stdout) [17:27:35.808] }, add = TRUE) [17:27:35.808] } [17:27:35.808] ...future.frame <- base::sys.nframe() [17:27:35.808] ...future.conditions <- base::list() [17:27:35.808] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.808] if (FALSE) { [17:27:35.808] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.808] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.808] } [17:27:35.808] ...future.result <- base::tryCatch({ [17:27:35.808] base::withCallingHandlers({ [17:27:35.808] ...future.value <- base::withVisible(base::local({ [17:27:35.808] 4 [17:27:35.808] })) [17:27:35.808] future::FutureResult(value = ...future.value$value, [17:27:35.808] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.808] ...future.rng), globalenv = if (FALSE) [17:27:35.808] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.808] ...future.globalenv.names)) [17:27:35.808] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.808] }, condition = base::local({ [17:27:35.808] c <- base::c [17:27:35.808] inherits <- base::inherits [17:27:35.808] invokeRestart <- base::invokeRestart [17:27:35.808] length <- base::length [17:27:35.808] list <- base::list [17:27:35.808] seq.int <- base::seq.int [17:27:35.808] signalCondition <- base::signalCondition [17:27:35.808] sys.calls <- base::sys.calls [17:27:35.808] `[[` <- base::`[[` [17:27:35.808] `+` <- base::`+` [17:27:35.808] `<<-` <- base::`<<-` [17:27:35.808] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.808] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.808] 3L)] [17:27:35.808] } [17:27:35.808] function(cond) { [17:27:35.808] is_error <- inherits(cond, "error") [17:27:35.808] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.808] NULL) [17:27:35.808] if (is_error) { [17:27:35.808] sessionInformation <- function() { [17:27:35.808] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.808] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.808] search = base::search(), system = base::Sys.info()) [17:27:35.808] } [17:27:35.808] ...future.conditions[[length(...future.conditions) + [17:27:35.808] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.808] cond$call), session = sessionInformation(), [17:27:35.808] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.808] signalCondition(cond) [17:27:35.808] } [17:27:35.808] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.808] "immediateCondition"))) { [17:27:35.808] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.808] ...future.conditions[[length(...future.conditions) + [17:27:35.808] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.808] if (TRUE && !signal) { [17:27:35.808] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.808] { [17:27:35.808] inherits <- base::inherits [17:27:35.808] invokeRestart <- base::invokeRestart [17:27:35.808] is.null <- base::is.null [17:27:35.808] muffled <- FALSE [17:27:35.808] if (inherits(cond, "message")) { [17:27:35.808] muffled <- grepl(pattern, "muffleMessage") [17:27:35.808] if (muffled) [17:27:35.808] invokeRestart("muffleMessage") [17:27:35.808] } [17:27:35.808] else if (inherits(cond, "warning")) { [17:27:35.808] muffled <- grepl(pattern, "muffleWarning") [17:27:35.808] if (muffled) [17:27:35.808] invokeRestart("muffleWarning") [17:27:35.808] } [17:27:35.808] else if (inherits(cond, "condition")) { [17:27:35.808] if (!is.null(pattern)) { [17:27:35.808] computeRestarts <- base::computeRestarts [17:27:35.808] grepl <- base::grepl [17:27:35.808] restarts <- computeRestarts(cond) [17:27:35.808] for (restart in restarts) { [17:27:35.808] name <- restart$name [17:27:35.808] if (is.null(name)) [17:27:35.808] next [17:27:35.808] if (!grepl(pattern, name)) [17:27:35.808] next [17:27:35.808] invokeRestart(restart) [17:27:35.808] muffled <- TRUE [17:27:35.808] break [17:27:35.808] } [17:27:35.808] } [17:27:35.808] } [17:27:35.808] invisible(muffled) [17:27:35.808] } [17:27:35.808] muffleCondition(cond, pattern = "^muffle") [17:27:35.808] } [17:27:35.808] } [17:27:35.808] else { [17:27:35.808] if (TRUE) { [17:27:35.808] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.808] { [17:27:35.808] inherits <- base::inherits [17:27:35.808] invokeRestart <- base::invokeRestart [17:27:35.808] is.null <- base::is.null [17:27:35.808] muffled <- FALSE [17:27:35.808] if (inherits(cond, "message")) { [17:27:35.808] muffled <- grepl(pattern, "muffleMessage") [17:27:35.808] if (muffled) [17:27:35.808] invokeRestart("muffleMessage") [17:27:35.808] } [17:27:35.808] else if (inherits(cond, "warning")) { [17:27:35.808] muffled <- grepl(pattern, "muffleWarning") [17:27:35.808] if (muffled) [17:27:35.808] invokeRestart("muffleWarning") [17:27:35.808] } [17:27:35.808] else if (inherits(cond, "condition")) { [17:27:35.808] if (!is.null(pattern)) { [17:27:35.808] computeRestarts <- base::computeRestarts [17:27:35.808] grepl <- base::grepl [17:27:35.808] restarts <- computeRestarts(cond) [17:27:35.808] for (restart in restarts) { [17:27:35.808] name <- restart$name [17:27:35.808] if (is.null(name)) [17:27:35.808] next [17:27:35.808] if (!grepl(pattern, name)) [17:27:35.808] next [17:27:35.808] invokeRestart(restart) [17:27:35.808] muffled <- TRUE [17:27:35.808] break [17:27:35.808] } [17:27:35.808] } [17:27:35.808] } [17:27:35.808] invisible(muffled) [17:27:35.808] } [17:27:35.808] muffleCondition(cond, pattern = "^muffle") [17:27:35.808] } [17:27:35.808] } [17:27:35.808] } [17:27:35.808] })) [17:27:35.808] }, error = function(ex) { [17:27:35.808] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.808] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.808] ...future.rng), started = ...future.startTime, [17:27:35.808] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.808] version = "1.8"), class = "FutureResult") [17:27:35.808] }, finally = { [17:27:35.808] if (!identical(...future.workdir, getwd())) [17:27:35.808] setwd(...future.workdir) [17:27:35.808] { [17:27:35.808] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.808] ...future.oldOptions$nwarnings <- NULL [17:27:35.808] } [17:27:35.808] base::options(...future.oldOptions) [17:27:35.808] if (.Platform$OS.type == "windows") { [17:27:35.808] old_names <- names(...future.oldEnvVars) [17:27:35.808] envs <- base::Sys.getenv() [17:27:35.808] names <- names(envs) [17:27:35.808] common <- intersect(names, old_names) [17:27:35.808] added <- setdiff(names, old_names) [17:27:35.808] removed <- setdiff(old_names, names) [17:27:35.808] changed <- common[...future.oldEnvVars[common] != [17:27:35.808] envs[common]] [17:27:35.808] NAMES <- toupper(changed) [17:27:35.808] args <- list() [17:27:35.808] for (kk in seq_along(NAMES)) { [17:27:35.808] name <- changed[[kk]] [17:27:35.808] NAME <- NAMES[[kk]] [17:27:35.808] if (name != NAME && is.element(NAME, old_names)) [17:27:35.808] next [17:27:35.808] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.808] } [17:27:35.808] NAMES <- toupper(added) [17:27:35.808] for (kk in seq_along(NAMES)) { [17:27:35.808] name <- added[[kk]] [17:27:35.808] NAME <- NAMES[[kk]] [17:27:35.808] if (name != NAME && is.element(NAME, old_names)) [17:27:35.808] next [17:27:35.808] args[[name]] <- "" [17:27:35.808] } [17:27:35.808] NAMES <- toupper(removed) [17:27:35.808] for (kk in seq_along(NAMES)) { [17:27:35.808] name <- removed[[kk]] [17:27:35.808] NAME <- NAMES[[kk]] [17:27:35.808] if (name != NAME && is.element(NAME, old_names)) [17:27:35.808] next [17:27:35.808] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.808] } [17:27:35.808] if (length(args) > 0) [17:27:35.808] base::do.call(base::Sys.setenv, args = args) [17:27:35.808] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.808] } [17:27:35.808] else { [17:27:35.808] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.808] } [17:27:35.808] { [17:27:35.808] if (base::length(...future.futureOptionsAdded) > [17:27:35.808] 0L) { [17:27:35.808] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.808] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.808] base::options(opts) [17:27:35.808] } [17:27:35.808] { [17:27:35.808] { [17:27:35.808] NULL [17:27:35.808] RNGkind("Mersenne-Twister") [17:27:35.808] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.808] inherits = FALSE) [17:27:35.808] } [17:27:35.808] options(future.plan = NULL) [17:27:35.808] if (is.na(NA_character_)) [17:27:35.808] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.808] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.808] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.808] .init = FALSE) [17:27:35.808] } [17:27:35.808] } [17:27:35.808] } [17:27:35.808] }) [17:27:35.808] if (TRUE) { [17:27:35.808] base::sink(type = "output", split = FALSE) [17:27:35.808] if (TRUE) { [17:27:35.808] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.808] } [17:27:35.808] else { [17:27:35.808] ...future.result["stdout"] <- base::list(NULL) [17:27:35.808] } [17:27:35.808] base::close(...future.stdout) [17:27:35.808] ...future.stdout <- NULL [17:27:35.808] } [17:27:35.808] ...future.result$conditions <- ...future.conditions [17:27:35.808] ...future.result$finished <- base::Sys.time() [17:27:35.808] ...future.result [17:27:35.808] } [17:27:35.815] plan(): Setting new future strategy stack: [17:27:35.816] List of future strategies: [17:27:35.816] 1. sequential: [17:27:35.816] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.816] - tweaked: FALSE [17:27:35.816] - call: NULL [17:27:35.817] plan(): nbrOfWorkers() = 1 [17:27:35.819] plan(): Setting new future strategy stack: [17:27:35.819] List of future strategies: [17:27:35.819] 1. sequential: [17:27:35.819] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.819] - tweaked: FALSE [17:27:35.819] - call: plan(strategy) [17:27:35.820] plan(): nbrOfWorkers() = 1 [17:27:35.821] SequentialFuture started (and completed) [17:27:35.821] - Launch lazy future ... done [17:27:35.821] run() for 'SequentialFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 2 3 - attr(*, "dimnames.")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" [17:27:35.829] resolved() for 'SequentialFuture' ... [17:27:35.829] - state: 'finished' [17:27:35.830] - run: TRUE [17:27:35.830] - result: 'FutureResult' [17:27:35.830] resolved() for 'SequentialFuture' ... done [17:27:35.831] resolved() for 'SequentialFuture' ... [17:27:35.831] - state: 'finished' [17:27:35.831] - run: TRUE [17:27:35.832] - result: 'FutureResult' [17:27:35.832] resolved() for 'SequentialFuture' ... done [17:27:35.832] resolved() for 'SequentialFuture' ... [17:27:35.833] - state: 'finished' [17:27:35.833] - run: TRUE [17:27:35.833] - result: 'FutureResult' [17:27:35.834] resolved() for 'SequentialFuture' ... done logi [1:2, 1:3] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:35.842] resolve() on list environment ... [17:27:35.842] recursive: 0 [17:27:35.844] length: 6 [17:27:35.844] elements: 'a', 'b', 'c', 'd', '', '' [17:27:35.845] signalConditionsASAP(numeric, pos=1) ... [17:27:35.845] - nx: 6 [17:27:35.845] - relay: TRUE [17:27:35.846] - stdout: TRUE [17:27:35.846] - signal: TRUE [17:27:35.846] - resignal: FALSE [17:27:35.847] - force: TRUE [17:27:35.847] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.847] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.847] - until=2 [17:27:35.848] - relaying element #2 [17:27:35.848] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.848] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.849] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.849] length: 5 (resolved future 1) [17:27:35.849] resolved() for 'SequentialFuture' ... [17:27:35.850] - state: 'finished' [17:27:35.850] - run: TRUE [17:27:35.850] - result: 'FutureResult' [17:27:35.851] resolved() for 'SequentialFuture' ... done [17:27:35.851] Future #2 [17:27:35.851] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.852] - nx: 6 [17:27:35.852] - relay: TRUE [17:27:35.852] - stdout: TRUE [17:27:35.852] - signal: TRUE [17:27:35.853] - resignal: FALSE [17:27:35.853] - force: TRUE [17:27:35.853] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.854] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.854] - until=2 [17:27:35.854] - relaying element #2 [17:27:35.855] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.855] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.855] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.856] length: 4 (resolved future 2) [17:27:35.856] resolved() for 'SequentialFuture' ... [17:27:35.856] - state: 'finished' [17:27:35.857] - run: TRUE [17:27:35.857] - result: 'FutureResult' [17:27:35.857] resolved() for 'SequentialFuture' ... done [17:27:35.858] Future #3 [17:27:35.858] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.858] - nx: 6 [17:27:35.859] - relay: TRUE [17:27:35.859] - stdout: TRUE [17:27:35.859] - signal: TRUE [17:27:35.859] - resignal: FALSE [17:27:35.860] - force: TRUE [17:27:35.860] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.860] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.861] - until=3 [17:27:35.861] - relaying element #3 [17:27:35.861] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.862] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.862] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.862] length: 3 (resolved future 3) [17:27:35.863] resolved() for 'SequentialFuture' ... [17:27:35.863] - state: 'finished' [17:27:35.863] - run: TRUE [17:27:35.864] - result: 'FutureResult' [17:27:35.864] resolved() for 'SequentialFuture' ... done [17:27:35.864] Future #4 [17:27:35.865] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.865] - nx: 6 [17:27:35.865] - relay: TRUE [17:27:35.866] - stdout: TRUE [17:27:35.866] - signal: TRUE [17:27:35.866] - resignal: FALSE [17:27:35.866] - force: TRUE [17:27:35.867] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.867] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.867] - until=4 [17:27:35.868] - relaying element #4 [17:27:35.868] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.868] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.869] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.869] length: 2 (resolved future 4) [17:27:35.869] signalConditionsASAP(NULL, pos=5) ... [17:27:35.870] - nx: 6 [17:27:35.870] - relay: TRUE [17:27:35.870] - stdout: TRUE [17:27:35.870] - signal: TRUE [17:27:35.871] - resignal: FALSE [17:27:35.871] - force: TRUE [17:27:35.871] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.871] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.872] - until=6 [17:27:35.872] - relaying element #6 [17:27:35.872] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:35.873] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.873] signalConditionsASAP(NULL, pos=5) ... done [17:27:35.873] length: 1 (resolved future 5) [17:27:35.874] signalConditionsASAP(numeric, pos=6) ... [17:27:35.874] - nx: 6 [17:27:35.874] - relay: TRUE [17:27:35.874] - stdout: TRUE [17:27:35.875] - signal: TRUE [17:27:35.875] - resignal: FALSE [17:27:35.875] - force: TRUE [17:27:35.875] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:35.876] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.876] - until=6 [17:27:35.876] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.877] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.877] signalConditionsASAP(numeric, pos=6) ... done [17:27:35.877] length: 0 (resolved future 6) [17:27:35.877] Relaying remaining futures [17:27:35.878] signalConditionsASAP(NULL, pos=0) ... [17:27:35.878] - nx: 6 [17:27:35.878] - relay: TRUE [17:27:35.879] - stdout: TRUE [17:27:35.879] - signal: TRUE [17:27:35.879] - resignal: FALSE [17:27:35.879] - force: TRUE [17:27:35.880] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.880] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:35.880] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:35.881] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.881] signalConditionsASAP(NULL, pos=0) ... done [17:27:35.881] resolve() on list environment ... DONE Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 2 3 - attr(*, "dimnames.")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" Dimensions: c(2, 3, 1) [17:27:35.885] getGlobalsAndPackages() ... [17:27:35.885] Searching for globals... [17:27:35.886] [17:27:35.886] Searching for globals ... DONE [17:27:35.886] - globals: [0] [17:27:35.886] getGlobalsAndPackages() ... DONE [17:27:35.887] run() for 'Future' ... [17:27:35.887] - state: 'created' [17:27:35.887] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.888] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.890] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.890] - Field: 'label' [17:27:35.890] - Field: 'local' [17:27:35.891] - Field: 'owner' [17:27:35.891] - Field: 'envir' [17:27:35.891] - Field: 'packages' [17:27:35.891] - Field: 'gc' [17:27:35.892] - Field: 'conditions' [17:27:35.892] - Field: 'expr' [17:27:35.892] - Field: 'uuid' [17:27:35.892] - Field: 'seed' [17:27:35.893] - Field: 'version' [17:27:35.893] - Field: 'result' [17:27:35.893] - Field: 'asynchronous' [17:27:35.893] - Field: 'calls' [17:27:35.893] - Field: 'globals' [17:27:35.894] - Field: 'stdout' [17:27:35.894] - Field: 'earlySignal' [17:27:35.894] - Field: 'lazy' [17:27:35.894] - Field: 'state' [17:27:35.894] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.894] - Launch lazy future ... [17:27:35.895] Packages needed by the future expression (n = 0): [17:27:35.895] Packages needed by future strategies (n = 0): [17:27:35.896] { [17:27:35.896] { [17:27:35.896] { [17:27:35.896] ...future.startTime <- base::Sys.time() [17:27:35.896] { [17:27:35.896] { [17:27:35.896] { [17:27:35.896] base::local({ [17:27:35.896] has_future <- base::requireNamespace("future", [17:27:35.896] quietly = TRUE) [17:27:35.896] if (has_future) { [17:27:35.896] ns <- base::getNamespace("future") [17:27:35.896] version <- ns[[".package"]][["version"]] [17:27:35.896] if (is.null(version)) [17:27:35.896] version <- utils::packageVersion("future") [17:27:35.896] } [17:27:35.896] else { [17:27:35.896] version <- NULL [17:27:35.896] } [17:27:35.896] if (!has_future || version < "1.8.0") { [17:27:35.896] info <- base::c(r_version = base::gsub("R version ", [17:27:35.896] "", base::R.version$version.string), [17:27:35.896] platform = base::sprintf("%s (%s-bit)", [17:27:35.896] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.896] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.896] "release", "version")], collapse = " "), [17:27:35.896] hostname = base::Sys.info()[["nodename"]]) [17:27:35.896] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.896] info) [17:27:35.896] info <- base::paste(info, collapse = "; ") [17:27:35.896] if (!has_future) { [17:27:35.896] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.896] info) [17:27:35.896] } [17:27:35.896] else { [17:27:35.896] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.896] info, version) [17:27:35.896] } [17:27:35.896] base::stop(msg) [17:27:35.896] } [17:27:35.896] }) [17:27:35.896] } [17:27:35.896] ...future.strategy.old <- future::plan("list") [17:27:35.896] options(future.plan = NULL) [17:27:35.896] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.896] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.896] } [17:27:35.896] ...future.workdir <- getwd() [17:27:35.896] } [17:27:35.896] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.896] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.896] } [17:27:35.896] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.896] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.896] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.896] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.896] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.896] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.896] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.896] base::names(...future.oldOptions)) [17:27:35.896] } [17:27:35.896] if (FALSE) { [17:27:35.896] } [17:27:35.896] else { [17:27:35.896] if (TRUE) { [17:27:35.896] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.896] open = "w") [17:27:35.896] } [17:27:35.896] else { [17:27:35.896] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.896] windows = "NUL", "/dev/null"), open = "w") [17:27:35.896] } [17:27:35.896] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.896] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.896] base::sink(type = "output", split = FALSE) [17:27:35.896] base::close(...future.stdout) [17:27:35.896] }, add = TRUE) [17:27:35.896] } [17:27:35.896] ...future.frame <- base::sys.nframe() [17:27:35.896] ...future.conditions <- base::list() [17:27:35.896] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.896] if (FALSE) { [17:27:35.896] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.896] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.896] } [17:27:35.896] ...future.result <- base::tryCatch({ [17:27:35.896] base::withCallingHandlers({ [17:27:35.896] ...future.value <- base::withVisible(base::local(2)) [17:27:35.896] future::FutureResult(value = ...future.value$value, [17:27:35.896] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.896] ...future.rng), globalenv = if (FALSE) [17:27:35.896] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.896] ...future.globalenv.names)) [17:27:35.896] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.896] }, condition = base::local({ [17:27:35.896] c <- base::c [17:27:35.896] inherits <- base::inherits [17:27:35.896] invokeRestart <- base::invokeRestart [17:27:35.896] length <- base::length [17:27:35.896] list <- base::list [17:27:35.896] seq.int <- base::seq.int [17:27:35.896] signalCondition <- base::signalCondition [17:27:35.896] sys.calls <- base::sys.calls [17:27:35.896] `[[` <- base::`[[` [17:27:35.896] `+` <- base::`+` [17:27:35.896] `<<-` <- base::`<<-` [17:27:35.896] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.896] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.896] 3L)] [17:27:35.896] } [17:27:35.896] function(cond) { [17:27:35.896] is_error <- inherits(cond, "error") [17:27:35.896] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.896] NULL) [17:27:35.896] if (is_error) { [17:27:35.896] sessionInformation <- function() { [17:27:35.896] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.896] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.896] search = base::search(), system = base::Sys.info()) [17:27:35.896] } [17:27:35.896] ...future.conditions[[length(...future.conditions) + [17:27:35.896] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.896] cond$call), session = sessionInformation(), [17:27:35.896] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.896] signalCondition(cond) [17:27:35.896] } [17:27:35.896] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.896] "immediateCondition"))) { [17:27:35.896] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.896] ...future.conditions[[length(...future.conditions) + [17:27:35.896] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.896] if (TRUE && !signal) { [17:27:35.896] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.896] { [17:27:35.896] inherits <- base::inherits [17:27:35.896] invokeRestart <- base::invokeRestart [17:27:35.896] is.null <- base::is.null [17:27:35.896] muffled <- FALSE [17:27:35.896] if (inherits(cond, "message")) { [17:27:35.896] muffled <- grepl(pattern, "muffleMessage") [17:27:35.896] if (muffled) [17:27:35.896] invokeRestart("muffleMessage") [17:27:35.896] } [17:27:35.896] else if (inherits(cond, "warning")) { [17:27:35.896] muffled <- grepl(pattern, "muffleWarning") [17:27:35.896] if (muffled) [17:27:35.896] invokeRestart("muffleWarning") [17:27:35.896] } [17:27:35.896] else if (inherits(cond, "condition")) { [17:27:35.896] if (!is.null(pattern)) { [17:27:35.896] computeRestarts <- base::computeRestarts [17:27:35.896] grepl <- base::grepl [17:27:35.896] restarts <- computeRestarts(cond) [17:27:35.896] for (restart in restarts) { [17:27:35.896] name <- restart$name [17:27:35.896] if (is.null(name)) [17:27:35.896] next [17:27:35.896] if (!grepl(pattern, name)) [17:27:35.896] next [17:27:35.896] invokeRestart(restart) [17:27:35.896] muffled <- TRUE [17:27:35.896] break [17:27:35.896] } [17:27:35.896] } [17:27:35.896] } [17:27:35.896] invisible(muffled) [17:27:35.896] } [17:27:35.896] muffleCondition(cond, pattern = "^muffle") [17:27:35.896] } [17:27:35.896] } [17:27:35.896] else { [17:27:35.896] if (TRUE) { [17:27:35.896] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.896] { [17:27:35.896] inherits <- base::inherits [17:27:35.896] invokeRestart <- base::invokeRestart [17:27:35.896] is.null <- base::is.null [17:27:35.896] muffled <- FALSE [17:27:35.896] if (inherits(cond, "message")) { [17:27:35.896] muffled <- grepl(pattern, "muffleMessage") [17:27:35.896] if (muffled) [17:27:35.896] invokeRestart("muffleMessage") [17:27:35.896] } [17:27:35.896] else if (inherits(cond, "warning")) { [17:27:35.896] muffled <- grepl(pattern, "muffleWarning") [17:27:35.896] if (muffled) [17:27:35.896] invokeRestart("muffleWarning") [17:27:35.896] } [17:27:35.896] else if (inherits(cond, "condition")) { [17:27:35.896] if (!is.null(pattern)) { [17:27:35.896] computeRestarts <- base::computeRestarts [17:27:35.896] grepl <- base::grepl [17:27:35.896] restarts <- computeRestarts(cond) [17:27:35.896] for (restart in restarts) { [17:27:35.896] name <- restart$name [17:27:35.896] if (is.null(name)) [17:27:35.896] next [17:27:35.896] if (!grepl(pattern, name)) [17:27:35.896] next [17:27:35.896] invokeRestart(restart) [17:27:35.896] muffled <- TRUE [17:27:35.896] break [17:27:35.896] } [17:27:35.896] } [17:27:35.896] } [17:27:35.896] invisible(muffled) [17:27:35.896] } [17:27:35.896] muffleCondition(cond, pattern = "^muffle") [17:27:35.896] } [17:27:35.896] } [17:27:35.896] } [17:27:35.896] })) [17:27:35.896] }, error = function(ex) { [17:27:35.896] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.896] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.896] ...future.rng), started = ...future.startTime, [17:27:35.896] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.896] version = "1.8"), class = "FutureResult") [17:27:35.896] }, finally = { [17:27:35.896] if (!identical(...future.workdir, getwd())) [17:27:35.896] setwd(...future.workdir) [17:27:35.896] { [17:27:35.896] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.896] ...future.oldOptions$nwarnings <- NULL [17:27:35.896] } [17:27:35.896] base::options(...future.oldOptions) [17:27:35.896] if (.Platform$OS.type == "windows") { [17:27:35.896] old_names <- names(...future.oldEnvVars) [17:27:35.896] envs <- base::Sys.getenv() [17:27:35.896] names <- names(envs) [17:27:35.896] common <- intersect(names, old_names) [17:27:35.896] added <- setdiff(names, old_names) [17:27:35.896] removed <- setdiff(old_names, names) [17:27:35.896] changed <- common[...future.oldEnvVars[common] != [17:27:35.896] envs[common]] [17:27:35.896] NAMES <- toupper(changed) [17:27:35.896] args <- list() [17:27:35.896] for (kk in seq_along(NAMES)) { [17:27:35.896] name <- changed[[kk]] [17:27:35.896] NAME <- NAMES[[kk]] [17:27:35.896] if (name != NAME && is.element(NAME, old_names)) [17:27:35.896] next [17:27:35.896] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.896] } [17:27:35.896] NAMES <- toupper(added) [17:27:35.896] for (kk in seq_along(NAMES)) { [17:27:35.896] name <- added[[kk]] [17:27:35.896] NAME <- NAMES[[kk]] [17:27:35.896] if (name != NAME && is.element(NAME, old_names)) [17:27:35.896] next [17:27:35.896] args[[name]] <- "" [17:27:35.896] } [17:27:35.896] NAMES <- toupper(removed) [17:27:35.896] for (kk in seq_along(NAMES)) { [17:27:35.896] name <- removed[[kk]] [17:27:35.896] NAME <- NAMES[[kk]] [17:27:35.896] if (name != NAME && is.element(NAME, old_names)) [17:27:35.896] next [17:27:35.896] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.896] } [17:27:35.896] if (length(args) > 0) [17:27:35.896] base::do.call(base::Sys.setenv, args = args) [17:27:35.896] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.896] } [17:27:35.896] else { [17:27:35.896] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.896] } [17:27:35.896] { [17:27:35.896] if (base::length(...future.futureOptionsAdded) > [17:27:35.896] 0L) { [17:27:35.896] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.896] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.896] base::options(opts) [17:27:35.896] } [17:27:35.896] { [17:27:35.896] { [17:27:35.896] NULL [17:27:35.896] RNGkind("Mersenne-Twister") [17:27:35.896] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.896] inherits = FALSE) [17:27:35.896] } [17:27:35.896] options(future.plan = NULL) [17:27:35.896] if (is.na(NA_character_)) [17:27:35.896] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.896] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.896] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.896] .init = FALSE) [17:27:35.896] } [17:27:35.896] } [17:27:35.896] } [17:27:35.896] }) [17:27:35.896] if (TRUE) { [17:27:35.896] base::sink(type = "output", split = FALSE) [17:27:35.896] if (TRUE) { [17:27:35.896] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.896] } [17:27:35.896] else { [17:27:35.896] ...future.result["stdout"] <- base::list(NULL) [17:27:35.896] } [17:27:35.896] base::close(...future.stdout) [17:27:35.896] ...future.stdout <- NULL [17:27:35.896] } [17:27:35.896] ...future.result$conditions <- ...future.conditions [17:27:35.896] ...future.result$finished <- base::Sys.time() [17:27:35.896] ...future.result [17:27:35.896] } [17:27:35.900] plan(): Setting new future strategy stack: [17:27:35.900] List of future strategies: [17:27:35.900] 1. sequential: [17:27:35.900] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.900] - tweaked: FALSE [17:27:35.900] - call: NULL [17:27:35.901] plan(): nbrOfWorkers() = 1 [17:27:35.903] plan(): Setting new future strategy stack: [17:27:35.903] List of future strategies: [17:27:35.903] 1. sequential: [17:27:35.903] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.903] - tweaked: FALSE [17:27:35.903] - call: plan(strategy) [17:27:35.903] plan(): nbrOfWorkers() = 1 [17:27:35.904] SequentialFuture started (and completed) [17:27:35.904] - Launch lazy future ... done [17:27:35.904] run() for 'SequentialFuture' ... done [17:27:35.904] getGlobalsAndPackages() ... [17:27:35.905] Searching for globals... [17:27:35.905] [17:27:35.906] Searching for globals ... DONE [17:27:35.906] - globals: [0] [17:27:35.906] getGlobalsAndPackages() ... DONE [17:27:35.907] run() for 'Future' ... [17:27:35.907] - state: 'created' [17:27:35.907] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.908] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.908] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.908] - Field: 'label' [17:27:35.908] - Field: 'local' [17:27:35.909] - Field: 'owner' [17:27:35.909] - Field: 'envir' [17:27:35.909] - Field: 'packages' [17:27:35.909] - Field: 'gc' [17:27:35.909] - Field: 'conditions' [17:27:35.910] - Field: 'expr' [17:27:35.910] - Field: 'uuid' [17:27:35.910] - Field: 'seed' [17:27:35.910] - Field: 'version' [17:27:35.910] - Field: 'result' [17:27:35.910] - Field: 'asynchronous' [17:27:35.911] - Field: 'calls' [17:27:35.911] - Field: 'globals' [17:27:35.911] - Field: 'stdout' [17:27:35.911] - Field: 'earlySignal' [17:27:35.911] - Field: 'lazy' [17:27:35.912] - Field: 'state' [17:27:35.912] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.912] - Launch lazy future ... [17:27:35.912] Packages needed by the future expression (n = 0): [17:27:35.912] Packages needed by future strategies (n = 0): [17:27:35.913] { [17:27:35.913] { [17:27:35.913] { [17:27:35.913] ...future.startTime <- base::Sys.time() [17:27:35.913] { [17:27:35.913] { [17:27:35.913] { [17:27:35.913] base::local({ [17:27:35.913] has_future <- base::requireNamespace("future", [17:27:35.913] quietly = TRUE) [17:27:35.913] if (has_future) { [17:27:35.913] ns <- base::getNamespace("future") [17:27:35.913] version <- ns[[".package"]][["version"]] [17:27:35.913] if (is.null(version)) [17:27:35.913] version <- utils::packageVersion("future") [17:27:35.913] } [17:27:35.913] else { [17:27:35.913] version <- NULL [17:27:35.913] } [17:27:35.913] if (!has_future || version < "1.8.0") { [17:27:35.913] info <- base::c(r_version = base::gsub("R version ", [17:27:35.913] "", base::R.version$version.string), [17:27:35.913] platform = base::sprintf("%s (%s-bit)", [17:27:35.913] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.913] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.913] "release", "version")], collapse = " "), [17:27:35.913] hostname = base::Sys.info()[["nodename"]]) [17:27:35.913] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.913] info) [17:27:35.913] info <- base::paste(info, collapse = "; ") [17:27:35.913] if (!has_future) { [17:27:35.913] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.913] info) [17:27:35.913] } [17:27:35.913] else { [17:27:35.913] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.913] info, version) [17:27:35.913] } [17:27:35.913] base::stop(msg) [17:27:35.913] } [17:27:35.913] }) [17:27:35.913] } [17:27:35.913] ...future.strategy.old <- future::plan("list") [17:27:35.913] options(future.plan = NULL) [17:27:35.913] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.913] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.913] } [17:27:35.913] ...future.workdir <- getwd() [17:27:35.913] } [17:27:35.913] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.913] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.913] } [17:27:35.913] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.913] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.913] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.913] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.913] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.913] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.913] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.913] base::names(...future.oldOptions)) [17:27:35.913] } [17:27:35.913] if (FALSE) { [17:27:35.913] } [17:27:35.913] else { [17:27:35.913] if (TRUE) { [17:27:35.913] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.913] open = "w") [17:27:35.913] } [17:27:35.913] else { [17:27:35.913] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.913] windows = "NUL", "/dev/null"), open = "w") [17:27:35.913] } [17:27:35.913] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.913] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.913] base::sink(type = "output", split = FALSE) [17:27:35.913] base::close(...future.stdout) [17:27:35.913] }, add = TRUE) [17:27:35.913] } [17:27:35.913] ...future.frame <- base::sys.nframe() [17:27:35.913] ...future.conditions <- base::list() [17:27:35.913] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.913] if (FALSE) { [17:27:35.913] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.913] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.913] } [17:27:35.913] ...future.result <- base::tryCatch({ [17:27:35.913] base::withCallingHandlers({ [17:27:35.913] ...future.value <- base::withVisible(base::local(NULL)) [17:27:35.913] future::FutureResult(value = ...future.value$value, [17:27:35.913] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.913] ...future.rng), globalenv = if (FALSE) [17:27:35.913] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.913] ...future.globalenv.names)) [17:27:35.913] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.913] }, condition = base::local({ [17:27:35.913] c <- base::c [17:27:35.913] inherits <- base::inherits [17:27:35.913] invokeRestart <- base::invokeRestart [17:27:35.913] length <- base::length [17:27:35.913] list <- base::list [17:27:35.913] seq.int <- base::seq.int [17:27:35.913] signalCondition <- base::signalCondition [17:27:35.913] sys.calls <- base::sys.calls [17:27:35.913] `[[` <- base::`[[` [17:27:35.913] `+` <- base::`+` [17:27:35.913] `<<-` <- base::`<<-` [17:27:35.913] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.913] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.913] 3L)] [17:27:35.913] } [17:27:35.913] function(cond) { [17:27:35.913] is_error <- inherits(cond, "error") [17:27:35.913] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.913] NULL) [17:27:35.913] if (is_error) { [17:27:35.913] sessionInformation <- function() { [17:27:35.913] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.913] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.913] search = base::search(), system = base::Sys.info()) [17:27:35.913] } [17:27:35.913] ...future.conditions[[length(...future.conditions) + [17:27:35.913] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.913] cond$call), session = sessionInformation(), [17:27:35.913] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.913] signalCondition(cond) [17:27:35.913] } [17:27:35.913] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.913] "immediateCondition"))) { [17:27:35.913] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.913] ...future.conditions[[length(...future.conditions) + [17:27:35.913] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.913] if (TRUE && !signal) { [17:27:35.913] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.913] { [17:27:35.913] inherits <- base::inherits [17:27:35.913] invokeRestart <- base::invokeRestart [17:27:35.913] is.null <- base::is.null [17:27:35.913] muffled <- FALSE [17:27:35.913] if (inherits(cond, "message")) { [17:27:35.913] muffled <- grepl(pattern, "muffleMessage") [17:27:35.913] if (muffled) [17:27:35.913] invokeRestart("muffleMessage") [17:27:35.913] } [17:27:35.913] else if (inherits(cond, "warning")) { [17:27:35.913] muffled <- grepl(pattern, "muffleWarning") [17:27:35.913] if (muffled) [17:27:35.913] invokeRestart("muffleWarning") [17:27:35.913] } [17:27:35.913] else if (inherits(cond, "condition")) { [17:27:35.913] if (!is.null(pattern)) { [17:27:35.913] computeRestarts <- base::computeRestarts [17:27:35.913] grepl <- base::grepl [17:27:35.913] restarts <- computeRestarts(cond) [17:27:35.913] for (restart in restarts) { [17:27:35.913] name <- restart$name [17:27:35.913] if (is.null(name)) [17:27:35.913] next [17:27:35.913] if (!grepl(pattern, name)) [17:27:35.913] next [17:27:35.913] invokeRestart(restart) [17:27:35.913] muffled <- TRUE [17:27:35.913] break [17:27:35.913] } [17:27:35.913] } [17:27:35.913] } [17:27:35.913] invisible(muffled) [17:27:35.913] } [17:27:35.913] muffleCondition(cond, pattern = "^muffle") [17:27:35.913] } [17:27:35.913] } [17:27:35.913] else { [17:27:35.913] if (TRUE) { [17:27:35.913] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.913] { [17:27:35.913] inherits <- base::inherits [17:27:35.913] invokeRestart <- base::invokeRestart [17:27:35.913] is.null <- base::is.null [17:27:35.913] muffled <- FALSE [17:27:35.913] if (inherits(cond, "message")) { [17:27:35.913] muffled <- grepl(pattern, "muffleMessage") [17:27:35.913] if (muffled) [17:27:35.913] invokeRestart("muffleMessage") [17:27:35.913] } [17:27:35.913] else if (inherits(cond, "warning")) { [17:27:35.913] muffled <- grepl(pattern, "muffleWarning") [17:27:35.913] if (muffled) [17:27:35.913] invokeRestart("muffleWarning") [17:27:35.913] } [17:27:35.913] else if (inherits(cond, "condition")) { [17:27:35.913] if (!is.null(pattern)) { [17:27:35.913] computeRestarts <- base::computeRestarts [17:27:35.913] grepl <- base::grepl [17:27:35.913] restarts <- computeRestarts(cond) [17:27:35.913] for (restart in restarts) { [17:27:35.913] name <- restart$name [17:27:35.913] if (is.null(name)) [17:27:35.913] next [17:27:35.913] if (!grepl(pattern, name)) [17:27:35.913] next [17:27:35.913] invokeRestart(restart) [17:27:35.913] muffled <- TRUE [17:27:35.913] break [17:27:35.913] } [17:27:35.913] } [17:27:35.913] } [17:27:35.913] invisible(muffled) [17:27:35.913] } [17:27:35.913] muffleCondition(cond, pattern = "^muffle") [17:27:35.913] } [17:27:35.913] } [17:27:35.913] } [17:27:35.913] })) [17:27:35.913] }, error = function(ex) { [17:27:35.913] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.913] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.913] ...future.rng), started = ...future.startTime, [17:27:35.913] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.913] version = "1.8"), class = "FutureResult") [17:27:35.913] }, finally = { [17:27:35.913] if (!identical(...future.workdir, getwd())) [17:27:35.913] setwd(...future.workdir) [17:27:35.913] { [17:27:35.913] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.913] ...future.oldOptions$nwarnings <- NULL [17:27:35.913] } [17:27:35.913] base::options(...future.oldOptions) [17:27:35.913] if (.Platform$OS.type == "windows") { [17:27:35.913] old_names <- names(...future.oldEnvVars) [17:27:35.913] envs <- base::Sys.getenv() [17:27:35.913] names <- names(envs) [17:27:35.913] common <- intersect(names, old_names) [17:27:35.913] added <- setdiff(names, old_names) [17:27:35.913] removed <- setdiff(old_names, names) [17:27:35.913] changed <- common[...future.oldEnvVars[common] != [17:27:35.913] envs[common]] [17:27:35.913] NAMES <- toupper(changed) [17:27:35.913] args <- list() [17:27:35.913] for (kk in seq_along(NAMES)) { [17:27:35.913] name <- changed[[kk]] [17:27:35.913] NAME <- NAMES[[kk]] [17:27:35.913] if (name != NAME && is.element(NAME, old_names)) [17:27:35.913] next [17:27:35.913] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.913] } [17:27:35.913] NAMES <- toupper(added) [17:27:35.913] for (kk in seq_along(NAMES)) { [17:27:35.913] name <- added[[kk]] [17:27:35.913] NAME <- NAMES[[kk]] [17:27:35.913] if (name != NAME && is.element(NAME, old_names)) [17:27:35.913] next [17:27:35.913] args[[name]] <- "" [17:27:35.913] } [17:27:35.913] NAMES <- toupper(removed) [17:27:35.913] for (kk in seq_along(NAMES)) { [17:27:35.913] name <- removed[[kk]] [17:27:35.913] NAME <- NAMES[[kk]] [17:27:35.913] if (name != NAME && is.element(NAME, old_names)) [17:27:35.913] next [17:27:35.913] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.913] } [17:27:35.913] if (length(args) > 0) [17:27:35.913] base::do.call(base::Sys.setenv, args = args) [17:27:35.913] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.913] } [17:27:35.913] else { [17:27:35.913] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.913] } [17:27:35.913] { [17:27:35.913] if (base::length(...future.futureOptionsAdded) > [17:27:35.913] 0L) { [17:27:35.913] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.913] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.913] base::options(opts) [17:27:35.913] } [17:27:35.913] { [17:27:35.913] { [17:27:35.913] NULL [17:27:35.913] RNGkind("Mersenne-Twister") [17:27:35.913] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.913] inherits = FALSE) [17:27:35.913] } [17:27:35.913] options(future.plan = NULL) [17:27:35.913] if (is.na(NA_character_)) [17:27:35.913] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.913] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.913] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.913] .init = FALSE) [17:27:35.913] } [17:27:35.913] } [17:27:35.913] } [17:27:35.913] }) [17:27:35.913] if (TRUE) { [17:27:35.913] base::sink(type = "output", split = FALSE) [17:27:35.913] if (TRUE) { [17:27:35.913] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.913] } [17:27:35.913] else { [17:27:35.913] ...future.result["stdout"] <- base::list(NULL) [17:27:35.913] } [17:27:35.913] base::close(...future.stdout) [17:27:35.913] ...future.stdout <- NULL [17:27:35.913] } [17:27:35.913] ...future.result$conditions <- ...future.conditions [17:27:35.913] ...future.result$finished <- base::Sys.time() [17:27:35.913] ...future.result [17:27:35.913] } [17:27:35.917] plan(): Setting new future strategy stack: [17:27:35.918] List of future strategies: [17:27:35.918] 1. sequential: [17:27:35.918] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.918] - tweaked: FALSE [17:27:35.918] - call: NULL [17:27:35.918] plan(): nbrOfWorkers() = 1 [17:27:35.920] plan(): Setting new future strategy stack: [17:27:35.920] List of future strategies: [17:27:35.920] 1. sequential: [17:27:35.920] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.920] - tweaked: FALSE [17:27:35.920] - call: plan(strategy) [17:27:35.921] plan(): nbrOfWorkers() = 1 [17:27:35.921] SequentialFuture started (and completed) [17:27:35.922] - Launch lazy future ... done [17:27:35.922] run() for 'SequentialFuture' ... done [17:27:35.922] getGlobalsAndPackages() ... [17:27:35.922] Searching for globals... [17:27:35.924] - globals found: [1] '{' [17:27:35.924] Searching for globals ... DONE [17:27:35.924] Resolving globals: FALSE [17:27:35.925] [17:27:35.925] [17:27:35.925] getGlobalsAndPackages() ... DONE [17:27:35.926] run() for 'Future' ... [17:27:35.926] - state: 'created' [17:27:35.927] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:35.927] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:35.928] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:35.928] - Field: 'label' [17:27:35.928] - Field: 'local' [17:27:35.928] - Field: 'owner' [17:27:35.929] - Field: 'envir' [17:27:35.929] - Field: 'packages' [17:27:35.929] - Field: 'gc' [17:27:35.930] - Field: 'conditions' [17:27:35.930] - Field: 'expr' [17:27:35.930] - Field: 'uuid' [17:27:35.931] - Field: 'seed' [17:27:35.931] - Field: 'version' [17:27:35.931] - Field: 'result' [17:27:35.931] - Field: 'asynchronous' [17:27:35.932] - Field: 'calls' [17:27:35.932] - Field: 'globals' [17:27:35.932] - Field: 'stdout' [17:27:35.933] - Field: 'earlySignal' [17:27:35.933] - Field: 'lazy' [17:27:35.933] - Field: 'state' [17:27:35.934] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:35.934] - Launch lazy future ... [17:27:35.934] Packages needed by the future expression (n = 0): [17:27:35.935] Packages needed by future strategies (n = 0): [17:27:35.939] { [17:27:35.939] { [17:27:35.939] { [17:27:35.939] ...future.startTime <- base::Sys.time() [17:27:35.939] { [17:27:35.939] { [17:27:35.939] { [17:27:35.939] base::local({ [17:27:35.939] has_future <- base::requireNamespace("future", [17:27:35.939] quietly = TRUE) [17:27:35.939] if (has_future) { [17:27:35.939] ns <- base::getNamespace("future") [17:27:35.939] version <- ns[[".package"]][["version"]] [17:27:35.939] if (is.null(version)) [17:27:35.939] version <- utils::packageVersion("future") [17:27:35.939] } [17:27:35.939] else { [17:27:35.939] version <- NULL [17:27:35.939] } [17:27:35.939] if (!has_future || version < "1.8.0") { [17:27:35.939] info <- base::c(r_version = base::gsub("R version ", [17:27:35.939] "", base::R.version$version.string), [17:27:35.939] platform = base::sprintf("%s (%s-bit)", [17:27:35.939] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:35.939] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:35.939] "release", "version")], collapse = " "), [17:27:35.939] hostname = base::Sys.info()[["nodename"]]) [17:27:35.939] info <- base::sprintf("%s: %s", base::names(info), [17:27:35.939] info) [17:27:35.939] info <- base::paste(info, collapse = "; ") [17:27:35.939] if (!has_future) { [17:27:35.939] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:35.939] info) [17:27:35.939] } [17:27:35.939] else { [17:27:35.939] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:35.939] info, version) [17:27:35.939] } [17:27:35.939] base::stop(msg) [17:27:35.939] } [17:27:35.939] }) [17:27:35.939] } [17:27:35.939] ...future.strategy.old <- future::plan("list") [17:27:35.939] options(future.plan = NULL) [17:27:35.939] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.939] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:35.939] } [17:27:35.939] ...future.workdir <- getwd() [17:27:35.939] } [17:27:35.939] ...future.oldOptions <- base::as.list(base::.Options) [17:27:35.939] ...future.oldEnvVars <- base::Sys.getenv() [17:27:35.939] } [17:27:35.939] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:35.939] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:35.939] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:35.939] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:35.939] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:35.939] future.stdout.windows.reencode = NULL, width = 80L) [17:27:35.939] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:35.939] base::names(...future.oldOptions)) [17:27:35.939] } [17:27:35.939] if (FALSE) { [17:27:35.939] } [17:27:35.939] else { [17:27:35.939] if (TRUE) { [17:27:35.939] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:35.939] open = "w") [17:27:35.939] } [17:27:35.939] else { [17:27:35.939] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:35.939] windows = "NUL", "/dev/null"), open = "w") [17:27:35.939] } [17:27:35.939] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:35.939] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:35.939] base::sink(type = "output", split = FALSE) [17:27:35.939] base::close(...future.stdout) [17:27:35.939] }, add = TRUE) [17:27:35.939] } [17:27:35.939] ...future.frame <- base::sys.nframe() [17:27:35.939] ...future.conditions <- base::list() [17:27:35.939] ...future.rng <- base::globalenv()$.Random.seed [17:27:35.939] if (FALSE) { [17:27:35.939] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:35.939] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:35.939] } [17:27:35.939] ...future.result <- base::tryCatch({ [17:27:35.939] base::withCallingHandlers({ [17:27:35.939] ...future.value <- base::withVisible(base::local({ [17:27:35.939] 4 [17:27:35.939] })) [17:27:35.939] future::FutureResult(value = ...future.value$value, [17:27:35.939] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.939] ...future.rng), globalenv = if (FALSE) [17:27:35.939] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:35.939] ...future.globalenv.names)) [17:27:35.939] else NULL, started = ...future.startTime, version = "1.8") [17:27:35.939] }, condition = base::local({ [17:27:35.939] c <- base::c [17:27:35.939] inherits <- base::inherits [17:27:35.939] invokeRestart <- base::invokeRestart [17:27:35.939] length <- base::length [17:27:35.939] list <- base::list [17:27:35.939] seq.int <- base::seq.int [17:27:35.939] signalCondition <- base::signalCondition [17:27:35.939] sys.calls <- base::sys.calls [17:27:35.939] `[[` <- base::`[[` [17:27:35.939] `+` <- base::`+` [17:27:35.939] `<<-` <- base::`<<-` [17:27:35.939] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:35.939] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:35.939] 3L)] [17:27:35.939] } [17:27:35.939] function(cond) { [17:27:35.939] is_error <- inherits(cond, "error") [17:27:35.939] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:35.939] NULL) [17:27:35.939] if (is_error) { [17:27:35.939] sessionInformation <- function() { [17:27:35.939] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:35.939] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:35.939] search = base::search(), system = base::Sys.info()) [17:27:35.939] } [17:27:35.939] ...future.conditions[[length(...future.conditions) + [17:27:35.939] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:35.939] cond$call), session = sessionInformation(), [17:27:35.939] timestamp = base::Sys.time(), signaled = 0L) [17:27:35.939] signalCondition(cond) [17:27:35.939] } [17:27:35.939] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:35.939] "immediateCondition"))) { [17:27:35.939] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:35.939] ...future.conditions[[length(...future.conditions) + [17:27:35.939] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:35.939] if (TRUE && !signal) { [17:27:35.939] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.939] { [17:27:35.939] inherits <- base::inherits [17:27:35.939] invokeRestart <- base::invokeRestart [17:27:35.939] is.null <- base::is.null [17:27:35.939] muffled <- FALSE [17:27:35.939] if (inherits(cond, "message")) { [17:27:35.939] muffled <- grepl(pattern, "muffleMessage") [17:27:35.939] if (muffled) [17:27:35.939] invokeRestart("muffleMessage") [17:27:35.939] } [17:27:35.939] else if (inherits(cond, "warning")) { [17:27:35.939] muffled <- grepl(pattern, "muffleWarning") [17:27:35.939] if (muffled) [17:27:35.939] invokeRestart("muffleWarning") [17:27:35.939] } [17:27:35.939] else if (inherits(cond, "condition")) { [17:27:35.939] if (!is.null(pattern)) { [17:27:35.939] computeRestarts <- base::computeRestarts [17:27:35.939] grepl <- base::grepl [17:27:35.939] restarts <- computeRestarts(cond) [17:27:35.939] for (restart in restarts) { [17:27:35.939] name <- restart$name [17:27:35.939] if (is.null(name)) [17:27:35.939] next [17:27:35.939] if (!grepl(pattern, name)) [17:27:35.939] next [17:27:35.939] invokeRestart(restart) [17:27:35.939] muffled <- TRUE [17:27:35.939] break [17:27:35.939] } [17:27:35.939] } [17:27:35.939] } [17:27:35.939] invisible(muffled) [17:27:35.939] } [17:27:35.939] muffleCondition(cond, pattern = "^muffle") [17:27:35.939] } [17:27:35.939] } [17:27:35.939] else { [17:27:35.939] if (TRUE) { [17:27:35.939] muffleCondition <- function (cond, pattern = "^muffle") [17:27:35.939] { [17:27:35.939] inherits <- base::inherits [17:27:35.939] invokeRestart <- base::invokeRestart [17:27:35.939] is.null <- base::is.null [17:27:35.939] muffled <- FALSE [17:27:35.939] if (inherits(cond, "message")) { [17:27:35.939] muffled <- grepl(pattern, "muffleMessage") [17:27:35.939] if (muffled) [17:27:35.939] invokeRestart("muffleMessage") [17:27:35.939] } [17:27:35.939] else if (inherits(cond, "warning")) { [17:27:35.939] muffled <- grepl(pattern, "muffleWarning") [17:27:35.939] if (muffled) [17:27:35.939] invokeRestart("muffleWarning") [17:27:35.939] } [17:27:35.939] else if (inherits(cond, "condition")) { [17:27:35.939] if (!is.null(pattern)) { [17:27:35.939] computeRestarts <- base::computeRestarts [17:27:35.939] grepl <- base::grepl [17:27:35.939] restarts <- computeRestarts(cond) [17:27:35.939] for (restart in restarts) { [17:27:35.939] name <- restart$name [17:27:35.939] if (is.null(name)) [17:27:35.939] next [17:27:35.939] if (!grepl(pattern, name)) [17:27:35.939] next [17:27:35.939] invokeRestart(restart) [17:27:35.939] muffled <- TRUE [17:27:35.939] break [17:27:35.939] } [17:27:35.939] } [17:27:35.939] } [17:27:35.939] invisible(muffled) [17:27:35.939] } [17:27:35.939] muffleCondition(cond, pattern = "^muffle") [17:27:35.939] } [17:27:35.939] } [17:27:35.939] } [17:27:35.939] })) [17:27:35.939] }, error = function(ex) { [17:27:35.939] base::structure(base::list(value = NULL, visible = NULL, [17:27:35.939] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:35.939] ...future.rng), started = ...future.startTime, [17:27:35.939] finished = Sys.time(), session_uuid = NA_character_, [17:27:35.939] version = "1.8"), class = "FutureResult") [17:27:35.939] }, finally = { [17:27:35.939] if (!identical(...future.workdir, getwd())) [17:27:35.939] setwd(...future.workdir) [17:27:35.939] { [17:27:35.939] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:35.939] ...future.oldOptions$nwarnings <- NULL [17:27:35.939] } [17:27:35.939] base::options(...future.oldOptions) [17:27:35.939] if (.Platform$OS.type == "windows") { [17:27:35.939] old_names <- names(...future.oldEnvVars) [17:27:35.939] envs <- base::Sys.getenv() [17:27:35.939] names <- names(envs) [17:27:35.939] common <- intersect(names, old_names) [17:27:35.939] added <- setdiff(names, old_names) [17:27:35.939] removed <- setdiff(old_names, names) [17:27:35.939] changed <- common[...future.oldEnvVars[common] != [17:27:35.939] envs[common]] [17:27:35.939] NAMES <- toupper(changed) [17:27:35.939] args <- list() [17:27:35.939] for (kk in seq_along(NAMES)) { [17:27:35.939] name <- changed[[kk]] [17:27:35.939] NAME <- NAMES[[kk]] [17:27:35.939] if (name != NAME && is.element(NAME, old_names)) [17:27:35.939] next [17:27:35.939] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.939] } [17:27:35.939] NAMES <- toupper(added) [17:27:35.939] for (kk in seq_along(NAMES)) { [17:27:35.939] name <- added[[kk]] [17:27:35.939] NAME <- NAMES[[kk]] [17:27:35.939] if (name != NAME && is.element(NAME, old_names)) [17:27:35.939] next [17:27:35.939] args[[name]] <- "" [17:27:35.939] } [17:27:35.939] NAMES <- toupper(removed) [17:27:35.939] for (kk in seq_along(NAMES)) { [17:27:35.939] name <- removed[[kk]] [17:27:35.939] NAME <- NAMES[[kk]] [17:27:35.939] if (name != NAME && is.element(NAME, old_names)) [17:27:35.939] next [17:27:35.939] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:35.939] } [17:27:35.939] if (length(args) > 0) [17:27:35.939] base::do.call(base::Sys.setenv, args = args) [17:27:35.939] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:35.939] } [17:27:35.939] else { [17:27:35.939] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:35.939] } [17:27:35.939] { [17:27:35.939] if (base::length(...future.futureOptionsAdded) > [17:27:35.939] 0L) { [17:27:35.939] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:35.939] base::names(opts) <- ...future.futureOptionsAdded [17:27:35.939] base::options(opts) [17:27:35.939] } [17:27:35.939] { [17:27:35.939] { [17:27:35.939] NULL [17:27:35.939] RNGkind("Mersenne-Twister") [17:27:35.939] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:35.939] inherits = FALSE) [17:27:35.939] } [17:27:35.939] options(future.plan = NULL) [17:27:35.939] if (is.na(NA_character_)) [17:27:35.939] Sys.unsetenv("R_FUTURE_PLAN") [17:27:35.939] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:35.939] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:35.939] .init = FALSE) [17:27:35.939] } [17:27:35.939] } [17:27:35.939] } [17:27:35.939] }) [17:27:35.939] if (TRUE) { [17:27:35.939] base::sink(type = "output", split = FALSE) [17:27:35.939] if (TRUE) { [17:27:35.939] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:35.939] } [17:27:35.939] else { [17:27:35.939] ...future.result["stdout"] <- base::list(NULL) [17:27:35.939] } [17:27:35.939] base::close(...future.stdout) [17:27:35.939] ...future.stdout <- NULL [17:27:35.939] } [17:27:35.939] ...future.result$conditions <- ...future.conditions [17:27:35.939] ...future.result$finished <- base::Sys.time() [17:27:35.939] ...future.result [17:27:35.939] } [17:27:35.946] plan(): Setting new future strategy stack: [17:27:35.946] List of future strategies: [17:27:35.946] 1. sequential: [17:27:35.946] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.946] - tweaked: FALSE [17:27:35.946] - call: NULL [17:27:35.947] plan(): nbrOfWorkers() = 1 [17:27:35.949] plan(): Setting new future strategy stack: [17:27:35.950] List of future strategies: [17:27:35.950] 1. sequential: [17:27:35.950] - args: function (..., envir = parent.frame(), workers = "") [17:27:35.950] - tweaked: FALSE [17:27:35.950] - call: plan(strategy) [17:27:35.951] plan(): nbrOfWorkers() = 1 [17:27:35.951] SequentialFuture started (and completed) [17:27:35.952] - Launch lazy future ... done [17:27:35.952] run() for 'SequentialFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:3] 2 3 1 - attr(*, "dimnames.")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:35.960] resolved() for 'SequentialFuture' ... [17:27:35.960] - state: 'finished' [17:27:35.960] - run: TRUE [17:27:35.961] - result: 'FutureResult' [17:27:35.961] resolved() for 'SequentialFuture' ... done [17:27:35.961] resolved() for 'SequentialFuture' ... [17:27:35.962] - state: 'finished' [17:27:35.962] - run: TRUE [17:27:35.962] - result: 'FutureResult' [17:27:35.963] resolved() for 'SequentialFuture' ... done [17:27:35.963] resolved() for 'SequentialFuture' ... [17:27:35.963] - state: 'finished' [17:27:35.964] - run: TRUE [17:27:35.964] - result: 'FutureResult' [17:27:35.964] resolved() for 'SequentialFuture' ... done logi [1:2, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:35.969] resolve() on list environment ... [17:27:35.970] recursive: 0 [17:27:35.972] length: 6 [17:27:35.972] elements: 'a', 'b', 'c', 'd', '', '' [17:27:35.972] signalConditionsASAP(numeric, pos=1) ... [17:27:35.972] - nx: 6 [17:27:35.973] - relay: TRUE [17:27:35.973] - stdout: TRUE [17:27:35.973] - signal: TRUE [17:27:35.974] - resignal: FALSE [17:27:35.974] - force: TRUE [17:27:35.974] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.974] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.975] - until=2 [17:27:35.975] - relaying element #2 [17:27:35.975] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.975] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.976] signalConditionsASAP(NULL, pos=1) ... done [17:27:35.976] length: 5 (resolved future 1) [17:27:35.976] resolved() for 'SequentialFuture' ... [17:27:35.977] - state: 'finished' [17:27:35.977] - run: TRUE [17:27:35.977] - result: 'FutureResult' [17:27:35.978] resolved() for 'SequentialFuture' ... done [17:27:35.978] Future #2 [17:27:35.978] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:35.979] - nx: 6 [17:27:35.979] - relay: TRUE [17:27:35.979] - stdout: TRUE [17:27:35.979] - signal: TRUE [17:27:35.980] - resignal: FALSE [17:27:35.980] - force: TRUE [17:27:35.980] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.980] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:35.981] - until=2 [17:27:35.981] - relaying element #2 [17:27:35.981] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.982] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.982] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:35.982] length: 4 (resolved future 2) [17:27:35.982] resolved() for 'SequentialFuture' ... [17:27:35.983] - state: 'finished' [17:27:35.983] - run: TRUE [17:27:35.983] - result: 'FutureResult' [17:27:35.984] resolved() for 'SequentialFuture' ... done [17:27:35.984] Future #3 [17:27:35.984] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:35.984] - nx: 6 [17:27:35.985] - relay: TRUE [17:27:35.985] - stdout: TRUE [17:27:35.988] - signal: TRUE [17:27:35.988] - resignal: FALSE [17:27:35.989] - force: TRUE [17:27:35.989] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.989] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:35.990] - until=3 [17:27:35.990] - relaying element #3 [17:27:35.990] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.991] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.991] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:35.991] length: 3 (resolved future 3) [17:27:35.992] resolved() for 'SequentialFuture' ... [17:27:35.992] - state: 'finished' [17:27:35.992] - run: TRUE [17:27:35.992] - result: 'FutureResult' [17:27:35.993] resolved() for 'SequentialFuture' ... done [17:27:35.993] Future #4 [17:27:35.993] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:35.994] - nx: 6 [17:27:35.994] - relay: TRUE [17:27:35.994] - stdout: TRUE [17:27:35.994] - signal: TRUE [17:27:35.995] - resignal: FALSE [17:27:35.995] - force: TRUE [17:27:35.995] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.995] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:35.996] - until=4 [17:27:35.996] - relaying element #4 [17:27:35.996] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.997] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:35.997] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:35.997] length: 2 (resolved future 4) [17:27:35.998] signalConditionsASAP(NULL, pos=5) ... [17:27:35.998] - nx: 6 [17:27:35.998] - relay: TRUE [17:27:35.998] - stdout: TRUE [17:27:35.999] - signal: TRUE [17:27:35.999] - resignal: FALSE [17:27:35.999] - force: TRUE [17:27:35.999] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.000] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.000] - until=6 [17:27:36.000] - relaying element #6 [17:27:36.000] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:36.001] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.001] signalConditionsASAP(NULL, pos=5) ... done [17:27:36.001] length: 1 (resolved future 5) [17:27:36.001] signalConditionsASAP(numeric, pos=6) ... [17:27:36.002] - nx: 6 [17:27:36.002] - relay: TRUE [17:27:36.002] - stdout: TRUE [17:27:36.002] - signal: TRUE [17:27:36.003] - resignal: FALSE [17:27:36.003] - force: TRUE [17:27:36.003] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:36.003] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.004] - until=6 [17:27:36.004] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:36.004] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.005] signalConditionsASAP(numeric, pos=6) ... done [17:27:36.005] length: 0 (resolved future 6) [17:27:36.005] Relaying remaining futures [17:27:36.005] signalConditionsASAP(NULL, pos=0) ... [17:27:36.006] - nx: 6 [17:27:36.006] - relay: TRUE [17:27:36.006] - stdout: TRUE [17:27:36.006] - signal: TRUE [17:27:36.007] - resignal: FALSE [17:27:36.007] - force: TRUE [17:27:36.007] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:36.007] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:36.008] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:36.008] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.008] signalConditionsASAP(NULL, pos=0) ... done [17:27:36.009] resolve() on list environment ... DONE Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:3] 2 3 1 - attr(*, "dimnames.")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" Dimensions: c(2, 1, 3, 1) [17:27:36.013] getGlobalsAndPackages() ... [17:27:36.014] Searching for globals... [17:27:36.014] [17:27:36.015] Searching for globals ... DONE [17:27:36.015] - globals: [0] [17:27:36.015] getGlobalsAndPackages() ... DONE [17:27:36.016] run() for 'Future' ... [17:27:36.016] - state: 'created' [17:27:36.016] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:36.017] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:36.017] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:36.018] - Field: 'label' [17:27:36.018] - Field: 'local' [17:27:36.018] - Field: 'owner' [17:27:36.019] - Field: 'envir' [17:27:36.019] - Field: 'packages' [17:27:36.019] - Field: 'gc' [17:27:36.019] - Field: 'conditions' [17:27:36.020] - Field: 'expr' [17:27:36.020] - Field: 'uuid' [17:27:36.020] - Field: 'seed' [17:27:36.021] - Field: 'version' [17:27:36.021] - Field: 'result' [17:27:36.021] - Field: 'asynchronous' [17:27:36.021] - Field: 'calls' [17:27:36.022] - Field: 'globals' [17:27:36.022] - Field: 'stdout' [17:27:36.022] - Field: 'earlySignal' [17:27:36.023] - Field: 'lazy' [17:27:36.023] - Field: 'state' [17:27:36.023] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:36.023] - Launch lazy future ... [17:27:36.024] Packages needed by the future expression (n = 0): [17:27:36.024] Packages needed by future strategies (n = 0): [17:27:36.025] { [17:27:36.025] { [17:27:36.025] { [17:27:36.025] ...future.startTime <- base::Sys.time() [17:27:36.025] { [17:27:36.025] { [17:27:36.025] { [17:27:36.025] base::local({ [17:27:36.025] has_future <- base::requireNamespace("future", [17:27:36.025] quietly = TRUE) [17:27:36.025] if (has_future) { [17:27:36.025] ns <- base::getNamespace("future") [17:27:36.025] version <- ns[[".package"]][["version"]] [17:27:36.025] if (is.null(version)) [17:27:36.025] version <- utils::packageVersion("future") [17:27:36.025] } [17:27:36.025] else { [17:27:36.025] version <- NULL [17:27:36.025] } [17:27:36.025] if (!has_future || version < "1.8.0") { [17:27:36.025] info <- base::c(r_version = base::gsub("R version ", [17:27:36.025] "", base::R.version$version.string), [17:27:36.025] platform = base::sprintf("%s (%s-bit)", [17:27:36.025] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:36.025] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:36.025] "release", "version")], collapse = " "), [17:27:36.025] hostname = base::Sys.info()[["nodename"]]) [17:27:36.025] info <- base::sprintf("%s: %s", base::names(info), [17:27:36.025] info) [17:27:36.025] info <- base::paste(info, collapse = "; ") [17:27:36.025] if (!has_future) { [17:27:36.025] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:36.025] info) [17:27:36.025] } [17:27:36.025] else { [17:27:36.025] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:36.025] info, version) [17:27:36.025] } [17:27:36.025] base::stop(msg) [17:27:36.025] } [17:27:36.025] }) [17:27:36.025] } [17:27:36.025] ...future.strategy.old <- future::plan("list") [17:27:36.025] options(future.plan = NULL) [17:27:36.025] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.025] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:36.025] } [17:27:36.025] ...future.workdir <- getwd() [17:27:36.025] } [17:27:36.025] ...future.oldOptions <- base::as.list(base::.Options) [17:27:36.025] ...future.oldEnvVars <- base::Sys.getenv() [17:27:36.025] } [17:27:36.025] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:36.025] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:36.025] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:36.025] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:36.025] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:36.025] future.stdout.windows.reencode = NULL, width = 80L) [17:27:36.025] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:36.025] base::names(...future.oldOptions)) [17:27:36.025] } [17:27:36.025] if (FALSE) { [17:27:36.025] } [17:27:36.025] else { [17:27:36.025] if (TRUE) { [17:27:36.025] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:36.025] open = "w") [17:27:36.025] } [17:27:36.025] else { [17:27:36.025] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:36.025] windows = "NUL", "/dev/null"), open = "w") [17:27:36.025] } [17:27:36.025] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:36.025] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:36.025] base::sink(type = "output", split = FALSE) [17:27:36.025] base::close(...future.stdout) [17:27:36.025] }, add = TRUE) [17:27:36.025] } [17:27:36.025] ...future.frame <- base::sys.nframe() [17:27:36.025] ...future.conditions <- base::list() [17:27:36.025] ...future.rng <- base::globalenv()$.Random.seed [17:27:36.025] if (FALSE) { [17:27:36.025] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:36.025] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:36.025] } [17:27:36.025] ...future.result <- base::tryCatch({ [17:27:36.025] base::withCallingHandlers({ [17:27:36.025] ...future.value <- base::withVisible(base::local(2)) [17:27:36.025] future::FutureResult(value = ...future.value$value, [17:27:36.025] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.025] ...future.rng), globalenv = if (FALSE) [17:27:36.025] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:36.025] ...future.globalenv.names)) [17:27:36.025] else NULL, started = ...future.startTime, version = "1.8") [17:27:36.025] }, condition = base::local({ [17:27:36.025] c <- base::c [17:27:36.025] inherits <- base::inherits [17:27:36.025] invokeRestart <- base::invokeRestart [17:27:36.025] length <- base::length [17:27:36.025] list <- base::list [17:27:36.025] seq.int <- base::seq.int [17:27:36.025] signalCondition <- base::signalCondition [17:27:36.025] sys.calls <- base::sys.calls [17:27:36.025] `[[` <- base::`[[` [17:27:36.025] `+` <- base::`+` [17:27:36.025] `<<-` <- base::`<<-` [17:27:36.025] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:36.025] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:36.025] 3L)] [17:27:36.025] } [17:27:36.025] function(cond) { [17:27:36.025] is_error <- inherits(cond, "error") [17:27:36.025] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:36.025] NULL) [17:27:36.025] if (is_error) { [17:27:36.025] sessionInformation <- function() { [17:27:36.025] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:36.025] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:36.025] search = base::search(), system = base::Sys.info()) [17:27:36.025] } [17:27:36.025] ...future.conditions[[length(...future.conditions) + [17:27:36.025] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:36.025] cond$call), session = sessionInformation(), [17:27:36.025] timestamp = base::Sys.time(), signaled = 0L) [17:27:36.025] signalCondition(cond) [17:27:36.025] } [17:27:36.025] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:36.025] "immediateCondition"))) { [17:27:36.025] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:36.025] ...future.conditions[[length(...future.conditions) + [17:27:36.025] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:36.025] if (TRUE && !signal) { [17:27:36.025] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.025] { [17:27:36.025] inherits <- base::inherits [17:27:36.025] invokeRestart <- base::invokeRestart [17:27:36.025] is.null <- base::is.null [17:27:36.025] muffled <- FALSE [17:27:36.025] if (inherits(cond, "message")) { [17:27:36.025] muffled <- grepl(pattern, "muffleMessage") [17:27:36.025] if (muffled) [17:27:36.025] invokeRestart("muffleMessage") [17:27:36.025] } [17:27:36.025] else if (inherits(cond, "warning")) { [17:27:36.025] muffled <- grepl(pattern, "muffleWarning") [17:27:36.025] if (muffled) [17:27:36.025] invokeRestart("muffleWarning") [17:27:36.025] } [17:27:36.025] else if (inherits(cond, "condition")) { [17:27:36.025] if (!is.null(pattern)) { [17:27:36.025] computeRestarts <- base::computeRestarts [17:27:36.025] grepl <- base::grepl [17:27:36.025] restarts <- computeRestarts(cond) [17:27:36.025] for (restart in restarts) { [17:27:36.025] name <- restart$name [17:27:36.025] if (is.null(name)) [17:27:36.025] next [17:27:36.025] if (!grepl(pattern, name)) [17:27:36.025] next [17:27:36.025] invokeRestart(restart) [17:27:36.025] muffled <- TRUE [17:27:36.025] break [17:27:36.025] } [17:27:36.025] } [17:27:36.025] } [17:27:36.025] invisible(muffled) [17:27:36.025] } [17:27:36.025] muffleCondition(cond, pattern = "^muffle") [17:27:36.025] } [17:27:36.025] } [17:27:36.025] else { [17:27:36.025] if (TRUE) { [17:27:36.025] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.025] { [17:27:36.025] inherits <- base::inherits [17:27:36.025] invokeRestart <- base::invokeRestart [17:27:36.025] is.null <- base::is.null [17:27:36.025] muffled <- FALSE [17:27:36.025] if (inherits(cond, "message")) { [17:27:36.025] muffled <- grepl(pattern, "muffleMessage") [17:27:36.025] if (muffled) [17:27:36.025] invokeRestart("muffleMessage") [17:27:36.025] } [17:27:36.025] else if (inherits(cond, "warning")) { [17:27:36.025] muffled <- grepl(pattern, "muffleWarning") [17:27:36.025] if (muffled) [17:27:36.025] invokeRestart("muffleWarning") [17:27:36.025] } [17:27:36.025] else if (inherits(cond, "condition")) { [17:27:36.025] if (!is.null(pattern)) { [17:27:36.025] computeRestarts <- base::computeRestarts [17:27:36.025] grepl <- base::grepl [17:27:36.025] restarts <- computeRestarts(cond) [17:27:36.025] for (restart in restarts) { [17:27:36.025] name <- restart$name [17:27:36.025] if (is.null(name)) [17:27:36.025] next [17:27:36.025] if (!grepl(pattern, name)) [17:27:36.025] next [17:27:36.025] invokeRestart(restart) [17:27:36.025] muffled <- TRUE [17:27:36.025] break [17:27:36.025] } [17:27:36.025] } [17:27:36.025] } [17:27:36.025] invisible(muffled) [17:27:36.025] } [17:27:36.025] muffleCondition(cond, pattern = "^muffle") [17:27:36.025] } [17:27:36.025] } [17:27:36.025] } [17:27:36.025] })) [17:27:36.025] }, error = function(ex) { [17:27:36.025] base::structure(base::list(value = NULL, visible = NULL, [17:27:36.025] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.025] ...future.rng), started = ...future.startTime, [17:27:36.025] finished = Sys.time(), session_uuid = NA_character_, [17:27:36.025] version = "1.8"), class = "FutureResult") [17:27:36.025] }, finally = { [17:27:36.025] if (!identical(...future.workdir, getwd())) [17:27:36.025] setwd(...future.workdir) [17:27:36.025] { [17:27:36.025] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:36.025] ...future.oldOptions$nwarnings <- NULL [17:27:36.025] } [17:27:36.025] base::options(...future.oldOptions) [17:27:36.025] if (.Platform$OS.type == "windows") { [17:27:36.025] old_names <- names(...future.oldEnvVars) [17:27:36.025] envs <- base::Sys.getenv() [17:27:36.025] names <- names(envs) [17:27:36.025] common <- intersect(names, old_names) [17:27:36.025] added <- setdiff(names, old_names) [17:27:36.025] removed <- setdiff(old_names, names) [17:27:36.025] changed <- common[...future.oldEnvVars[common] != [17:27:36.025] envs[common]] [17:27:36.025] NAMES <- toupper(changed) [17:27:36.025] args <- list() [17:27:36.025] for (kk in seq_along(NAMES)) { [17:27:36.025] name <- changed[[kk]] [17:27:36.025] NAME <- NAMES[[kk]] [17:27:36.025] if (name != NAME && is.element(NAME, old_names)) [17:27:36.025] next [17:27:36.025] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.025] } [17:27:36.025] NAMES <- toupper(added) [17:27:36.025] for (kk in seq_along(NAMES)) { [17:27:36.025] name <- added[[kk]] [17:27:36.025] NAME <- NAMES[[kk]] [17:27:36.025] if (name != NAME && is.element(NAME, old_names)) [17:27:36.025] next [17:27:36.025] args[[name]] <- "" [17:27:36.025] } [17:27:36.025] NAMES <- toupper(removed) [17:27:36.025] for (kk in seq_along(NAMES)) { [17:27:36.025] name <- removed[[kk]] [17:27:36.025] NAME <- NAMES[[kk]] [17:27:36.025] if (name != NAME && is.element(NAME, old_names)) [17:27:36.025] next [17:27:36.025] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.025] } [17:27:36.025] if (length(args) > 0) [17:27:36.025] base::do.call(base::Sys.setenv, args = args) [17:27:36.025] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:36.025] } [17:27:36.025] else { [17:27:36.025] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:36.025] } [17:27:36.025] { [17:27:36.025] if (base::length(...future.futureOptionsAdded) > [17:27:36.025] 0L) { [17:27:36.025] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:36.025] base::names(opts) <- ...future.futureOptionsAdded [17:27:36.025] base::options(opts) [17:27:36.025] } [17:27:36.025] { [17:27:36.025] { [17:27:36.025] NULL [17:27:36.025] RNGkind("Mersenne-Twister") [17:27:36.025] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:36.025] inherits = FALSE) [17:27:36.025] } [17:27:36.025] options(future.plan = NULL) [17:27:36.025] if (is.na(NA_character_)) [17:27:36.025] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.025] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:36.025] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:36.025] .init = FALSE) [17:27:36.025] } [17:27:36.025] } [17:27:36.025] } [17:27:36.025] }) [17:27:36.025] if (TRUE) { [17:27:36.025] base::sink(type = "output", split = FALSE) [17:27:36.025] if (TRUE) { [17:27:36.025] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:36.025] } [17:27:36.025] else { [17:27:36.025] ...future.result["stdout"] <- base::list(NULL) [17:27:36.025] } [17:27:36.025] base::close(...future.stdout) [17:27:36.025] ...future.stdout <- NULL [17:27:36.025] } [17:27:36.025] ...future.result$conditions <- ...future.conditions [17:27:36.025] ...future.result$finished <- base::Sys.time() [17:27:36.025] ...future.result [17:27:36.025] } [17:27:36.032] plan(): Setting new future strategy stack: [17:27:36.032] List of future strategies: [17:27:36.032] 1. sequential: [17:27:36.032] - args: function (..., envir = parent.frame(), workers = "") [17:27:36.032] - tweaked: FALSE [17:27:36.032] - call: NULL [17:27:36.033] plan(): nbrOfWorkers() = 1 [17:27:36.035] plan(): Setting new future strategy stack: [17:27:36.035] List of future strategies: [17:27:36.035] 1. sequential: [17:27:36.035] - args: function (..., envir = parent.frame(), workers = "") [17:27:36.035] - tweaked: FALSE [17:27:36.035] - call: plan(strategy) [17:27:36.036] plan(): nbrOfWorkers() = 1 [17:27:36.037] SequentialFuture started (and completed) [17:27:36.037] - Launch lazy future ... done [17:27:36.037] run() for 'SequentialFuture' ... done [17:27:36.038] getGlobalsAndPackages() ... [17:27:36.038] Searching for globals... [17:27:36.039] [17:27:36.042] Searching for globals ... DONE [17:27:36.042] - globals: [0] [17:27:36.042] getGlobalsAndPackages() ... DONE [17:27:36.043] run() for 'Future' ... [17:27:36.043] - state: 'created' [17:27:36.044] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:36.044] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:36.045] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:36.045] - Field: 'label' [17:27:36.045] - Field: 'local' [17:27:36.046] - Field: 'owner' [17:27:36.046] - Field: 'envir' [17:27:36.046] - Field: 'packages' [17:27:36.047] - Field: 'gc' [17:27:36.047] - Field: 'conditions' [17:27:36.047] - Field: 'expr' [17:27:36.047] - Field: 'uuid' [17:27:36.048] - Field: 'seed' [17:27:36.048] - Field: 'version' [17:27:36.048] - Field: 'result' [17:27:36.049] - Field: 'asynchronous' [17:27:36.049] - Field: 'calls' [17:27:36.049] - Field: 'globals' [17:27:36.049] - Field: 'stdout' [17:27:36.050] - Field: 'earlySignal' [17:27:36.050] - Field: 'lazy' [17:27:36.050] - Field: 'state' [17:27:36.051] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:36.051] - Launch lazy future ... [17:27:36.051] Packages needed by the future expression (n = 0): [17:27:36.052] Packages needed by future strategies (n = 0): [17:27:36.053] { [17:27:36.053] { [17:27:36.053] { [17:27:36.053] ...future.startTime <- base::Sys.time() [17:27:36.053] { [17:27:36.053] { [17:27:36.053] { [17:27:36.053] base::local({ [17:27:36.053] has_future <- base::requireNamespace("future", [17:27:36.053] quietly = TRUE) [17:27:36.053] if (has_future) { [17:27:36.053] ns <- base::getNamespace("future") [17:27:36.053] version <- ns[[".package"]][["version"]] [17:27:36.053] if (is.null(version)) [17:27:36.053] version <- utils::packageVersion("future") [17:27:36.053] } [17:27:36.053] else { [17:27:36.053] version <- NULL [17:27:36.053] } [17:27:36.053] if (!has_future || version < "1.8.0") { [17:27:36.053] info <- base::c(r_version = base::gsub("R version ", [17:27:36.053] "", base::R.version$version.string), [17:27:36.053] platform = base::sprintf("%s (%s-bit)", [17:27:36.053] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:36.053] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:36.053] "release", "version")], collapse = " "), [17:27:36.053] hostname = base::Sys.info()[["nodename"]]) [17:27:36.053] info <- base::sprintf("%s: %s", base::names(info), [17:27:36.053] info) [17:27:36.053] info <- base::paste(info, collapse = "; ") [17:27:36.053] if (!has_future) { [17:27:36.053] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:36.053] info) [17:27:36.053] } [17:27:36.053] else { [17:27:36.053] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:36.053] info, version) [17:27:36.053] } [17:27:36.053] base::stop(msg) [17:27:36.053] } [17:27:36.053] }) [17:27:36.053] } [17:27:36.053] ...future.strategy.old <- future::plan("list") [17:27:36.053] options(future.plan = NULL) [17:27:36.053] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.053] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:36.053] } [17:27:36.053] ...future.workdir <- getwd() [17:27:36.053] } [17:27:36.053] ...future.oldOptions <- base::as.list(base::.Options) [17:27:36.053] ...future.oldEnvVars <- base::Sys.getenv() [17:27:36.053] } [17:27:36.053] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:36.053] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:36.053] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:36.053] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:36.053] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:36.053] future.stdout.windows.reencode = NULL, width = 80L) [17:27:36.053] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:36.053] base::names(...future.oldOptions)) [17:27:36.053] } [17:27:36.053] if (FALSE) { [17:27:36.053] } [17:27:36.053] else { [17:27:36.053] if (TRUE) { [17:27:36.053] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:36.053] open = "w") [17:27:36.053] } [17:27:36.053] else { [17:27:36.053] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:36.053] windows = "NUL", "/dev/null"), open = "w") [17:27:36.053] } [17:27:36.053] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:36.053] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:36.053] base::sink(type = "output", split = FALSE) [17:27:36.053] base::close(...future.stdout) [17:27:36.053] }, add = TRUE) [17:27:36.053] } [17:27:36.053] ...future.frame <- base::sys.nframe() [17:27:36.053] ...future.conditions <- base::list() [17:27:36.053] ...future.rng <- base::globalenv()$.Random.seed [17:27:36.053] if (FALSE) { [17:27:36.053] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:36.053] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:36.053] } [17:27:36.053] ...future.result <- base::tryCatch({ [17:27:36.053] base::withCallingHandlers({ [17:27:36.053] ...future.value <- base::withVisible(base::local(NULL)) [17:27:36.053] future::FutureResult(value = ...future.value$value, [17:27:36.053] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.053] ...future.rng), globalenv = if (FALSE) [17:27:36.053] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:36.053] ...future.globalenv.names)) [17:27:36.053] else NULL, started = ...future.startTime, version = "1.8") [17:27:36.053] }, condition = base::local({ [17:27:36.053] c <- base::c [17:27:36.053] inherits <- base::inherits [17:27:36.053] invokeRestart <- base::invokeRestart [17:27:36.053] length <- base::length [17:27:36.053] list <- base::list [17:27:36.053] seq.int <- base::seq.int [17:27:36.053] signalCondition <- base::signalCondition [17:27:36.053] sys.calls <- base::sys.calls [17:27:36.053] `[[` <- base::`[[` [17:27:36.053] `+` <- base::`+` [17:27:36.053] `<<-` <- base::`<<-` [17:27:36.053] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:36.053] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:36.053] 3L)] [17:27:36.053] } [17:27:36.053] function(cond) { [17:27:36.053] is_error <- inherits(cond, "error") [17:27:36.053] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:36.053] NULL) [17:27:36.053] if (is_error) { [17:27:36.053] sessionInformation <- function() { [17:27:36.053] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:36.053] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:36.053] search = base::search(), system = base::Sys.info()) [17:27:36.053] } [17:27:36.053] ...future.conditions[[length(...future.conditions) + [17:27:36.053] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:36.053] cond$call), session = sessionInformation(), [17:27:36.053] timestamp = base::Sys.time(), signaled = 0L) [17:27:36.053] signalCondition(cond) [17:27:36.053] } [17:27:36.053] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:36.053] "immediateCondition"))) { [17:27:36.053] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:36.053] ...future.conditions[[length(...future.conditions) + [17:27:36.053] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:36.053] if (TRUE && !signal) { [17:27:36.053] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.053] { [17:27:36.053] inherits <- base::inherits [17:27:36.053] invokeRestart <- base::invokeRestart [17:27:36.053] is.null <- base::is.null [17:27:36.053] muffled <- FALSE [17:27:36.053] if (inherits(cond, "message")) { [17:27:36.053] muffled <- grepl(pattern, "muffleMessage") [17:27:36.053] if (muffled) [17:27:36.053] invokeRestart("muffleMessage") [17:27:36.053] } [17:27:36.053] else if (inherits(cond, "warning")) { [17:27:36.053] muffled <- grepl(pattern, "muffleWarning") [17:27:36.053] if (muffled) [17:27:36.053] invokeRestart("muffleWarning") [17:27:36.053] } [17:27:36.053] else if (inherits(cond, "condition")) { [17:27:36.053] if (!is.null(pattern)) { [17:27:36.053] computeRestarts <- base::computeRestarts [17:27:36.053] grepl <- base::grepl [17:27:36.053] restarts <- computeRestarts(cond) [17:27:36.053] for (restart in restarts) { [17:27:36.053] name <- restart$name [17:27:36.053] if (is.null(name)) [17:27:36.053] next [17:27:36.053] if (!grepl(pattern, name)) [17:27:36.053] next [17:27:36.053] invokeRestart(restart) [17:27:36.053] muffled <- TRUE [17:27:36.053] break [17:27:36.053] } [17:27:36.053] } [17:27:36.053] } [17:27:36.053] invisible(muffled) [17:27:36.053] } [17:27:36.053] muffleCondition(cond, pattern = "^muffle") [17:27:36.053] } [17:27:36.053] } [17:27:36.053] else { [17:27:36.053] if (TRUE) { [17:27:36.053] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.053] { [17:27:36.053] inherits <- base::inherits [17:27:36.053] invokeRestart <- base::invokeRestart [17:27:36.053] is.null <- base::is.null [17:27:36.053] muffled <- FALSE [17:27:36.053] if (inherits(cond, "message")) { [17:27:36.053] muffled <- grepl(pattern, "muffleMessage") [17:27:36.053] if (muffled) [17:27:36.053] invokeRestart("muffleMessage") [17:27:36.053] } [17:27:36.053] else if (inherits(cond, "warning")) { [17:27:36.053] muffled <- grepl(pattern, "muffleWarning") [17:27:36.053] if (muffled) [17:27:36.053] invokeRestart("muffleWarning") [17:27:36.053] } [17:27:36.053] else if (inherits(cond, "condition")) { [17:27:36.053] if (!is.null(pattern)) { [17:27:36.053] computeRestarts <- base::computeRestarts [17:27:36.053] grepl <- base::grepl [17:27:36.053] restarts <- computeRestarts(cond) [17:27:36.053] for (restart in restarts) { [17:27:36.053] name <- restart$name [17:27:36.053] if (is.null(name)) [17:27:36.053] next [17:27:36.053] if (!grepl(pattern, name)) [17:27:36.053] next [17:27:36.053] invokeRestart(restart) [17:27:36.053] muffled <- TRUE [17:27:36.053] break [17:27:36.053] } [17:27:36.053] } [17:27:36.053] } [17:27:36.053] invisible(muffled) [17:27:36.053] } [17:27:36.053] muffleCondition(cond, pattern = "^muffle") [17:27:36.053] } [17:27:36.053] } [17:27:36.053] } [17:27:36.053] })) [17:27:36.053] }, error = function(ex) { [17:27:36.053] base::structure(base::list(value = NULL, visible = NULL, [17:27:36.053] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.053] ...future.rng), started = ...future.startTime, [17:27:36.053] finished = Sys.time(), session_uuid = NA_character_, [17:27:36.053] version = "1.8"), class = "FutureResult") [17:27:36.053] }, finally = { [17:27:36.053] if (!identical(...future.workdir, getwd())) [17:27:36.053] setwd(...future.workdir) [17:27:36.053] { [17:27:36.053] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:36.053] ...future.oldOptions$nwarnings <- NULL [17:27:36.053] } [17:27:36.053] base::options(...future.oldOptions) [17:27:36.053] if (.Platform$OS.type == "windows") { [17:27:36.053] old_names <- names(...future.oldEnvVars) [17:27:36.053] envs <- base::Sys.getenv() [17:27:36.053] names <- names(envs) [17:27:36.053] common <- intersect(names, old_names) [17:27:36.053] added <- setdiff(names, old_names) [17:27:36.053] removed <- setdiff(old_names, names) [17:27:36.053] changed <- common[...future.oldEnvVars[common] != [17:27:36.053] envs[common]] [17:27:36.053] NAMES <- toupper(changed) [17:27:36.053] args <- list() [17:27:36.053] for (kk in seq_along(NAMES)) { [17:27:36.053] name <- changed[[kk]] [17:27:36.053] NAME <- NAMES[[kk]] [17:27:36.053] if (name != NAME && is.element(NAME, old_names)) [17:27:36.053] next [17:27:36.053] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.053] } [17:27:36.053] NAMES <- toupper(added) [17:27:36.053] for (kk in seq_along(NAMES)) { [17:27:36.053] name <- added[[kk]] [17:27:36.053] NAME <- NAMES[[kk]] [17:27:36.053] if (name != NAME && is.element(NAME, old_names)) [17:27:36.053] next [17:27:36.053] args[[name]] <- "" [17:27:36.053] } [17:27:36.053] NAMES <- toupper(removed) [17:27:36.053] for (kk in seq_along(NAMES)) { [17:27:36.053] name <- removed[[kk]] [17:27:36.053] NAME <- NAMES[[kk]] [17:27:36.053] if (name != NAME && is.element(NAME, old_names)) [17:27:36.053] next [17:27:36.053] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.053] } [17:27:36.053] if (length(args) > 0) [17:27:36.053] base::do.call(base::Sys.setenv, args = args) [17:27:36.053] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:36.053] } [17:27:36.053] else { [17:27:36.053] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:36.053] } [17:27:36.053] { [17:27:36.053] if (base::length(...future.futureOptionsAdded) > [17:27:36.053] 0L) { [17:27:36.053] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:36.053] base::names(opts) <- ...future.futureOptionsAdded [17:27:36.053] base::options(opts) [17:27:36.053] } [17:27:36.053] { [17:27:36.053] { [17:27:36.053] NULL [17:27:36.053] RNGkind("Mersenne-Twister") [17:27:36.053] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:36.053] inherits = FALSE) [17:27:36.053] } [17:27:36.053] options(future.plan = NULL) [17:27:36.053] if (is.na(NA_character_)) [17:27:36.053] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.053] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:36.053] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:36.053] .init = FALSE) [17:27:36.053] } [17:27:36.053] } [17:27:36.053] } [17:27:36.053] }) [17:27:36.053] if (TRUE) { [17:27:36.053] base::sink(type = "output", split = FALSE) [17:27:36.053] if (TRUE) { [17:27:36.053] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:36.053] } [17:27:36.053] else { [17:27:36.053] ...future.result["stdout"] <- base::list(NULL) [17:27:36.053] } [17:27:36.053] base::close(...future.stdout) [17:27:36.053] ...future.stdout <- NULL [17:27:36.053] } [17:27:36.053] ...future.result$conditions <- ...future.conditions [17:27:36.053] ...future.result$finished <- base::Sys.time() [17:27:36.053] ...future.result [17:27:36.053] } [17:27:36.059] plan(): Setting new future strategy stack: [17:27:36.060] List of future strategies: [17:27:36.060] 1. sequential: [17:27:36.060] - args: function (..., envir = parent.frame(), workers = "") [17:27:36.060] - tweaked: FALSE [17:27:36.060] - call: NULL [17:27:36.061] plan(): nbrOfWorkers() = 1 [17:27:36.063] plan(): Setting new future strategy stack: [17:27:36.063] List of future strategies: [17:27:36.063] 1. sequential: [17:27:36.063] - args: function (..., envir = parent.frame(), workers = "") [17:27:36.063] - tweaked: FALSE [17:27:36.063] - call: plan(strategy) [17:27:36.064] plan(): nbrOfWorkers() = 1 [17:27:36.065] SequentialFuture started (and completed) [17:27:36.065] - Launch lazy future ... done [17:27:36.065] run() for 'SequentialFuture' ... done [17:27:36.066] getGlobalsAndPackages() ... [17:27:36.067] Searching for globals... [17:27:36.068] - globals found: [1] '{' [17:27:36.068] Searching for globals ... DONE [17:27:36.068] Resolving globals: FALSE [17:27:36.069] [17:27:36.069] [17:27:36.070] getGlobalsAndPackages() ... DONE [17:27:36.070] run() for 'Future' ... [17:27:36.070] - state: 'created' [17:27:36.070] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:36.071] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:36.071] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:36.071] - Field: 'label' [17:27:36.072] - Field: 'local' [17:27:36.072] - Field: 'owner' [17:27:36.072] - Field: 'envir' [17:27:36.072] - Field: 'packages' [17:27:36.073] - Field: 'gc' [17:27:36.073] - Field: 'conditions' [17:27:36.073] - Field: 'expr' [17:27:36.073] - Field: 'uuid' [17:27:36.074] - Field: 'seed' [17:27:36.074] - Field: 'version' [17:27:36.074] - Field: 'result' [17:27:36.074] - Field: 'asynchronous' [17:27:36.075] - Field: 'calls' [17:27:36.075] - Field: 'globals' [17:27:36.075] - Field: 'stdout' [17:27:36.075] - Field: 'earlySignal' [17:27:36.075] - Field: 'lazy' [17:27:36.076] - Field: 'state' [17:27:36.076] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:36.076] - Launch lazy future ... [17:27:36.076] Packages needed by the future expression (n = 0): [17:27:36.076] Packages needed by future strategies (n = 0): [17:27:36.077] { [17:27:36.077] { [17:27:36.077] { [17:27:36.077] ...future.startTime <- base::Sys.time() [17:27:36.077] { [17:27:36.077] { [17:27:36.077] { [17:27:36.077] base::local({ [17:27:36.077] has_future <- base::requireNamespace("future", [17:27:36.077] quietly = TRUE) [17:27:36.077] if (has_future) { [17:27:36.077] ns <- base::getNamespace("future") [17:27:36.077] version <- ns[[".package"]][["version"]] [17:27:36.077] if (is.null(version)) [17:27:36.077] version <- utils::packageVersion("future") [17:27:36.077] } [17:27:36.077] else { [17:27:36.077] version <- NULL [17:27:36.077] } [17:27:36.077] if (!has_future || version < "1.8.0") { [17:27:36.077] info <- base::c(r_version = base::gsub("R version ", [17:27:36.077] "", base::R.version$version.string), [17:27:36.077] platform = base::sprintf("%s (%s-bit)", [17:27:36.077] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:36.077] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:36.077] "release", "version")], collapse = " "), [17:27:36.077] hostname = base::Sys.info()[["nodename"]]) [17:27:36.077] info <- base::sprintf("%s: %s", base::names(info), [17:27:36.077] info) [17:27:36.077] info <- base::paste(info, collapse = "; ") [17:27:36.077] if (!has_future) { [17:27:36.077] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:36.077] info) [17:27:36.077] } [17:27:36.077] else { [17:27:36.077] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:36.077] info, version) [17:27:36.077] } [17:27:36.077] base::stop(msg) [17:27:36.077] } [17:27:36.077] }) [17:27:36.077] } [17:27:36.077] ...future.strategy.old <- future::plan("list") [17:27:36.077] options(future.plan = NULL) [17:27:36.077] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.077] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:36.077] } [17:27:36.077] ...future.workdir <- getwd() [17:27:36.077] } [17:27:36.077] ...future.oldOptions <- base::as.list(base::.Options) [17:27:36.077] ...future.oldEnvVars <- base::Sys.getenv() [17:27:36.077] } [17:27:36.077] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:36.077] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:36.077] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:36.077] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:36.077] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:36.077] future.stdout.windows.reencode = NULL, width = 80L) [17:27:36.077] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:36.077] base::names(...future.oldOptions)) [17:27:36.077] } [17:27:36.077] if (FALSE) { [17:27:36.077] } [17:27:36.077] else { [17:27:36.077] if (TRUE) { [17:27:36.077] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:36.077] open = "w") [17:27:36.077] } [17:27:36.077] else { [17:27:36.077] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:36.077] windows = "NUL", "/dev/null"), open = "w") [17:27:36.077] } [17:27:36.077] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:36.077] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:36.077] base::sink(type = "output", split = FALSE) [17:27:36.077] base::close(...future.stdout) [17:27:36.077] }, add = TRUE) [17:27:36.077] } [17:27:36.077] ...future.frame <- base::sys.nframe() [17:27:36.077] ...future.conditions <- base::list() [17:27:36.077] ...future.rng <- base::globalenv()$.Random.seed [17:27:36.077] if (FALSE) { [17:27:36.077] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:36.077] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:36.077] } [17:27:36.077] ...future.result <- base::tryCatch({ [17:27:36.077] base::withCallingHandlers({ [17:27:36.077] ...future.value <- base::withVisible(base::local({ [17:27:36.077] 4 [17:27:36.077] })) [17:27:36.077] future::FutureResult(value = ...future.value$value, [17:27:36.077] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.077] ...future.rng), globalenv = if (FALSE) [17:27:36.077] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:36.077] ...future.globalenv.names)) [17:27:36.077] else NULL, started = ...future.startTime, version = "1.8") [17:27:36.077] }, condition = base::local({ [17:27:36.077] c <- base::c [17:27:36.077] inherits <- base::inherits [17:27:36.077] invokeRestart <- base::invokeRestart [17:27:36.077] length <- base::length [17:27:36.077] list <- base::list [17:27:36.077] seq.int <- base::seq.int [17:27:36.077] signalCondition <- base::signalCondition [17:27:36.077] sys.calls <- base::sys.calls [17:27:36.077] `[[` <- base::`[[` [17:27:36.077] `+` <- base::`+` [17:27:36.077] `<<-` <- base::`<<-` [17:27:36.077] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:36.077] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:36.077] 3L)] [17:27:36.077] } [17:27:36.077] function(cond) { [17:27:36.077] is_error <- inherits(cond, "error") [17:27:36.077] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:36.077] NULL) [17:27:36.077] if (is_error) { [17:27:36.077] sessionInformation <- function() { [17:27:36.077] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:36.077] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:36.077] search = base::search(), system = base::Sys.info()) [17:27:36.077] } [17:27:36.077] ...future.conditions[[length(...future.conditions) + [17:27:36.077] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:36.077] cond$call), session = sessionInformation(), [17:27:36.077] timestamp = base::Sys.time(), signaled = 0L) [17:27:36.077] signalCondition(cond) [17:27:36.077] } [17:27:36.077] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:36.077] "immediateCondition"))) { [17:27:36.077] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:36.077] ...future.conditions[[length(...future.conditions) + [17:27:36.077] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:36.077] if (TRUE && !signal) { [17:27:36.077] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.077] { [17:27:36.077] inherits <- base::inherits [17:27:36.077] invokeRestart <- base::invokeRestart [17:27:36.077] is.null <- base::is.null [17:27:36.077] muffled <- FALSE [17:27:36.077] if (inherits(cond, "message")) { [17:27:36.077] muffled <- grepl(pattern, "muffleMessage") [17:27:36.077] if (muffled) [17:27:36.077] invokeRestart("muffleMessage") [17:27:36.077] } [17:27:36.077] else if (inherits(cond, "warning")) { [17:27:36.077] muffled <- grepl(pattern, "muffleWarning") [17:27:36.077] if (muffled) [17:27:36.077] invokeRestart("muffleWarning") [17:27:36.077] } [17:27:36.077] else if (inherits(cond, "condition")) { [17:27:36.077] if (!is.null(pattern)) { [17:27:36.077] computeRestarts <- base::computeRestarts [17:27:36.077] grepl <- base::grepl [17:27:36.077] restarts <- computeRestarts(cond) [17:27:36.077] for (restart in restarts) { [17:27:36.077] name <- restart$name [17:27:36.077] if (is.null(name)) [17:27:36.077] next [17:27:36.077] if (!grepl(pattern, name)) [17:27:36.077] next [17:27:36.077] invokeRestart(restart) [17:27:36.077] muffled <- TRUE [17:27:36.077] break [17:27:36.077] } [17:27:36.077] } [17:27:36.077] } [17:27:36.077] invisible(muffled) [17:27:36.077] } [17:27:36.077] muffleCondition(cond, pattern = "^muffle") [17:27:36.077] } [17:27:36.077] } [17:27:36.077] else { [17:27:36.077] if (TRUE) { [17:27:36.077] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.077] { [17:27:36.077] inherits <- base::inherits [17:27:36.077] invokeRestart <- base::invokeRestart [17:27:36.077] is.null <- base::is.null [17:27:36.077] muffled <- FALSE [17:27:36.077] if (inherits(cond, "message")) { [17:27:36.077] muffled <- grepl(pattern, "muffleMessage") [17:27:36.077] if (muffled) [17:27:36.077] invokeRestart("muffleMessage") [17:27:36.077] } [17:27:36.077] else if (inherits(cond, "warning")) { [17:27:36.077] muffled <- grepl(pattern, "muffleWarning") [17:27:36.077] if (muffled) [17:27:36.077] invokeRestart("muffleWarning") [17:27:36.077] } [17:27:36.077] else if (inherits(cond, "condition")) { [17:27:36.077] if (!is.null(pattern)) { [17:27:36.077] computeRestarts <- base::computeRestarts [17:27:36.077] grepl <- base::grepl [17:27:36.077] restarts <- computeRestarts(cond) [17:27:36.077] for (restart in restarts) { [17:27:36.077] name <- restart$name [17:27:36.077] if (is.null(name)) [17:27:36.077] next [17:27:36.077] if (!grepl(pattern, name)) [17:27:36.077] next [17:27:36.077] invokeRestart(restart) [17:27:36.077] muffled <- TRUE [17:27:36.077] break [17:27:36.077] } [17:27:36.077] } [17:27:36.077] } [17:27:36.077] invisible(muffled) [17:27:36.077] } [17:27:36.077] muffleCondition(cond, pattern = "^muffle") [17:27:36.077] } [17:27:36.077] } [17:27:36.077] } [17:27:36.077] })) [17:27:36.077] }, error = function(ex) { [17:27:36.077] base::structure(base::list(value = NULL, visible = NULL, [17:27:36.077] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.077] ...future.rng), started = ...future.startTime, [17:27:36.077] finished = Sys.time(), session_uuid = NA_character_, [17:27:36.077] version = "1.8"), class = "FutureResult") [17:27:36.077] }, finally = { [17:27:36.077] if (!identical(...future.workdir, getwd())) [17:27:36.077] setwd(...future.workdir) [17:27:36.077] { [17:27:36.077] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:36.077] ...future.oldOptions$nwarnings <- NULL [17:27:36.077] } [17:27:36.077] base::options(...future.oldOptions) [17:27:36.077] if (.Platform$OS.type == "windows") { [17:27:36.077] old_names <- names(...future.oldEnvVars) [17:27:36.077] envs <- base::Sys.getenv() [17:27:36.077] names <- names(envs) [17:27:36.077] common <- intersect(names, old_names) [17:27:36.077] added <- setdiff(names, old_names) [17:27:36.077] removed <- setdiff(old_names, names) [17:27:36.077] changed <- common[...future.oldEnvVars[common] != [17:27:36.077] envs[common]] [17:27:36.077] NAMES <- toupper(changed) [17:27:36.077] args <- list() [17:27:36.077] for (kk in seq_along(NAMES)) { [17:27:36.077] name <- changed[[kk]] [17:27:36.077] NAME <- NAMES[[kk]] [17:27:36.077] if (name != NAME && is.element(NAME, old_names)) [17:27:36.077] next [17:27:36.077] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.077] } [17:27:36.077] NAMES <- toupper(added) [17:27:36.077] for (kk in seq_along(NAMES)) { [17:27:36.077] name <- added[[kk]] [17:27:36.077] NAME <- NAMES[[kk]] [17:27:36.077] if (name != NAME && is.element(NAME, old_names)) [17:27:36.077] next [17:27:36.077] args[[name]] <- "" [17:27:36.077] } [17:27:36.077] NAMES <- toupper(removed) [17:27:36.077] for (kk in seq_along(NAMES)) { [17:27:36.077] name <- removed[[kk]] [17:27:36.077] NAME <- NAMES[[kk]] [17:27:36.077] if (name != NAME && is.element(NAME, old_names)) [17:27:36.077] next [17:27:36.077] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.077] } [17:27:36.077] if (length(args) > 0) [17:27:36.077] base::do.call(base::Sys.setenv, args = args) [17:27:36.077] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:36.077] } [17:27:36.077] else { [17:27:36.077] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:36.077] } [17:27:36.077] { [17:27:36.077] if (base::length(...future.futureOptionsAdded) > [17:27:36.077] 0L) { [17:27:36.077] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:36.077] base::names(opts) <- ...future.futureOptionsAdded [17:27:36.077] base::options(opts) [17:27:36.077] } [17:27:36.077] { [17:27:36.077] { [17:27:36.077] NULL [17:27:36.077] RNGkind("Mersenne-Twister") [17:27:36.077] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:36.077] inherits = FALSE) [17:27:36.077] } [17:27:36.077] options(future.plan = NULL) [17:27:36.077] if (is.na(NA_character_)) [17:27:36.077] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.077] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:36.077] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:36.077] .init = FALSE) [17:27:36.077] } [17:27:36.077] } [17:27:36.077] } [17:27:36.077] }) [17:27:36.077] if (TRUE) { [17:27:36.077] base::sink(type = "output", split = FALSE) [17:27:36.077] if (TRUE) { [17:27:36.077] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:36.077] } [17:27:36.077] else { [17:27:36.077] ...future.result["stdout"] <- base::list(NULL) [17:27:36.077] } [17:27:36.077] base::close(...future.stdout) [17:27:36.077] ...future.stdout <- NULL [17:27:36.077] } [17:27:36.077] ...future.result$conditions <- ...future.conditions [17:27:36.077] ...future.result$finished <- base::Sys.time() [17:27:36.077] ...future.result [17:27:36.077] } [17:27:36.081] plan(): Setting new future strategy stack: [17:27:36.081] List of future strategies: [17:27:36.081] 1. sequential: [17:27:36.081] - args: function (..., envir = parent.frame(), workers = "") [17:27:36.081] - tweaked: FALSE [17:27:36.081] - call: NULL [17:27:36.082] plan(): nbrOfWorkers() = 1 [17:27:36.083] plan(): Setting new future strategy stack: [17:27:36.083] List of future strategies: [17:27:36.083] 1. sequential: [17:27:36.083] - args: function (..., envir = parent.frame(), workers = "") [17:27:36.083] - tweaked: FALSE [17:27:36.083] - call: plan(strategy) [17:27:36.084] plan(): nbrOfWorkers() = 1 [17:27:36.084] SequentialFuture started (and completed) [17:27:36.084] - Launch lazy future ... done [17:27:36.084] run() for 'SequentialFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:4] 2 1 3 1 - attr(*, "dimnames.")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:36.092] resolved() for 'SequentialFuture' ... [17:27:36.092] - state: 'finished' [17:27:36.092] - run: TRUE [17:27:36.092] - result: 'FutureResult' [17:27:36.093] resolved() for 'SequentialFuture' ... done [17:27:36.093] resolved() for 'SequentialFuture' ... [17:27:36.093] - state: 'finished' [17:27:36.093] - run: TRUE [17:27:36.093] - result: 'FutureResult' [17:27:36.094] resolved() for 'SequentialFuture' ... done [17:27:36.094] resolved() for 'SequentialFuture' ... [17:27:36.094] - state: 'finished' [17:27:36.094] - run: TRUE [17:27:36.094] - result: 'FutureResult' [17:27:36.094] resolved() for 'SequentialFuture' ... done logi [1:2, 1, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:36.098] resolve() on list environment ... [17:27:36.099] recursive: 0 [17:27:36.100] length: 6 [17:27:36.101] elements: 'a', 'b', 'c', 'd', '', '' [17:27:36.101] signalConditionsASAP(numeric, pos=1) ... [17:27:36.101] - nx: 6 [17:27:36.101] - relay: TRUE [17:27:36.102] - stdout: TRUE [17:27:36.102] - signal: TRUE [17:27:36.102] - resignal: FALSE [17:27:36.102] - force: TRUE [17:27:36.102] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:36.102] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:36.103] - until=2 [17:27:36.103] - relaying element #2 [17:27:36.103] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:36.103] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:36.103] signalConditionsASAP(NULL, pos=1) ... done [17:27:36.103] length: 5 (resolved future 1) [17:27:36.103] resolved() for 'SequentialFuture' ... [17:27:36.104] - state: 'finished' [17:27:36.104] - run: TRUE [17:27:36.104] - result: 'FutureResult' [17:27:36.104] resolved() for 'SequentialFuture' ... done [17:27:36.104] Future #2 [17:27:36.105] signalConditionsASAP(SequentialFuture, pos=2) ... [17:27:36.105] - nx: 6 [17:27:36.105] - relay: TRUE [17:27:36.105] - stdout: TRUE [17:27:36.105] - signal: TRUE [17:27:36.105] - resignal: FALSE [17:27:36.105] - force: TRUE [17:27:36.106] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:36.106] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:36.106] - until=2 [17:27:36.106] - relaying element #2 [17:27:36.106] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:36.107] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:36.107] signalConditionsASAP(SequentialFuture, pos=2) ... done [17:27:36.107] length: 4 (resolved future 2) [17:27:36.108] resolved() for 'SequentialFuture' ... [17:27:36.108] - state: 'finished' [17:27:36.108] - run: TRUE [17:27:36.109] - result: 'FutureResult' [17:27:36.109] resolved() for 'SequentialFuture' ... done [17:27:36.109] Future #3 [17:27:36.110] signalConditionsASAP(SequentialFuture, pos=3) ... [17:27:36.110] - nx: 6 [17:27:36.110] - relay: TRUE [17:27:36.111] - stdout: TRUE [17:27:36.111] - signal: TRUE [17:27:36.111] - resignal: FALSE [17:27:36.111] - force: TRUE [17:27:36.112] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:36.112] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:36.112] - until=3 [17:27:36.112] - relaying element #3 [17:27:36.113] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:36.113] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:36.113] signalConditionsASAP(SequentialFuture, pos=3) ... done [17:27:36.114] length: 3 (resolved future 3) [17:27:36.114] resolved() for 'SequentialFuture' ... [17:27:36.114] - state: 'finished' [17:27:36.115] - run: TRUE [17:27:36.115] - result: 'FutureResult' [17:27:36.115] resolved() for 'SequentialFuture' ... done [17:27:36.116] Future #4 [17:27:36.116] signalConditionsASAP(SequentialFuture, pos=4) ... [17:27:36.116] - nx: 6 [17:27:36.116] - relay: TRUE [17:27:36.117] - stdout: TRUE [17:27:36.117] - signal: TRUE [17:27:36.117] - resignal: FALSE [17:27:36.117] - force: TRUE [17:27:36.118] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:36.118] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:36.118] - until=4 [17:27:36.118] - relaying element #4 [17:27:36.119] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.119] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.119] signalConditionsASAP(SequentialFuture, pos=4) ... done [17:27:36.120] length: 2 (resolved future 4) [17:27:36.120] signalConditionsASAP(NULL, pos=5) ... [17:27:36.120] - nx: 6 [17:27:36.120] - relay: TRUE [17:27:36.121] - stdout: TRUE [17:27:36.121] - signal: TRUE [17:27:36.121] - resignal: FALSE [17:27:36.121] - force: TRUE [17:27:36.122] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.122] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.122] - until=6 [17:27:36.122] - relaying element #6 [17:27:36.126] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:36.126] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.126] signalConditionsASAP(NULL, pos=5) ... done [17:27:36.127] length: 1 (resolved future 5) [17:27:36.127] signalConditionsASAP(numeric, pos=6) ... [17:27:36.127] - nx: 6 [17:27:36.127] - relay: TRUE [17:27:36.128] - stdout: TRUE [17:27:36.128] - signal: TRUE [17:27:36.128] - resignal: FALSE [17:27:36.129] - force: TRUE [17:27:36.129] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:36.129] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.129] - until=6 [17:27:36.130] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:36.130] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.130] signalConditionsASAP(numeric, pos=6) ... done [17:27:36.130] length: 0 (resolved future 6) [17:27:36.131] Relaying remaining futures [17:27:36.131] signalConditionsASAP(NULL, pos=0) ... [17:27:36.131] - nx: 6 [17:27:36.131] - relay: TRUE [17:27:36.132] - stdout: TRUE [17:27:36.132] - signal: TRUE [17:27:36.132] - resignal: FALSE [17:27:36.132] - force: TRUE [17:27:36.133] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:36.133] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:36.133] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:36.134] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:36.134] signalConditionsASAP(NULL, pos=0) ... done [17:27:36.134] resolve() on list environment ... DONE Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:4] 2 1 3 1 - attr(*, "dimnames.")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" *** futures() - listenv ... DONE Testing with 1 cores ... DONE Testing with 2 cores ... Type of object: list Type of future: multisession [17:27:36.140] plan(): Setting new future strategy stack: [17:27:36.140] List of future strategies: [17:27:36.140] 1. multisession: [17:27:36.140] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:36.140] - tweaked: FALSE [17:27:36.140] - call: plan(strategy) [17:27:36.141] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [17:27:36.141] multisession: [17:27:36.141] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:36.141] - tweaked: FALSE [17:27:36.141] - call: plan(strategy) [17:27:36.147] getGlobalsAndPackages() ... [17:27:36.148] Not searching for globals [17:27:36.148] - globals: [0] [17:27:36.148] getGlobalsAndPackages() ... DONE [17:27:36.149] [local output] makeClusterPSOCK() ... [17:27:36.200] [local output] Workers: [n = 2] 'localhost', 'localhost' [17:27:36.208] [local output] Base port: 31943 [17:27:36.208] [local output] Getting setup options for 2 cluster nodes ... [17:27:36.209] [local output] - Node #1 of 2 ... [17:27:36.209] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:36.211] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c4a96b0b.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c4a96b0b.pid\")"' [17:27:36.658] - Possible to infer worker's PID: TRUE [17:27:36.659] [local output] Rscript port: 31943 [17:27:36.660] [local output] - Node #2 of 2 ... [17:27:36.661] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:36.663] [local output] Rscript port: 31943 [17:27:36.664] [local output] Getting setup options for 2 cluster nodes ... done [17:27:36.664] [local output] - Parallel setup requested for some PSOCK nodes [17:27:36.665] [local output] Setting up PSOCK nodes in parallel [17:27:36.665] List of 36 [17:27:36.665] $ worker : chr "localhost" [17:27:36.665] ..- attr(*, "localhost")= logi TRUE [17:27:36.665] $ master : chr "localhost" [17:27:36.665] $ port : int 31943 [17:27:36.665] $ connectTimeout : num 120 [17:27:36.665] $ timeout : num 120 [17:27:36.665] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [17:27:36.665] $ homogeneous : logi TRUE [17:27:36.665] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=futures.R:101676:CRANWIN3:CRAN\""| __truncated__ [17:27:36.665] $ rscript_envs : NULL [17:27:36.665] $ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:36.665] $ rscript_startup : NULL [17:27:36.665] $ rscript_sh : chr [1:2] "cmd" "cmd" [17:27:36.665] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:36.665] $ methods : logi TRUE [17:27:36.665] $ socketOptions : chr "no-delay" [17:27:36.665] $ useXDR : logi FALSE [17:27:36.665] $ outfile : chr "/dev/null" [17:27:36.665] $ renice : int NA [17:27:36.665] $ rshcmd : NULL [17:27:36.665] $ user : chr(0) [17:27:36.665] $ revtunnel : logi FALSE [17:27:36.665] $ rshlogfile : NULL [17:27:36.665] $ rshopts : chr(0) [17:27:36.665] $ rank : int 1 [17:27:36.665] $ manual : logi FALSE [17:27:36.665] $ dryrun : logi FALSE [17:27:36.665] $ quiet : logi FALSE [17:27:36.665] $ setup_strategy : chr "parallel" [17:27:36.665] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:36.665] $ pidfile : chr "D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c4a96b0b.pid" [17:27:36.665] $ rshcmd_label : NULL [17:27:36.665] $ rsh_call : NULL [17:27:36.665] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:36.665] $ localMachine : logi TRUE [17:27:36.665] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [17:27:36.665] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [17:27:36.665] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [17:27:36.665] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [17:27:36.665] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [17:27:36.665] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [17:27:36.665] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [17:27:36.665] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [17:27:36.665] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [17:27:36.665] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [17:27:36.665] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [17:27:36.665] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [17:27:36.665] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [17:27:36.665] "parallel"), action = c("launch", "options"), verbose = FALSE) [17:27:36.665] $ arguments :List of 28 [17:27:36.665] ..$ worker : chr "localhost" [17:27:36.665] ..$ master : NULL [17:27:36.665] ..$ port : int 31943 [17:27:36.665] ..$ connectTimeout : num 120 [17:27:36.665] ..$ timeout : num 120 [17:27:36.665] ..$ rscript : NULL [17:27:36.665] ..$ homogeneous : NULL [17:27:36.665] ..$ rscript_args : NULL [17:27:36.665] ..$ rscript_envs : NULL [17:27:36.665] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:36.665] ..$ rscript_startup : NULL [17:27:36.665] ..$ rscript_sh : chr "auto" [17:27:36.665] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:36.665] ..$ methods : logi TRUE [17:27:36.665] ..$ socketOptions : chr "no-delay" [17:27:36.665] ..$ useXDR : logi FALSE [17:27:36.665] ..$ outfile : chr "/dev/null" [17:27:36.665] ..$ renice : int NA [17:27:36.665] ..$ rshcmd : NULL [17:27:36.665] ..$ user : NULL [17:27:36.665] ..$ revtunnel : logi NA [17:27:36.665] ..$ rshlogfile : NULL [17:27:36.665] ..$ rshopts : NULL [17:27:36.665] ..$ rank : int 1 [17:27:36.665] ..$ manual : logi FALSE [17:27:36.665] ..$ dryrun : logi FALSE [17:27:36.665] ..$ quiet : logi FALSE [17:27:36.665] ..$ setup_strategy : chr "parallel" [17:27:36.665] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [17:27:36.700] [local output] System call to launch all workers: [17:27:36.700] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=futures.R:101676:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c4a96b0b.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=31943 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [17:27:36.701] [local output] Starting PSOCK main server [17:27:36.710] [local output] Workers launched [17:27:36.711] [local output] Waiting for workers to connect back [17:27:36.711] - [local output] 0 workers out of 2 ready [17:27:36.960] - [local output] 0 workers out of 2 ready [17:27:36.961] - [local output] 1 workers out of 2 ready [17:27:36.972] - [local output] 1 workers out of 2 ready [17:27:36.973] - [local output] 2 workers out of 2 ready [17:27:36.973] [local output] Launching of 2 workers completed [17:27:36.973] [local output] Number of nodes in cluster: 2 [17:27:36.974] [local output] Collecting session information from 2 workers [17:27:36.975] [local output] - Worker #1 of 2 [17:27:36.976] [local output] - Worker #2 of 2 [17:27:36.977] [local output] makeClusterPSOCK() ... done [17:27:36.993] Packages needed by the future expression (n = 0): [17:27:36.994] Packages needed by future strategies (n = 0): [17:27:36.995] { [17:27:36.995] { [17:27:36.995] { [17:27:36.995] ...future.startTime <- base::Sys.time() [17:27:36.995] { [17:27:36.995] { [17:27:36.995] { [17:27:36.995] { [17:27:36.995] base::local({ [17:27:36.995] has_future <- base::requireNamespace("future", [17:27:36.995] quietly = TRUE) [17:27:36.995] if (has_future) { [17:27:36.995] ns <- base::getNamespace("future") [17:27:36.995] version <- ns[[".package"]][["version"]] [17:27:36.995] if (is.null(version)) [17:27:36.995] version <- utils::packageVersion("future") [17:27:36.995] } [17:27:36.995] else { [17:27:36.995] version <- NULL [17:27:36.995] } [17:27:36.995] if (!has_future || version < "1.8.0") { [17:27:36.995] info <- base::c(r_version = base::gsub("R version ", [17:27:36.995] "", base::R.version$version.string), [17:27:36.995] platform = base::sprintf("%s (%s-bit)", [17:27:36.995] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:36.995] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:36.995] "release", "version")], collapse = " "), [17:27:36.995] hostname = base::Sys.info()[["nodename"]]) [17:27:36.995] info <- base::sprintf("%s: %s", base::names(info), [17:27:36.995] info) [17:27:36.995] info <- base::paste(info, collapse = "; ") [17:27:36.995] if (!has_future) { [17:27:36.995] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:36.995] info) [17:27:36.995] } [17:27:36.995] else { [17:27:36.995] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:36.995] info, version) [17:27:36.995] } [17:27:36.995] base::stop(msg) [17:27:36.995] } [17:27:36.995] }) [17:27:36.995] } [17:27:36.995] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:36.995] base::options(mc.cores = 1L) [17:27:36.995] } [17:27:36.995] ...future.strategy.old <- future::plan("list") [17:27:36.995] options(future.plan = NULL) [17:27:36.995] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.995] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:36.995] } [17:27:36.995] ...future.workdir <- getwd() [17:27:36.995] } [17:27:36.995] ...future.oldOptions <- base::as.list(base::.Options) [17:27:36.995] ...future.oldEnvVars <- base::Sys.getenv() [17:27:36.995] } [17:27:36.995] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:36.995] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:36.995] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:36.995] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:36.995] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:36.995] future.stdout.windows.reencode = NULL, width = 80L) [17:27:36.995] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:36.995] base::names(...future.oldOptions)) [17:27:36.995] } [17:27:36.995] if (FALSE) { [17:27:36.995] } [17:27:36.995] else { [17:27:36.995] if (TRUE) { [17:27:36.995] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:36.995] open = "w") [17:27:36.995] } [17:27:36.995] else { [17:27:36.995] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:36.995] windows = "NUL", "/dev/null"), open = "w") [17:27:36.995] } [17:27:36.995] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:36.995] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:36.995] base::sink(type = "output", split = FALSE) [17:27:36.995] base::close(...future.stdout) [17:27:36.995] }, add = TRUE) [17:27:36.995] } [17:27:36.995] ...future.frame <- base::sys.nframe() [17:27:36.995] ...future.conditions <- base::list() [17:27:36.995] ...future.rng <- base::globalenv()$.Random.seed [17:27:36.995] if (FALSE) { [17:27:36.995] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:36.995] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:36.995] } [17:27:36.995] ...future.result <- base::tryCatch({ [17:27:36.995] base::withCallingHandlers({ [17:27:36.995] ...future.value <- base::withVisible(base::local({ [17:27:36.995] ...future.makeSendCondition <- base::local({ [17:27:36.995] sendCondition <- NULL [17:27:36.995] function(frame = 1L) { [17:27:36.995] if (is.function(sendCondition)) [17:27:36.995] return(sendCondition) [17:27:36.995] ns <- getNamespace("parallel") [17:27:36.995] if (exists("sendData", mode = "function", [17:27:36.995] envir = ns)) { [17:27:36.995] parallel_sendData <- get("sendData", mode = "function", [17:27:36.995] envir = ns) [17:27:36.995] envir <- sys.frame(frame) [17:27:36.995] master <- NULL [17:27:36.995] while (!identical(envir, .GlobalEnv) && [17:27:36.995] !identical(envir, emptyenv())) { [17:27:36.995] if (exists("master", mode = "list", envir = envir, [17:27:36.995] inherits = FALSE)) { [17:27:36.995] master <- get("master", mode = "list", [17:27:36.995] envir = envir, inherits = FALSE) [17:27:36.995] if (inherits(master, c("SOCKnode", [17:27:36.995] "SOCK0node"))) { [17:27:36.995] sendCondition <<- function(cond) { [17:27:36.995] data <- list(type = "VALUE", value = cond, [17:27:36.995] success = TRUE) [17:27:36.995] parallel_sendData(master, data) [17:27:36.995] } [17:27:36.995] return(sendCondition) [17:27:36.995] } [17:27:36.995] } [17:27:36.995] frame <- frame + 1L [17:27:36.995] envir <- sys.frame(frame) [17:27:36.995] } [17:27:36.995] } [17:27:36.995] sendCondition <<- function(cond) NULL [17:27:36.995] } [17:27:36.995] }) [17:27:36.995] withCallingHandlers({ [17:27:36.995] NA [17:27:36.995] }, immediateCondition = function(cond) { [17:27:36.995] sendCondition <- ...future.makeSendCondition() [17:27:36.995] sendCondition(cond) [17:27:36.995] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.995] { [17:27:36.995] inherits <- base::inherits [17:27:36.995] invokeRestart <- base::invokeRestart [17:27:36.995] is.null <- base::is.null [17:27:36.995] muffled <- FALSE [17:27:36.995] if (inherits(cond, "message")) { [17:27:36.995] muffled <- grepl(pattern, "muffleMessage") [17:27:36.995] if (muffled) [17:27:36.995] invokeRestart("muffleMessage") [17:27:36.995] } [17:27:36.995] else if (inherits(cond, "warning")) { [17:27:36.995] muffled <- grepl(pattern, "muffleWarning") [17:27:36.995] if (muffled) [17:27:36.995] invokeRestart("muffleWarning") [17:27:36.995] } [17:27:36.995] else if (inherits(cond, "condition")) { [17:27:36.995] if (!is.null(pattern)) { [17:27:36.995] computeRestarts <- base::computeRestarts [17:27:36.995] grepl <- base::grepl [17:27:36.995] restarts <- computeRestarts(cond) [17:27:36.995] for (restart in restarts) { [17:27:36.995] name <- restart$name [17:27:36.995] if (is.null(name)) [17:27:36.995] next [17:27:36.995] if (!grepl(pattern, name)) [17:27:36.995] next [17:27:36.995] invokeRestart(restart) [17:27:36.995] muffled <- TRUE [17:27:36.995] break [17:27:36.995] } [17:27:36.995] } [17:27:36.995] } [17:27:36.995] invisible(muffled) [17:27:36.995] } [17:27:36.995] muffleCondition(cond) [17:27:36.995] }) [17:27:36.995] })) [17:27:36.995] future::FutureResult(value = ...future.value$value, [17:27:36.995] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.995] ...future.rng), globalenv = if (FALSE) [17:27:36.995] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:36.995] ...future.globalenv.names)) [17:27:36.995] else NULL, started = ...future.startTime, version = "1.8") [17:27:36.995] }, condition = base::local({ [17:27:36.995] c <- base::c [17:27:36.995] inherits <- base::inherits [17:27:36.995] invokeRestart <- base::invokeRestart [17:27:36.995] length <- base::length [17:27:36.995] list <- base::list [17:27:36.995] seq.int <- base::seq.int [17:27:36.995] signalCondition <- base::signalCondition [17:27:36.995] sys.calls <- base::sys.calls [17:27:36.995] `[[` <- base::`[[` [17:27:36.995] `+` <- base::`+` [17:27:36.995] `<<-` <- base::`<<-` [17:27:36.995] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:36.995] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:36.995] 3L)] [17:27:36.995] } [17:27:36.995] function(cond) { [17:27:36.995] is_error <- inherits(cond, "error") [17:27:36.995] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:36.995] NULL) [17:27:36.995] if (is_error) { [17:27:36.995] sessionInformation <- function() { [17:27:36.995] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:36.995] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:36.995] search = base::search(), system = base::Sys.info()) [17:27:36.995] } [17:27:36.995] ...future.conditions[[length(...future.conditions) + [17:27:36.995] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:36.995] cond$call), session = sessionInformation(), [17:27:36.995] timestamp = base::Sys.time(), signaled = 0L) [17:27:36.995] signalCondition(cond) [17:27:36.995] } [17:27:36.995] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:36.995] "immediateCondition"))) { [17:27:36.995] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:36.995] ...future.conditions[[length(...future.conditions) + [17:27:36.995] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:36.995] if (TRUE && !signal) { [17:27:36.995] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.995] { [17:27:36.995] inherits <- base::inherits [17:27:36.995] invokeRestart <- base::invokeRestart [17:27:36.995] is.null <- base::is.null [17:27:36.995] muffled <- FALSE [17:27:36.995] if (inherits(cond, "message")) { [17:27:36.995] muffled <- grepl(pattern, "muffleMessage") [17:27:36.995] if (muffled) [17:27:36.995] invokeRestart("muffleMessage") [17:27:36.995] } [17:27:36.995] else if (inherits(cond, "warning")) { [17:27:36.995] muffled <- grepl(pattern, "muffleWarning") [17:27:36.995] if (muffled) [17:27:36.995] invokeRestart("muffleWarning") [17:27:36.995] } [17:27:36.995] else if (inherits(cond, "condition")) { [17:27:36.995] if (!is.null(pattern)) { [17:27:36.995] computeRestarts <- base::computeRestarts [17:27:36.995] grepl <- base::grepl [17:27:36.995] restarts <- computeRestarts(cond) [17:27:36.995] for (restart in restarts) { [17:27:36.995] name <- restart$name [17:27:36.995] if (is.null(name)) [17:27:36.995] next [17:27:36.995] if (!grepl(pattern, name)) [17:27:36.995] next [17:27:36.995] invokeRestart(restart) [17:27:36.995] muffled <- TRUE [17:27:36.995] break [17:27:36.995] } [17:27:36.995] } [17:27:36.995] } [17:27:36.995] invisible(muffled) [17:27:36.995] } [17:27:36.995] muffleCondition(cond, pattern = "^muffle") [17:27:36.995] } [17:27:36.995] } [17:27:36.995] else { [17:27:36.995] if (TRUE) { [17:27:36.995] muffleCondition <- function (cond, pattern = "^muffle") [17:27:36.995] { [17:27:36.995] inherits <- base::inherits [17:27:36.995] invokeRestart <- base::invokeRestart [17:27:36.995] is.null <- base::is.null [17:27:36.995] muffled <- FALSE [17:27:36.995] if (inherits(cond, "message")) { [17:27:36.995] muffled <- grepl(pattern, "muffleMessage") [17:27:36.995] if (muffled) [17:27:36.995] invokeRestart("muffleMessage") [17:27:36.995] } [17:27:36.995] else if (inherits(cond, "warning")) { [17:27:36.995] muffled <- grepl(pattern, "muffleWarning") [17:27:36.995] if (muffled) [17:27:36.995] invokeRestart("muffleWarning") [17:27:36.995] } [17:27:36.995] else if (inherits(cond, "condition")) { [17:27:36.995] if (!is.null(pattern)) { [17:27:36.995] computeRestarts <- base::computeRestarts [17:27:36.995] grepl <- base::grepl [17:27:36.995] restarts <- computeRestarts(cond) [17:27:36.995] for (restart in restarts) { [17:27:36.995] name <- restart$name [17:27:36.995] if (is.null(name)) [17:27:36.995] next [17:27:36.995] if (!grepl(pattern, name)) [17:27:36.995] next [17:27:36.995] invokeRestart(restart) [17:27:36.995] muffled <- TRUE [17:27:36.995] break [17:27:36.995] } [17:27:36.995] } [17:27:36.995] } [17:27:36.995] invisible(muffled) [17:27:36.995] } [17:27:36.995] muffleCondition(cond, pattern = "^muffle") [17:27:36.995] } [17:27:36.995] } [17:27:36.995] } [17:27:36.995] })) [17:27:36.995] }, error = function(ex) { [17:27:36.995] base::structure(base::list(value = NULL, visible = NULL, [17:27:36.995] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:36.995] ...future.rng), started = ...future.startTime, [17:27:36.995] finished = Sys.time(), session_uuid = NA_character_, [17:27:36.995] version = "1.8"), class = "FutureResult") [17:27:36.995] }, finally = { [17:27:36.995] if (!identical(...future.workdir, getwd())) [17:27:36.995] setwd(...future.workdir) [17:27:36.995] { [17:27:36.995] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:36.995] ...future.oldOptions$nwarnings <- NULL [17:27:36.995] } [17:27:36.995] base::options(...future.oldOptions) [17:27:36.995] if (.Platform$OS.type == "windows") { [17:27:36.995] old_names <- names(...future.oldEnvVars) [17:27:36.995] envs <- base::Sys.getenv() [17:27:36.995] names <- names(envs) [17:27:36.995] common <- intersect(names, old_names) [17:27:36.995] added <- setdiff(names, old_names) [17:27:36.995] removed <- setdiff(old_names, names) [17:27:36.995] changed <- common[...future.oldEnvVars[common] != [17:27:36.995] envs[common]] [17:27:36.995] NAMES <- toupper(changed) [17:27:36.995] args <- list() [17:27:36.995] for (kk in seq_along(NAMES)) { [17:27:36.995] name <- changed[[kk]] [17:27:36.995] NAME <- NAMES[[kk]] [17:27:36.995] if (name != NAME && is.element(NAME, old_names)) [17:27:36.995] next [17:27:36.995] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.995] } [17:27:36.995] NAMES <- toupper(added) [17:27:36.995] for (kk in seq_along(NAMES)) { [17:27:36.995] name <- added[[kk]] [17:27:36.995] NAME <- NAMES[[kk]] [17:27:36.995] if (name != NAME && is.element(NAME, old_names)) [17:27:36.995] next [17:27:36.995] args[[name]] <- "" [17:27:36.995] } [17:27:36.995] NAMES <- toupper(removed) [17:27:36.995] for (kk in seq_along(NAMES)) { [17:27:36.995] name <- removed[[kk]] [17:27:36.995] NAME <- NAMES[[kk]] [17:27:36.995] if (name != NAME && is.element(NAME, old_names)) [17:27:36.995] next [17:27:36.995] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:36.995] } [17:27:36.995] if (length(args) > 0) [17:27:36.995] base::do.call(base::Sys.setenv, args = args) [17:27:36.995] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:36.995] } [17:27:36.995] else { [17:27:36.995] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:36.995] } [17:27:36.995] { [17:27:36.995] if (base::length(...future.futureOptionsAdded) > [17:27:36.995] 0L) { [17:27:36.995] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:36.995] base::names(opts) <- ...future.futureOptionsAdded [17:27:36.995] base::options(opts) [17:27:36.995] } [17:27:36.995] { [17:27:36.995] { [17:27:36.995] base::options(mc.cores = ...future.mc.cores.old) [17:27:36.995] NULL [17:27:36.995] } [17:27:36.995] options(future.plan = NULL) [17:27:36.995] if (is.na(NA_character_)) [17:27:36.995] Sys.unsetenv("R_FUTURE_PLAN") [17:27:36.995] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:36.995] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:36.995] .init = FALSE) [17:27:36.995] } [17:27:36.995] } [17:27:36.995] } [17:27:36.995] }) [17:27:36.995] if (TRUE) { [17:27:36.995] base::sink(type = "output", split = FALSE) [17:27:36.995] if (TRUE) { [17:27:36.995] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:36.995] } [17:27:36.995] else { [17:27:36.995] ...future.result["stdout"] <- base::list(NULL) [17:27:36.995] } [17:27:36.995] base::close(...future.stdout) [17:27:36.995] ...future.stdout <- NULL [17:27:36.995] } [17:27:36.995] ...future.result$conditions <- ...future.conditions [17:27:36.995] ...future.result$finished <- base::Sys.time() [17:27:36.995] ...future.result [17:27:36.995] } [17:27:37.164] MultisessionFuture started [17:27:37.164] result() for ClusterFuture ... [17:27:37.165] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.166] - Validating connection of MultisessionFuture [17:27:37.252] - received message: FutureResult [17:27:37.252] - Received FutureResult [17:27:37.258] - Erased future from FutureRegistry [17:27:37.258] result() for ClusterFuture ... [17:27:37.258] - result already collected: FutureResult [17:27:37.259] result() for ClusterFuture ... done [17:27:37.259] receiveMessageFromWorker() for ClusterFuture ... done [17:27:37.259] result() for ClusterFuture ... done [17:27:37.259] result() for ClusterFuture ... [17:27:37.260] - result already collected: FutureResult [17:27:37.260] result() for ClusterFuture ... done [17:27:37.260] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [17:27:37.265] plan(): nbrOfWorkers() = 2 Dimensions: NULL [17:27:37.265] getGlobalsAndPackages() ... [17:27:37.266] Searching for globals... [17:27:37.266] [17:27:37.267] Searching for globals ... DONE [17:27:37.267] - globals: [0] [17:27:37.267] getGlobalsAndPackages() ... DONE [17:27:37.268] run() for 'Future' ... [17:27:37.268] - state: 'created' [17:27:37.268] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.286] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.286] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.286] - Field: 'node' [17:27:37.286] - Field: 'label' [17:27:37.287] - Field: 'local' [17:27:37.287] - Field: 'owner' [17:27:37.287] - Field: 'envir' [17:27:37.287] - Field: 'workers' [17:27:37.287] - Field: 'packages' [17:27:37.288] - Field: 'gc' [17:27:37.288] - Field: 'conditions' [17:27:37.288] - Field: 'persistent' [17:27:37.288] - Field: 'expr' [17:27:37.288] - Field: 'uuid' [17:27:37.288] - Field: 'seed' [17:27:37.289] - Field: 'version' [17:27:37.289] - Field: 'result' [17:27:37.289] - Field: 'asynchronous' [17:27:37.289] - Field: 'calls' [17:27:37.289] - Field: 'globals' [17:27:37.290] - Field: 'stdout' [17:27:37.290] - Field: 'earlySignal' [17:27:37.290] - Field: 'lazy' [17:27:37.290] - Field: 'state' [17:27:37.290] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.291] - Launch lazy future ... [17:27:37.291] Packages needed by the future expression (n = 0): [17:27:37.291] Packages needed by future strategies (n = 0): [17:27:37.292] { [17:27:37.292] { [17:27:37.292] { [17:27:37.292] ...future.startTime <- base::Sys.time() [17:27:37.292] { [17:27:37.292] { [17:27:37.292] { [17:27:37.292] { [17:27:37.292] base::local({ [17:27:37.292] has_future <- base::requireNamespace("future", [17:27:37.292] quietly = TRUE) [17:27:37.292] if (has_future) { [17:27:37.292] ns <- base::getNamespace("future") [17:27:37.292] version <- ns[[".package"]][["version"]] [17:27:37.292] if (is.null(version)) [17:27:37.292] version <- utils::packageVersion("future") [17:27:37.292] } [17:27:37.292] else { [17:27:37.292] version <- NULL [17:27:37.292] } [17:27:37.292] if (!has_future || version < "1.8.0") { [17:27:37.292] info <- base::c(r_version = base::gsub("R version ", [17:27:37.292] "", base::R.version$version.string), [17:27:37.292] platform = base::sprintf("%s (%s-bit)", [17:27:37.292] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.292] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.292] "release", "version")], collapse = " "), [17:27:37.292] hostname = base::Sys.info()[["nodename"]]) [17:27:37.292] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.292] info) [17:27:37.292] info <- base::paste(info, collapse = "; ") [17:27:37.292] if (!has_future) { [17:27:37.292] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.292] info) [17:27:37.292] } [17:27:37.292] else { [17:27:37.292] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.292] info, version) [17:27:37.292] } [17:27:37.292] base::stop(msg) [17:27:37.292] } [17:27:37.292] }) [17:27:37.292] } [17:27:37.292] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.292] base::options(mc.cores = 1L) [17:27:37.292] } [17:27:37.292] ...future.strategy.old <- future::plan("list") [17:27:37.292] options(future.plan = NULL) [17:27:37.292] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.292] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.292] } [17:27:37.292] ...future.workdir <- getwd() [17:27:37.292] } [17:27:37.292] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.292] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.292] } [17:27:37.292] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.292] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.292] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.292] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.292] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.292] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.292] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.292] base::names(...future.oldOptions)) [17:27:37.292] } [17:27:37.292] if (FALSE) { [17:27:37.292] } [17:27:37.292] else { [17:27:37.292] if (TRUE) { [17:27:37.292] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.292] open = "w") [17:27:37.292] } [17:27:37.292] else { [17:27:37.292] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.292] windows = "NUL", "/dev/null"), open = "w") [17:27:37.292] } [17:27:37.292] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.292] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.292] base::sink(type = "output", split = FALSE) [17:27:37.292] base::close(...future.stdout) [17:27:37.292] }, add = TRUE) [17:27:37.292] } [17:27:37.292] ...future.frame <- base::sys.nframe() [17:27:37.292] ...future.conditions <- base::list() [17:27:37.292] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.292] if (FALSE) { [17:27:37.292] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.292] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.292] } [17:27:37.292] ...future.result <- base::tryCatch({ [17:27:37.292] base::withCallingHandlers({ [17:27:37.292] ...future.value <- base::withVisible(base::local({ [17:27:37.292] ...future.makeSendCondition <- base::local({ [17:27:37.292] sendCondition <- NULL [17:27:37.292] function(frame = 1L) { [17:27:37.292] if (is.function(sendCondition)) [17:27:37.292] return(sendCondition) [17:27:37.292] ns <- getNamespace("parallel") [17:27:37.292] if (exists("sendData", mode = "function", [17:27:37.292] envir = ns)) { [17:27:37.292] parallel_sendData <- get("sendData", mode = "function", [17:27:37.292] envir = ns) [17:27:37.292] envir <- sys.frame(frame) [17:27:37.292] master <- NULL [17:27:37.292] while (!identical(envir, .GlobalEnv) && [17:27:37.292] !identical(envir, emptyenv())) { [17:27:37.292] if (exists("master", mode = "list", envir = envir, [17:27:37.292] inherits = FALSE)) { [17:27:37.292] master <- get("master", mode = "list", [17:27:37.292] envir = envir, inherits = FALSE) [17:27:37.292] if (inherits(master, c("SOCKnode", [17:27:37.292] "SOCK0node"))) { [17:27:37.292] sendCondition <<- function(cond) { [17:27:37.292] data <- list(type = "VALUE", value = cond, [17:27:37.292] success = TRUE) [17:27:37.292] parallel_sendData(master, data) [17:27:37.292] } [17:27:37.292] return(sendCondition) [17:27:37.292] } [17:27:37.292] } [17:27:37.292] frame <- frame + 1L [17:27:37.292] envir <- sys.frame(frame) [17:27:37.292] } [17:27:37.292] } [17:27:37.292] sendCondition <<- function(cond) NULL [17:27:37.292] } [17:27:37.292] }) [17:27:37.292] withCallingHandlers({ [17:27:37.292] 2 [17:27:37.292] }, immediateCondition = function(cond) { [17:27:37.292] sendCondition <- ...future.makeSendCondition() [17:27:37.292] sendCondition(cond) [17:27:37.292] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.292] { [17:27:37.292] inherits <- base::inherits [17:27:37.292] invokeRestart <- base::invokeRestart [17:27:37.292] is.null <- base::is.null [17:27:37.292] muffled <- FALSE [17:27:37.292] if (inherits(cond, "message")) { [17:27:37.292] muffled <- grepl(pattern, "muffleMessage") [17:27:37.292] if (muffled) [17:27:37.292] invokeRestart("muffleMessage") [17:27:37.292] } [17:27:37.292] else if (inherits(cond, "warning")) { [17:27:37.292] muffled <- grepl(pattern, "muffleWarning") [17:27:37.292] if (muffled) [17:27:37.292] invokeRestart("muffleWarning") [17:27:37.292] } [17:27:37.292] else if (inherits(cond, "condition")) { [17:27:37.292] if (!is.null(pattern)) { [17:27:37.292] computeRestarts <- base::computeRestarts [17:27:37.292] grepl <- base::grepl [17:27:37.292] restarts <- computeRestarts(cond) [17:27:37.292] for (restart in restarts) { [17:27:37.292] name <- restart$name [17:27:37.292] if (is.null(name)) [17:27:37.292] next [17:27:37.292] if (!grepl(pattern, name)) [17:27:37.292] next [17:27:37.292] invokeRestart(restart) [17:27:37.292] muffled <- TRUE [17:27:37.292] break [17:27:37.292] } [17:27:37.292] } [17:27:37.292] } [17:27:37.292] invisible(muffled) [17:27:37.292] } [17:27:37.292] muffleCondition(cond) [17:27:37.292] }) [17:27:37.292] })) [17:27:37.292] future::FutureResult(value = ...future.value$value, [17:27:37.292] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.292] ...future.rng), globalenv = if (FALSE) [17:27:37.292] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.292] ...future.globalenv.names)) [17:27:37.292] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.292] }, condition = base::local({ [17:27:37.292] c <- base::c [17:27:37.292] inherits <- base::inherits [17:27:37.292] invokeRestart <- base::invokeRestart [17:27:37.292] length <- base::length [17:27:37.292] list <- base::list [17:27:37.292] seq.int <- base::seq.int [17:27:37.292] signalCondition <- base::signalCondition [17:27:37.292] sys.calls <- base::sys.calls [17:27:37.292] `[[` <- base::`[[` [17:27:37.292] `+` <- base::`+` [17:27:37.292] `<<-` <- base::`<<-` [17:27:37.292] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.292] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.292] 3L)] [17:27:37.292] } [17:27:37.292] function(cond) { [17:27:37.292] is_error <- inherits(cond, "error") [17:27:37.292] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.292] NULL) [17:27:37.292] if (is_error) { [17:27:37.292] sessionInformation <- function() { [17:27:37.292] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.292] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.292] search = base::search(), system = base::Sys.info()) [17:27:37.292] } [17:27:37.292] ...future.conditions[[length(...future.conditions) + [17:27:37.292] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.292] cond$call), session = sessionInformation(), [17:27:37.292] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.292] signalCondition(cond) [17:27:37.292] } [17:27:37.292] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.292] "immediateCondition"))) { [17:27:37.292] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.292] ...future.conditions[[length(...future.conditions) + [17:27:37.292] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.292] if (TRUE && !signal) { [17:27:37.292] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.292] { [17:27:37.292] inherits <- base::inherits [17:27:37.292] invokeRestart <- base::invokeRestart [17:27:37.292] is.null <- base::is.null [17:27:37.292] muffled <- FALSE [17:27:37.292] if (inherits(cond, "message")) { [17:27:37.292] muffled <- grepl(pattern, "muffleMessage") [17:27:37.292] if (muffled) [17:27:37.292] invokeRestart("muffleMessage") [17:27:37.292] } [17:27:37.292] else if (inherits(cond, "warning")) { [17:27:37.292] muffled <- grepl(pattern, "muffleWarning") [17:27:37.292] if (muffled) [17:27:37.292] invokeRestart("muffleWarning") [17:27:37.292] } [17:27:37.292] else if (inherits(cond, "condition")) { [17:27:37.292] if (!is.null(pattern)) { [17:27:37.292] computeRestarts <- base::computeRestarts [17:27:37.292] grepl <- base::grepl [17:27:37.292] restarts <- computeRestarts(cond) [17:27:37.292] for (restart in restarts) { [17:27:37.292] name <- restart$name [17:27:37.292] if (is.null(name)) [17:27:37.292] next [17:27:37.292] if (!grepl(pattern, name)) [17:27:37.292] next [17:27:37.292] invokeRestart(restart) [17:27:37.292] muffled <- TRUE [17:27:37.292] break [17:27:37.292] } [17:27:37.292] } [17:27:37.292] } [17:27:37.292] invisible(muffled) [17:27:37.292] } [17:27:37.292] muffleCondition(cond, pattern = "^muffle") [17:27:37.292] } [17:27:37.292] } [17:27:37.292] else { [17:27:37.292] if (TRUE) { [17:27:37.292] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.292] { [17:27:37.292] inherits <- base::inherits [17:27:37.292] invokeRestart <- base::invokeRestart [17:27:37.292] is.null <- base::is.null [17:27:37.292] muffled <- FALSE [17:27:37.292] if (inherits(cond, "message")) { [17:27:37.292] muffled <- grepl(pattern, "muffleMessage") [17:27:37.292] if (muffled) [17:27:37.292] invokeRestart("muffleMessage") [17:27:37.292] } [17:27:37.292] else if (inherits(cond, "warning")) { [17:27:37.292] muffled <- grepl(pattern, "muffleWarning") [17:27:37.292] if (muffled) [17:27:37.292] invokeRestart("muffleWarning") [17:27:37.292] } [17:27:37.292] else if (inherits(cond, "condition")) { [17:27:37.292] if (!is.null(pattern)) { [17:27:37.292] computeRestarts <- base::computeRestarts [17:27:37.292] grepl <- base::grepl [17:27:37.292] restarts <- computeRestarts(cond) [17:27:37.292] for (restart in restarts) { [17:27:37.292] name <- restart$name [17:27:37.292] if (is.null(name)) [17:27:37.292] next [17:27:37.292] if (!grepl(pattern, name)) [17:27:37.292] next [17:27:37.292] invokeRestart(restart) [17:27:37.292] muffled <- TRUE [17:27:37.292] break [17:27:37.292] } [17:27:37.292] } [17:27:37.292] } [17:27:37.292] invisible(muffled) [17:27:37.292] } [17:27:37.292] muffleCondition(cond, pattern = "^muffle") [17:27:37.292] } [17:27:37.292] } [17:27:37.292] } [17:27:37.292] })) [17:27:37.292] }, error = function(ex) { [17:27:37.292] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.292] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.292] ...future.rng), started = ...future.startTime, [17:27:37.292] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.292] version = "1.8"), class = "FutureResult") [17:27:37.292] }, finally = { [17:27:37.292] if (!identical(...future.workdir, getwd())) [17:27:37.292] setwd(...future.workdir) [17:27:37.292] { [17:27:37.292] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.292] ...future.oldOptions$nwarnings <- NULL [17:27:37.292] } [17:27:37.292] base::options(...future.oldOptions) [17:27:37.292] if (.Platform$OS.type == "windows") { [17:27:37.292] old_names <- names(...future.oldEnvVars) [17:27:37.292] envs <- base::Sys.getenv() [17:27:37.292] names <- names(envs) [17:27:37.292] common <- intersect(names, old_names) [17:27:37.292] added <- setdiff(names, old_names) [17:27:37.292] removed <- setdiff(old_names, names) [17:27:37.292] changed <- common[...future.oldEnvVars[common] != [17:27:37.292] envs[common]] [17:27:37.292] NAMES <- toupper(changed) [17:27:37.292] args <- list() [17:27:37.292] for (kk in seq_along(NAMES)) { [17:27:37.292] name <- changed[[kk]] [17:27:37.292] NAME <- NAMES[[kk]] [17:27:37.292] if (name != NAME && is.element(NAME, old_names)) [17:27:37.292] next [17:27:37.292] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.292] } [17:27:37.292] NAMES <- toupper(added) [17:27:37.292] for (kk in seq_along(NAMES)) { [17:27:37.292] name <- added[[kk]] [17:27:37.292] NAME <- NAMES[[kk]] [17:27:37.292] if (name != NAME && is.element(NAME, old_names)) [17:27:37.292] next [17:27:37.292] args[[name]] <- "" [17:27:37.292] } [17:27:37.292] NAMES <- toupper(removed) [17:27:37.292] for (kk in seq_along(NAMES)) { [17:27:37.292] name <- removed[[kk]] [17:27:37.292] NAME <- NAMES[[kk]] [17:27:37.292] if (name != NAME && is.element(NAME, old_names)) [17:27:37.292] next [17:27:37.292] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.292] } [17:27:37.292] if (length(args) > 0) [17:27:37.292] base::do.call(base::Sys.setenv, args = args) [17:27:37.292] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.292] } [17:27:37.292] else { [17:27:37.292] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.292] } [17:27:37.292] { [17:27:37.292] if (base::length(...future.futureOptionsAdded) > [17:27:37.292] 0L) { [17:27:37.292] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.292] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.292] base::options(opts) [17:27:37.292] } [17:27:37.292] { [17:27:37.292] { [17:27:37.292] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.292] NULL [17:27:37.292] } [17:27:37.292] options(future.plan = NULL) [17:27:37.292] if (is.na(NA_character_)) [17:27:37.292] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.292] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.292] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.292] .init = FALSE) [17:27:37.292] } [17:27:37.292] } [17:27:37.292] } [17:27:37.292] }) [17:27:37.292] if (TRUE) { [17:27:37.292] base::sink(type = "output", split = FALSE) [17:27:37.292] if (TRUE) { [17:27:37.292] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.292] } [17:27:37.292] else { [17:27:37.292] ...future.result["stdout"] <- base::list(NULL) [17:27:37.292] } [17:27:37.292] base::close(...future.stdout) [17:27:37.292] ...future.stdout <- NULL [17:27:37.292] } [17:27:37.292] ...future.result$conditions <- ...future.conditions [17:27:37.292] ...future.result$finished <- base::Sys.time() [17:27:37.292] ...future.result [17:27:37.292] } [17:27:37.298] MultisessionFuture started [17:27:37.298] - Launch lazy future ... done [17:27:37.299] run() for 'MultisessionFuture' ... done [17:27:37.299] getGlobalsAndPackages() ... [17:27:37.299] Searching for globals... [17:27:37.300] [17:27:37.300] Searching for globals ... DONE [17:27:37.301] - globals: [0] [17:27:37.301] getGlobalsAndPackages() ... DONE [17:27:37.301] run() for 'Future' ... [17:27:37.302] - state: 'created' [17:27:37.302] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.321] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.322] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.322] - Field: 'node' [17:27:37.322] - Field: 'label' [17:27:37.323] - Field: 'local' [17:27:37.323] - Field: 'owner' [17:27:37.323] - Field: 'envir' [17:27:37.324] - Field: 'workers' [17:27:37.324] - Field: 'packages' [17:27:37.324] - Field: 'gc' [17:27:37.325] - Field: 'conditions' [17:27:37.325] - Field: 'persistent' [17:27:37.325] - Field: 'expr' [17:27:37.325] - Field: 'uuid' [17:27:37.326] - Field: 'seed' [17:27:37.326] - Field: 'version' [17:27:37.326] - Field: 'result' [17:27:37.326] - Field: 'asynchronous' [17:27:37.326] - Field: 'calls' [17:27:37.327] - Field: 'globals' [17:27:37.327] - Field: 'stdout' [17:27:37.327] - Field: 'earlySignal' [17:27:37.327] - Field: 'lazy' [17:27:37.327] - Field: 'state' [17:27:37.328] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.328] - Launch lazy future ... [17:27:37.328] Packages needed by the future expression (n = 0): [17:27:37.328] Packages needed by future strategies (n = 0): [17:27:37.329] { [17:27:37.329] { [17:27:37.329] { [17:27:37.329] ...future.startTime <- base::Sys.time() [17:27:37.329] { [17:27:37.329] { [17:27:37.329] { [17:27:37.329] { [17:27:37.329] base::local({ [17:27:37.329] has_future <- base::requireNamespace("future", [17:27:37.329] quietly = TRUE) [17:27:37.329] if (has_future) { [17:27:37.329] ns <- base::getNamespace("future") [17:27:37.329] version <- ns[[".package"]][["version"]] [17:27:37.329] if (is.null(version)) [17:27:37.329] version <- utils::packageVersion("future") [17:27:37.329] } [17:27:37.329] else { [17:27:37.329] version <- NULL [17:27:37.329] } [17:27:37.329] if (!has_future || version < "1.8.0") { [17:27:37.329] info <- base::c(r_version = base::gsub("R version ", [17:27:37.329] "", base::R.version$version.string), [17:27:37.329] platform = base::sprintf("%s (%s-bit)", [17:27:37.329] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.329] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.329] "release", "version")], collapse = " "), [17:27:37.329] hostname = base::Sys.info()[["nodename"]]) [17:27:37.329] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.329] info) [17:27:37.329] info <- base::paste(info, collapse = "; ") [17:27:37.329] if (!has_future) { [17:27:37.329] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.329] info) [17:27:37.329] } [17:27:37.329] else { [17:27:37.329] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.329] info, version) [17:27:37.329] } [17:27:37.329] base::stop(msg) [17:27:37.329] } [17:27:37.329] }) [17:27:37.329] } [17:27:37.329] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.329] base::options(mc.cores = 1L) [17:27:37.329] } [17:27:37.329] ...future.strategy.old <- future::plan("list") [17:27:37.329] options(future.plan = NULL) [17:27:37.329] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.329] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.329] } [17:27:37.329] ...future.workdir <- getwd() [17:27:37.329] } [17:27:37.329] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.329] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.329] } [17:27:37.329] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.329] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.329] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.329] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.329] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.329] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.329] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.329] base::names(...future.oldOptions)) [17:27:37.329] } [17:27:37.329] if (FALSE) { [17:27:37.329] } [17:27:37.329] else { [17:27:37.329] if (TRUE) { [17:27:37.329] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.329] open = "w") [17:27:37.329] } [17:27:37.329] else { [17:27:37.329] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.329] windows = "NUL", "/dev/null"), open = "w") [17:27:37.329] } [17:27:37.329] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.329] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.329] base::sink(type = "output", split = FALSE) [17:27:37.329] base::close(...future.stdout) [17:27:37.329] }, add = TRUE) [17:27:37.329] } [17:27:37.329] ...future.frame <- base::sys.nframe() [17:27:37.329] ...future.conditions <- base::list() [17:27:37.329] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.329] if (FALSE) { [17:27:37.329] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.329] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.329] } [17:27:37.329] ...future.result <- base::tryCatch({ [17:27:37.329] base::withCallingHandlers({ [17:27:37.329] ...future.value <- base::withVisible(base::local({ [17:27:37.329] ...future.makeSendCondition <- base::local({ [17:27:37.329] sendCondition <- NULL [17:27:37.329] function(frame = 1L) { [17:27:37.329] if (is.function(sendCondition)) [17:27:37.329] return(sendCondition) [17:27:37.329] ns <- getNamespace("parallel") [17:27:37.329] if (exists("sendData", mode = "function", [17:27:37.329] envir = ns)) { [17:27:37.329] parallel_sendData <- get("sendData", mode = "function", [17:27:37.329] envir = ns) [17:27:37.329] envir <- sys.frame(frame) [17:27:37.329] master <- NULL [17:27:37.329] while (!identical(envir, .GlobalEnv) && [17:27:37.329] !identical(envir, emptyenv())) { [17:27:37.329] if (exists("master", mode = "list", envir = envir, [17:27:37.329] inherits = FALSE)) { [17:27:37.329] master <- get("master", mode = "list", [17:27:37.329] envir = envir, inherits = FALSE) [17:27:37.329] if (inherits(master, c("SOCKnode", [17:27:37.329] "SOCK0node"))) { [17:27:37.329] sendCondition <<- function(cond) { [17:27:37.329] data <- list(type = "VALUE", value = cond, [17:27:37.329] success = TRUE) [17:27:37.329] parallel_sendData(master, data) [17:27:37.329] } [17:27:37.329] return(sendCondition) [17:27:37.329] } [17:27:37.329] } [17:27:37.329] frame <- frame + 1L [17:27:37.329] envir <- sys.frame(frame) [17:27:37.329] } [17:27:37.329] } [17:27:37.329] sendCondition <<- function(cond) NULL [17:27:37.329] } [17:27:37.329] }) [17:27:37.329] withCallingHandlers({ [17:27:37.329] NULL [17:27:37.329] }, immediateCondition = function(cond) { [17:27:37.329] sendCondition <- ...future.makeSendCondition() [17:27:37.329] sendCondition(cond) [17:27:37.329] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.329] { [17:27:37.329] inherits <- base::inherits [17:27:37.329] invokeRestart <- base::invokeRestart [17:27:37.329] is.null <- base::is.null [17:27:37.329] muffled <- FALSE [17:27:37.329] if (inherits(cond, "message")) { [17:27:37.329] muffled <- grepl(pattern, "muffleMessage") [17:27:37.329] if (muffled) [17:27:37.329] invokeRestart("muffleMessage") [17:27:37.329] } [17:27:37.329] else if (inherits(cond, "warning")) { [17:27:37.329] muffled <- grepl(pattern, "muffleWarning") [17:27:37.329] if (muffled) [17:27:37.329] invokeRestart("muffleWarning") [17:27:37.329] } [17:27:37.329] else if (inherits(cond, "condition")) { [17:27:37.329] if (!is.null(pattern)) { [17:27:37.329] computeRestarts <- base::computeRestarts [17:27:37.329] grepl <- base::grepl [17:27:37.329] restarts <- computeRestarts(cond) [17:27:37.329] for (restart in restarts) { [17:27:37.329] name <- restart$name [17:27:37.329] if (is.null(name)) [17:27:37.329] next [17:27:37.329] if (!grepl(pattern, name)) [17:27:37.329] next [17:27:37.329] invokeRestart(restart) [17:27:37.329] muffled <- TRUE [17:27:37.329] break [17:27:37.329] } [17:27:37.329] } [17:27:37.329] } [17:27:37.329] invisible(muffled) [17:27:37.329] } [17:27:37.329] muffleCondition(cond) [17:27:37.329] }) [17:27:37.329] })) [17:27:37.329] future::FutureResult(value = ...future.value$value, [17:27:37.329] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.329] ...future.rng), globalenv = if (FALSE) [17:27:37.329] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.329] ...future.globalenv.names)) [17:27:37.329] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.329] }, condition = base::local({ [17:27:37.329] c <- base::c [17:27:37.329] inherits <- base::inherits [17:27:37.329] invokeRestart <- base::invokeRestart [17:27:37.329] length <- base::length [17:27:37.329] list <- base::list [17:27:37.329] seq.int <- base::seq.int [17:27:37.329] signalCondition <- base::signalCondition [17:27:37.329] sys.calls <- base::sys.calls [17:27:37.329] `[[` <- base::`[[` [17:27:37.329] `+` <- base::`+` [17:27:37.329] `<<-` <- base::`<<-` [17:27:37.329] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.329] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.329] 3L)] [17:27:37.329] } [17:27:37.329] function(cond) { [17:27:37.329] is_error <- inherits(cond, "error") [17:27:37.329] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.329] NULL) [17:27:37.329] if (is_error) { [17:27:37.329] sessionInformation <- function() { [17:27:37.329] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.329] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.329] search = base::search(), system = base::Sys.info()) [17:27:37.329] } [17:27:37.329] ...future.conditions[[length(...future.conditions) + [17:27:37.329] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.329] cond$call), session = sessionInformation(), [17:27:37.329] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.329] signalCondition(cond) [17:27:37.329] } [17:27:37.329] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.329] "immediateCondition"))) { [17:27:37.329] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.329] ...future.conditions[[length(...future.conditions) + [17:27:37.329] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.329] if (TRUE && !signal) { [17:27:37.329] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.329] { [17:27:37.329] inherits <- base::inherits [17:27:37.329] invokeRestart <- base::invokeRestart [17:27:37.329] is.null <- base::is.null [17:27:37.329] muffled <- FALSE [17:27:37.329] if (inherits(cond, "message")) { [17:27:37.329] muffled <- grepl(pattern, "muffleMessage") [17:27:37.329] if (muffled) [17:27:37.329] invokeRestart("muffleMessage") [17:27:37.329] } [17:27:37.329] else if (inherits(cond, "warning")) { [17:27:37.329] muffled <- grepl(pattern, "muffleWarning") [17:27:37.329] if (muffled) [17:27:37.329] invokeRestart("muffleWarning") [17:27:37.329] } [17:27:37.329] else if (inherits(cond, "condition")) { [17:27:37.329] if (!is.null(pattern)) { [17:27:37.329] computeRestarts <- base::computeRestarts [17:27:37.329] grepl <- base::grepl [17:27:37.329] restarts <- computeRestarts(cond) [17:27:37.329] for (restart in restarts) { [17:27:37.329] name <- restart$name [17:27:37.329] if (is.null(name)) [17:27:37.329] next [17:27:37.329] if (!grepl(pattern, name)) [17:27:37.329] next [17:27:37.329] invokeRestart(restart) [17:27:37.329] muffled <- TRUE [17:27:37.329] break [17:27:37.329] } [17:27:37.329] } [17:27:37.329] } [17:27:37.329] invisible(muffled) [17:27:37.329] } [17:27:37.329] muffleCondition(cond, pattern = "^muffle") [17:27:37.329] } [17:27:37.329] } [17:27:37.329] else { [17:27:37.329] if (TRUE) { [17:27:37.329] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.329] { [17:27:37.329] inherits <- base::inherits [17:27:37.329] invokeRestart <- base::invokeRestart [17:27:37.329] is.null <- base::is.null [17:27:37.329] muffled <- FALSE [17:27:37.329] if (inherits(cond, "message")) { [17:27:37.329] muffled <- grepl(pattern, "muffleMessage") [17:27:37.329] if (muffled) [17:27:37.329] invokeRestart("muffleMessage") [17:27:37.329] } [17:27:37.329] else if (inherits(cond, "warning")) { [17:27:37.329] muffled <- grepl(pattern, "muffleWarning") [17:27:37.329] if (muffled) [17:27:37.329] invokeRestart("muffleWarning") [17:27:37.329] } [17:27:37.329] else if (inherits(cond, "condition")) { [17:27:37.329] if (!is.null(pattern)) { [17:27:37.329] computeRestarts <- base::computeRestarts [17:27:37.329] grepl <- base::grepl [17:27:37.329] restarts <- computeRestarts(cond) [17:27:37.329] for (restart in restarts) { [17:27:37.329] name <- restart$name [17:27:37.329] if (is.null(name)) [17:27:37.329] next [17:27:37.329] if (!grepl(pattern, name)) [17:27:37.329] next [17:27:37.329] invokeRestart(restart) [17:27:37.329] muffled <- TRUE [17:27:37.329] break [17:27:37.329] } [17:27:37.329] } [17:27:37.329] } [17:27:37.329] invisible(muffled) [17:27:37.329] } [17:27:37.329] muffleCondition(cond, pattern = "^muffle") [17:27:37.329] } [17:27:37.329] } [17:27:37.329] } [17:27:37.329] })) [17:27:37.329] }, error = function(ex) { [17:27:37.329] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.329] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.329] ...future.rng), started = ...future.startTime, [17:27:37.329] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.329] version = "1.8"), class = "FutureResult") [17:27:37.329] }, finally = { [17:27:37.329] if (!identical(...future.workdir, getwd())) [17:27:37.329] setwd(...future.workdir) [17:27:37.329] { [17:27:37.329] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.329] ...future.oldOptions$nwarnings <- NULL [17:27:37.329] } [17:27:37.329] base::options(...future.oldOptions) [17:27:37.329] if (.Platform$OS.type == "windows") { [17:27:37.329] old_names <- names(...future.oldEnvVars) [17:27:37.329] envs <- base::Sys.getenv() [17:27:37.329] names <- names(envs) [17:27:37.329] common <- intersect(names, old_names) [17:27:37.329] added <- setdiff(names, old_names) [17:27:37.329] removed <- setdiff(old_names, names) [17:27:37.329] changed <- common[...future.oldEnvVars[common] != [17:27:37.329] envs[common]] [17:27:37.329] NAMES <- toupper(changed) [17:27:37.329] args <- list() [17:27:37.329] for (kk in seq_along(NAMES)) { [17:27:37.329] name <- changed[[kk]] [17:27:37.329] NAME <- NAMES[[kk]] [17:27:37.329] if (name != NAME && is.element(NAME, old_names)) [17:27:37.329] next [17:27:37.329] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.329] } [17:27:37.329] NAMES <- toupper(added) [17:27:37.329] for (kk in seq_along(NAMES)) { [17:27:37.329] name <- added[[kk]] [17:27:37.329] NAME <- NAMES[[kk]] [17:27:37.329] if (name != NAME && is.element(NAME, old_names)) [17:27:37.329] next [17:27:37.329] args[[name]] <- "" [17:27:37.329] } [17:27:37.329] NAMES <- toupper(removed) [17:27:37.329] for (kk in seq_along(NAMES)) { [17:27:37.329] name <- removed[[kk]] [17:27:37.329] NAME <- NAMES[[kk]] [17:27:37.329] if (name != NAME && is.element(NAME, old_names)) [17:27:37.329] next [17:27:37.329] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.329] } [17:27:37.329] if (length(args) > 0) [17:27:37.329] base::do.call(base::Sys.setenv, args = args) [17:27:37.329] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.329] } [17:27:37.329] else { [17:27:37.329] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.329] } [17:27:37.329] { [17:27:37.329] if (base::length(...future.futureOptionsAdded) > [17:27:37.329] 0L) { [17:27:37.329] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.329] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.329] base::options(opts) [17:27:37.329] } [17:27:37.329] { [17:27:37.329] { [17:27:37.329] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.329] NULL [17:27:37.329] } [17:27:37.329] options(future.plan = NULL) [17:27:37.329] if (is.na(NA_character_)) [17:27:37.329] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.329] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.329] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.329] .init = FALSE) [17:27:37.329] } [17:27:37.329] } [17:27:37.329] } [17:27:37.329] }) [17:27:37.329] if (TRUE) { [17:27:37.329] base::sink(type = "output", split = FALSE) [17:27:37.329] if (TRUE) { [17:27:37.329] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.329] } [17:27:37.329] else { [17:27:37.329] ...future.result["stdout"] <- base::list(NULL) [17:27:37.329] } [17:27:37.329] base::close(...future.stdout) [17:27:37.329] ...future.stdout <- NULL [17:27:37.329] } [17:27:37.329] ...future.result$conditions <- ...future.conditions [17:27:37.329] ...future.result$finished <- base::Sys.time() [17:27:37.329] ...future.result [17:27:37.329] } [17:27:37.455] MultisessionFuture started [17:27:37.456] - Launch lazy future ... done [17:27:37.456] run() for 'MultisessionFuture' ... done List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 [17:27:37.464] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.464] - Validating connection of MultisessionFuture [17:27:37.464] - received message: FutureResult [17:27:37.464] - Received FutureResult [17:27:37.465] - Erased future from FutureRegistry [17:27:37.465] result() for ClusterFuture ... [17:27:37.465] - result already collected: FutureResult [17:27:37.465] result() for ClusterFuture ... done [17:27:37.465] receiveMessageFromWorker() for ClusterFuture ... done [17:27:37.532] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.533] - Validating connection of MultisessionFuture [17:27:37.533] - received message: FutureResult [17:27:37.534] - Received FutureResult [17:27:37.534] - Erased future from FutureRegistry [17:27:37.534] result() for ClusterFuture ... [17:27:37.535] - result already collected: FutureResult [17:27:37.535] result() for ClusterFuture ... done [17:27:37.535] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:37.537] resolve() on list ... [17:27:37.537] recursive: 0 [17:27:37.538] length: 6 [17:27:37.538] elements: 'a', 'b', 'c', '', '', '' [17:27:37.538] signalConditionsASAP(numeric, pos=1) ... [17:27:37.538] - nx: 6 [17:27:37.539] - relay: TRUE [17:27:37.539] - stdout: TRUE [17:27:37.539] - signal: TRUE [17:27:37.539] - resignal: FALSE [17:27:37.540] - force: TRUE [17:27:37.540] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.540] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.541] - until=2 [17:27:37.541] - relaying element #2 [17:27:37.541] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.541] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.542] signalConditionsASAP(NULL, pos=1) ... done [17:27:37.542] length: 5 (resolved future 1) [17:27:37.542] Future #2 [17:27:37.543] result() for ClusterFuture ... [17:27:37.543] - result already collected: FutureResult [17:27:37.543] result() for ClusterFuture ... done [17:27:37.543] result() for ClusterFuture ... [17:27:37.544] - result already collected: FutureResult [17:27:37.544] result() for ClusterFuture ... done [17:27:37.544] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:37.544] - nx: 6 [17:27:37.545] - relay: TRUE [17:27:37.545] - stdout: TRUE [17:27:37.545] - signal: TRUE [17:27:37.545] - resignal: FALSE [17:27:37.546] - force: TRUE [17:27:37.546] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.546] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.546] - until=2 [17:27:37.547] - relaying element #2 [17:27:37.547] result() for ClusterFuture ... [17:27:37.547] - result already collected: FutureResult [17:27:37.547] result() for ClusterFuture ... done [17:27:37.548] result() for ClusterFuture ... [17:27:37.548] - result already collected: FutureResult [17:27:37.548] result() for ClusterFuture ... done [17:27:37.549] result() for ClusterFuture ... [17:27:37.549] - result already collected: FutureResult [17:27:37.549] result() for ClusterFuture ... done [17:27:37.550] result() for ClusterFuture ... [17:27:37.550] - result already collected: FutureResult [17:27:37.550] result() for ClusterFuture ... done [17:27:37.551] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.551] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.551] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:37.552] length: 4 (resolved future 2) [17:27:37.552] Future #3 [17:27:37.552] result() for ClusterFuture ... [17:27:37.553] - result already collected: FutureResult [17:27:37.553] result() for ClusterFuture ... done [17:27:37.553] result() for ClusterFuture ... [17:27:37.554] - result already collected: FutureResult [17:27:37.554] result() for ClusterFuture ... done [17:27:37.554] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:37.555] - nx: 6 [17:27:37.555] - relay: TRUE [17:27:37.555] - stdout: TRUE [17:27:37.555] - signal: TRUE [17:27:37.556] - resignal: FALSE [17:27:37.556] - force: TRUE [17:27:37.556] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.557] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.557] - until=3 [17:27:37.557] - relaying element #3 [17:27:37.558] result() for ClusterFuture ... [17:27:37.558] - result already collected: FutureResult [17:27:37.558] result() for ClusterFuture ... done [17:27:37.558] result() for ClusterFuture ... [17:27:37.559] - result already collected: FutureResult [17:27:37.559] result() for ClusterFuture ... done [17:27:37.559] result() for ClusterFuture ... [17:27:37.559] - result already collected: FutureResult [17:27:37.560] result() for ClusterFuture ... done [17:27:37.560] result() for ClusterFuture ... [17:27:37.560] - result already collected: FutureResult [17:27:37.560] result() for ClusterFuture ... done [17:27:37.561] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.561] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.561] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:37.562] length: 3 (resolved future 3) [17:27:37.562] signalConditionsASAP(NULL, pos=4) ... [17:27:37.562] - nx: 6 [17:27:37.562] - relay: TRUE [17:27:37.563] - stdout: TRUE [17:27:37.563] - signal: TRUE [17:27:37.563] - resignal: FALSE [17:27:37.563] - force: TRUE [17:27:37.564] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.564] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.564] - until=5 [17:27:37.564] - relaying element #5 [17:27:37.565] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:37.565] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.565] signalConditionsASAP(NULL, pos=4) ... done [17:27:37.566] length: 2 (resolved future 4) [17:27:37.566] signalConditionsASAP(NULL, pos=5) ... [17:27:37.566] - nx: 6 [17:27:37.566] - relay: TRUE [17:27:37.567] - stdout: TRUE [17:27:37.567] - signal: TRUE [17:27:37.567] - resignal: FALSE [17:27:37.567] - force: TRUE [17:27:37.568] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:37.568] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.568] - until=6 [17:27:37.568] - relaying element #6 [17:27:37.569] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:37.569] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.569] signalConditionsASAP(NULL, pos=5) ... done [17:27:37.570] length: 1 (resolved future 5) [17:27:37.570] signalConditionsASAP(numeric, pos=6) ... [17:27:37.570] - nx: 6 [17:27:37.570] - relay: TRUE [17:27:37.571] - stdout: TRUE [17:27:37.571] - signal: TRUE [17:27:37.571] - resignal: FALSE [17:27:37.571] - force: TRUE [17:27:37.572] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:37.572] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.572] - until=6 [17:27:37.572] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.573] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.573] signalConditionsASAP(numeric, pos=6) ... done [17:27:37.573] length: 0 (resolved future 6) [17:27:37.573] Relaying remaining futures [17:27:37.574] signalConditionsASAP(NULL, pos=0) ... [17:27:37.574] - nx: 6 [17:27:37.574] - relay: TRUE [17:27:37.574] - stdout: TRUE [17:27:37.575] - signal: TRUE [17:27:37.575] - resignal: FALSE [17:27:37.575] - force: TRUE [17:27:37.576] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.576] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:37.576] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.577] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.577] signalConditionsASAP(NULL, pos=0) ... done [17:27:37.577] resolve() on list ... DONE [17:27:37.578] result() for ClusterFuture ... [17:27:37.581] - result already collected: FutureResult [17:27:37.581] result() for ClusterFuture ... done [17:27:37.581] result() for ClusterFuture ... [17:27:37.581] - result already collected: FutureResult [17:27:37.581] result() for ClusterFuture ... done [17:27:37.582] result() for ClusterFuture ... [17:27:37.582] - result already collected: FutureResult [17:27:37.582] result() for ClusterFuture ... done [17:27:37.582] result() for ClusterFuture ... [17:27:37.583] - result already collected: FutureResult [17:27:37.583] result() for ClusterFuture ... done List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 Dimensions: c(1, 6) [17:27:37.586] getGlobalsAndPackages() ... [17:27:37.586] Searching for globals... [17:27:37.586] [17:27:37.587] Searching for globals ... DONE [17:27:37.587] - globals: [0] [17:27:37.587] getGlobalsAndPackages() ... DONE [17:27:37.587] run() for 'Future' ... [17:27:37.587] - state: 'created' [17:27:37.588] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.604] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.604] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.604] - Field: 'node' [17:27:37.605] - Field: 'label' [17:27:37.605] - Field: 'local' [17:27:37.605] - Field: 'owner' [17:27:37.605] - Field: 'envir' [17:27:37.605] - Field: 'workers' [17:27:37.606] - Field: 'packages' [17:27:37.606] - Field: 'gc' [17:27:37.606] - Field: 'conditions' [17:27:37.606] - Field: 'persistent' [17:27:37.606] - Field: 'expr' [17:27:37.606] - Field: 'uuid' [17:27:37.607] - Field: 'seed' [17:27:37.607] - Field: 'version' [17:27:37.607] - Field: 'result' [17:27:37.607] - Field: 'asynchronous' [17:27:37.607] - Field: 'calls' [17:27:37.607] - Field: 'globals' [17:27:37.608] - Field: 'stdout' [17:27:37.608] - Field: 'earlySignal' [17:27:37.608] - Field: 'lazy' [17:27:37.608] - Field: 'state' [17:27:37.608] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.608] - Launch lazy future ... [17:27:37.609] Packages needed by the future expression (n = 0): [17:27:37.609] Packages needed by future strategies (n = 0): [17:27:37.610] { [17:27:37.610] { [17:27:37.610] { [17:27:37.610] ...future.startTime <- base::Sys.time() [17:27:37.610] { [17:27:37.610] { [17:27:37.610] { [17:27:37.610] { [17:27:37.610] base::local({ [17:27:37.610] has_future <- base::requireNamespace("future", [17:27:37.610] quietly = TRUE) [17:27:37.610] if (has_future) { [17:27:37.610] ns <- base::getNamespace("future") [17:27:37.610] version <- ns[[".package"]][["version"]] [17:27:37.610] if (is.null(version)) [17:27:37.610] version <- utils::packageVersion("future") [17:27:37.610] } [17:27:37.610] else { [17:27:37.610] version <- NULL [17:27:37.610] } [17:27:37.610] if (!has_future || version < "1.8.0") { [17:27:37.610] info <- base::c(r_version = base::gsub("R version ", [17:27:37.610] "", base::R.version$version.string), [17:27:37.610] platform = base::sprintf("%s (%s-bit)", [17:27:37.610] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.610] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.610] "release", "version")], collapse = " "), [17:27:37.610] hostname = base::Sys.info()[["nodename"]]) [17:27:37.610] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.610] info) [17:27:37.610] info <- base::paste(info, collapse = "; ") [17:27:37.610] if (!has_future) { [17:27:37.610] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.610] info) [17:27:37.610] } [17:27:37.610] else { [17:27:37.610] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.610] info, version) [17:27:37.610] } [17:27:37.610] base::stop(msg) [17:27:37.610] } [17:27:37.610] }) [17:27:37.610] } [17:27:37.610] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.610] base::options(mc.cores = 1L) [17:27:37.610] } [17:27:37.610] ...future.strategy.old <- future::plan("list") [17:27:37.610] options(future.plan = NULL) [17:27:37.610] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.610] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.610] } [17:27:37.610] ...future.workdir <- getwd() [17:27:37.610] } [17:27:37.610] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.610] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.610] } [17:27:37.610] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.610] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.610] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.610] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.610] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.610] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.610] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.610] base::names(...future.oldOptions)) [17:27:37.610] } [17:27:37.610] if (FALSE) { [17:27:37.610] } [17:27:37.610] else { [17:27:37.610] if (TRUE) { [17:27:37.610] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.610] open = "w") [17:27:37.610] } [17:27:37.610] else { [17:27:37.610] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.610] windows = "NUL", "/dev/null"), open = "w") [17:27:37.610] } [17:27:37.610] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.610] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.610] base::sink(type = "output", split = FALSE) [17:27:37.610] base::close(...future.stdout) [17:27:37.610] }, add = TRUE) [17:27:37.610] } [17:27:37.610] ...future.frame <- base::sys.nframe() [17:27:37.610] ...future.conditions <- base::list() [17:27:37.610] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.610] if (FALSE) { [17:27:37.610] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.610] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.610] } [17:27:37.610] ...future.result <- base::tryCatch({ [17:27:37.610] base::withCallingHandlers({ [17:27:37.610] ...future.value <- base::withVisible(base::local({ [17:27:37.610] ...future.makeSendCondition <- base::local({ [17:27:37.610] sendCondition <- NULL [17:27:37.610] function(frame = 1L) { [17:27:37.610] if (is.function(sendCondition)) [17:27:37.610] return(sendCondition) [17:27:37.610] ns <- getNamespace("parallel") [17:27:37.610] if (exists("sendData", mode = "function", [17:27:37.610] envir = ns)) { [17:27:37.610] parallel_sendData <- get("sendData", mode = "function", [17:27:37.610] envir = ns) [17:27:37.610] envir <- sys.frame(frame) [17:27:37.610] master <- NULL [17:27:37.610] while (!identical(envir, .GlobalEnv) && [17:27:37.610] !identical(envir, emptyenv())) { [17:27:37.610] if (exists("master", mode = "list", envir = envir, [17:27:37.610] inherits = FALSE)) { [17:27:37.610] master <- get("master", mode = "list", [17:27:37.610] envir = envir, inherits = FALSE) [17:27:37.610] if (inherits(master, c("SOCKnode", [17:27:37.610] "SOCK0node"))) { [17:27:37.610] sendCondition <<- function(cond) { [17:27:37.610] data <- list(type = "VALUE", value = cond, [17:27:37.610] success = TRUE) [17:27:37.610] parallel_sendData(master, data) [17:27:37.610] } [17:27:37.610] return(sendCondition) [17:27:37.610] } [17:27:37.610] } [17:27:37.610] frame <- frame + 1L [17:27:37.610] envir <- sys.frame(frame) [17:27:37.610] } [17:27:37.610] } [17:27:37.610] sendCondition <<- function(cond) NULL [17:27:37.610] } [17:27:37.610] }) [17:27:37.610] withCallingHandlers({ [17:27:37.610] 2 [17:27:37.610] }, immediateCondition = function(cond) { [17:27:37.610] sendCondition <- ...future.makeSendCondition() [17:27:37.610] sendCondition(cond) [17:27:37.610] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.610] { [17:27:37.610] inherits <- base::inherits [17:27:37.610] invokeRestart <- base::invokeRestart [17:27:37.610] is.null <- base::is.null [17:27:37.610] muffled <- FALSE [17:27:37.610] if (inherits(cond, "message")) { [17:27:37.610] muffled <- grepl(pattern, "muffleMessage") [17:27:37.610] if (muffled) [17:27:37.610] invokeRestart("muffleMessage") [17:27:37.610] } [17:27:37.610] else if (inherits(cond, "warning")) { [17:27:37.610] muffled <- grepl(pattern, "muffleWarning") [17:27:37.610] if (muffled) [17:27:37.610] invokeRestart("muffleWarning") [17:27:37.610] } [17:27:37.610] else if (inherits(cond, "condition")) { [17:27:37.610] if (!is.null(pattern)) { [17:27:37.610] computeRestarts <- base::computeRestarts [17:27:37.610] grepl <- base::grepl [17:27:37.610] restarts <- computeRestarts(cond) [17:27:37.610] for (restart in restarts) { [17:27:37.610] name <- restart$name [17:27:37.610] if (is.null(name)) [17:27:37.610] next [17:27:37.610] if (!grepl(pattern, name)) [17:27:37.610] next [17:27:37.610] invokeRestart(restart) [17:27:37.610] muffled <- TRUE [17:27:37.610] break [17:27:37.610] } [17:27:37.610] } [17:27:37.610] } [17:27:37.610] invisible(muffled) [17:27:37.610] } [17:27:37.610] muffleCondition(cond) [17:27:37.610] }) [17:27:37.610] })) [17:27:37.610] future::FutureResult(value = ...future.value$value, [17:27:37.610] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.610] ...future.rng), globalenv = if (FALSE) [17:27:37.610] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.610] ...future.globalenv.names)) [17:27:37.610] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.610] }, condition = base::local({ [17:27:37.610] c <- base::c [17:27:37.610] inherits <- base::inherits [17:27:37.610] invokeRestart <- base::invokeRestart [17:27:37.610] length <- base::length [17:27:37.610] list <- base::list [17:27:37.610] seq.int <- base::seq.int [17:27:37.610] signalCondition <- base::signalCondition [17:27:37.610] sys.calls <- base::sys.calls [17:27:37.610] `[[` <- base::`[[` [17:27:37.610] `+` <- base::`+` [17:27:37.610] `<<-` <- base::`<<-` [17:27:37.610] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.610] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.610] 3L)] [17:27:37.610] } [17:27:37.610] function(cond) { [17:27:37.610] is_error <- inherits(cond, "error") [17:27:37.610] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.610] NULL) [17:27:37.610] if (is_error) { [17:27:37.610] sessionInformation <- function() { [17:27:37.610] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.610] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.610] search = base::search(), system = base::Sys.info()) [17:27:37.610] } [17:27:37.610] ...future.conditions[[length(...future.conditions) + [17:27:37.610] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.610] cond$call), session = sessionInformation(), [17:27:37.610] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.610] signalCondition(cond) [17:27:37.610] } [17:27:37.610] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.610] "immediateCondition"))) { [17:27:37.610] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.610] ...future.conditions[[length(...future.conditions) + [17:27:37.610] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.610] if (TRUE && !signal) { [17:27:37.610] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.610] { [17:27:37.610] inherits <- base::inherits [17:27:37.610] invokeRestart <- base::invokeRestart [17:27:37.610] is.null <- base::is.null [17:27:37.610] muffled <- FALSE [17:27:37.610] if (inherits(cond, "message")) { [17:27:37.610] muffled <- grepl(pattern, "muffleMessage") [17:27:37.610] if (muffled) [17:27:37.610] invokeRestart("muffleMessage") [17:27:37.610] } [17:27:37.610] else if (inherits(cond, "warning")) { [17:27:37.610] muffled <- grepl(pattern, "muffleWarning") [17:27:37.610] if (muffled) [17:27:37.610] invokeRestart("muffleWarning") [17:27:37.610] } [17:27:37.610] else if (inherits(cond, "condition")) { [17:27:37.610] if (!is.null(pattern)) { [17:27:37.610] computeRestarts <- base::computeRestarts [17:27:37.610] grepl <- base::grepl [17:27:37.610] restarts <- computeRestarts(cond) [17:27:37.610] for (restart in restarts) { [17:27:37.610] name <- restart$name [17:27:37.610] if (is.null(name)) [17:27:37.610] next [17:27:37.610] if (!grepl(pattern, name)) [17:27:37.610] next [17:27:37.610] invokeRestart(restart) [17:27:37.610] muffled <- TRUE [17:27:37.610] break [17:27:37.610] } [17:27:37.610] } [17:27:37.610] } [17:27:37.610] invisible(muffled) [17:27:37.610] } [17:27:37.610] muffleCondition(cond, pattern = "^muffle") [17:27:37.610] } [17:27:37.610] } [17:27:37.610] else { [17:27:37.610] if (TRUE) { [17:27:37.610] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.610] { [17:27:37.610] inherits <- base::inherits [17:27:37.610] invokeRestart <- base::invokeRestart [17:27:37.610] is.null <- base::is.null [17:27:37.610] muffled <- FALSE [17:27:37.610] if (inherits(cond, "message")) { [17:27:37.610] muffled <- grepl(pattern, "muffleMessage") [17:27:37.610] if (muffled) [17:27:37.610] invokeRestart("muffleMessage") [17:27:37.610] } [17:27:37.610] else if (inherits(cond, "warning")) { [17:27:37.610] muffled <- grepl(pattern, "muffleWarning") [17:27:37.610] if (muffled) [17:27:37.610] invokeRestart("muffleWarning") [17:27:37.610] } [17:27:37.610] else if (inherits(cond, "condition")) { [17:27:37.610] if (!is.null(pattern)) { [17:27:37.610] computeRestarts <- base::computeRestarts [17:27:37.610] grepl <- base::grepl [17:27:37.610] restarts <- computeRestarts(cond) [17:27:37.610] for (restart in restarts) { [17:27:37.610] name <- restart$name [17:27:37.610] if (is.null(name)) [17:27:37.610] next [17:27:37.610] if (!grepl(pattern, name)) [17:27:37.610] next [17:27:37.610] invokeRestart(restart) [17:27:37.610] muffled <- TRUE [17:27:37.610] break [17:27:37.610] } [17:27:37.610] } [17:27:37.610] } [17:27:37.610] invisible(muffled) [17:27:37.610] } [17:27:37.610] muffleCondition(cond, pattern = "^muffle") [17:27:37.610] } [17:27:37.610] } [17:27:37.610] } [17:27:37.610] })) [17:27:37.610] }, error = function(ex) { [17:27:37.610] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.610] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.610] ...future.rng), started = ...future.startTime, [17:27:37.610] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.610] version = "1.8"), class = "FutureResult") [17:27:37.610] }, finally = { [17:27:37.610] if (!identical(...future.workdir, getwd())) [17:27:37.610] setwd(...future.workdir) [17:27:37.610] { [17:27:37.610] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.610] ...future.oldOptions$nwarnings <- NULL [17:27:37.610] } [17:27:37.610] base::options(...future.oldOptions) [17:27:37.610] if (.Platform$OS.type == "windows") { [17:27:37.610] old_names <- names(...future.oldEnvVars) [17:27:37.610] envs <- base::Sys.getenv() [17:27:37.610] names <- names(envs) [17:27:37.610] common <- intersect(names, old_names) [17:27:37.610] added <- setdiff(names, old_names) [17:27:37.610] removed <- setdiff(old_names, names) [17:27:37.610] changed <- common[...future.oldEnvVars[common] != [17:27:37.610] envs[common]] [17:27:37.610] NAMES <- toupper(changed) [17:27:37.610] args <- list() [17:27:37.610] for (kk in seq_along(NAMES)) { [17:27:37.610] name <- changed[[kk]] [17:27:37.610] NAME <- NAMES[[kk]] [17:27:37.610] if (name != NAME && is.element(NAME, old_names)) [17:27:37.610] next [17:27:37.610] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.610] } [17:27:37.610] NAMES <- toupper(added) [17:27:37.610] for (kk in seq_along(NAMES)) { [17:27:37.610] name <- added[[kk]] [17:27:37.610] NAME <- NAMES[[kk]] [17:27:37.610] if (name != NAME && is.element(NAME, old_names)) [17:27:37.610] next [17:27:37.610] args[[name]] <- "" [17:27:37.610] } [17:27:37.610] NAMES <- toupper(removed) [17:27:37.610] for (kk in seq_along(NAMES)) { [17:27:37.610] name <- removed[[kk]] [17:27:37.610] NAME <- NAMES[[kk]] [17:27:37.610] if (name != NAME && is.element(NAME, old_names)) [17:27:37.610] next [17:27:37.610] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.610] } [17:27:37.610] if (length(args) > 0) [17:27:37.610] base::do.call(base::Sys.setenv, args = args) [17:27:37.610] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.610] } [17:27:37.610] else { [17:27:37.610] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.610] } [17:27:37.610] { [17:27:37.610] if (base::length(...future.futureOptionsAdded) > [17:27:37.610] 0L) { [17:27:37.610] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.610] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.610] base::options(opts) [17:27:37.610] } [17:27:37.610] { [17:27:37.610] { [17:27:37.610] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.610] NULL [17:27:37.610] } [17:27:37.610] options(future.plan = NULL) [17:27:37.610] if (is.na(NA_character_)) [17:27:37.610] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.610] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.610] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.610] .init = FALSE) [17:27:37.610] } [17:27:37.610] } [17:27:37.610] } [17:27:37.610] }) [17:27:37.610] if (TRUE) { [17:27:37.610] base::sink(type = "output", split = FALSE) [17:27:37.610] if (TRUE) { [17:27:37.610] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.610] } [17:27:37.610] else { [17:27:37.610] ...future.result["stdout"] <- base::list(NULL) [17:27:37.610] } [17:27:37.610] base::close(...future.stdout) [17:27:37.610] ...future.stdout <- NULL [17:27:37.610] } [17:27:37.610] ...future.result$conditions <- ...future.conditions [17:27:37.610] ...future.result$finished <- base::Sys.time() [17:27:37.610] ...future.result [17:27:37.610] } [17:27:37.616] MultisessionFuture started [17:27:37.616] - Launch lazy future ... done [17:27:37.616] run() for 'MultisessionFuture' ... done [17:27:37.617] getGlobalsAndPackages() ... [17:27:37.617] Searching for globals... [17:27:37.617] [17:27:37.617] Searching for globals ... DONE [17:27:37.618] - globals: [0] [17:27:37.618] getGlobalsAndPackages() ... DONE [17:27:37.618] run() for 'Future' ... [17:27:37.618] - state: 'created' [17:27:37.619] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.636] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.636] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.636] - Field: 'node' [17:27:37.637] - Field: 'label' [17:27:37.637] - Field: 'local' [17:27:37.637] - Field: 'owner' [17:27:37.638] - Field: 'envir' [17:27:37.638] - Field: 'workers' [17:27:37.638] - Field: 'packages' [17:27:37.639] - Field: 'gc' [17:27:37.639] - Field: 'conditions' [17:27:37.639] - Field: 'persistent' [17:27:37.639] - Field: 'expr' [17:27:37.640] - Field: 'uuid' [17:27:37.640] - Field: 'seed' [17:27:37.640] - Field: 'version' [17:27:37.641] - Field: 'result' [17:27:37.641] - Field: 'asynchronous' [17:27:37.641] - Field: 'calls' [17:27:37.642] - Field: 'globals' [17:27:37.642] - Field: 'stdout' [17:27:37.642] - Field: 'earlySignal' [17:27:37.642] - Field: 'lazy' [17:27:37.643] - Field: 'state' [17:27:37.643] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.643] - Launch lazy future ... [17:27:37.644] Packages needed by the future expression (n = 0): [17:27:37.644] Packages needed by future strategies (n = 0): [17:27:37.645] { [17:27:37.645] { [17:27:37.645] { [17:27:37.645] ...future.startTime <- base::Sys.time() [17:27:37.645] { [17:27:37.645] { [17:27:37.645] { [17:27:37.645] { [17:27:37.645] base::local({ [17:27:37.645] has_future <- base::requireNamespace("future", [17:27:37.645] quietly = TRUE) [17:27:37.645] if (has_future) { [17:27:37.645] ns <- base::getNamespace("future") [17:27:37.645] version <- ns[[".package"]][["version"]] [17:27:37.645] if (is.null(version)) [17:27:37.645] version <- utils::packageVersion("future") [17:27:37.645] } [17:27:37.645] else { [17:27:37.645] version <- NULL [17:27:37.645] } [17:27:37.645] if (!has_future || version < "1.8.0") { [17:27:37.645] info <- base::c(r_version = base::gsub("R version ", [17:27:37.645] "", base::R.version$version.string), [17:27:37.645] platform = base::sprintf("%s (%s-bit)", [17:27:37.645] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.645] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.645] "release", "version")], collapse = " "), [17:27:37.645] hostname = base::Sys.info()[["nodename"]]) [17:27:37.645] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.645] info) [17:27:37.645] info <- base::paste(info, collapse = "; ") [17:27:37.645] if (!has_future) { [17:27:37.645] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.645] info) [17:27:37.645] } [17:27:37.645] else { [17:27:37.645] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.645] info, version) [17:27:37.645] } [17:27:37.645] base::stop(msg) [17:27:37.645] } [17:27:37.645] }) [17:27:37.645] } [17:27:37.645] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.645] base::options(mc.cores = 1L) [17:27:37.645] } [17:27:37.645] ...future.strategy.old <- future::plan("list") [17:27:37.645] options(future.plan = NULL) [17:27:37.645] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.645] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.645] } [17:27:37.645] ...future.workdir <- getwd() [17:27:37.645] } [17:27:37.645] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.645] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.645] } [17:27:37.645] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.645] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.645] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.645] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.645] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.645] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.645] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.645] base::names(...future.oldOptions)) [17:27:37.645] } [17:27:37.645] if (FALSE) { [17:27:37.645] } [17:27:37.645] else { [17:27:37.645] if (TRUE) { [17:27:37.645] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.645] open = "w") [17:27:37.645] } [17:27:37.645] else { [17:27:37.645] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.645] windows = "NUL", "/dev/null"), open = "w") [17:27:37.645] } [17:27:37.645] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.645] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.645] base::sink(type = "output", split = FALSE) [17:27:37.645] base::close(...future.stdout) [17:27:37.645] }, add = TRUE) [17:27:37.645] } [17:27:37.645] ...future.frame <- base::sys.nframe() [17:27:37.645] ...future.conditions <- base::list() [17:27:37.645] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.645] if (FALSE) { [17:27:37.645] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.645] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.645] } [17:27:37.645] ...future.result <- base::tryCatch({ [17:27:37.645] base::withCallingHandlers({ [17:27:37.645] ...future.value <- base::withVisible(base::local({ [17:27:37.645] ...future.makeSendCondition <- base::local({ [17:27:37.645] sendCondition <- NULL [17:27:37.645] function(frame = 1L) { [17:27:37.645] if (is.function(sendCondition)) [17:27:37.645] return(sendCondition) [17:27:37.645] ns <- getNamespace("parallel") [17:27:37.645] if (exists("sendData", mode = "function", [17:27:37.645] envir = ns)) { [17:27:37.645] parallel_sendData <- get("sendData", mode = "function", [17:27:37.645] envir = ns) [17:27:37.645] envir <- sys.frame(frame) [17:27:37.645] master <- NULL [17:27:37.645] while (!identical(envir, .GlobalEnv) && [17:27:37.645] !identical(envir, emptyenv())) { [17:27:37.645] if (exists("master", mode = "list", envir = envir, [17:27:37.645] inherits = FALSE)) { [17:27:37.645] master <- get("master", mode = "list", [17:27:37.645] envir = envir, inherits = FALSE) [17:27:37.645] if (inherits(master, c("SOCKnode", [17:27:37.645] "SOCK0node"))) { [17:27:37.645] sendCondition <<- function(cond) { [17:27:37.645] data <- list(type = "VALUE", value = cond, [17:27:37.645] success = TRUE) [17:27:37.645] parallel_sendData(master, data) [17:27:37.645] } [17:27:37.645] return(sendCondition) [17:27:37.645] } [17:27:37.645] } [17:27:37.645] frame <- frame + 1L [17:27:37.645] envir <- sys.frame(frame) [17:27:37.645] } [17:27:37.645] } [17:27:37.645] sendCondition <<- function(cond) NULL [17:27:37.645] } [17:27:37.645] }) [17:27:37.645] withCallingHandlers({ [17:27:37.645] NULL [17:27:37.645] }, immediateCondition = function(cond) { [17:27:37.645] sendCondition <- ...future.makeSendCondition() [17:27:37.645] sendCondition(cond) [17:27:37.645] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.645] { [17:27:37.645] inherits <- base::inherits [17:27:37.645] invokeRestart <- base::invokeRestart [17:27:37.645] is.null <- base::is.null [17:27:37.645] muffled <- FALSE [17:27:37.645] if (inherits(cond, "message")) { [17:27:37.645] muffled <- grepl(pattern, "muffleMessage") [17:27:37.645] if (muffled) [17:27:37.645] invokeRestart("muffleMessage") [17:27:37.645] } [17:27:37.645] else if (inherits(cond, "warning")) { [17:27:37.645] muffled <- grepl(pattern, "muffleWarning") [17:27:37.645] if (muffled) [17:27:37.645] invokeRestart("muffleWarning") [17:27:37.645] } [17:27:37.645] else if (inherits(cond, "condition")) { [17:27:37.645] if (!is.null(pattern)) { [17:27:37.645] computeRestarts <- base::computeRestarts [17:27:37.645] grepl <- base::grepl [17:27:37.645] restarts <- computeRestarts(cond) [17:27:37.645] for (restart in restarts) { [17:27:37.645] name <- restart$name [17:27:37.645] if (is.null(name)) [17:27:37.645] next [17:27:37.645] if (!grepl(pattern, name)) [17:27:37.645] next [17:27:37.645] invokeRestart(restart) [17:27:37.645] muffled <- TRUE [17:27:37.645] break [17:27:37.645] } [17:27:37.645] } [17:27:37.645] } [17:27:37.645] invisible(muffled) [17:27:37.645] } [17:27:37.645] muffleCondition(cond) [17:27:37.645] }) [17:27:37.645] })) [17:27:37.645] future::FutureResult(value = ...future.value$value, [17:27:37.645] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.645] ...future.rng), globalenv = if (FALSE) [17:27:37.645] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.645] ...future.globalenv.names)) [17:27:37.645] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.645] }, condition = base::local({ [17:27:37.645] c <- base::c [17:27:37.645] inherits <- base::inherits [17:27:37.645] invokeRestart <- base::invokeRestart [17:27:37.645] length <- base::length [17:27:37.645] list <- base::list [17:27:37.645] seq.int <- base::seq.int [17:27:37.645] signalCondition <- base::signalCondition [17:27:37.645] sys.calls <- base::sys.calls [17:27:37.645] `[[` <- base::`[[` [17:27:37.645] `+` <- base::`+` [17:27:37.645] `<<-` <- base::`<<-` [17:27:37.645] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.645] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.645] 3L)] [17:27:37.645] } [17:27:37.645] function(cond) { [17:27:37.645] is_error <- inherits(cond, "error") [17:27:37.645] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.645] NULL) [17:27:37.645] if (is_error) { [17:27:37.645] sessionInformation <- function() { [17:27:37.645] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.645] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.645] search = base::search(), system = base::Sys.info()) [17:27:37.645] } [17:27:37.645] ...future.conditions[[length(...future.conditions) + [17:27:37.645] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.645] cond$call), session = sessionInformation(), [17:27:37.645] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.645] signalCondition(cond) [17:27:37.645] } [17:27:37.645] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.645] "immediateCondition"))) { [17:27:37.645] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.645] ...future.conditions[[length(...future.conditions) + [17:27:37.645] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.645] if (TRUE && !signal) { [17:27:37.645] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.645] { [17:27:37.645] inherits <- base::inherits [17:27:37.645] invokeRestart <- base::invokeRestart [17:27:37.645] is.null <- base::is.null [17:27:37.645] muffled <- FALSE [17:27:37.645] if (inherits(cond, "message")) { [17:27:37.645] muffled <- grepl(pattern, "muffleMessage") [17:27:37.645] if (muffled) [17:27:37.645] invokeRestart("muffleMessage") [17:27:37.645] } [17:27:37.645] else if (inherits(cond, "warning")) { [17:27:37.645] muffled <- grepl(pattern, "muffleWarning") [17:27:37.645] if (muffled) [17:27:37.645] invokeRestart("muffleWarning") [17:27:37.645] } [17:27:37.645] else if (inherits(cond, "condition")) { [17:27:37.645] if (!is.null(pattern)) { [17:27:37.645] computeRestarts <- base::computeRestarts [17:27:37.645] grepl <- base::grepl [17:27:37.645] restarts <- computeRestarts(cond) [17:27:37.645] for (restart in restarts) { [17:27:37.645] name <- restart$name [17:27:37.645] if (is.null(name)) [17:27:37.645] next [17:27:37.645] if (!grepl(pattern, name)) [17:27:37.645] next [17:27:37.645] invokeRestart(restart) [17:27:37.645] muffled <- TRUE [17:27:37.645] break [17:27:37.645] } [17:27:37.645] } [17:27:37.645] } [17:27:37.645] invisible(muffled) [17:27:37.645] } [17:27:37.645] muffleCondition(cond, pattern = "^muffle") [17:27:37.645] } [17:27:37.645] } [17:27:37.645] else { [17:27:37.645] if (TRUE) { [17:27:37.645] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.645] { [17:27:37.645] inherits <- base::inherits [17:27:37.645] invokeRestart <- base::invokeRestart [17:27:37.645] is.null <- base::is.null [17:27:37.645] muffled <- FALSE [17:27:37.645] if (inherits(cond, "message")) { [17:27:37.645] muffled <- grepl(pattern, "muffleMessage") [17:27:37.645] if (muffled) [17:27:37.645] invokeRestart("muffleMessage") [17:27:37.645] } [17:27:37.645] else if (inherits(cond, "warning")) { [17:27:37.645] muffled <- grepl(pattern, "muffleWarning") [17:27:37.645] if (muffled) [17:27:37.645] invokeRestart("muffleWarning") [17:27:37.645] } [17:27:37.645] else if (inherits(cond, "condition")) { [17:27:37.645] if (!is.null(pattern)) { [17:27:37.645] computeRestarts <- base::computeRestarts [17:27:37.645] grepl <- base::grepl [17:27:37.645] restarts <- computeRestarts(cond) [17:27:37.645] for (restart in restarts) { [17:27:37.645] name <- restart$name [17:27:37.645] if (is.null(name)) [17:27:37.645] next [17:27:37.645] if (!grepl(pattern, name)) [17:27:37.645] next [17:27:37.645] invokeRestart(restart) [17:27:37.645] muffled <- TRUE [17:27:37.645] break [17:27:37.645] } [17:27:37.645] } [17:27:37.645] } [17:27:37.645] invisible(muffled) [17:27:37.645] } [17:27:37.645] muffleCondition(cond, pattern = "^muffle") [17:27:37.645] } [17:27:37.645] } [17:27:37.645] } [17:27:37.645] })) [17:27:37.645] }, error = function(ex) { [17:27:37.645] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.645] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.645] ...future.rng), started = ...future.startTime, [17:27:37.645] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.645] version = "1.8"), class = "FutureResult") [17:27:37.645] }, finally = { [17:27:37.645] if (!identical(...future.workdir, getwd())) [17:27:37.645] setwd(...future.workdir) [17:27:37.645] { [17:27:37.645] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.645] ...future.oldOptions$nwarnings <- NULL [17:27:37.645] } [17:27:37.645] base::options(...future.oldOptions) [17:27:37.645] if (.Platform$OS.type == "windows") { [17:27:37.645] old_names <- names(...future.oldEnvVars) [17:27:37.645] envs <- base::Sys.getenv() [17:27:37.645] names <- names(envs) [17:27:37.645] common <- intersect(names, old_names) [17:27:37.645] added <- setdiff(names, old_names) [17:27:37.645] removed <- setdiff(old_names, names) [17:27:37.645] changed <- common[...future.oldEnvVars[common] != [17:27:37.645] envs[common]] [17:27:37.645] NAMES <- toupper(changed) [17:27:37.645] args <- list() [17:27:37.645] for (kk in seq_along(NAMES)) { [17:27:37.645] name <- changed[[kk]] [17:27:37.645] NAME <- NAMES[[kk]] [17:27:37.645] if (name != NAME && is.element(NAME, old_names)) [17:27:37.645] next [17:27:37.645] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.645] } [17:27:37.645] NAMES <- toupper(added) [17:27:37.645] for (kk in seq_along(NAMES)) { [17:27:37.645] name <- added[[kk]] [17:27:37.645] NAME <- NAMES[[kk]] [17:27:37.645] if (name != NAME && is.element(NAME, old_names)) [17:27:37.645] next [17:27:37.645] args[[name]] <- "" [17:27:37.645] } [17:27:37.645] NAMES <- toupper(removed) [17:27:37.645] for (kk in seq_along(NAMES)) { [17:27:37.645] name <- removed[[kk]] [17:27:37.645] NAME <- NAMES[[kk]] [17:27:37.645] if (name != NAME && is.element(NAME, old_names)) [17:27:37.645] next [17:27:37.645] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.645] } [17:27:37.645] if (length(args) > 0) [17:27:37.645] base::do.call(base::Sys.setenv, args = args) [17:27:37.645] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.645] } [17:27:37.645] else { [17:27:37.645] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.645] } [17:27:37.645] { [17:27:37.645] if (base::length(...future.futureOptionsAdded) > [17:27:37.645] 0L) { [17:27:37.645] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.645] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.645] base::options(opts) [17:27:37.645] } [17:27:37.645] { [17:27:37.645] { [17:27:37.645] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.645] NULL [17:27:37.645] } [17:27:37.645] options(future.plan = NULL) [17:27:37.645] if (is.na(NA_character_)) [17:27:37.645] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.645] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.645] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.645] .init = FALSE) [17:27:37.645] } [17:27:37.645] } [17:27:37.645] } [17:27:37.645] }) [17:27:37.645] if (TRUE) { [17:27:37.645] base::sink(type = "output", split = FALSE) [17:27:37.645] if (TRUE) { [17:27:37.645] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.645] } [17:27:37.645] else { [17:27:37.645] ...future.result["stdout"] <- base::list(NULL) [17:27:37.645] } [17:27:37.645] base::close(...future.stdout) [17:27:37.645] ...future.stdout <- NULL [17:27:37.645] } [17:27:37.645] ...future.result$conditions <- ...future.conditions [17:27:37.645] ...future.result$finished <- base::Sys.time() [17:27:37.645] ...future.result [17:27:37.645] } [17:27:37.654] MultisessionFuture started [17:27:37.654] - Launch lazy future ... done [17:27:37.655] run() for 'MultisessionFuture' ... done List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 1 6 - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... [17:27:37.664] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.664] - Validating connection of MultisessionFuture [17:27:37.664] - received message: FutureResult [17:27:37.664] - Received FutureResult [17:27:37.665] - Erased future from FutureRegistry [17:27:37.665] result() for ClusterFuture ... [17:27:37.665] - result already collected: FutureResult [17:27:37.665] result() for ClusterFuture ... done [17:27:37.666] receiveMessageFromWorker() for ClusterFuture ... done [17:27:37.686] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.686] - Validating connection of MultisessionFuture [17:27:37.687] - received message: FutureResult [17:27:37.687] - Received FutureResult [17:27:37.687] - Erased future from FutureRegistry [17:27:37.688] result() for ClusterFuture ... [17:27:37.688] - result already collected: FutureResult [17:27:37.688] result() for ClusterFuture ... done [17:27:37.689] receiveMessageFromWorker() for ClusterFuture ... done logi [1, 1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:37.692] resolve() on list ... [17:27:37.692] recursive: 0 [17:27:37.693] length: 6 [17:27:37.693] elements: 'a', 'b', 'c', '', '', '' [17:27:37.693] signalConditionsASAP(numeric, pos=1) ... [17:27:37.694] - nx: 6 [17:27:37.694] - relay: TRUE [17:27:37.694] - stdout: TRUE [17:27:37.694] - signal: TRUE [17:27:37.695] - resignal: FALSE [17:27:37.695] - force: TRUE [17:27:37.695] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.695] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.696] - until=2 [17:27:37.696] - relaying element #2 [17:27:37.696] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.697] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.697] signalConditionsASAP(NULL, pos=1) ... done [17:27:37.697] length: 5 (resolved future 1) [17:27:37.697] Future #2 [17:27:37.698] result() for ClusterFuture ... [17:27:37.698] - result already collected: FutureResult [17:27:37.698] result() for ClusterFuture ... done [17:27:37.699] result() for ClusterFuture ... [17:27:37.699] - result already collected: FutureResult [17:27:37.699] result() for ClusterFuture ... done [17:27:37.699] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:37.700] - nx: 6 [17:27:37.700] - relay: TRUE [17:27:37.700] - stdout: TRUE [17:27:37.700] - signal: TRUE [17:27:37.701] - resignal: FALSE [17:27:37.701] - force: TRUE [17:27:37.701] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.702] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.702] - until=2 [17:27:37.702] - relaying element #2 [17:27:37.702] result() for ClusterFuture ... [17:27:37.703] - result already collected: FutureResult [17:27:37.703] result() for ClusterFuture ... done [17:27:37.703] result() for ClusterFuture ... [17:27:37.703] - result already collected: FutureResult [17:27:37.704] result() for ClusterFuture ... done [17:27:37.704] result() for ClusterFuture ... [17:27:37.704] - result already collected: FutureResult [17:27:37.705] result() for ClusterFuture ... done [17:27:37.705] result() for ClusterFuture ... [17:27:37.705] - result already collected: FutureResult [17:27:37.705] result() for ClusterFuture ... done [17:27:37.706] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.706] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.706] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:37.707] length: 4 (resolved future 2) [17:27:37.707] Future #3 [17:27:37.707] result() for ClusterFuture ... [17:27:37.707] - result already collected: FutureResult [17:27:37.708] result() for ClusterFuture ... done [17:27:37.708] result() for ClusterFuture ... [17:27:37.708] - result already collected: FutureResult [17:27:37.708] result() for ClusterFuture ... done [17:27:37.709] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:37.709] - nx: 6 [17:27:37.709] - relay: TRUE [17:27:37.710] - stdout: TRUE [17:27:37.710] - signal: TRUE [17:27:37.710] - resignal: FALSE [17:27:37.710] - force: TRUE [17:27:37.711] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.711] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.711] - until=3 [17:27:37.711] - relaying element #3 [17:27:37.712] result() for ClusterFuture ... [17:27:37.712] - result already collected: FutureResult [17:27:37.712] result() for ClusterFuture ... done [17:27:37.713] result() for ClusterFuture ... [17:27:37.713] - result already collected: FutureResult [17:27:37.713] result() for ClusterFuture ... done [17:27:37.713] result() for ClusterFuture ... [17:27:37.714] - result already collected: FutureResult [17:27:37.714] result() for ClusterFuture ... done [17:27:37.714] result() for ClusterFuture ... [17:27:37.714] - result already collected: FutureResult [17:27:37.715] result() for ClusterFuture ... done [17:27:37.715] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.715] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.716] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:37.716] length: 3 (resolved future 3) [17:27:37.716] signalConditionsASAP(NULL, pos=4) ... [17:27:37.716] - nx: 6 [17:27:37.717] - relay: TRUE [17:27:37.717] - stdout: TRUE [17:27:37.717] - signal: TRUE [17:27:37.717] - resignal: FALSE [17:27:37.718] - force: TRUE [17:27:37.718] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.718] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.719] - until=5 [17:27:37.719] - relaying element #5 [17:27:37.719] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:37.719] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.720] signalConditionsASAP(NULL, pos=4) ... done [17:27:37.720] length: 2 (resolved future 4) [17:27:37.721] signalConditionsASAP(NULL, pos=5) ... [17:27:37.721] - nx: 6 [17:27:37.721] - relay: TRUE [17:27:37.722] - stdout: TRUE [17:27:37.722] - signal: TRUE [17:27:37.722] - resignal: FALSE [17:27:37.722] - force: TRUE [17:27:37.723] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:37.723] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.723] - until=6 [17:27:37.724] - relaying element #6 [17:27:37.724] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:37.724] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.724] signalConditionsASAP(NULL, pos=5) ... done [17:27:37.725] length: 1 (resolved future 5) [17:27:37.725] signalConditionsASAP(numeric, pos=6) ... [17:27:37.725] - nx: 6 [17:27:37.726] - relay: TRUE [17:27:37.726] - stdout: TRUE [17:27:37.726] - signal: TRUE [17:27:37.726] - resignal: FALSE [17:27:37.727] - force: TRUE [17:27:37.727] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:37.727] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.727] - until=6 [17:27:37.728] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.728] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.728] signalConditionsASAP(numeric, pos=6) ... done [17:27:37.728] length: 0 (resolved future 6) [17:27:37.729] Relaying remaining futures [17:27:37.729] signalConditionsASAP(NULL, pos=0) ... [17:27:37.729] - nx: 6 [17:27:37.729] - relay: TRUE [17:27:37.730] - stdout: TRUE [17:27:37.730] - signal: TRUE [17:27:37.730] - resignal: FALSE [17:27:37.730] - force: TRUE [17:27:37.731] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.731] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:37.731] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.732] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.732] signalConditionsASAP(NULL, pos=0) ... done [17:27:37.732] resolve() on list ... DONE [17:27:37.733] result() for ClusterFuture ... [17:27:37.733] - result already collected: FutureResult [17:27:37.733] result() for ClusterFuture ... done [17:27:37.733] result() for ClusterFuture ... [17:27:37.734] - result already collected: FutureResult [17:27:37.734] result() for ClusterFuture ... done [17:27:37.734] result() for ClusterFuture ... [17:27:37.734] - result already collected: FutureResult [17:27:37.735] result() for ClusterFuture ... done [17:27:37.735] result() for ClusterFuture ... [17:27:37.735] - result already collected: FutureResult [17:27:37.736] result() for ClusterFuture ... done List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 1 6 - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... Dimensions: c(2, 3) [17:27:37.742] getGlobalsAndPackages() ... [17:27:37.742] Searching for globals... [17:27:37.743] [17:27:37.743] Searching for globals ... DONE [17:27:37.744] - globals: [0] [17:27:37.744] getGlobalsAndPackages() ... DONE [17:27:37.745] run() for 'Future' ... [17:27:37.745] - state: 'created' [17:27:37.745] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.763] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.764] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.764] - Field: 'node' [17:27:37.764] - Field: 'label' [17:27:37.764] - Field: 'local' [17:27:37.765] - Field: 'owner' [17:27:37.765] - Field: 'envir' [17:27:37.765] - Field: 'workers' [17:27:37.765] - Field: 'packages' [17:27:37.765] - Field: 'gc' [17:27:37.765] - Field: 'conditions' [17:27:37.766] - Field: 'persistent' [17:27:37.766] - Field: 'expr' [17:27:37.766] - Field: 'uuid' [17:27:37.766] - Field: 'seed' [17:27:37.766] - Field: 'version' [17:27:37.767] - Field: 'result' [17:27:37.767] - Field: 'asynchronous' [17:27:37.767] - Field: 'calls' [17:27:37.767] - Field: 'globals' [17:27:37.768] - Field: 'stdout' [17:27:37.768] - Field: 'earlySignal' [17:27:37.768] - Field: 'lazy' [17:27:37.768] - Field: 'state' [17:27:37.769] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.769] - Launch lazy future ... [17:27:37.769] Packages needed by the future expression (n = 0): [17:27:37.770] Packages needed by future strategies (n = 0): [17:27:37.771] { [17:27:37.771] { [17:27:37.771] { [17:27:37.771] ...future.startTime <- base::Sys.time() [17:27:37.771] { [17:27:37.771] { [17:27:37.771] { [17:27:37.771] { [17:27:37.771] base::local({ [17:27:37.771] has_future <- base::requireNamespace("future", [17:27:37.771] quietly = TRUE) [17:27:37.771] if (has_future) { [17:27:37.771] ns <- base::getNamespace("future") [17:27:37.771] version <- ns[[".package"]][["version"]] [17:27:37.771] if (is.null(version)) [17:27:37.771] version <- utils::packageVersion("future") [17:27:37.771] } [17:27:37.771] else { [17:27:37.771] version <- NULL [17:27:37.771] } [17:27:37.771] if (!has_future || version < "1.8.0") { [17:27:37.771] info <- base::c(r_version = base::gsub("R version ", [17:27:37.771] "", base::R.version$version.string), [17:27:37.771] platform = base::sprintf("%s (%s-bit)", [17:27:37.771] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.771] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.771] "release", "version")], collapse = " "), [17:27:37.771] hostname = base::Sys.info()[["nodename"]]) [17:27:37.771] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.771] info) [17:27:37.771] info <- base::paste(info, collapse = "; ") [17:27:37.771] if (!has_future) { [17:27:37.771] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.771] info) [17:27:37.771] } [17:27:37.771] else { [17:27:37.771] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.771] info, version) [17:27:37.771] } [17:27:37.771] base::stop(msg) [17:27:37.771] } [17:27:37.771] }) [17:27:37.771] } [17:27:37.771] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.771] base::options(mc.cores = 1L) [17:27:37.771] } [17:27:37.771] ...future.strategy.old <- future::plan("list") [17:27:37.771] options(future.plan = NULL) [17:27:37.771] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.771] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.771] } [17:27:37.771] ...future.workdir <- getwd() [17:27:37.771] } [17:27:37.771] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.771] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.771] } [17:27:37.771] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.771] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.771] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.771] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.771] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.771] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.771] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.771] base::names(...future.oldOptions)) [17:27:37.771] } [17:27:37.771] if (FALSE) { [17:27:37.771] } [17:27:37.771] else { [17:27:37.771] if (TRUE) { [17:27:37.771] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.771] open = "w") [17:27:37.771] } [17:27:37.771] else { [17:27:37.771] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.771] windows = "NUL", "/dev/null"), open = "w") [17:27:37.771] } [17:27:37.771] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.771] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.771] base::sink(type = "output", split = FALSE) [17:27:37.771] base::close(...future.stdout) [17:27:37.771] }, add = TRUE) [17:27:37.771] } [17:27:37.771] ...future.frame <- base::sys.nframe() [17:27:37.771] ...future.conditions <- base::list() [17:27:37.771] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.771] if (FALSE) { [17:27:37.771] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.771] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.771] } [17:27:37.771] ...future.result <- base::tryCatch({ [17:27:37.771] base::withCallingHandlers({ [17:27:37.771] ...future.value <- base::withVisible(base::local({ [17:27:37.771] ...future.makeSendCondition <- base::local({ [17:27:37.771] sendCondition <- NULL [17:27:37.771] function(frame = 1L) { [17:27:37.771] if (is.function(sendCondition)) [17:27:37.771] return(sendCondition) [17:27:37.771] ns <- getNamespace("parallel") [17:27:37.771] if (exists("sendData", mode = "function", [17:27:37.771] envir = ns)) { [17:27:37.771] parallel_sendData <- get("sendData", mode = "function", [17:27:37.771] envir = ns) [17:27:37.771] envir <- sys.frame(frame) [17:27:37.771] master <- NULL [17:27:37.771] while (!identical(envir, .GlobalEnv) && [17:27:37.771] !identical(envir, emptyenv())) { [17:27:37.771] if (exists("master", mode = "list", envir = envir, [17:27:37.771] inherits = FALSE)) { [17:27:37.771] master <- get("master", mode = "list", [17:27:37.771] envir = envir, inherits = FALSE) [17:27:37.771] if (inherits(master, c("SOCKnode", [17:27:37.771] "SOCK0node"))) { [17:27:37.771] sendCondition <<- function(cond) { [17:27:37.771] data <- list(type = "VALUE", value = cond, [17:27:37.771] success = TRUE) [17:27:37.771] parallel_sendData(master, data) [17:27:37.771] } [17:27:37.771] return(sendCondition) [17:27:37.771] } [17:27:37.771] } [17:27:37.771] frame <- frame + 1L [17:27:37.771] envir <- sys.frame(frame) [17:27:37.771] } [17:27:37.771] } [17:27:37.771] sendCondition <<- function(cond) NULL [17:27:37.771] } [17:27:37.771] }) [17:27:37.771] withCallingHandlers({ [17:27:37.771] 2 [17:27:37.771] }, immediateCondition = function(cond) { [17:27:37.771] sendCondition <- ...future.makeSendCondition() [17:27:37.771] sendCondition(cond) [17:27:37.771] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.771] { [17:27:37.771] inherits <- base::inherits [17:27:37.771] invokeRestart <- base::invokeRestart [17:27:37.771] is.null <- base::is.null [17:27:37.771] muffled <- FALSE [17:27:37.771] if (inherits(cond, "message")) { [17:27:37.771] muffled <- grepl(pattern, "muffleMessage") [17:27:37.771] if (muffled) [17:27:37.771] invokeRestart("muffleMessage") [17:27:37.771] } [17:27:37.771] else if (inherits(cond, "warning")) { [17:27:37.771] muffled <- grepl(pattern, "muffleWarning") [17:27:37.771] if (muffled) [17:27:37.771] invokeRestart("muffleWarning") [17:27:37.771] } [17:27:37.771] else if (inherits(cond, "condition")) { [17:27:37.771] if (!is.null(pattern)) { [17:27:37.771] computeRestarts <- base::computeRestarts [17:27:37.771] grepl <- base::grepl [17:27:37.771] restarts <- computeRestarts(cond) [17:27:37.771] for (restart in restarts) { [17:27:37.771] name <- restart$name [17:27:37.771] if (is.null(name)) [17:27:37.771] next [17:27:37.771] if (!grepl(pattern, name)) [17:27:37.771] next [17:27:37.771] invokeRestart(restart) [17:27:37.771] muffled <- TRUE [17:27:37.771] break [17:27:37.771] } [17:27:37.771] } [17:27:37.771] } [17:27:37.771] invisible(muffled) [17:27:37.771] } [17:27:37.771] muffleCondition(cond) [17:27:37.771] }) [17:27:37.771] })) [17:27:37.771] future::FutureResult(value = ...future.value$value, [17:27:37.771] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.771] ...future.rng), globalenv = if (FALSE) [17:27:37.771] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.771] ...future.globalenv.names)) [17:27:37.771] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.771] }, condition = base::local({ [17:27:37.771] c <- base::c [17:27:37.771] inherits <- base::inherits [17:27:37.771] invokeRestart <- base::invokeRestart [17:27:37.771] length <- base::length [17:27:37.771] list <- base::list [17:27:37.771] seq.int <- base::seq.int [17:27:37.771] signalCondition <- base::signalCondition [17:27:37.771] sys.calls <- base::sys.calls [17:27:37.771] `[[` <- base::`[[` [17:27:37.771] `+` <- base::`+` [17:27:37.771] `<<-` <- base::`<<-` [17:27:37.771] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.771] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.771] 3L)] [17:27:37.771] } [17:27:37.771] function(cond) { [17:27:37.771] is_error <- inherits(cond, "error") [17:27:37.771] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.771] NULL) [17:27:37.771] if (is_error) { [17:27:37.771] sessionInformation <- function() { [17:27:37.771] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.771] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.771] search = base::search(), system = base::Sys.info()) [17:27:37.771] } [17:27:37.771] ...future.conditions[[length(...future.conditions) + [17:27:37.771] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.771] cond$call), session = sessionInformation(), [17:27:37.771] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.771] signalCondition(cond) [17:27:37.771] } [17:27:37.771] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.771] "immediateCondition"))) { [17:27:37.771] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.771] ...future.conditions[[length(...future.conditions) + [17:27:37.771] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.771] if (TRUE && !signal) { [17:27:37.771] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.771] { [17:27:37.771] inherits <- base::inherits [17:27:37.771] invokeRestart <- base::invokeRestart [17:27:37.771] is.null <- base::is.null [17:27:37.771] muffled <- FALSE [17:27:37.771] if (inherits(cond, "message")) { [17:27:37.771] muffled <- grepl(pattern, "muffleMessage") [17:27:37.771] if (muffled) [17:27:37.771] invokeRestart("muffleMessage") [17:27:37.771] } [17:27:37.771] else if (inherits(cond, "warning")) { [17:27:37.771] muffled <- grepl(pattern, "muffleWarning") [17:27:37.771] if (muffled) [17:27:37.771] invokeRestart("muffleWarning") [17:27:37.771] } [17:27:37.771] else if (inherits(cond, "condition")) { [17:27:37.771] if (!is.null(pattern)) { [17:27:37.771] computeRestarts <- base::computeRestarts [17:27:37.771] grepl <- base::grepl [17:27:37.771] restarts <- computeRestarts(cond) [17:27:37.771] for (restart in restarts) { [17:27:37.771] name <- restart$name [17:27:37.771] if (is.null(name)) [17:27:37.771] next [17:27:37.771] if (!grepl(pattern, name)) [17:27:37.771] next [17:27:37.771] invokeRestart(restart) [17:27:37.771] muffled <- TRUE [17:27:37.771] break [17:27:37.771] } [17:27:37.771] } [17:27:37.771] } [17:27:37.771] invisible(muffled) [17:27:37.771] } [17:27:37.771] muffleCondition(cond, pattern = "^muffle") [17:27:37.771] } [17:27:37.771] } [17:27:37.771] else { [17:27:37.771] if (TRUE) { [17:27:37.771] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.771] { [17:27:37.771] inherits <- base::inherits [17:27:37.771] invokeRestart <- base::invokeRestart [17:27:37.771] is.null <- base::is.null [17:27:37.771] muffled <- FALSE [17:27:37.771] if (inherits(cond, "message")) { [17:27:37.771] muffled <- grepl(pattern, "muffleMessage") [17:27:37.771] if (muffled) [17:27:37.771] invokeRestart("muffleMessage") [17:27:37.771] } [17:27:37.771] else if (inherits(cond, "warning")) { [17:27:37.771] muffled <- grepl(pattern, "muffleWarning") [17:27:37.771] if (muffled) [17:27:37.771] invokeRestart("muffleWarning") [17:27:37.771] } [17:27:37.771] else if (inherits(cond, "condition")) { [17:27:37.771] if (!is.null(pattern)) { [17:27:37.771] computeRestarts <- base::computeRestarts [17:27:37.771] grepl <- base::grepl [17:27:37.771] restarts <- computeRestarts(cond) [17:27:37.771] for (restart in restarts) { [17:27:37.771] name <- restart$name [17:27:37.771] if (is.null(name)) [17:27:37.771] next [17:27:37.771] if (!grepl(pattern, name)) [17:27:37.771] next [17:27:37.771] invokeRestart(restart) [17:27:37.771] muffled <- TRUE [17:27:37.771] break [17:27:37.771] } [17:27:37.771] } [17:27:37.771] } [17:27:37.771] invisible(muffled) [17:27:37.771] } [17:27:37.771] muffleCondition(cond, pattern = "^muffle") [17:27:37.771] } [17:27:37.771] } [17:27:37.771] } [17:27:37.771] })) [17:27:37.771] }, error = function(ex) { [17:27:37.771] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.771] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.771] ...future.rng), started = ...future.startTime, [17:27:37.771] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.771] version = "1.8"), class = "FutureResult") [17:27:37.771] }, finally = { [17:27:37.771] if (!identical(...future.workdir, getwd())) [17:27:37.771] setwd(...future.workdir) [17:27:37.771] { [17:27:37.771] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.771] ...future.oldOptions$nwarnings <- NULL [17:27:37.771] } [17:27:37.771] base::options(...future.oldOptions) [17:27:37.771] if (.Platform$OS.type == "windows") { [17:27:37.771] old_names <- names(...future.oldEnvVars) [17:27:37.771] envs <- base::Sys.getenv() [17:27:37.771] names <- names(envs) [17:27:37.771] common <- intersect(names, old_names) [17:27:37.771] added <- setdiff(names, old_names) [17:27:37.771] removed <- setdiff(old_names, names) [17:27:37.771] changed <- common[...future.oldEnvVars[common] != [17:27:37.771] envs[common]] [17:27:37.771] NAMES <- toupper(changed) [17:27:37.771] args <- list() [17:27:37.771] for (kk in seq_along(NAMES)) { [17:27:37.771] name <- changed[[kk]] [17:27:37.771] NAME <- NAMES[[kk]] [17:27:37.771] if (name != NAME && is.element(NAME, old_names)) [17:27:37.771] next [17:27:37.771] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.771] } [17:27:37.771] NAMES <- toupper(added) [17:27:37.771] for (kk in seq_along(NAMES)) { [17:27:37.771] name <- added[[kk]] [17:27:37.771] NAME <- NAMES[[kk]] [17:27:37.771] if (name != NAME && is.element(NAME, old_names)) [17:27:37.771] next [17:27:37.771] args[[name]] <- "" [17:27:37.771] } [17:27:37.771] NAMES <- toupper(removed) [17:27:37.771] for (kk in seq_along(NAMES)) { [17:27:37.771] name <- removed[[kk]] [17:27:37.771] NAME <- NAMES[[kk]] [17:27:37.771] if (name != NAME && is.element(NAME, old_names)) [17:27:37.771] next [17:27:37.771] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.771] } [17:27:37.771] if (length(args) > 0) [17:27:37.771] base::do.call(base::Sys.setenv, args = args) [17:27:37.771] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.771] } [17:27:37.771] else { [17:27:37.771] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.771] } [17:27:37.771] { [17:27:37.771] if (base::length(...future.futureOptionsAdded) > [17:27:37.771] 0L) { [17:27:37.771] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.771] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.771] base::options(opts) [17:27:37.771] } [17:27:37.771] { [17:27:37.771] { [17:27:37.771] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.771] NULL [17:27:37.771] } [17:27:37.771] options(future.plan = NULL) [17:27:37.771] if (is.na(NA_character_)) [17:27:37.771] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.771] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.771] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.771] .init = FALSE) [17:27:37.771] } [17:27:37.771] } [17:27:37.771] } [17:27:37.771] }) [17:27:37.771] if (TRUE) { [17:27:37.771] base::sink(type = "output", split = FALSE) [17:27:37.771] if (TRUE) { [17:27:37.771] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.771] } [17:27:37.771] else { [17:27:37.771] ...future.result["stdout"] <- base::list(NULL) [17:27:37.771] } [17:27:37.771] base::close(...future.stdout) [17:27:37.771] ...future.stdout <- NULL [17:27:37.771] } [17:27:37.771] ...future.result$conditions <- ...future.conditions [17:27:37.771] ...future.result$finished <- base::Sys.time() [17:27:37.771] ...future.result [17:27:37.771] } [17:27:37.779] MultisessionFuture started [17:27:37.779] - Launch lazy future ... done [17:27:37.779] run() for 'MultisessionFuture' ... done [17:27:37.780] getGlobalsAndPackages() ... [17:27:37.780] Searching for globals... [17:27:37.781] [17:27:37.781] Searching for globals ... DONE [17:27:37.781] - globals: [0] [17:27:37.781] getGlobalsAndPackages() ... DONE [17:27:37.782] run() for 'Future' ... [17:27:37.782] - state: 'created' [17:27:37.782] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.801] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.801] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.801] - Field: 'node' [17:27:37.802] - Field: 'label' [17:27:37.802] - Field: 'local' [17:27:37.802] - Field: 'owner' [17:27:37.803] - Field: 'envir' [17:27:37.803] - Field: 'workers' [17:27:37.803] - Field: 'packages' [17:27:37.803] - Field: 'gc' [17:27:37.804] - Field: 'conditions' [17:27:37.804] - Field: 'persistent' [17:27:37.804] - Field: 'expr' [17:27:37.804] - Field: 'uuid' [17:27:37.805] - Field: 'seed' [17:27:37.805] - Field: 'version' [17:27:37.805] - Field: 'result' [17:27:37.805] - Field: 'asynchronous' [17:27:37.806] - Field: 'calls' [17:27:37.806] - Field: 'globals' [17:27:37.806] - Field: 'stdout' [17:27:37.806] - Field: 'earlySignal' [17:27:37.807] - Field: 'lazy' [17:27:37.807] - Field: 'state' [17:27:37.807] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.808] - Launch lazy future ... [17:27:37.808] Packages needed by the future expression (n = 0): [17:27:37.808] Packages needed by future strategies (n = 0): [17:27:37.809] { [17:27:37.809] { [17:27:37.809] { [17:27:37.809] ...future.startTime <- base::Sys.time() [17:27:37.809] { [17:27:37.809] { [17:27:37.809] { [17:27:37.809] { [17:27:37.809] base::local({ [17:27:37.809] has_future <- base::requireNamespace("future", [17:27:37.809] quietly = TRUE) [17:27:37.809] if (has_future) { [17:27:37.809] ns <- base::getNamespace("future") [17:27:37.809] version <- ns[[".package"]][["version"]] [17:27:37.809] if (is.null(version)) [17:27:37.809] version <- utils::packageVersion("future") [17:27:37.809] } [17:27:37.809] else { [17:27:37.809] version <- NULL [17:27:37.809] } [17:27:37.809] if (!has_future || version < "1.8.0") { [17:27:37.809] info <- base::c(r_version = base::gsub("R version ", [17:27:37.809] "", base::R.version$version.string), [17:27:37.809] platform = base::sprintf("%s (%s-bit)", [17:27:37.809] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.809] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.809] "release", "version")], collapse = " "), [17:27:37.809] hostname = base::Sys.info()[["nodename"]]) [17:27:37.809] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.809] info) [17:27:37.809] info <- base::paste(info, collapse = "; ") [17:27:37.809] if (!has_future) { [17:27:37.809] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.809] info) [17:27:37.809] } [17:27:37.809] else { [17:27:37.809] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.809] info, version) [17:27:37.809] } [17:27:37.809] base::stop(msg) [17:27:37.809] } [17:27:37.809] }) [17:27:37.809] } [17:27:37.809] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.809] base::options(mc.cores = 1L) [17:27:37.809] } [17:27:37.809] ...future.strategy.old <- future::plan("list") [17:27:37.809] options(future.plan = NULL) [17:27:37.809] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.809] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.809] } [17:27:37.809] ...future.workdir <- getwd() [17:27:37.809] } [17:27:37.809] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.809] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.809] } [17:27:37.809] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.809] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.809] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.809] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.809] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.809] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.809] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.809] base::names(...future.oldOptions)) [17:27:37.809] } [17:27:37.809] if (FALSE) { [17:27:37.809] } [17:27:37.809] else { [17:27:37.809] if (TRUE) { [17:27:37.809] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.809] open = "w") [17:27:37.809] } [17:27:37.809] else { [17:27:37.809] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.809] windows = "NUL", "/dev/null"), open = "w") [17:27:37.809] } [17:27:37.809] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.809] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.809] base::sink(type = "output", split = FALSE) [17:27:37.809] base::close(...future.stdout) [17:27:37.809] }, add = TRUE) [17:27:37.809] } [17:27:37.809] ...future.frame <- base::sys.nframe() [17:27:37.809] ...future.conditions <- base::list() [17:27:37.809] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.809] if (FALSE) { [17:27:37.809] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.809] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.809] } [17:27:37.809] ...future.result <- base::tryCatch({ [17:27:37.809] base::withCallingHandlers({ [17:27:37.809] ...future.value <- base::withVisible(base::local({ [17:27:37.809] ...future.makeSendCondition <- base::local({ [17:27:37.809] sendCondition <- NULL [17:27:37.809] function(frame = 1L) { [17:27:37.809] if (is.function(sendCondition)) [17:27:37.809] return(sendCondition) [17:27:37.809] ns <- getNamespace("parallel") [17:27:37.809] if (exists("sendData", mode = "function", [17:27:37.809] envir = ns)) { [17:27:37.809] parallel_sendData <- get("sendData", mode = "function", [17:27:37.809] envir = ns) [17:27:37.809] envir <- sys.frame(frame) [17:27:37.809] master <- NULL [17:27:37.809] while (!identical(envir, .GlobalEnv) && [17:27:37.809] !identical(envir, emptyenv())) { [17:27:37.809] if (exists("master", mode = "list", envir = envir, [17:27:37.809] inherits = FALSE)) { [17:27:37.809] master <- get("master", mode = "list", [17:27:37.809] envir = envir, inherits = FALSE) [17:27:37.809] if (inherits(master, c("SOCKnode", [17:27:37.809] "SOCK0node"))) { [17:27:37.809] sendCondition <<- function(cond) { [17:27:37.809] data <- list(type = "VALUE", value = cond, [17:27:37.809] success = TRUE) [17:27:37.809] parallel_sendData(master, data) [17:27:37.809] } [17:27:37.809] return(sendCondition) [17:27:37.809] } [17:27:37.809] } [17:27:37.809] frame <- frame + 1L [17:27:37.809] envir <- sys.frame(frame) [17:27:37.809] } [17:27:37.809] } [17:27:37.809] sendCondition <<- function(cond) NULL [17:27:37.809] } [17:27:37.809] }) [17:27:37.809] withCallingHandlers({ [17:27:37.809] NULL [17:27:37.809] }, immediateCondition = function(cond) { [17:27:37.809] sendCondition <- ...future.makeSendCondition() [17:27:37.809] sendCondition(cond) [17:27:37.809] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.809] { [17:27:37.809] inherits <- base::inherits [17:27:37.809] invokeRestart <- base::invokeRestart [17:27:37.809] is.null <- base::is.null [17:27:37.809] muffled <- FALSE [17:27:37.809] if (inherits(cond, "message")) { [17:27:37.809] muffled <- grepl(pattern, "muffleMessage") [17:27:37.809] if (muffled) [17:27:37.809] invokeRestart("muffleMessage") [17:27:37.809] } [17:27:37.809] else if (inherits(cond, "warning")) { [17:27:37.809] muffled <- grepl(pattern, "muffleWarning") [17:27:37.809] if (muffled) [17:27:37.809] invokeRestart("muffleWarning") [17:27:37.809] } [17:27:37.809] else if (inherits(cond, "condition")) { [17:27:37.809] if (!is.null(pattern)) { [17:27:37.809] computeRestarts <- base::computeRestarts [17:27:37.809] grepl <- base::grepl [17:27:37.809] restarts <- computeRestarts(cond) [17:27:37.809] for (restart in restarts) { [17:27:37.809] name <- restart$name [17:27:37.809] if (is.null(name)) [17:27:37.809] next [17:27:37.809] if (!grepl(pattern, name)) [17:27:37.809] next [17:27:37.809] invokeRestart(restart) [17:27:37.809] muffled <- TRUE [17:27:37.809] break [17:27:37.809] } [17:27:37.809] } [17:27:37.809] } [17:27:37.809] invisible(muffled) [17:27:37.809] } [17:27:37.809] muffleCondition(cond) [17:27:37.809] }) [17:27:37.809] })) [17:27:37.809] future::FutureResult(value = ...future.value$value, [17:27:37.809] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.809] ...future.rng), globalenv = if (FALSE) [17:27:37.809] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.809] ...future.globalenv.names)) [17:27:37.809] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.809] }, condition = base::local({ [17:27:37.809] c <- base::c [17:27:37.809] inherits <- base::inherits [17:27:37.809] invokeRestart <- base::invokeRestart [17:27:37.809] length <- base::length [17:27:37.809] list <- base::list [17:27:37.809] seq.int <- base::seq.int [17:27:37.809] signalCondition <- base::signalCondition [17:27:37.809] sys.calls <- base::sys.calls [17:27:37.809] `[[` <- base::`[[` [17:27:37.809] `+` <- base::`+` [17:27:37.809] `<<-` <- base::`<<-` [17:27:37.809] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.809] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.809] 3L)] [17:27:37.809] } [17:27:37.809] function(cond) { [17:27:37.809] is_error <- inherits(cond, "error") [17:27:37.809] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.809] NULL) [17:27:37.809] if (is_error) { [17:27:37.809] sessionInformation <- function() { [17:27:37.809] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.809] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.809] search = base::search(), system = base::Sys.info()) [17:27:37.809] } [17:27:37.809] ...future.conditions[[length(...future.conditions) + [17:27:37.809] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.809] cond$call), session = sessionInformation(), [17:27:37.809] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.809] signalCondition(cond) [17:27:37.809] } [17:27:37.809] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.809] "immediateCondition"))) { [17:27:37.809] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.809] ...future.conditions[[length(...future.conditions) + [17:27:37.809] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.809] if (TRUE && !signal) { [17:27:37.809] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.809] { [17:27:37.809] inherits <- base::inherits [17:27:37.809] invokeRestart <- base::invokeRestart [17:27:37.809] is.null <- base::is.null [17:27:37.809] muffled <- FALSE [17:27:37.809] if (inherits(cond, "message")) { [17:27:37.809] muffled <- grepl(pattern, "muffleMessage") [17:27:37.809] if (muffled) [17:27:37.809] invokeRestart("muffleMessage") [17:27:37.809] } [17:27:37.809] else if (inherits(cond, "warning")) { [17:27:37.809] muffled <- grepl(pattern, "muffleWarning") [17:27:37.809] if (muffled) [17:27:37.809] invokeRestart("muffleWarning") [17:27:37.809] } [17:27:37.809] else if (inherits(cond, "condition")) { [17:27:37.809] if (!is.null(pattern)) { [17:27:37.809] computeRestarts <- base::computeRestarts [17:27:37.809] grepl <- base::grepl [17:27:37.809] restarts <- computeRestarts(cond) [17:27:37.809] for (restart in restarts) { [17:27:37.809] name <- restart$name [17:27:37.809] if (is.null(name)) [17:27:37.809] next [17:27:37.809] if (!grepl(pattern, name)) [17:27:37.809] next [17:27:37.809] invokeRestart(restart) [17:27:37.809] muffled <- TRUE [17:27:37.809] break [17:27:37.809] } [17:27:37.809] } [17:27:37.809] } [17:27:37.809] invisible(muffled) [17:27:37.809] } [17:27:37.809] muffleCondition(cond, pattern = "^muffle") [17:27:37.809] } [17:27:37.809] } [17:27:37.809] else { [17:27:37.809] if (TRUE) { [17:27:37.809] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.809] { [17:27:37.809] inherits <- base::inherits [17:27:37.809] invokeRestart <- base::invokeRestart [17:27:37.809] is.null <- base::is.null [17:27:37.809] muffled <- FALSE [17:27:37.809] if (inherits(cond, "message")) { [17:27:37.809] muffled <- grepl(pattern, "muffleMessage") [17:27:37.809] if (muffled) [17:27:37.809] invokeRestart("muffleMessage") [17:27:37.809] } [17:27:37.809] else if (inherits(cond, "warning")) { [17:27:37.809] muffled <- grepl(pattern, "muffleWarning") [17:27:37.809] if (muffled) [17:27:37.809] invokeRestart("muffleWarning") [17:27:37.809] } [17:27:37.809] else if (inherits(cond, "condition")) { [17:27:37.809] if (!is.null(pattern)) { [17:27:37.809] computeRestarts <- base::computeRestarts [17:27:37.809] grepl <- base::grepl [17:27:37.809] restarts <- computeRestarts(cond) [17:27:37.809] for (restart in restarts) { [17:27:37.809] name <- restart$name [17:27:37.809] if (is.null(name)) [17:27:37.809] next [17:27:37.809] if (!grepl(pattern, name)) [17:27:37.809] next [17:27:37.809] invokeRestart(restart) [17:27:37.809] muffled <- TRUE [17:27:37.809] break [17:27:37.809] } [17:27:37.809] } [17:27:37.809] } [17:27:37.809] invisible(muffled) [17:27:37.809] } [17:27:37.809] muffleCondition(cond, pattern = "^muffle") [17:27:37.809] } [17:27:37.809] } [17:27:37.809] } [17:27:37.809] })) [17:27:37.809] }, error = function(ex) { [17:27:37.809] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.809] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.809] ...future.rng), started = ...future.startTime, [17:27:37.809] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.809] version = "1.8"), class = "FutureResult") [17:27:37.809] }, finally = { [17:27:37.809] if (!identical(...future.workdir, getwd())) [17:27:37.809] setwd(...future.workdir) [17:27:37.809] { [17:27:37.809] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.809] ...future.oldOptions$nwarnings <- NULL [17:27:37.809] } [17:27:37.809] base::options(...future.oldOptions) [17:27:37.809] if (.Platform$OS.type == "windows") { [17:27:37.809] old_names <- names(...future.oldEnvVars) [17:27:37.809] envs <- base::Sys.getenv() [17:27:37.809] names <- names(envs) [17:27:37.809] common <- intersect(names, old_names) [17:27:37.809] added <- setdiff(names, old_names) [17:27:37.809] removed <- setdiff(old_names, names) [17:27:37.809] changed <- common[...future.oldEnvVars[common] != [17:27:37.809] envs[common]] [17:27:37.809] NAMES <- toupper(changed) [17:27:37.809] args <- list() [17:27:37.809] for (kk in seq_along(NAMES)) { [17:27:37.809] name <- changed[[kk]] [17:27:37.809] NAME <- NAMES[[kk]] [17:27:37.809] if (name != NAME && is.element(NAME, old_names)) [17:27:37.809] next [17:27:37.809] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.809] } [17:27:37.809] NAMES <- toupper(added) [17:27:37.809] for (kk in seq_along(NAMES)) { [17:27:37.809] name <- added[[kk]] [17:27:37.809] NAME <- NAMES[[kk]] [17:27:37.809] if (name != NAME && is.element(NAME, old_names)) [17:27:37.809] next [17:27:37.809] args[[name]] <- "" [17:27:37.809] } [17:27:37.809] NAMES <- toupper(removed) [17:27:37.809] for (kk in seq_along(NAMES)) { [17:27:37.809] name <- removed[[kk]] [17:27:37.809] NAME <- NAMES[[kk]] [17:27:37.809] if (name != NAME && is.element(NAME, old_names)) [17:27:37.809] next [17:27:37.809] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.809] } [17:27:37.809] if (length(args) > 0) [17:27:37.809] base::do.call(base::Sys.setenv, args = args) [17:27:37.809] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.809] } [17:27:37.809] else { [17:27:37.809] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.809] } [17:27:37.809] { [17:27:37.809] if (base::length(...future.futureOptionsAdded) > [17:27:37.809] 0L) { [17:27:37.809] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.809] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.809] base::options(opts) [17:27:37.809] } [17:27:37.809] { [17:27:37.809] { [17:27:37.809] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.809] NULL [17:27:37.809] } [17:27:37.809] options(future.plan = NULL) [17:27:37.809] if (is.na(NA_character_)) [17:27:37.809] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.809] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.809] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.809] .init = FALSE) [17:27:37.809] } [17:27:37.809] } [17:27:37.809] } [17:27:37.809] }) [17:27:37.809] if (TRUE) { [17:27:37.809] base::sink(type = "output", split = FALSE) [17:27:37.809] if (TRUE) { [17:27:37.809] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.809] } [17:27:37.809] else { [17:27:37.809] ...future.result["stdout"] <- base::list(NULL) [17:27:37.809] } [17:27:37.809] base::close(...future.stdout) [17:27:37.809] ...future.stdout <- NULL [17:27:37.809] } [17:27:37.809] ...future.result$conditions <- ...future.conditions [17:27:37.809] ...future.result$finished <- base::Sys.time() [17:27:37.809] ...future.result [17:27:37.809] } [17:27:37.819] MultisessionFuture started [17:27:37.819] - Launch lazy future ... done [17:27:37.820] run() for 'MultisessionFuture' ... done List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 2 3 - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" [17:27:37.833] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.834] - Validating connection of MultisessionFuture [17:27:37.834] - received message: FutureResult [17:27:37.835] - Received FutureResult [17:27:37.835] - Erased future from FutureRegistry [17:27:37.835] result() for ClusterFuture ... [17:27:37.836] - result already collected: FutureResult [17:27:37.836] result() for ClusterFuture ... done [17:27:37.837] receiveMessageFromWorker() for ClusterFuture ... done [17:27:37.850] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.851] - Validating connection of MultisessionFuture [17:27:37.852] - received message: FutureResult [17:27:37.852] - Received FutureResult [17:27:37.852] - Erased future from FutureRegistry [17:27:37.853] result() for ClusterFuture ... [17:27:37.853] - result already collected: FutureResult [17:27:37.853] result() for ClusterFuture ... done [17:27:37.854] receiveMessageFromWorker() for ClusterFuture ... done logi [1:2, 1:3] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:37.857] resolve() on list ... [17:27:37.858] recursive: 0 [17:27:37.858] length: 6 [17:27:37.858] elements: 'a', 'b', 'c', '', '', '' [17:27:37.859] signalConditionsASAP(numeric, pos=1) ... [17:27:37.859] - nx: 6 [17:27:37.859] - relay: TRUE [17:27:37.859] - stdout: TRUE [17:27:37.860] - signal: TRUE [17:27:37.860] - resignal: FALSE [17:27:37.860] - force: TRUE [17:27:37.861] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.861] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.862] - until=2 [17:27:37.862] - relaying element #2 [17:27:37.862] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.866] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.866] signalConditionsASAP(NULL, pos=1) ... done [17:27:37.866] length: 5 (resolved future 1) [17:27:37.867] Future #2 [17:27:37.867] result() for ClusterFuture ... [17:27:37.867] - result already collected: FutureResult [17:27:37.867] result() for ClusterFuture ... done [17:27:37.868] result() for ClusterFuture ... [17:27:37.868] - result already collected: FutureResult [17:27:37.868] result() for ClusterFuture ... done [17:27:37.869] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:37.869] - nx: 6 [17:27:37.869] - relay: TRUE [17:27:37.869] - stdout: TRUE [17:27:37.870] - signal: TRUE [17:27:37.870] - resignal: FALSE [17:27:37.870] - force: TRUE [17:27:37.871] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.871] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:37.871] - until=2 [17:27:37.871] - relaying element #2 [17:27:37.872] result() for ClusterFuture ... [17:27:37.872] - result already collected: FutureResult [17:27:37.872] result() for ClusterFuture ... done [17:27:37.872] result() for ClusterFuture ... [17:27:37.873] - result already collected: FutureResult [17:27:37.873] result() for ClusterFuture ... done [17:27:37.873] result() for ClusterFuture ... [17:27:37.874] - result already collected: FutureResult [17:27:37.874] result() for ClusterFuture ... done [17:27:37.874] result() for ClusterFuture ... [17:27:37.874] - result already collected: FutureResult [17:27:37.875] result() for ClusterFuture ... done [17:27:37.875] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.875] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.876] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:37.876] length: 4 (resolved future 2) [17:27:37.876] Future #3 [17:27:37.876] result() for ClusterFuture ... [17:27:37.877] - result already collected: FutureResult [17:27:37.877] result() for ClusterFuture ... done [17:27:37.877] result() for ClusterFuture ... [17:27:37.877] - result already collected: FutureResult [17:27:37.877] result() for ClusterFuture ... done [17:27:37.878] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:37.878] - nx: 6 [17:27:37.878] - relay: TRUE [17:27:37.878] - stdout: TRUE [17:27:37.878] - signal: TRUE [17:27:37.878] - resignal: FALSE [17:27:37.878] - force: TRUE [17:27:37.879] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.879] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:37.879] - until=3 [17:27:37.879] - relaying element #3 [17:27:37.880] result() for ClusterFuture ... [17:27:37.880] - result already collected: FutureResult [17:27:37.880] result() for ClusterFuture ... done [17:27:37.880] result() for ClusterFuture ... [17:27:37.881] - result already collected: FutureResult [17:27:37.881] result() for ClusterFuture ... done [17:27:37.881] result() for ClusterFuture ... [17:27:37.881] - result already collected: FutureResult [17:27:37.881] result() for ClusterFuture ... done [17:27:37.881] result() for ClusterFuture ... [17:27:37.882] - result already collected: FutureResult [17:27:37.882] result() for ClusterFuture ... done [17:27:37.882] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.882] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.882] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:37.882] length: 3 (resolved future 3) [17:27:37.883] signalConditionsASAP(NULL, pos=4) ... [17:27:37.883] - nx: 6 [17:27:37.883] - relay: TRUE [17:27:37.883] - stdout: TRUE [17:27:37.883] - signal: TRUE [17:27:37.883] - resignal: FALSE [17:27:37.884] - force: TRUE [17:27:37.884] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.884] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.884] - until=5 [17:27:37.884] - relaying element #5 [17:27:37.884] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:37.885] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.885] signalConditionsASAP(NULL, pos=4) ... done [17:27:37.885] length: 2 (resolved future 4) [17:27:37.885] signalConditionsASAP(NULL, pos=5) ... [17:27:37.885] - nx: 6 [17:27:37.885] - relay: TRUE [17:27:37.886] - stdout: TRUE [17:27:37.886] - signal: TRUE [17:27:37.886] - resignal: FALSE [17:27:37.886] - force: TRUE [17:27:37.886] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:37.887] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.887] - until=6 [17:27:37.887] - relaying element #6 [17:27:37.887] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:37.888] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.888] signalConditionsASAP(NULL, pos=5) ... done [17:27:37.888] length: 1 (resolved future 5) [17:27:37.889] signalConditionsASAP(numeric, pos=6) ... [17:27:37.889] - nx: 6 [17:27:37.889] - relay: TRUE [17:27:37.889] - stdout: TRUE [17:27:37.889] - signal: TRUE [17:27:37.889] - resignal: FALSE [17:27:37.890] - force: TRUE [17:27:37.890] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:37.890] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.890] - until=6 [17:27:37.890] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.890] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.891] signalConditionsASAP(numeric, pos=6) ... done [17:27:37.891] length: 0 (resolved future 6) [17:27:37.891] Relaying remaining futures [17:27:37.891] signalConditionsASAP(NULL, pos=0) ... [17:27:37.891] - nx: 6 [17:27:37.891] - relay: TRUE [17:27:37.891] - stdout: TRUE [17:27:37.892] - signal: TRUE [17:27:37.892] - resignal: FALSE [17:27:37.892] - force: TRUE [17:27:37.892] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.893] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:37.893] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:37.893] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:37.894] signalConditionsASAP(NULL, pos=0) ... done [17:27:37.894] resolve() on list ... DONE [17:27:37.894] result() for ClusterFuture ... [17:27:37.894] - result already collected: FutureResult [17:27:37.895] result() for ClusterFuture ... done [17:27:37.895] result() for ClusterFuture ... [17:27:37.895] - result already collected: FutureResult [17:27:37.895] result() for ClusterFuture ... done [17:27:37.895] result() for ClusterFuture ... [17:27:37.895] - result already collected: FutureResult [17:27:37.896] result() for ClusterFuture ... done [17:27:37.896] result() for ClusterFuture ... [17:27:37.896] - result already collected: FutureResult [17:27:37.896] result() for ClusterFuture ... done List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:2] 2 3 - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" Dimensions: c(2, 3, 1) [17:27:37.900] getGlobalsAndPackages() ... [17:27:37.900] Searching for globals... [17:27:37.901] [17:27:37.901] Searching for globals ... DONE [17:27:37.901] - globals: [0] [17:27:37.901] getGlobalsAndPackages() ... DONE [17:27:37.902] run() for 'Future' ... [17:27:37.902] - state: 'created' [17:27:37.902] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.921] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.922] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.922] - Field: 'node' [17:27:37.922] - Field: 'label' [17:27:37.922] - Field: 'local' [17:27:37.923] - Field: 'owner' [17:27:37.923] - Field: 'envir' [17:27:37.923] - Field: 'workers' [17:27:37.924] - Field: 'packages' [17:27:37.924] - Field: 'gc' [17:27:37.924] - Field: 'conditions' [17:27:37.925] - Field: 'persistent' [17:27:37.925] - Field: 'expr' [17:27:37.925] - Field: 'uuid' [17:27:37.926] - Field: 'seed' [17:27:37.926] - Field: 'version' [17:27:37.926] - Field: 'result' [17:27:37.926] - Field: 'asynchronous' [17:27:37.927] - Field: 'calls' [17:27:37.927] - Field: 'globals' [17:27:37.927] - Field: 'stdout' [17:27:37.928] - Field: 'earlySignal' [17:27:37.928] - Field: 'lazy' [17:27:37.928] - Field: 'state' [17:27:37.929] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.929] - Launch lazy future ... [17:27:37.930] Packages needed by the future expression (n = 0): [17:27:37.930] Packages needed by future strategies (n = 0): [17:27:37.931] { [17:27:37.931] { [17:27:37.931] { [17:27:37.931] ...future.startTime <- base::Sys.time() [17:27:37.931] { [17:27:37.931] { [17:27:37.931] { [17:27:37.931] { [17:27:37.931] base::local({ [17:27:37.931] has_future <- base::requireNamespace("future", [17:27:37.931] quietly = TRUE) [17:27:37.931] if (has_future) { [17:27:37.931] ns <- base::getNamespace("future") [17:27:37.931] version <- ns[[".package"]][["version"]] [17:27:37.931] if (is.null(version)) [17:27:37.931] version <- utils::packageVersion("future") [17:27:37.931] } [17:27:37.931] else { [17:27:37.931] version <- NULL [17:27:37.931] } [17:27:37.931] if (!has_future || version < "1.8.0") { [17:27:37.931] info <- base::c(r_version = base::gsub("R version ", [17:27:37.931] "", base::R.version$version.string), [17:27:37.931] platform = base::sprintf("%s (%s-bit)", [17:27:37.931] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.931] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.931] "release", "version")], collapse = " "), [17:27:37.931] hostname = base::Sys.info()[["nodename"]]) [17:27:37.931] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.931] info) [17:27:37.931] info <- base::paste(info, collapse = "; ") [17:27:37.931] if (!has_future) { [17:27:37.931] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.931] info) [17:27:37.931] } [17:27:37.931] else { [17:27:37.931] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.931] info, version) [17:27:37.931] } [17:27:37.931] base::stop(msg) [17:27:37.931] } [17:27:37.931] }) [17:27:37.931] } [17:27:37.931] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.931] base::options(mc.cores = 1L) [17:27:37.931] } [17:27:37.931] ...future.strategy.old <- future::plan("list") [17:27:37.931] options(future.plan = NULL) [17:27:37.931] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.931] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.931] } [17:27:37.931] ...future.workdir <- getwd() [17:27:37.931] } [17:27:37.931] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.931] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.931] } [17:27:37.931] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.931] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.931] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.931] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.931] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.931] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.931] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.931] base::names(...future.oldOptions)) [17:27:37.931] } [17:27:37.931] if (FALSE) { [17:27:37.931] } [17:27:37.931] else { [17:27:37.931] if (TRUE) { [17:27:37.931] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.931] open = "w") [17:27:37.931] } [17:27:37.931] else { [17:27:37.931] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.931] windows = "NUL", "/dev/null"), open = "w") [17:27:37.931] } [17:27:37.931] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.931] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.931] base::sink(type = "output", split = FALSE) [17:27:37.931] base::close(...future.stdout) [17:27:37.931] }, add = TRUE) [17:27:37.931] } [17:27:37.931] ...future.frame <- base::sys.nframe() [17:27:37.931] ...future.conditions <- base::list() [17:27:37.931] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.931] if (FALSE) { [17:27:37.931] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.931] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.931] } [17:27:37.931] ...future.result <- base::tryCatch({ [17:27:37.931] base::withCallingHandlers({ [17:27:37.931] ...future.value <- base::withVisible(base::local({ [17:27:37.931] ...future.makeSendCondition <- base::local({ [17:27:37.931] sendCondition <- NULL [17:27:37.931] function(frame = 1L) { [17:27:37.931] if (is.function(sendCondition)) [17:27:37.931] return(sendCondition) [17:27:37.931] ns <- getNamespace("parallel") [17:27:37.931] if (exists("sendData", mode = "function", [17:27:37.931] envir = ns)) { [17:27:37.931] parallel_sendData <- get("sendData", mode = "function", [17:27:37.931] envir = ns) [17:27:37.931] envir <- sys.frame(frame) [17:27:37.931] master <- NULL [17:27:37.931] while (!identical(envir, .GlobalEnv) && [17:27:37.931] !identical(envir, emptyenv())) { [17:27:37.931] if (exists("master", mode = "list", envir = envir, [17:27:37.931] inherits = FALSE)) { [17:27:37.931] master <- get("master", mode = "list", [17:27:37.931] envir = envir, inherits = FALSE) [17:27:37.931] if (inherits(master, c("SOCKnode", [17:27:37.931] "SOCK0node"))) { [17:27:37.931] sendCondition <<- function(cond) { [17:27:37.931] data <- list(type = "VALUE", value = cond, [17:27:37.931] success = TRUE) [17:27:37.931] parallel_sendData(master, data) [17:27:37.931] } [17:27:37.931] return(sendCondition) [17:27:37.931] } [17:27:37.931] } [17:27:37.931] frame <- frame + 1L [17:27:37.931] envir <- sys.frame(frame) [17:27:37.931] } [17:27:37.931] } [17:27:37.931] sendCondition <<- function(cond) NULL [17:27:37.931] } [17:27:37.931] }) [17:27:37.931] withCallingHandlers({ [17:27:37.931] 2 [17:27:37.931] }, immediateCondition = function(cond) { [17:27:37.931] sendCondition <- ...future.makeSendCondition() [17:27:37.931] sendCondition(cond) [17:27:37.931] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.931] { [17:27:37.931] inherits <- base::inherits [17:27:37.931] invokeRestart <- base::invokeRestart [17:27:37.931] is.null <- base::is.null [17:27:37.931] muffled <- FALSE [17:27:37.931] if (inherits(cond, "message")) { [17:27:37.931] muffled <- grepl(pattern, "muffleMessage") [17:27:37.931] if (muffled) [17:27:37.931] invokeRestart("muffleMessage") [17:27:37.931] } [17:27:37.931] else if (inherits(cond, "warning")) { [17:27:37.931] muffled <- grepl(pattern, "muffleWarning") [17:27:37.931] if (muffled) [17:27:37.931] invokeRestart("muffleWarning") [17:27:37.931] } [17:27:37.931] else if (inherits(cond, "condition")) { [17:27:37.931] if (!is.null(pattern)) { [17:27:37.931] computeRestarts <- base::computeRestarts [17:27:37.931] grepl <- base::grepl [17:27:37.931] restarts <- computeRestarts(cond) [17:27:37.931] for (restart in restarts) { [17:27:37.931] name <- restart$name [17:27:37.931] if (is.null(name)) [17:27:37.931] next [17:27:37.931] if (!grepl(pattern, name)) [17:27:37.931] next [17:27:37.931] invokeRestart(restart) [17:27:37.931] muffled <- TRUE [17:27:37.931] break [17:27:37.931] } [17:27:37.931] } [17:27:37.931] } [17:27:37.931] invisible(muffled) [17:27:37.931] } [17:27:37.931] muffleCondition(cond) [17:27:37.931] }) [17:27:37.931] })) [17:27:37.931] future::FutureResult(value = ...future.value$value, [17:27:37.931] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.931] ...future.rng), globalenv = if (FALSE) [17:27:37.931] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.931] ...future.globalenv.names)) [17:27:37.931] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.931] }, condition = base::local({ [17:27:37.931] c <- base::c [17:27:37.931] inherits <- base::inherits [17:27:37.931] invokeRestart <- base::invokeRestart [17:27:37.931] length <- base::length [17:27:37.931] list <- base::list [17:27:37.931] seq.int <- base::seq.int [17:27:37.931] signalCondition <- base::signalCondition [17:27:37.931] sys.calls <- base::sys.calls [17:27:37.931] `[[` <- base::`[[` [17:27:37.931] `+` <- base::`+` [17:27:37.931] `<<-` <- base::`<<-` [17:27:37.931] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.931] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.931] 3L)] [17:27:37.931] } [17:27:37.931] function(cond) { [17:27:37.931] is_error <- inherits(cond, "error") [17:27:37.931] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.931] NULL) [17:27:37.931] if (is_error) { [17:27:37.931] sessionInformation <- function() { [17:27:37.931] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.931] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.931] search = base::search(), system = base::Sys.info()) [17:27:37.931] } [17:27:37.931] ...future.conditions[[length(...future.conditions) + [17:27:37.931] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.931] cond$call), session = sessionInformation(), [17:27:37.931] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.931] signalCondition(cond) [17:27:37.931] } [17:27:37.931] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.931] "immediateCondition"))) { [17:27:37.931] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.931] ...future.conditions[[length(...future.conditions) + [17:27:37.931] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.931] if (TRUE && !signal) { [17:27:37.931] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.931] { [17:27:37.931] inherits <- base::inherits [17:27:37.931] invokeRestart <- base::invokeRestart [17:27:37.931] is.null <- base::is.null [17:27:37.931] muffled <- FALSE [17:27:37.931] if (inherits(cond, "message")) { [17:27:37.931] muffled <- grepl(pattern, "muffleMessage") [17:27:37.931] if (muffled) [17:27:37.931] invokeRestart("muffleMessage") [17:27:37.931] } [17:27:37.931] else if (inherits(cond, "warning")) { [17:27:37.931] muffled <- grepl(pattern, "muffleWarning") [17:27:37.931] if (muffled) [17:27:37.931] invokeRestart("muffleWarning") [17:27:37.931] } [17:27:37.931] else if (inherits(cond, "condition")) { [17:27:37.931] if (!is.null(pattern)) { [17:27:37.931] computeRestarts <- base::computeRestarts [17:27:37.931] grepl <- base::grepl [17:27:37.931] restarts <- computeRestarts(cond) [17:27:37.931] for (restart in restarts) { [17:27:37.931] name <- restart$name [17:27:37.931] if (is.null(name)) [17:27:37.931] next [17:27:37.931] if (!grepl(pattern, name)) [17:27:37.931] next [17:27:37.931] invokeRestart(restart) [17:27:37.931] muffled <- TRUE [17:27:37.931] break [17:27:37.931] } [17:27:37.931] } [17:27:37.931] } [17:27:37.931] invisible(muffled) [17:27:37.931] } [17:27:37.931] muffleCondition(cond, pattern = "^muffle") [17:27:37.931] } [17:27:37.931] } [17:27:37.931] else { [17:27:37.931] if (TRUE) { [17:27:37.931] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.931] { [17:27:37.931] inherits <- base::inherits [17:27:37.931] invokeRestart <- base::invokeRestart [17:27:37.931] is.null <- base::is.null [17:27:37.931] muffled <- FALSE [17:27:37.931] if (inherits(cond, "message")) { [17:27:37.931] muffled <- grepl(pattern, "muffleMessage") [17:27:37.931] if (muffled) [17:27:37.931] invokeRestart("muffleMessage") [17:27:37.931] } [17:27:37.931] else if (inherits(cond, "warning")) { [17:27:37.931] muffled <- grepl(pattern, "muffleWarning") [17:27:37.931] if (muffled) [17:27:37.931] invokeRestart("muffleWarning") [17:27:37.931] } [17:27:37.931] else if (inherits(cond, "condition")) { [17:27:37.931] if (!is.null(pattern)) { [17:27:37.931] computeRestarts <- base::computeRestarts [17:27:37.931] grepl <- base::grepl [17:27:37.931] restarts <- computeRestarts(cond) [17:27:37.931] for (restart in restarts) { [17:27:37.931] name <- restart$name [17:27:37.931] if (is.null(name)) [17:27:37.931] next [17:27:37.931] if (!grepl(pattern, name)) [17:27:37.931] next [17:27:37.931] invokeRestart(restart) [17:27:37.931] muffled <- TRUE [17:27:37.931] break [17:27:37.931] } [17:27:37.931] } [17:27:37.931] } [17:27:37.931] invisible(muffled) [17:27:37.931] } [17:27:37.931] muffleCondition(cond, pattern = "^muffle") [17:27:37.931] } [17:27:37.931] } [17:27:37.931] } [17:27:37.931] })) [17:27:37.931] }, error = function(ex) { [17:27:37.931] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.931] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.931] ...future.rng), started = ...future.startTime, [17:27:37.931] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.931] version = "1.8"), class = "FutureResult") [17:27:37.931] }, finally = { [17:27:37.931] if (!identical(...future.workdir, getwd())) [17:27:37.931] setwd(...future.workdir) [17:27:37.931] { [17:27:37.931] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.931] ...future.oldOptions$nwarnings <- NULL [17:27:37.931] } [17:27:37.931] base::options(...future.oldOptions) [17:27:37.931] if (.Platform$OS.type == "windows") { [17:27:37.931] old_names <- names(...future.oldEnvVars) [17:27:37.931] envs <- base::Sys.getenv() [17:27:37.931] names <- names(envs) [17:27:37.931] common <- intersect(names, old_names) [17:27:37.931] added <- setdiff(names, old_names) [17:27:37.931] removed <- setdiff(old_names, names) [17:27:37.931] changed <- common[...future.oldEnvVars[common] != [17:27:37.931] envs[common]] [17:27:37.931] NAMES <- toupper(changed) [17:27:37.931] args <- list() [17:27:37.931] for (kk in seq_along(NAMES)) { [17:27:37.931] name <- changed[[kk]] [17:27:37.931] NAME <- NAMES[[kk]] [17:27:37.931] if (name != NAME && is.element(NAME, old_names)) [17:27:37.931] next [17:27:37.931] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.931] } [17:27:37.931] NAMES <- toupper(added) [17:27:37.931] for (kk in seq_along(NAMES)) { [17:27:37.931] name <- added[[kk]] [17:27:37.931] NAME <- NAMES[[kk]] [17:27:37.931] if (name != NAME && is.element(NAME, old_names)) [17:27:37.931] next [17:27:37.931] args[[name]] <- "" [17:27:37.931] } [17:27:37.931] NAMES <- toupper(removed) [17:27:37.931] for (kk in seq_along(NAMES)) { [17:27:37.931] name <- removed[[kk]] [17:27:37.931] NAME <- NAMES[[kk]] [17:27:37.931] if (name != NAME && is.element(NAME, old_names)) [17:27:37.931] next [17:27:37.931] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.931] } [17:27:37.931] if (length(args) > 0) [17:27:37.931] base::do.call(base::Sys.setenv, args = args) [17:27:37.931] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.931] } [17:27:37.931] else { [17:27:37.931] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.931] } [17:27:37.931] { [17:27:37.931] if (base::length(...future.futureOptionsAdded) > [17:27:37.931] 0L) { [17:27:37.931] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.931] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.931] base::options(opts) [17:27:37.931] } [17:27:37.931] { [17:27:37.931] { [17:27:37.931] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.931] NULL [17:27:37.931] } [17:27:37.931] options(future.plan = NULL) [17:27:37.931] if (is.na(NA_character_)) [17:27:37.931] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.931] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.931] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.931] .init = FALSE) [17:27:37.931] } [17:27:37.931] } [17:27:37.931] } [17:27:37.931] }) [17:27:37.931] if (TRUE) { [17:27:37.931] base::sink(type = "output", split = FALSE) [17:27:37.931] if (TRUE) { [17:27:37.931] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.931] } [17:27:37.931] else { [17:27:37.931] ...future.result["stdout"] <- base::list(NULL) [17:27:37.931] } [17:27:37.931] base::close(...future.stdout) [17:27:37.931] ...future.stdout <- NULL [17:27:37.931] } [17:27:37.931] ...future.result$conditions <- ...future.conditions [17:27:37.931] ...future.result$finished <- base::Sys.time() [17:27:37.931] ...future.result [17:27:37.931] } [17:27:37.941] MultisessionFuture started [17:27:37.941] - Launch lazy future ... done [17:27:37.941] run() for 'MultisessionFuture' ... done [17:27:37.942] getGlobalsAndPackages() ... [17:27:37.942] Searching for globals... [17:27:37.943] [17:27:37.943] Searching for globals ... DONE [17:27:37.943] - globals: [0] [17:27:37.943] getGlobalsAndPackages() ... DONE [17:27:37.944] run() for 'Future' ... [17:27:37.944] - state: 'created' [17:27:37.945] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:37.964] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:37.964] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:37.965] - Field: 'node' [17:27:37.965] - Field: 'label' [17:27:37.965] - Field: 'local' [17:27:37.966] - Field: 'owner' [17:27:37.966] - Field: 'envir' [17:27:37.966] - Field: 'workers' [17:27:37.967] - Field: 'packages' [17:27:37.967] - Field: 'gc' [17:27:37.967] - Field: 'conditions' [17:27:37.968] - Field: 'persistent' [17:27:37.968] - Field: 'expr' [17:27:37.968] - Field: 'uuid' [17:27:37.969] - Field: 'seed' [17:27:37.969] - Field: 'version' [17:27:37.969] - Field: 'result' [17:27:37.970] - Field: 'asynchronous' [17:27:37.970] - Field: 'calls' [17:27:37.970] - Field: 'globals' [17:27:37.971] - Field: 'stdout' [17:27:37.971] - Field: 'earlySignal' [17:27:37.971] - Field: 'lazy' [17:27:37.972] - Field: 'state' [17:27:37.972] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:37.972] - Launch lazy future ... [17:27:37.973] Packages needed by the future expression (n = 0): [17:27:37.973] Packages needed by future strategies (n = 0): [17:27:37.974] { [17:27:37.974] { [17:27:37.974] { [17:27:37.974] ...future.startTime <- base::Sys.time() [17:27:37.974] { [17:27:37.974] { [17:27:37.974] { [17:27:37.974] { [17:27:37.974] base::local({ [17:27:37.974] has_future <- base::requireNamespace("future", [17:27:37.974] quietly = TRUE) [17:27:37.974] if (has_future) { [17:27:37.974] ns <- base::getNamespace("future") [17:27:37.974] version <- ns[[".package"]][["version"]] [17:27:37.974] if (is.null(version)) [17:27:37.974] version <- utils::packageVersion("future") [17:27:37.974] } [17:27:37.974] else { [17:27:37.974] version <- NULL [17:27:37.974] } [17:27:37.974] if (!has_future || version < "1.8.0") { [17:27:37.974] info <- base::c(r_version = base::gsub("R version ", [17:27:37.974] "", base::R.version$version.string), [17:27:37.974] platform = base::sprintf("%s (%s-bit)", [17:27:37.974] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:37.974] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:37.974] "release", "version")], collapse = " "), [17:27:37.974] hostname = base::Sys.info()[["nodename"]]) [17:27:37.974] info <- base::sprintf("%s: %s", base::names(info), [17:27:37.974] info) [17:27:37.974] info <- base::paste(info, collapse = "; ") [17:27:37.974] if (!has_future) { [17:27:37.974] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:37.974] info) [17:27:37.974] } [17:27:37.974] else { [17:27:37.974] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:37.974] info, version) [17:27:37.974] } [17:27:37.974] base::stop(msg) [17:27:37.974] } [17:27:37.974] }) [17:27:37.974] } [17:27:37.974] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:37.974] base::options(mc.cores = 1L) [17:27:37.974] } [17:27:37.974] ...future.strategy.old <- future::plan("list") [17:27:37.974] options(future.plan = NULL) [17:27:37.974] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.974] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:37.974] } [17:27:37.974] ...future.workdir <- getwd() [17:27:37.974] } [17:27:37.974] ...future.oldOptions <- base::as.list(base::.Options) [17:27:37.974] ...future.oldEnvVars <- base::Sys.getenv() [17:27:37.974] } [17:27:37.974] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:37.974] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:37.974] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:37.974] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:37.974] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:37.974] future.stdout.windows.reencode = NULL, width = 80L) [17:27:37.974] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:37.974] base::names(...future.oldOptions)) [17:27:37.974] } [17:27:37.974] if (FALSE) { [17:27:37.974] } [17:27:37.974] else { [17:27:37.974] if (TRUE) { [17:27:37.974] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:37.974] open = "w") [17:27:37.974] } [17:27:37.974] else { [17:27:37.974] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:37.974] windows = "NUL", "/dev/null"), open = "w") [17:27:37.974] } [17:27:37.974] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:37.974] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:37.974] base::sink(type = "output", split = FALSE) [17:27:37.974] base::close(...future.stdout) [17:27:37.974] }, add = TRUE) [17:27:37.974] } [17:27:37.974] ...future.frame <- base::sys.nframe() [17:27:37.974] ...future.conditions <- base::list() [17:27:37.974] ...future.rng <- base::globalenv()$.Random.seed [17:27:37.974] if (FALSE) { [17:27:37.974] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:37.974] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:37.974] } [17:27:37.974] ...future.result <- base::tryCatch({ [17:27:37.974] base::withCallingHandlers({ [17:27:37.974] ...future.value <- base::withVisible(base::local({ [17:27:37.974] ...future.makeSendCondition <- base::local({ [17:27:37.974] sendCondition <- NULL [17:27:37.974] function(frame = 1L) { [17:27:37.974] if (is.function(sendCondition)) [17:27:37.974] return(sendCondition) [17:27:37.974] ns <- getNamespace("parallel") [17:27:37.974] if (exists("sendData", mode = "function", [17:27:37.974] envir = ns)) { [17:27:37.974] parallel_sendData <- get("sendData", mode = "function", [17:27:37.974] envir = ns) [17:27:37.974] envir <- sys.frame(frame) [17:27:37.974] master <- NULL [17:27:37.974] while (!identical(envir, .GlobalEnv) && [17:27:37.974] !identical(envir, emptyenv())) { [17:27:37.974] if (exists("master", mode = "list", envir = envir, [17:27:37.974] inherits = FALSE)) { [17:27:37.974] master <- get("master", mode = "list", [17:27:37.974] envir = envir, inherits = FALSE) [17:27:37.974] if (inherits(master, c("SOCKnode", [17:27:37.974] "SOCK0node"))) { [17:27:37.974] sendCondition <<- function(cond) { [17:27:37.974] data <- list(type = "VALUE", value = cond, [17:27:37.974] success = TRUE) [17:27:37.974] parallel_sendData(master, data) [17:27:37.974] } [17:27:37.974] return(sendCondition) [17:27:37.974] } [17:27:37.974] } [17:27:37.974] frame <- frame + 1L [17:27:37.974] envir <- sys.frame(frame) [17:27:37.974] } [17:27:37.974] } [17:27:37.974] sendCondition <<- function(cond) NULL [17:27:37.974] } [17:27:37.974] }) [17:27:37.974] withCallingHandlers({ [17:27:37.974] NULL [17:27:37.974] }, immediateCondition = function(cond) { [17:27:37.974] sendCondition <- ...future.makeSendCondition() [17:27:37.974] sendCondition(cond) [17:27:37.974] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.974] { [17:27:37.974] inherits <- base::inherits [17:27:37.974] invokeRestart <- base::invokeRestart [17:27:37.974] is.null <- base::is.null [17:27:37.974] muffled <- FALSE [17:27:37.974] if (inherits(cond, "message")) { [17:27:37.974] muffled <- grepl(pattern, "muffleMessage") [17:27:37.974] if (muffled) [17:27:37.974] invokeRestart("muffleMessage") [17:27:37.974] } [17:27:37.974] else if (inherits(cond, "warning")) { [17:27:37.974] muffled <- grepl(pattern, "muffleWarning") [17:27:37.974] if (muffled) [17:27:37.974] invokeRestart("muffleWarning") [17:27:37.974] } [17:27:37.974] else if (inherits(cond, "condition")) { [17:27:37.974] if (!is.null(pattern)) { [17:27:37.974] computeRestarts <- base::computeRestarts [17:27:37.974] grepl <- base::grepl [17:27:37.974] restarts <- computeRestarts(cond) [17:27:37.974] for (restart in restarts) { [17:27:37.974] name <- restart$name [17:27:37.974] if (is.null(name)) [17:27:37.974] next [17:27:37.974] if (!grepl(pattern, name)) [17:27:37.974] next [17:27:37.974] invokeRestart(restart) [17:27:37.974] muffled <- TRUE [17:27:37.974] break [17:27:37.974] } [17:27:37.974] } [17:27:37.974] } [17:27:37.974] invisible(muffled) [17:27:37.974] } [17:27:37.974] muffleCondition(cond) [17:27:37.974] }) [17:27:37.974] })) [17:27:37.974] future::FutureResult(value = ...future.value$value, [17:27:37.974] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.974] ...future.rng), globalenv = if (FALSE) [17:27:37.974] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:37.974] ...future.globalenv.names)) [17:27:37.974] else NULL, started = ...future.startTime, version = "1.8") [17:27:37.974] }, condition = base::local({ [17:27:37.974] c <- base::c [17:27:37.974] inherits <- base::inherits [17:27:37.974] invokeRestart <- base::invokeRestart [17:27:37.974] length <- base::length [17:27:37.974] list <- base::list [17:27:37.974] seq.int <- base::seq.int [17:27:37.974] signalCondition <- base::signalCondition [17:27:37.974] sys.calls <- base::sys.calls [17:27:37.974] `[[` <- base::`[[` [17:27:37.974] `+` <- base::`+` [17:27:37.974] `<<-` <- base::`<<-` [17:27:37.974] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:37.974] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:37.974] 3L)] [17:27:37.974] } [17:27:37.974] function(cond) { [17:27:37.974] is_error <- inherits(cond, "error") [17:27:37.974] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:37.974] NULL) [17:27:37.974] if (is_error) { [17:27:37.974] sessionInformation <- function() { [17:27:37.974] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:37.974] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:37.974] search = base::search(), system = base::Sys.info()) [17:27:37.974] } [17:27:37.974] ...future.conditions[[length(...future.conditions) + [17:27:37.974] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:37.974] cond$call), session = sessionInformation(), [17:27:37.974] timestamp = base::Sys.time(), signaled = 0L) [17:27:37.974] signalCondition(cond) [17:27:37.974] } [17:27:37.974] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:37.974] "immediateCondition"))) { [17:27:37.974] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:37.974] ...future.conditions[[length(...future.conditions) + [17:27:37.974] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:37.974] if (TRUE && !signal) { [17:27:37.974] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.974] { [17:27:37.974] inherits <- base::inherits [17:27:37.974] invokeRestart <- base::invokeRestart [17:27:37.974] is.null <- base::is.null [17:27:37.974] muffled <- FALSE [17:27:37.974] if (inherits(cond, "message")) { [17:27:37.974] muffled <- grepl(pattern, "muffleMessage") [17:27:37.974] if (muffled) [17:27:37.974] invokeRestart("muffleMessage") [17:27:37.974] } [17:27:37.974] else if (inherits(cond, "warning")) { [17:27:37.974] muffled <- grepl(pattern, "muffleWarning") [17:27:37.974] if (muffled) [17:27:37.974] invokeRestart("muffleWarning") [17:27:37.974] } [17:27:37.974] else if (inherits(cond, "condition")) { [17:27:37.974] if (!is.null(pattern)) { [17:27:37.974] computeRestarts <- base::computeRestarts [17:27:37.974] grepl <- base::grepl [17:27:37.974] restarts <- computeRestarts(cond) [17:27:37.974] for (restart in restarts) { [17:27:37.974] name <- restart$name [17:27:37.974] if (is.null(name)) [17:27:37.974] next [17:27:37.974] if (!grepl(pattern, name)) [17:27:37.974] next [17:27:37.974] invokeRestart(restart) [17:27:37.974] muffled <- TRUE [17:27:37.974] break [17:27:37.974] } [17:27:37.974] } [17:27:37.974] } [17:27:37.974] invisible(muffled) [17:27:37.974] } [17:27:37.974] muffleCondition(cond, pattern = "^muffle") [17:27:37.974] } [17:27:37.974] } [17:27:37.974] else { [17:27:37.974] if (TRUE) { [17:27:37.974] muffleCondition <- function (cond, pattern = "^muffle") [17:27:37.974] { [17:27:37.974] inherits <- base::inherits [17:27:37.974] invokeRestart <- base::invokeRestart [17:27:37.974] is.null <- base::is.null [17:27:37.974] muffled <- FALSE [17:27:37.974] if (inherits(cond, "message")) { [17:27:37.974] muffled <- grepl(pattern, "muffleMessage") [17:27:37.974] if (muffled) [17:27:37.974] invokeRestart("muffleMessage") [17:27:37.974] } [17:27:37.974] else if (inherits(cond, "warning")) { [17:27:37.974] muffled <- grepl(pattern, "muffleWarning") [17:27:37.974] if (muffled) [17:27:37.974] invokeRestart("muffleWarning") [17:27:37.974] } [17:27:37.974] else if (inherits(cond, "condition")) { [17:27:37.974] if (!is.null(pattern)) { [17:27:37.974] computeRestarts <- base::computeRestarts [17:27:37.974] grepl <- base::grepl [17:27:37.974] restarts <- computeRestarts(cond) [17:27:37.974] for (restart in restarts) { [17:27:37.974] name <- restart$name [17:27:37.974] if (is.null(name)) [17:27:37.974] next [17:27:37.974] if (!grepl(pattern, name)) [17:27:37.974] next [17:27:37.974] invokeRestart(restart) [17:27:37.974] muffled <- TRUE [17:27:37.974] break [17:27:37.974] } [17:27:37.974] } [17:27:37.974] } [17:27:37.974] invisible(muffled) [17:27:37.974] } [17:27:37.974] muffleCondition(cond, pattern = "^muffle") [17:27:37.974] } [17:27:37.974] } [17:27:37.974] } [17:27:37.974] })) [17:27:37.974] }, error = function(ex) { [17:27:37.974] base::structure(base::list(value = NULL, visible = NULL, [17:27:37.974] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:37.974] ...future.rng), started = ...future.startTime, [17:27:37.974] finished = Sys.time(), session_uuid = NA_character_, [17:27:37.974] version = "1.8"), class = "FutureResult") [17:27:37.974] }, finally = { [17:27:37.974] if (!identical(...future.workdir, getwd())) [17:27:37.974] setwd(...future.workdir) [17:27:37.974] { [17:27:37.974] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:37.974] ...future.oldOptions$nwarnings <- NULL [17:27:37.974] } [17:27:37.974] base::options(...future.oldOptions) [17:27:37.974] if (.Platform$OS.type == "windows") { [17:27:37.974] old_names <- names(...future.oldEnvVars) [17:27:37.974] envs <- base::Sys.getenv() [17:27:37.974] names <- names(envs) [17:27:37.974] common <- intersect(names, old_names) [17:27:37.974] added <- setdiff(names, old_names) [17:27:37.974] removed <- setdiff(old_names, names) [17:27:37.974] changed <- common[...future.oldEnvVars[common] != [17:27:37.974] envs[common]] [17:27:37.974] NAMES <- toupper(changed) [17:27:37.974] args <- list() [17:27:37.974] for (kk in seq_along(NAMES)) { [17:27:37.974] name <- changed[[kk]] [17:27:37.974] NAME <- NAMES[[kk]] [17:27:37.974] if (name != NAME && is.element(NAME, old_names)) [17:27:37.974] next [17:27:37.974] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.974] } [17:27:37.974] NAMES <- toupper(added) [17:27:37.974] for (kk in seq_along(NAMES)) { [17:27:37.974] name <- added[[kk]] [17:27:37.974] NAME <- NAMES[[kk]] [17:27:37.974] if (name != NAME && is.element(NAME, old_names)) [17:27:37.974] next [17:27:37.974] args[[name]] <- "" [17:27:37.974] } [17:27:37.974] NAMES <- toupper(removed) [17:27:37.974] for (kk in seq_along(NAMES)) { [17:27:37.974] name <- removed[[kk]] [17:27:37.974] NAME <- NAMES[[kk]] [17:27:37.974] if (name != NAME && is.element(NAME, old_names)) [17:27:37.974] next [17:27:37.974] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:37.974] } [17:27:37.974] if (length(args) > 0) [17:27:37.974] base::do.call(base::Sys.setenv, args = args) [17:27:37.974] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:37.974] } [17:27:37.974] else { [17:27:37.974] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:37.974] } [17:27:37.974] { [17:27:37.974] if (base::length(...future.futureOptionsAdded) > [17:27:37.974] 0L) { [17:27:37.974] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:37.974] base::names(opts) <- ...future.futureOptionsAdded [17:27:37.974] base::options(opts) [17:27:37.974] } [17:27:37.974] { [17:27:37.974] { [17:27:37.974] base::options(mc.cores = ...future.mc.cores.old) [17:27:37.974] NULL [17:27:37.974] } [17:27:37.974] options(future.plan = NULL) [17:27:37.974] if (is.na(NA_character_)) [17:27:37.974] Sys.unsetenv("R_FUTURE_PLAN") [17:27:37.974] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:37.974] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:37.974] .init = FALSE) [17:27:37.974] } [17:27:37.974] } [17:27:37.974] } [17:27:37.974] }) [17:27:37.974] if (TRUE) { [17:27:37.974] base::sink(type = "output", split = FALSE) [17:27:37.974] if (TRUE) { [17:27:37.974] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:37.974] } [17:27:37.974] else { [17:27:37.974] ...future.result["stdout"] <- base::list(NULL) [17:27:37.974] } [17:27:37.974] base::close(...future.stdout) [17:27:37.974] ...future.stdout <- NULL [17:27:37.974] } [17:27:37.974] ...future.result$conditions <- ...future.conditions [17:27:37.974] ...future.result$finished <- base::Sys.time() [17:27:37.974] ...future.result [17:27:37.974] } [17:27:37.982] MultisessionFuture started [17:27:37.982] - Launch lazy future ... done [17:27:37.982] run() for 'MultisessionFuture' ... done List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:3] 2 3 1 - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:37.993] receiveMessageFromWorker() for ClusterFuture ... [17:27:37.993] - Validating connection of MultisessionFuture [17:27:37.994] - received message: FutureResult [17:27:37.994] - Received FutureResult [17:27:37.994] - Erased future from FutureRegistry [17:27:37.994] result() for ClusterFuture ... [17:27:37.995] - result already collected: FutureResult [17:27:37.995] result() for ClusterFuture ... done [17:27:37.995] receiveMessageFromWorker() for ClusterFuture ... done [17:27:38.002] receiveMessageFromWorker() for ClusterFuture ... [17:27:38.003] - Validating connection of MultisessionFuture [17:27:38.003] - received message: FutureResult [17:27:38.004] - Received FutureResult [17:27:38.004] - Erased future from FutureRegistry [17:27:38.005] result() for ClusterFuture ... [17:27:38.005] - result already collected: FutureResult [17:27:38.005] result() for ClusterFuture ... done [17:27:38.005] receiveMessageFromWorker() for ClusterFuture ... done logi [1:2, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:38.008] resolve() on list ... [17:27:38.008] recursive: 0 [17:27:38.008] length: 6 [17:27:38.009] elements: 'a', 'b', 'c', '', '', '' [17:27:38.009] signalConditionsASAP(numeric, pos=1) ... [17:27:38.009] - nx: 6 [17:27:38.009] - relay: TRUE [17:27:38.009] - stdout: TRUE [17:27:38.009] - signal: TRUE [17:27:38.010] - resignal: FALSE [17:27:38.010] - force: TRUE [17:27:38.010] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.010] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.010] - until=2 [17:27:38.010] - relaying element #2 [17:27:38.010] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.011] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.011] signalConditionsASAP(NULL, pos=1) ... done [17:27:38.011] length: 5 (resolved future 1) [17:27:38.011] Future #2 [17:27:38.011] result() for ClusterFuture ... [17:27:38.012] - result already collected: FutureResult [17:27:38.012] result() for ClusterFuture ... done [17:27:38.012] result() for ClusterFuture ... [17:27:38.012] - result already collected: FutureResult [17:27:38.012] result() for ClusterFuture ... done [17:27:38.012] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:38.013] - nx: 6 [17:27:38.013] - relay: TRUE [17:27:38.013] - stdout: TRUE [17:27:38.013] - signal: TRUE [17:27:38.014] - resignal: FALSE [17:27:38.014] - force: TRUE [17:27:38.014] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.015] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.015] - until=2 [17:27:38.015] - relaying element #2 [17:27:38.015] result() for ClusterFuture ... [17:27:38.016] - result already collected: FutureResult [17:27:38.016] result() for ClusterFuture ... done [17:27:38.016] result() for ClusterFuture ... [17:27:38.016] - result already collected: FutureResult [17:27:38.017] result() for ClusterFuture ... done [17:27:38.017] result() for ClusterFuture ... [17:27:38.017] - result already collected: FutureResult [17:27:38.017] result() for ClusterFuture ... done [17:27:38.017] result() for ClusterFuture ... [17:27:38.017] - result already collected: FutureResult [17:27:38.018] result() for ClusterFuture ... done [17:27:38.018] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.018] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.018] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:38.018] length: 4 (resolved future 2) [17:27:38.019] Future #3 [17:27:38.019] result() for ClusterFuture ... [17:27:38.019] - result already collected: FutureResult [17:27:38.019] result() for ClusterFuture ... done [17:27:38.019] result() for ClusterFuture ... [17:27:38.019] - result already collected: FutureResult [17:27:38.019] result() for ClusterFuture ... done [17:27:38.020] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:38.020] - nx: 6 [17:27:38.020] - relay: TRUE [17:27:38.020] - stdout: TRUE [17:27:38.020] - signal: TRUE [17:27:38.020] - resignal: FALSE [17:27:38.021] - force: TRUE [17:27:38.021] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.021] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.021] - until=3 [17:27:38.021] - relaying element #3 [17:27:38.021] result() for ClusterFuture ... [17:27:38.022] - result already collected: FutureResult [17:27:38.022] result() for ClusterFuture ... done [17:27:38.022] result() for ClusterFuture ... [17:27:38.022] - result already collected: FutureResult [17:27:38.022] result() for ClusterFuture ... done [17:27:38.022] result() for ClusterFuture ... [17:27:38.023] - result already collected: FutureResult [17:27:38.023] result() for ClusterFuture ... done [17:27:38.023] result() for ClusterFuture ... [17:27:38.023] - result already collected: FutureResult [17:27:38.023] result() for ClusterFuture ... done [17:27:38.023] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.023] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.024] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:38.024] length: 3 (resolved future 3) [17:27:38.024] signalConditionsASAP(NULL, pos=4) ... [17:27:38.024] - nx: 6 [17:27:38.024] - relay: TRUE [17:27:38.025] - stdout: TRUE [17:27:38.025] - signal: TRUE [17:27:38.025] - resignal: FALSE [17:27:38.025] - force: TRUE [17:27:38.025] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.025] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.026] - until=5 [17:27:38.026] - relaying element #5 [17:27:38.026] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:38.026] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.026] signalConditionsASAP(NULL, pos=4) ... done [17:27:38.026] length: 2 (resolved future 4) [17:27:38.027] signalConditionsASAP(NULL, pos=5) ... [17:27:38.027] - nx: 6 [17:27:38.027] - relay: TRUE [17:27:38.028] - stdout: TRUE [17:27:38.028] - signal: TRUE [17:27:38.028] - resignal: FALSE [17:27:38.028] - force: TRUE [17:27:38.029] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:38.029] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.029] - until=6 [17:27:38.029] - relaying element #6 [17:27:38.030] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:38.030] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.030] signalConditionsASAP(NULL, pos=5) ... done [17:27:38.030] length: 1 (resolved future 5) [17:27:38.031] signalConditionsASAP(numeric, pos=6) ... [17:27:38.031] - nx: 6 [17:27:38.031] - relay: TRUE [17:27:38.032] - stdout: TRUE [17:27:38.032] - signal: TRUE [17:27:38.032] - resignal: FALSE [17:27:38.032] - force: TRUE [17:27:38.033] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:38.033] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.033] - until=6 [17:27:38.033] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:38.034] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.034] signalConditionsASAP(numeric, pos=6) ... done [17:27:38.034] length: 0 (resolved future 6) [17:27:38.035] Relaying remaining futures [17:27:38.035] signalConditionsASAP(NULL, pos=0) ... [17:27:38.035] - nx: 6 [17:27:38.035] - relay: TRUE [17:27:38.036] - stdout: TRUE [17:27:38.036] - signal: TRUE [17:27:38.036] - resignal: FALSE [17:27:38.036] - force: TRUE [17:27:38.037] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:38.037] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:38.037] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:38.037] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.037] signalConditionsASAP(NULL, pos=0) ... done [17:27:38.037] resolve() on list ... DONE [17:27:38.038] result() for ClusterFuture ... [17:27:38.038] - result already collected: FutureResult [17:27:38.038] result() for ClusterFuture ... done [17:27:38.039] result() for ClusterFuture ... [17:27:38.039] - result already collected: FutureResult [17:27:38.039] result() for ClusterFuture ... done [17:27:38.039] result() for ClusterFuture ... [17:27:38.040] - result already collected: FutureResult [17:27:38.040] result() for ClusterFuture ... done [17:27:38.040] result() for ClusterFuture ... [17:27:38.041] - result already collected: FutureResult [17:27:38.041] result() for ClusterFuture ... done List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:3] 2 3 1 - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" Dimensions: c(2, 1, 3, 1) [17:27:38.048] getGlobalsAndPackages() ... [17:27:38.049] Searching for globals... [17:27:38.049] [17:27:38.050] Searching for globals ... DONE [17:27:38.050] - globals: [0] [17:27:38.050] getGlobalsAndPackages() ... DONE [17:27:38.051] run() for 'Future' ... [17:27:38.051] - state: 'created' [17:27:38.052] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:38.071] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:38.071] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:38.071] - Field: 'node' [17:27:38.072] - Field: 'label' [17:27:38.072] - Field: 'local' [17:27:38.072] - Field: 'owner' [17:27:38.072] - Field: 'envir' [17:27:38.072] - Field: 'workers' [17:27:38.073] - Field: 'packages' [17:27:38.073] - Field: 'gc' [17:27:38.073] - Field: 'conditions' [17:27:38.073] - Field: 'persistent' [17:27:38.073] - Field: 'expr' [17:27:38.073] - Field: 'uuid' [17:27:38.074] - Field: 'seed' [17:27:38.074] - Field: 'version' [17:27:38.074] - Field: 'result' [17:27:38.074] - Field: 'asynchronous' [17:27:38.074] - Field: 'calls' [17:27:38.074] - Field: 'globals' [17:27:38.075] - Field: 'stdout' [17:27:38.075] - Field: 'earlySignal' [17:27:38.075] - Field: 'lazy' [17:27:38.075] - Field: 'state' [17:27:38.075] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:38.076] - Launch lazy future ... [17:27:38.076] Packages needed by the future expression (n = 0): [17:27:38.076] Packages needed by future strategies (n = 0): [17:27:38.077] { [17:27:38.077] { [17:27:38.077] { [17:27:38.077] ...future.startTime <- base::Sys.time() [17:27:38.077] { [17:27:38.077] { [17:27:38.077] { [17:27:38.077] { [17:27:38.077] base::local({ [17:27:38.077] has_future <- base::requireNamespace("future", [17:27:38.077] quietly = TRUE) [17:27:38.077] if (has_future) { [17:27:38.077] ns <- base::getNamespace("future") [17:27:38.077] version <- ns[[".package"]][["version"]] [17:27:38.077] if (is.null(version)) [17:27:38.077] version <- utils::packageVersion("future") [17:27:38.077] } [17:27:38.077] else { [17:27:38.077] version <- NULL [17:27:38.077] } [17:27:38.077] if (!has_future || version < "1.8.0") { [17:27:38.077] info <- base::c(r_version = base::gsub("R version ", [17:27:38.077] "", base::R.version$version.string), [17:27:38.077] platform = base::sprintf("%s (%s-bit)", [17:27:38.077] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:38.077] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:38.077] "release", "version")], collapse = " "), [17:27:38.077] hostname = base::Sys.info()[["nodename"]]) [17:27:38.077] info <- base::sprintf("%s: %s", base::names(info), [17:27:38.077] info) [17:27:38.077] info <- base::paste(info, collapse = "; ") [17:27:38.077] if (!has_future) { [17:27:38.077] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:38.077] info) [17:27:38.077] } [17:27:38.077] else { [17:27:38.077] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:38.077] info, version) [17:27:38.077] } [17:27:38.077] base::stop(msg) [17:27:38.077] } [17:27:38.077] }) [17:27:38.077] } [17:27:38.077] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:38.077] base::options(mc.cores = 1L) [17:27:38.077] } [17:27:38.077] ...future.strategy.old <- future::plan("list") [17:27:38.077] options(future.plan = NULL) [17:27:38.077] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.077] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:38.077] } [17:27:38.077] ...future.workdir <- getwd() [17:27:38.077] } [17:27:38.077] ...future.oldOptions <- base::as.list(base::.Options) [17:27:38.077] ...future.oldEnvVars <- base::Sys.getenv() [17:27:38.077] } [17:27:38.077] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:38.077] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:38.077] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:38.077] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:38.077] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:38.077] future.stdout.windows.reencode = NULL, width = 80L) [17:27:38.077] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:38.077] base::names(...future.oldOptions)) [17:27:38.077] } [17:27:38.077] if (FALSE) { [17:27:38.077] } [17:27:38.077] else { [17:27:38.077] if (TRUE) { [17:27:38.077] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:38.077] open = "w") [17:27:38.077] } [17:27:38.077] else { [17:27:38.077] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:38.077] windows = "NUL", "/dev/null"), open = "w") [17:27:38.077] } [17:27:38.077] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:38.077] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:38.077] base::sink(type = "output", split = FALSE) [17:27:38.077] base::close(...future.stdout) [17:27:38.077] }, add = TRUE) [17:27:38.077] } [17:27:38.077] ...future.frame <- base::sys.nframe() [17:27:38.077] ...future.conditions <- base::list() [17:27:38.077] ...future.rng <- base::globalenv()$.Random.seed [17:27:38.077] if (FALSE) { [17:27:38.077] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:38.077] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:38.077] } [17:27:38.077] ...future.result <- base::tryCatch({ [17:27:38.077] base::withCallingHandlers({ [17:27:38.077] ...future.value <- base::withVisible(base::local({ [17:27:38.077] ...future.makeSendCondition <- base::local({ [17:27:38.077] sendCondition <- NULL [17:27:38.077] function(frame = 1L) { [17:27:38.077] if (is.function(sendCondition)) [17:27:38.077] return(sendCondition) [17:27:38.077] ns <- getNamespace("parallel") [17:27:38.077] if (exists("sendData", mode = "function", [17:27:38.077] envir = ns)) { [17:27:38.077] parallel_sendData <- get("sendData", mode = "function", [17:27:38.077] envir = ns) [17:27:38.077] envir <- sys.frame(frame) [17:27:38.077] master <- NULL [17:27:38.077] while (!identical(envir, .GlobalEnv) && [17:27:38.077] !identical(envir, emptyenv())) { [17:27:38.077] if (exists("master", mode = "list", envir = envir, [17:27:38.077] inherits = FALSE)) { [17:27:38.077] master <- get("master", mode = "list", [17:27:38.077] envir = envir, inherits = FALSE) [17:27:38.077] if (inherits(master, c("SOCKnode", [17:27:38.077] "SOCK0node"))) { [17:27:38.077] sendCondition <<- function(cond) { [17:27:38.077] data <- list(type = "VALUE", value = cond, [17:27:38.077] success = TRUE) [17:27:38.077] parallel_sendData(master, data) [17:27:38.077] } [17:27:38.077] return(sendCondition) [17:27:38.077] } [17:27:38.077] } [17:27:38.077] frame <- frame + 1L [17:27:38.077] envir <- sys.frame(frame) [17:27:38.077] } [17:27:38.077] } [17:27:38.077] sendCondition <<- function(cond) NULL [17:27:38.077] } [17:27:38.077] }) [17:27:38.077] withCallingHandlers({ [17:27:38.077] 2 [17:27:38.077] }, immediateCondition = function(cond) { [17:27:38.077] sendCondition <- ...future.makeSendCondition() [17:27:38.077] sendCondition(cond) [17:27:38.077] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.077] { [17:27:38.077] inherits <- base::inherits [17:27:38.077] invokeRestart <- base::invokeRestart [17:27:38.077] is.null <- base::is.null [17:27:38.077] muffled <- FALSE [17:27:38.077] if (inherits(cond, "message")) { [17:27:38.077] muffled <- grepl(pattern, "muffleMessage") [17:27:38.077] if (muffled) [17:27:38.077] invokeRestart("muffleMessage") [17:27:38.077] } [17:27:38.077] else if (inherits(cond, "warning")) { [17:27:38.077] muffled <- grepl(pattern, "muffleWarning") [17:27:38.077] if (muffled) [17:27:38.077] invokeRestart("muffleWarning") [17:27:38.077] } [17:27:38.077] else if (inherits(cond, "condition")) { [17:27:38.077] if (!is.null(pattern)) { [17:27:38.077] computeRestarts <- base::computeRestarts [17:27:38.077] grepl <- base::grepl [17:27:38.077] restarts <- computeRestarts(cond) [17:27:38.077] for (restart in restarts) { [17:27:38.077] name <- restart$name [17:27:38.077] if (is.null(name)) [17:27:38.077] next [17:27:38.077] if (!grepl(pattern, name)) [17:27:38.077] next [17:27:38.077] invokeRestart(restart) [17:27:38.077] muffled <- TRUE [17:27:38.077] break [17:27:38.077] } [17:27:38.077] } [17:27:38.077] } [17:27:38.077] invisible(muffled) [17:27:38.077] } [17:27:38.077] muffleCondition(cond) [17:27:38.077] }) [17:27:38.077] })) [17:27:38.077] future::FutureResult(value = ...future.value$value, [17:27:38.077] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.077] ...future.rng), globalenv = if (FALSE) [17:27:38.077] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:38.077] ...future.globalenv.names)) [17:27:38.077] else NULL, started = ...future.startTime, version = "1.8") [17:27:38.077] }, condition = base::local({ [17:27:38.077] c <- base::c [17:27:38.077] inherits <- base::inherits [17:27:38.077] invokeRestart <- base::invokeRestart [17:27:38.077] length <- base::length [17:27:38.077] list <- base::list [17:27:38.077] seq.int <- base::seq.int [17:27:38.077] signalCondition <- base::signalCondition [17:27:38.077] sys.calls <- base::sys.calls [17:27:38.077] `[[` <- base::`[[` [17:27:38.077] `+` <- base::`+` [17:27:38.077] `<<-` <- base::`<<-` [17:27:38.077] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:38.077] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:38.077] 3L)] [17:27:38.077] } [17:27:38.077] function(cond) { [17:27:38.077] is_error <- inherits(cond, "error") [17:27:38.077] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:38.077] NULL) [17:27:38.077] if (is_error) { [17:27:38.077] sessionInformation <- function() { [17:27:38.077] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:38.077] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:38.077] search = base::search(), system = base::Sys.info()) [17:27:38.077] } [17:27:38.077] ...future.conditions[[length(...future.conditions) + [17:27:38.077] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:38.077] cond$call), session = sessionInformation(), [17:27:38.077] timestamp = base::Sys.time(), signaled = 0L) [17:27:38.077] signalCondition(cond) [17:27:38.077] } [17:27:38.077] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:38.077] "immediateCondition"))) { [17:27:38.077] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:38.077] ...future.conditions[[length(...future.conditions) + [17:27:38.077] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:38.077] if (TRUE && !signal) { [17:27:38.077] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.077] { [17:27:38.077] inherits <- base::inherits [17:27:38.077] invokeRestart <- base::invokeRestart [17:27:38.077] is.null <- base::is.null [17:27:38.077] muffled <- FALSE [17:27:38.077] if (inherits(cond, "message")) { [17:27:38.077] muffled <- grepl(pattern, "muffleMessage") [17:27:38.077] if (muffled) [17:27:38.077] invokeRestart("muffleMessage") [17:27:38.077] } [17:27:38.077] else if (inherits(cond, "warning")) { [17:27:38.077] muffled <- grepl(pattern, "muffleWarning") [17:27:38.077] if (muffled) [17:27:38.077] invokeRestart("muffleWarning") [17:27:38.077] } [17:27:38.077] else if (inherits(cond, "condition")) { [17:27:38.077] if (!is.null(pattern)) { [17:27:38.077] computeRestarts <- base::computeRestarts [17:27:38.077] grepl <- base::grepl [17:27:38.077] restarts <- computeRestarts(cond) [17:27:38.077] for (restart in restarts) { [17:27:38.077] name <- restart$name [17:27:38.077] if (is.null(name)) [17:27:38.077] next [17:27:38.077] if (!grepl(pattern, name)) [17:27:38.077] next [17:27:38.077] invokeRestart(restart) [17:27:38.077] muffled <- TRUE [17:27:38.077] break [17:27:38.077] } [17:27:38.077] } [17:27:38.077] } [17:27:38.077] invisible(muffled) [17:27:38.077] } [17:27:38.077] muffleCondition(cond, pattern = "^muffle") [17:27:38.077] } [17:27:38.077] } [17:27:38.077] else { [17:27:38.077] if (TRUE) { [17:27:38.077] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.077] { [17:27:38.077] inherits <- base::inherits [17:27:38.077] invokeRestart <- base::invokeRestart [17:27:38.077] is.null <- base::is.null [17:27:38.077] muffled <- FALSE [17:27:38.077] if (inherits(cond, "message")) { [17:27:38.077] muffled <- grepl(pattern, "muffleMessage") [17:27:38.077] if (muffled) [17:27:38.077] invokeRestart("muffleMessage") [17:27:38.077] } [17:27:38.077] else if (inherits(cond, "warning")) { [17:27:38.077] muffled <- grepl(pattern, "muffleWarning") [17:27:38.077] if (muffled) [17:27:38.077] invokeRestart("muffleWarning") [17:27:38.077] } [17:27:38.077] else if (inherits(cond, "condition")) { [17:27:38.077] if (!is.null(pattern)) { [17:27:38.077] computeRestarts <- base::computeRestarts [17:27:38.077] grepl <- base::grepl [17:27:38.077] restarts <- computeRestarts(cond) [17:27:38.077] for (restart in restarts) { [17:27:38.077] name <- restart$name [17:27:38.077] if (is.null(name)) [17:27:38.077] next [17:27:38.077] if (!grepl(pattern, name)) [17:27:38.077] next [17:27:38.077] invokeRestart(restart) [17:27:38.077] muffled <- TRUE [17:27:38.077] break [17:27:38.077] } [17:27:38.077] } [17:27:38.077] } [17:27:38.077] invisible(muffled) [17:27:38.077] } [17:27:38.077] muffleCondition(cond, pattern = "^muffle") [17:27:38.077] } [17:27:38.077] } [17:27:38.077] } [17:27:38.077] })) [17:27:38.077] }, error = function(ex) { [17:27:38.077] base::structure(base::list(value = NULL, visible = NULL, [17:27:38.077] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.077] ...future.rng), started = ...future.startTime, [17:27:38.077] finished = Sys.time(), session_uuid = NA_character_, [17:27:38.077] version = "1.8"), class = "FutureResult") [17:27:38.077] }, finally = { [17:27:38.077] if (!identical(...future.workdir, getwd())) [17:27:38.077] setwd(...future.workdir) [17:27:38.077] { [17:27:38.077] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:38.077] ...future.oldOptions$nwarnings <- NULL [17:27:38.077] } [17:27:38.077] base::options(...future.oldOptions) [17:27:38.077] if (.Platform$OS.type == "windows") { [17:27:38.077] old_names <- names(...future.oldEnvVars) [17:27:38.077] envs <- base::Sys.getenv() [17:27:38.077] names <- names(envs) [17:27:38.077] common <- intersect(names, old_names) [17:27:38.077] added <- setdiff(names, old_names) [17:27:38.077] removed <- setdiff(old_names, names) [17:27:38.077] changed <- common[...future.oldEnvVars[common] != [17:27:38.077] envs[common]] [17:27:38.077] NAMES <- toupper(changed) [17:27:38.077] args <- list() [17:27:38.077] for (kk in seq_along(NAMES)) { [17:27:38.077] name <- changed[[kk]] [17:27:38.077] NAME <- NAMES[[kk]] [17:27:38.077] if (name != NAME && is.element(NAME, old_names)) [17:27:38.077] next [17:27:38.077] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.077] } [17:27:38.077] NAMES <- toupper(added) [17:27:38.077] for (kk in seq_along(NAMES)) { [17:27:38.077] name <- added[[kk]] [17:27:38.077] NAME <- NAMES[[kk]] [17:27:38.077] if (name != NAME && is.element(NAME, old_names)) [17:27:38.077] next [17:27:38.077] args[[name]] <- "" [17:27:38.077] } [17:27:38.077] NAMES <- toupper(removed) [17:27:38.077] for (kk in seq_along(NAMES)) { [17:27:38.077] name <- removed[[kk]] [17:27:38.077] NAME <- NAMES[[kk]] [17:27:38.077] if (name != NAME && is.element(NAME, old_names)) [17:27:38.077] next [17:27:38.077] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.077] } [17:27:38.077] if (length(args) > 0) [17:27:38.077] base::do.call(base::Sys.setenv, args = args) [17:27:38.077] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:38.077] } [17:27:38.077] else { [17:27:38.077] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:38.077] } [17:27:38.077] { [17:27:38.077] if (base::length(...future.futureOptionsAdded) > [17:27:38.077] 0L) { [17:27:38.077] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:38.077] base::names(opts) <- ...future.futureOptionsAdded [17:27:38.077] base::options(opts) [17:27:38.077] } [17:27:38.077] { [17:27:38.077] { [17:27:38.077] base::options(mc.cores = ...future.mc.cores.old) [17:27:38.077] NULL [17:27:38.077] } [17:27:38.077] options(future.plan = NULL) [17:27:38.077] if (is.na(NA_character_)) [17:27:38.077] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.077] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:38.077] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:38.077] .init = FALSE) [17:27:38.077] } [17:27:38.077] } [17:27:38.077] } [17:27:38.077] }) [17:27:38.077] if (TRUE) { [17:27:38.077] base::sink(type = "output", split = FALSE) [17:27:38.077] if (TRUE) { [17:27:38.077] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:38.077] } [17:27:38.077] else { [17:27:38.077] ...future.result["stdout"] <- base::list(NULL) [17:27:38.077] } [17:27:38.077] base::close(...future.stdout) [17:27:38.077] ...future.stdout <- NULL [17:27:38.077] } [17:27:38.077] ...future.result$conditions <- ...future.conditions [17:27:38.077] ...future.result$finished <- base::Sys.time() [17:27:38.077] ...future.result [17:27:38.077] } [17:27:38.085] MultisessionFuture started [17:27:38.086] - Launch lazy future ... done [17:27:38.086] run() for 'MultisessionFuture' ... done [17:27:38.086] getGlobalsAndPackages() ... [17:27:38.087] Searching for globals... [17:27:38.087] [17:27:38.088] Searching for globals ... DONE [17:27:38.088] - globals: [0] [17:27:38.088] getGlobalsAndPackages() ... DONE [17:27:38.089] run() for 'Future' ... [17:27:38.089] - state: 'created' [17:27:38.089] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:38.112] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:38.112] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:38.113] - Field: 'node' [17:27:38.113] - Field: 'label' [17:27:38.113] - Field: 'local' [17:27:38.114] - Field: 'owner' [17:27:38.114] - Field: 'envir' [17:27:38.114] - Field: 'workers' [17:27:38.115] - Field: 'packages' [17:27:38.115] - Field: 'gc' [17:27:38.115] - Field: 'conditions' [17:27:38.116] - Field: 'persistent' [17:27:38.116] - Field: 'expr' [17:27:38.116] - Field: 'uuid' [17:27:38.117] - Field: 'seed' [17:27:38.117] - Field: 'version' [17:27:38.117] - Field: 'result' [17:27:38.118] - Field: 'asynchronous' [17:27:38.118] - Field: 'calls' [17:27:38.118] - Field: 'globals' [17:27:38.119] - Field: 'stdout' [17:27:38.119] - Field: 'earlySignal' [17:27:38.119] - Field: 'lazy' [17:27:38.119] - Field: 'state' [17:27:38.120] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:38.120] - Launch lazy future ... [17:27:38.121] Packages needed by the future expression (n = 0): [17:27:38.121] Packages needed by future strategies (n = 0): [17:27:38.122] { [17:27:38.122] { [17:27:38.122] { [17:27:38.122] ...future.startTime <- base::Sys.time() [17:27:38.122] { [17:27:38.122] { [17:27:38.122] { [17:27:38.122] { [17:27:38.122] base::local({ [17:27:38.122] has_future <- base::requireNamespace("future", [17:27:38.122] quietly = TRUE) [17:27:38.122] if (has_future) { [17:27:38.122] ns <- base::getNamespace("future") [17:27:38.122] version <- ns[[".package"]][["version"]] [17:27:38.122] if (is.null(version)) [17:27:38.122] version <- utils::packageVersion("future") [17:27:38.122] } [17:27:38.122] else { [17:27:38.122] version <- NULL [17:27:38.122] } [17:27:38.122] if (!has_future || version < "1.8.0") { [17:27:38.122] info <- base::c(r_version = base::gsub("R version ", [17:27:38.122] "", base::R.version$version.string), [17:27:38.122] platform = base::sprintf("%s (%s-bit)", [17:27:38.122] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:38.122] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:38.122] "release", "version")], collapse = " "), [17:27:38.122] hostname = base::Sys.info()[["nodename"]]) [17:27:38.122] info <- base::sprintf("%s: %s", base::names(info), [17:27:38.122] info) [17:27:38.122] info <- base::paste(info, collapse = "; ") [17:27:38.122] if (!has_future) { [17:27:38.122] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:38.122] info) [17:27:38.122] } [17:27:38.122] else { [17:27:38.122] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:38.122] info, version) [17:27:38.122] } [17:27:38.122] base::stop(msg) [17:27:38.122] } [17:27:38.122] }) [17:27:38.122] } [17:27:38.122] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:38.122] base::options(mc.cores = 1L) [17:27:38.122] } [17:27:38.122] ...future.strategy.old <- future::plan("list") [17:27:38.122] options(future.plan = NULL) [17:27:38.122] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.122] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:38.122] } [17:27:38.122] ...future.workdir <- getwd() [17:27:38.122] } [17:27:38.122] ...future.oldOptions <- base::as.list(base::.Options) [17:27:38.122] ...future.oldEnvVars <- base::Sys.getenv() [17:27:38.122] } [17:27:38.122] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:38.122] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:38.122] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:38.122] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:38.122] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:38.122] future.stdout.windows.reencode = NULL, width = 80L) [17:27:38.122] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:38.122] base::names(...future.oldOptions)) [17:27:38.122] } [17:27:38.122] if (FALSE) { [17:27:38.122] } [17:27:38.122] else { [17:27:38.122] if (TRUE) { [17:27:38.122] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:38.122] open = "w") [17:27:38.122] } [17:27:38.122] else { [17:27:38.122] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:38.122] windows = "NUL", "/dev/null"), open = "w") [17:27:38.122] } [17:27:38.122] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:38.122] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:38.122] base::sink(type = "output", split = FALSE) [17:27:38.122] base::close(...future.stdout) [17:27:38.122] }, add = TRUE) [17:27:38.122] } [17:27:38.122] ...future.frame <- base::sys.nframe() [17:27:38.122] ...future.conditions <- base::list() [17:27:38.122] ...future.rng <- base::globalenv()$.Random.seed [17:27:38.122] if (FALSE) { [17:27:38.122] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:38.122] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:38.122] } [17:27:38.122] ...future.result <- base::tryCatch({ [17:27:38.122] base::withCallingHandlers({ [17:27:38.122] ...future.value <- base::withVisible(base::local({ [17:27:38.122] ...future.makeSendCondition <- base::local({ [17:27:38.122] sendCondition <- NULL [17:27:38.122] function(frame = 1L) { [17:27:38.122] if (is.function(sendCondition)) [17:27:38.122] return(sendCondition) [17:27:38.122] ns <- getNamespace("parallel") [17:27:38.122] if (exists("sendData", mode = "function", [17:27:38.122] envir = ns)) { [17:27:38.122] parallel_sendData <- get("sendData", mode = "function", [17:27:38.122] envir = ns) [17:27:38.122] envir <- sys.frame(frame) [17:27:38.122] master <- NULL [17:27:38.122] while (!identical(envir, .GlobalEnv) && [17:27:38.122] !identical(envir, emptyenv())) { [17:27:38.122] if (exists("master", mode = "list", envir = envir, [17:27:38.122] inherits = FALSE)) { [17:27:38.122] master <- get("master", mode = "list", [17:27:38.122] envir = envir, inherits = FALSE) [17:27:38.122] if (inherits(master, c("SOCKnode", [17:27:38.122] "SOCK0node"))) { [17:27:38.122] sendCondition <<- function(cond) { [17:27:38.122] data <- list(type = "VALUE", value = cond, [17:27:38.122] success = TRUE) [17:27:38.122] parallel_sendData(master, data) [17:27:38.122] } [17:27:38.122] return(sendCondition) [17:27:38.122] } [17:27:38.122] } [17:27:38.122] frame <- frame + 1L [17:27:38.122] envir <- sys.frame(frame) [17:27:38.122] } [17:27:38.122] } [17:27:38.122] sendCondition <<- function(cond) NULL [17:27:38.122] } [17:27:38.122] }) [17:27:38.122] withCallingHandlers({ [17:27:38.122] NULL [17:27:38.122] }, immediateCondition = function(cond) { [17:27:38.122] sendCondition <- ...future.makeSendCondition() [17:27:38.122] sendCondition(cond) [17:27:38.122] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.122] { [17:27:38.122] inherits <- base::inherits [17:27:38.122] invokeRestart <- base::invokeRestart [17:27:38.122] is.null <- base::is.null [17:27:38.122] muffled <- FALSE [17:27:38.122] if (inherits(cond, "message")) { [17:27:38.122] muffled <- grepl(pattern, "muffleMessage") [17:27:38.122] if (muffled) [17:27:38.122] invokeRestart("muffleMessage") [17:27:38.122] } [17:27:38.122] else if (inherits(cond, "warning")) { [17:27:38.122] muffled <- grepl(pattern, "muffleWarning") [17:27:38.122] if (muffled) [17:27:38.122] invokeRestart("muffleWarning") [17:27:38.122] } [17:27:38.122] else if (inherits(cond, "condition")) { [17:27:38.122] if (!is.null(pattern)) { [17:27:38.122] computeRestarts <- base::computeRestarts [17:27:38.122] grepl <- base::grepl [17:27:38.122] restarts <- computeRestarts(cond) [17:27:38.122] for (restart in restarts) { [17:27:38.122] name <- restart$name [17:27:38.122] if (is.null(name)) [17:27:38.122] next [17:27:38.122] if (!grepl(pattern, name)) [17:27:38.122] next [17:27:38.122] invokeRestart(restart) [17:27:38.122] muffled <- TRUE [17:27:38.122] break [17:27:38.122] } [17:27:38.122] } [17:27:38.122] } [17:27:38.122] invisible(muffled) [17:27:38.122] } [17:27:38.122] muffleCondition(cond) [17:27:38.122] }) [17:27:38.122] })) [17:27:38.122] future::FutureResult(value = ...future.value$value, [17:27:38.122] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.122] ...future.rng), globalenv = if (FALSE) [17:27:38.122] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:38.122] ...future.globalenv.names)) [17:27:38.122] else NULL, started = ...future.startTime, version = "1.8") [17:27:38.122] }, condition = base::local({ [17:27:38.122] c <- base::c [17:27:38.122] inherits <- base::inherits [17:27:38.122] invokeRestart <- base::invokeRestart [17:27:38.122] length <- base::length [17:27:38.122] list <- base::list [17:27:38.122] seq.int <- base::seq.int [17:27:38.122] signalCondition <- base::signalCondition [17:27:38.122] sys.calls <- base::sys.calls [17:27:38.122] `[[` <- base::`[[` [17:27:38.122] `+` <- base::`+` [17:27:38.122] `<<-` <- base::`<<-` [17:27:38.122] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:38.122] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:38.122] 3L)] [17:27:38.122] } [17:27:38.122] function(cond) { [17:27:38.122] is_error <- inherits(cond, "error") [17:27:38.122] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:38.122] NULL) [17:27:38.122] if (is_error) { [17:27:38.122] sessionInformation <- function() { [17:27:38.122] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:38.122] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:38.122] search = base::search(), system = base::Sys.info()) [17:27:38.122] } [17:27:38.122] ...future.conditions[[length(...future.conditions) + [17:27:38.122] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:38.122] cond$call), session = sessionInformation(), [17:27:38.122] timestamp = base::Sys.time(), signaled = 0L) [17:27:38.122] signalCondition(cond) [17:27:38.122] } [17:27:38.122] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:38.122] "immediateCondition"))) { [17:27:38.122] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:38.122] ...future.conditions[[length(...future.conditions) + [17:27:38.122] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:38.122] if (TRUE && !signal) { [17:27:38.122] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.122] { [17:27:38.122] inherits <- base::inherits [17:27:38.122] invokeRestart <- base::invokeRestart [17:27:38.122] is.null <- base::is.null [17:27:38.122] muffled <- FALSE [17:27:38.122] if (inherits(cond, "message")) { [17:27:38.122] muffled <- grepl(pattern, "muffleMessage") [17:27:38.122] if (muffled) [17:27:38.122] invokeRestart("muffleMessage") [17:27:38.122] } [17:27:38.122] else if (inherits(cond, "warning")) { [17:27:38.122] muffled <- grepl(pattern, "muffleWarning") [17:27:38.122] if (muffled) [17:27:38.122] invokeRestart("muffleWarning") [17:27:38.122] } [17:27:38.122] else if (inherits(cond, "condition")) { [17:27:38.122] if (!is.null(pattern)) { [17:27:38.122] computeRestarts <- base::computeRestarts [17:27:38.122] grepl <- base::grepl [17:27:38.122] restarts <- computeRestarts(cond) [17:27:38.122] for (restart in restarts) { [17:27:38.122] name <- restart$name [17:27:38.122] if (is.null(name)) [17:27:38.122] next [17:27:38.122] if (!grepl(pattern, name)) [17:27:38.122] next [17:27:38.122] invokeRestart(restart) [17:27:38.122] muffled <- TRUE [17:27:38.122] break [17:27:38.122] } [17:27:38.122] } [17:27:38.122] } [17:27:38.122] invisible(muffled) [17:27:38.122] } [17:27:38.122] muffleCondition(cond, pattern = "^muffle") [17:27:38.122] } [17:27:38.122] } [17:27:38.122] else { [17:27:38.122] if (TRUE) { [17:27:38.122] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.122] { [17:27:38.122] inherits <- base::inherits [17:27:38.122] invokeRestart <- base::invokeRestart [17:27:38.122] is.null <- base::is.null [17:27:38.122] muffled <- FALSE [17:27:38.122] if (inherits(cond, "message")) { [17:27:38.122] muffled <- grepl(pattern, "muffleMessage") [17:27:38.122] if (muffled) [17:27:38.122] invokeRestart("muffleMessage") [17:27:38.122] } [17:27:38.122] else if (inherits(cond, "warning")) { [17:27:38.122] muffled <- grepl(pattern, "muffleWarning") [17:27:38.122] if (muffled) [17:27:38.122] invokeRestart("muffleWarning") [17:27:38.122] } [17:27:38.122] else if (inherits(cond, "condition")) { [17:27:38.122] if (!is.null(pattern)) { [17:27:38.122] computeRestarts <- base::computeRestarts [17:27:38.122] grepl <- base::grepl [17:27:38.122] restarts <- computeRestarts(cond) [17:27:38.122] for (restart in restarts) { [17:27:38.122] name <- restart$name [17:27:38.122] if (is.null(name)) [17:27:38.122] next [17:27:38.122] if (!grepl(pattern, name)) [17:27:38.122] next [17:27:38.122] invokeRestart(restart) [17:27:38.122] muffled <- TRUE [17:27:38.122] break [17:27:38.122] } [17:27:38.122] } [17:27:38.122] } [17:27:38.122] invisible(muffled) [17:27:38.122] } [17:27:38.122] muffleCondition(cond, pattern = "^muffle") [17:27:38.122] } [17:27:38.122] } [17:27:38.122] } [17:27:38.122] })) [17:27:38.122] }, error = function(ex) { [17:27:38.122] base::structure(base::list(value = NULL, visible = NULL, [17:27:38.122] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.122] ...future.rng), started = ...future.startTime, [17:27:38.122] finished = Sys.time(), session_uuid = NA_character_, [17:27:38.122] version = "1.8"), class = "FutureResult") [17:27:38.122] }, finally = { [17:27:38.122] if (!identical(...future.workdir, getwd())) [17:27:38.122] setwd(...future.workdir) [17:27:38.122] { [17:27:38.122] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:38.122] ...future.oldOptions$nwarnings <- NULL [17:27:38.122] } [17:27:38.122] base::options(...future.oldOptions) [17:27:38.122] if (.Platform$OS.type == "windows") { [17:27:38.122] old_names <- names(...future.oldEnvVars) [17:27:38.122] envs <- base::Sys.getenv() [17:27:38.122] names <- names(envs) [17:27:38.122] common <- intersect(names, old_names) [17:27:38.122] added <- setdiff(names, old_names) [17:27:38.122] removed <- setdiff(old_names, names) [17:27:38.122] changed <- common[...future.oldEnvVars[common] != [17:27:38.122] envs[common]] [17:27:38.122] NAMES <- toupper(changed) [17:27:38.122] args <- list() [17:27:38.122] for (kk in seq_along(NAMES)) { [17:27:38.122] name <- changed[[kk]] [17:27:38.122] NAME <- NAMES[[kk]] [17:27:38.122] if (name != NAME && is.element(NAME, old_names)) [17:27:38.122] next [17:27:38.122] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.122] } [17:27:38.122] NAMES <- toupper(added) [17:27:38.122] for (kk in seq_along(NAMES)) { [17:27:38.122] name <- added[[kk]] [17:27:38.122] NAME <- NAMES[[kk]] [17:27:38.122] if (name != NAME && is.element(NAME, old_names)) [17:27:38.122] next [17:27:38.122] args[[name]] <- "" [17:27:38.122] } [17:27:38.122] NAMES <- toupper(removed) [17:27:38.122] for (kk in seq_along(NAMES)) { [17:27:38.122] name <- removed[[kk]] [17:27:38.122] NAME <- NAMES[[kk]] [17:27:38.122] if (name != NAME && is.element(NAME, old_names)) [17:27:38.122] next [17:27:38.122] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.122] } [17:27:38.122] if (length(args) > 0) [17:27:38.122] base::do.call(base::Sys.setenv, args = args) [17:27:38.122] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:38.122] } [17:27:38.122] else { [17:27:38.122] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:38.122] } [17:27:38.122] { [17:27:38.122] if (base::length(...future.futureOptionsAdded) > [17:27:38.122] 0L) { [17:27:38.122] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:38.122] base::names(opts) <- ...future.futureOptionsAdded [17:27:38.122] base::options(opts) [17:27:38.122] } [17:27:38.122] { [17:27:38.122] { [17:27:38.122] base::options(mc.cores = ...future.mc.cores.old) [17:27:38.122] NULL [17:27:38.122] } [17:27:38.122] options(future.plan = NULL) [17:27:38.122] if (is.na(NA_character_)) [17:27:38.122] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.122] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:38.122] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:38.122] .init = FALSE) [17:27:38.122] } [17:27:38.122] } [17:27:38.122] } [17:27:38.122] }) [17:27:38.122] if (TRUE) { [17:27:38.122] base::sink(type = "output", split = FALSE) [17:27:38.122] if (TRUE) { [17:27:38.122] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:38.122] } [17:27:38.122] else { [17:27:38.122] ...future.result["stdout"] <- base::list(NULL) [17:27:38.122] } [17:27:38.122] base::close(...future.stdout) [17:27:38.122] ...future.stdout <- NULL [17:27:38.122] } [17:27:38.122] ...future.result$conditions <- ...future.conditions [17:27:38.122] ...future.result$finished <- base::Sys.time() [17:27:38.122] ...future.result [17:27:38.122] } [17:27:38.131] MultisessionFuture started [17:27:38.132] - Launch lazy future ... done [17:27:38.132] run() for 'MultisessionFuture' ... done List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 List of 6 $ a: num 1 $ b:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ c:Classes 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:4] 2 1 3 1 - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:38.144] receiveMessageFromWorker() for ClusterFuture ... [17:27:38.144] - Validating connection of MultisessionFuture [17:27:38.145] - received message: FutureResult [17:27:38.145] - Received FutureResult [17:27:38.145] - Erased future from FutureRegistry [17:27:38.146] result() for ClusterFuture ... [17:27:38.146] - result already collected: FutureResult [17:27:38.146] result() for ClusterFuture ... done [17:27:38.146] receiveMessageFromWorker() for ClusterFuture ... done [17:27:38.164] receiveMessageFromWorker() for ClusterFuture ... [17:27:38.165] - Validating connection of MultisessionFuture [17:27:38.165] - received message: FutureResult [17:27:38.165] - Received FutureResult [17:27:38.166] - Erased future from FutureRegistry [17:27:38.166] result() for ClusterFuture ... [17:27:38.166] - result already collected: FutureResult [17:27:38.166] result() for ClusterFuture ... done [17:27:38.167] receiveMessageFromWorker() for ClusterFuture ... done logi [1:2, 1, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [17:27:38.170] resolve() on list ... [17:27:38.171] recursive: 0 [17:27:38.171] length: 6 [17:27:38.171] elements: 'a', 'b', 'c', '', '', '' [17:27:38.171] signalConditionsASAP(numeric, pos=1) ... [17:27:38.171] - nx: 6 [17:27:38.172] - relay: TRUE [17:27:38.172] - stdout: TRUE [17:27:38.172] - signal: TRUE [17:27:38.172] - resignal: FALSE [17:27:38.173] - force: TRUE [17:27:38.173] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.173] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.173] - until=2 [17:27:38.174] - relaying element #2 [17:27:38.174] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.174] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.174] signalConditionsASAP(NULL, pos=1) ... done [17:27:38.174] length: 5 (resolved future 1) [17:27:38.175] Future #2 [17:27:38.175] result() for ClusterFuture ... [17:27:38.175] - result already collected: FutureResult [17:27:38.175] result() for ClusterFuture ... done [17:27:38.176] result() for ClusterFuture ... [17:27:38.176] - result already collected: FutureResult [17:27:38.176] result() for ClusterFuture ... done [17:27:38.176] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:38.177] - nx: 6 [17:27:38.177] - relay: TRUE [17:27:38.177] - stdout: TRUE [17:27:38.177] - signal: TRUE [17:27:38.178] - resignal: FALSE [17:27:38.178] - force: TRUE [17:27:38.178] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.178] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:38.179] - until=2 [17:27:38.179] - relaying element #2 [17:27:38.179] result() for ClusterFuture ... [17:27:38.179] - result already collected: FutureResult [17:27:38.180] result() for ClusterFuture ... done [17:27:38.180] result() for ClusterFuture ... [17:27:38.180] - result already collected: FutureResult [17:27:38.180] result() for ClusterFuture ... done [17:27:38.181] result() for ClusterFuture ... [17:27:38.181] - result already collected: FutureResult [17:27:38.181] result() for ClusterFuture ... done [17:27:38.181] result() for ClusterFuture ... [17:27:38.182] - result already collected: FutureResult [17:27:38.182] result() for ClusterFuture ... done [17:27:38.182] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.182] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.183] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:38.183] length: 4 (resolved future 2) [17:27:38.183] Future #3 [17:27:38.184] result() for ClusterFuture ... [17:27:38.184] - result already collected: FutureResult [17:27:38.184] result() for ClusterFuture ... done [17:27:38.184] result() for ClusterFuture ... [17:27:38.185] - result already collected: FutureResult [17:27:38.185] result() for ClusterFuture ... done [17:27:38.185] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:38.185] - nx: 6 [17:27:38.186] - relay: TRUE [17:27:38.186] - stdout: TRUE [17:27:38.186] - signal: TRUE [17:27:38.186] - resignal: FALSE [17:27:38.187] - force: TRUE [17:27:38.187] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.187] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:38.187] - until=3 [17:27:38.188] - relaying element #3 [17:27:38.188] result() for ClusterFuture ... [17:27:38.188] - result already collected: FutureResult [17:27:38.189] result() for ClusterFuture ... done [17:27:38.189] result() for ClusterFuture ... [17:27:38.189] - result already collected: FutureResult [17:27:38.189] result() for ClusterFuture ... done [17:27:38.189] result() for ClusterFuture ... [17:27:38.190] - result already collected: FutureResult [17:27:38.190] result() for ClusterFuture ... done [17:27:38.190] result() for ClusterFuture ... [17:27:38.190] - result already collected: FutureResult [17:27:38.190] result() for ClusterFuture ... done [17:27:38.190] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.191] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.191] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:38.191] length: 3 (resolved future 3) [17:27:38.191] signalConditionsASAP(NULL, pos=4) ... [17:27:38.191] - nx: 6 [17:27:38.192] - relay: TRUE [17:27:38.192] - stdout: TRUE [17:27:38.192] - signal: TRUE [17:27:38.192] - resignal: FALSE [17:27:38.192] - force: TRUE [17:27:38.192] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.193] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.193] - until=5 [17:27:38.193] - relaying element #5 [17:27:38.193] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:38.193] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.194] signalConditionsASAP(NULL, pos=4) ... done [17:27:38.194] length: 2 (resolved future 4) [17:27:38.194] signalConditionsASAP(NULL, pos=5) ... [17:27:38.194] - nx: 6 [17:27:38.194] - relay: TRUE [17:27:38.194] - stdout: TRUE [17:27:38.195] - signal: TRUE [17:27:38.195] - resignal: FALSE [17:27:38.195] - force: TRUE [17:27:38.195] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:38.195] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.196] - until=6 [17:27:38.196] - relaying element #6 [17:27:38.196] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:38.196] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.196] signalConditionsASAP(NULL, pos=5) ... done [17:27:38.197] length: 1 (resolved future 5) [17:27:38.197] signalConditionsASAP(numeric, pos=6) ... [17:27:38.197] - nx: 6 [17:27:38.197] - relay: TRUE [17:27:38.197] - stdout: TRUE [17:27:38.198] - signal: TRUE [17:27:38.198] - resignal: FALSE [17:27:38.198] - force: TRUE [17:27:38.198] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:38.198] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.198] - until=6 [17:27:38.199] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:38.199] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.199] signalConditionsASAP(numeric, pos=6) ... done [17:27:38.199] length: 0 (resolved future 6) [17:27:38.199] Relaying remaining futures [17:27:38.200] signalConditionsASAP(NULL, pos=0) ... [17:27:38.200] - nx: 6 [17:27:38.200] - relay: TRUE [17:27:38.200] - stdout: TRUE [17:27:38.200] - signal: TRUE [17:27:38.200] - resignal: FALSE [17:27:38.201] - force: TRUE [17:27:38.201] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:38.201] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [17:27:38.201] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:38.201] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:38.202] signalConditionsASAP(NULL, pos=0) ... done [17:27:38.202] resolve() on list ... DONE [17:27:38.202] result() for ClusterFuture ... [17:27:38.202] - result already collected: FutureResult [17:27:38.202] result() for ClusterFuture ... done [17:27:38.203] result() for ClusterFuture ... [17:27:38.203] - result already collected: FutureResult [17:27:38.203] result() for ClusterFuture ... done [17:27:38.203] result() for ClusterFuture ... [17:27:38.203] - result already collected: FutureResult [17:27:38.204] result() for ClusterFuture ... done [17:27:38.204] result() for ClusterFuture ... [17:27:38.204] - result already collected: FutureResult [17:27:38.204] result() for ClusterFuture ... done List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 - attr(*, "dim")= int [1:4] 2 1 3 1 - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" *** futures() - list ... DONE Type of object: environment Type of future: multisession [17:27:38.210] plan(): Setting new future strategy stack: [17:27:38.210] List of future strategies: [17:27:38.210] 1. multisession: [17:27:38.210] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:38.210] - tweaked: FALSE [17:27:38.210] - call: plan(strategy) [17:27:38.218] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [17:27:38.219] multisession: [17:27:38.219] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:38.219] - tweaked: FALSE [17:27:38.219] - call: plan(strategy) [17:27:38.223] getGlobalsAndPackages() ... [17:27:38.223] Not searching for globals [17:27:38.223] - globals: [0] [17:27:38.224] getGlobalsAndPackages() ... DONE [17:27:38.224] [local output] makeClusterPSOCK() ... [17:27:38.227] [local output] Workers: [n = 2] 'localhost', 'localhost' [17:27:38.230] [local output] Base port: 32719 [17:27:38.230] [local output] Getting setup options for 2 cluster nodes ... [17:27:38.231] [local output] - Node #1 of 2 ... [17:27:38.231] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:38.233] [local output] Rscript port: 32719 [17:27:38.233] [local output] - Node #2 of 2 ... [17:27:38.234] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:38.235] [local output] Rscript port: 32719 [17:27:38.236] [local output] Getting setup options for 2 cluster nodes ... done [17:27:38.236] [local output] - Parallel setup requested for some PSOCK nodes [17:27:38.237] [local output] Setting up PSOCK nodes in parallel [17:27:38.237] List of 36 [17:27:38.237] $ worker : chr "localhost" [17:27:38.237] ..- attr(*, "localhost")= logi TRUE [17:27:38.237] $ master : chr "localhost" [17:27:38.237] $ port : int 32719 [17:27:38.237] $ connectTimeout : num 120 [17:27:38.237] $ timeout : num 120 [17:27:38.237] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [17:27:38.237] $ homogeneous : logi TRUE [17:27:38.237] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=futures.R:101676:CRANWIN3:CRAN\""| __truncated__ [17:27:38.237] $ rscript_envs : NULL [17:27:38.237] $ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:38.237] $ rscript_startup : NULL [17:27:38.237] $ rscript_sh : chr [1:2] "cmd" "cmd" [17:27:38.237] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:38.237] $ methods : logi TRUE [17:27:38.237] $ socketOptions : chr "no-delay" [17:27:38.237] $ useXDR : logi FALSE [17:27:38.237] $ outfile : chr "/dev/null" [17:27:38.237] $ renice : int NA [17:27:38.237] $ rshcmd : NULL [17:27:38.237] $ user : chr(0) [17:27:38.237] $ revtunnel : logi FALSE [17:27:38.237] $ rshlogfile : NULL [17:27:38.237] $ rshopts : chr(0) [17:27:38.237] $ rank : int 1 [17:27:38.237] $ manual : logi FALSE [17:27:38.237] $ dryrun : logi FALSE [17:27:38.237] $ quiet : logi FALSE [17:27:38.237] $ setup_strategy : chr "parallel" [17:27:38.237] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:38.237] $ pidfile : chr "D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c2599331c.pid" [17:27:38.237] $ rshcmd_label : NULL [17:27:38.237] $ rsh_call : NULL [17:27:38.237] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:38.237] $ localMachine : logi TRUE [17:27:38.237] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [17:27:38.237] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [17:27:38.237] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [17:27:38.237] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [17:27:38.237] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [17:27:38.237] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [17:27:38.237] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [17:27:38.237] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [17:27:38.237] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [17:27:38.237] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [17:27:38.237] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [17:27:38.237] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [17:27:38.237] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [17:27:38.237] "parallel"), action = c("launch", "options"), verbose = FALSE) [17:27:38.237] $ arguments :List of 28 [17:27:38.237] ..$ worker : chr "localhost" [17:27:38.237] ..$ master : NULL [17:27:38.237] ..$ port : int 32719 [17:27:38.237] ..$ connectTimeout : num 120 [17:27:38.237] ..$ timeout : num 120 [17:27:38.237] ..$ rscript : NULL [17:27:38.237] ..$ homogeneous : NULL [17:27:38.237] ..$ rscript_args : NULL [17:27:38.237] ..$ rscript_envs : NULL [17:27:38.237] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:38.237] ..$ rscript_startup : NULL [17:27:38.237] ..$ rscript_sh : chr "auto" [17:27:38.237] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:38.237] ..$ methods : logi TRUE [17:27:38.237] ..$ socketOptions : chr "no-delay" [17:27:38.237] ..$ useXDR : logi FALSE [17:27:38.237] ..$ outfile : chr "/dev/null" [17:27:38.237] ..$ renice : int NA [17:27:38.237] ..$ rshcmd : NULL [17:27:38.237] ..$ user : NULL [17:27:38.237] ..$ revtunnel : logi NA [17:27:38.237] ..$ rshlogfile : NULL [17:27:38.237] ..$ rshopts : NULL [17:27:38.237] ..$ rank : int 1 [17:27:38.237] ..$ manual : logi FALSE [17:27:38.237] ..$ dryrun : logi FALSE [17:27:38.237] ..$ quiet : logi FALSE [17:27:38.237] ..$ setup_strategy : chr "parallel" [17:27:38.237] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [17:27:38.261] [local output] System call to launch all workers: [17:27:38.261] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=futures.R:101676:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c2599331c.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=32719 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [17:27:38.261] [local output] Starting PSOCK main server [17:27:38.270] [local output] Workers launched [17:27:38.270] [local output] Waiting for workers to connect back [17:27:38.270] - [local output] 0 workers out of 2 ready [17:27:38.488] - [local output] 0 workers out of 2 ready [17:27:38.489] - [local output] 1 workers out of 2 ready [17:27:38.509] - [local output] 1 workers out of 2 ready [17:27:38.510] - [local output] 2 workers out of 2 ready [17:27:38.510] [local output] Launching of 2 workers completed [17:27:38.511] [local output] Number of nodes in cluster: 2 [17:27:38.511] [local output] Collecting session information from 2 workers [17:27:38.512] [local output] - Worker #1 of 2 [17:27:38.513] [local output] - Worker #2 of 2 [17:27:38.514] [local output] makeClusterPSOCK() ... done [17:27:38.528] Packages needed by the future expression (n = 0): [17:27:38.528] Packages needed by future strategies (n = 0): [17:27:38.529] { [17:27:38.529] { [17:27:38.529] { [17:27:38.529] ...future.startTime <- base::Sys.time() [17:27:38.529] { [17:27:38.529] { [17:27:38.529] { [17:27:38.529] { [17:27:38.529] base::local({ [17:27:38.529] has_future <- base::requireNamespace("future", [17:27:38.529] quietly = TRUE) [17:27:38.529] if (has_future) { [17:27:38.529] ns <- base::getNamespace("future") [17:27:38.529] version <- ns[[".package"]][["version"]] [17:27:38.529] if (is.null(version)) [17:27:38.529] version <- utils::packageVersion("future") [17:27:38.529] } [17:27:38.529] else { [17:27:38.529] version <- NULL [17:27:38.529] } [17:27:38.529] if (!has_future || version < "1.8.0") { [17:27:38.529] info <- base::c(r_version = base::gsub("R version ", [17:27:38.529] "", base::R.version$version.string), [17:27:38.529] platform = base::sprintf("%s (%s-bit)", [17:27:38.529] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:38.529] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:38.529] "release", "version")], collapse = " "), [17:27:38.529] hostname = base::Sys.info()[["nodename"]]) [17:27:38.529] info <- base::sprintf("%s: %s", base::names(info), [17:27:38.529] info) [17:27:38.529] info <- base::paste(info, collapse = "; ") [17:27:38.529] if (!has_future) { [17:27:38.529] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:38.529] info) [17:27:38.529] } [17:27:38.529] else { [17:27:38.529] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:38.529] info, version) [17:27:38.529] } [17:27:38.529] base::stop(msg) [17:27:38.529] } [17:27:38.529] }) [17:27:38.529] } [17:27:38.529] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:38.529] base::options(mc.cores = 1L) [17:27:38.529] } [17:27:38.529] ...future.strategy.old <- future::plan("list") [17:27:38.529] options(future.plan = NULL) [17:27:38.529] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.529] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:38.529] } [17:27:38.529] ...future.workdir <- getwd() [17:27:38.529] } [17:27:38.529] ...future.oldOptions <- base::as.list(base::.Options) [17:27:38.529] ...future.oldEnvVars <- base::Sys.getenv() [17:27:38.529] } [17:27:38.529] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:38.529] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:38.529] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:38.529] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:38.529] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:38.529] future.stdout.windows.reencode = NULL, width = 80L) [17:27:38.529] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:38.529] base::names(...future.oldOptions)) [17:27:38.529] } [17:27:38.529] if (FALSE) { [17:27:38.529] } [17:27:38.529] else { [17:27:38.529] if (TRUE) { [17:27:38.529] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:38.529] open = "w") [17:27:38.529] } [17:27:38.529] else { [17:27:38.529] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:38.529] windows = "NUL", "/dev/null"), open = "w") [17:27:38.529] } [17:27:38.529] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:38.529] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:38.529] base::sink(type = "output", split = FALSE) [17:27:38.529] base::close(...future.stdout) [17:27:38.529] }, add = TRUE) [17:27:38.529] } [17:27:38.529] ...future.frame <- base::sys.nframe() [17:27:38.529] ...future.conditions <- base::list() [17:27:38.529] ...future.rng <- base::globalenv()$.Random.seed [17:27:38.529] if (FALSE) { [17:27:38.529] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:38.529] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:38.529] } [17:27:38.529] ...future.result <- base::tryCatch({ [17:27:38.529] base::withCallingHandlers({ [17:27:38.529] ...future.value <- base::withVisible(base::local({ [17:27:38.529] ...future.makeSendCondition <- base::local({ [17:27:38.529] sendCondition <- NULL [17:27:38.529] function(frame = 1L) { [17:27:38.529] if (is.function(sendCondition)) [17:27:38.529] return(sendCondition) [17:27:38.529] ns <- getNamespace("parallel") [17:27:38.529] if (exists("sendData", mode = "function", [17:27:38.529] envir = ns)) { [17:27:38.529] parallel_sendData <- get("sendData", mode = "function", [17:27:38.529] envir = ns) [17:27:38.529] envir <- sys.frame(frame) [17:27:38.529] master <- NULL [17:27:38.529] while (!identical(envir, .GlobalEnv) && [17:27:38.529] !identical(envir, emptyenv())) { [17:27:38.529] if (exists("master", mode = "list", envir = envir, [17:27:38.529] inherits = FALSE)) { [17:27:38.529] master <- get("master", mode = "list", [17:27:38.529] envir = envir, inherits = FALSE) [17:27:38.529] if (inherits(master, c("SOCKnode", [17:27:38.529] "SOCK0node"))) { [17:27:38.529] sendCondition <<- function(cond) { [17:27:38.529] data <- list(type = "VALUE", value = cond, [17:27:38.529] success = TRUE) [17:27:38.529] parallel_sendData(master, data) [17:27:38.529] } [17:27:38.529] return(sendCondition) [17:27:38.529] } [17:27:38.529] } [17:27:38.529] frame <- frame + 1L [17:27:38.529] envir <- sys.frame(frame) [17:27:38.529] } [17:27:38.529] } [17:27:38.529] sendCondition <<- function(cond) NULL [17:27:38.529] } [17:27:38.529] }) [17:27:38.529] withCallingHandlers({ [17:27:38.529] NA [17:27:38.529] }, immediateCondition = function(cond) { [17:27:38.529] sendCondition <- ...future.makeSendCondition() [17:27:38.529] sendCondition(cond) [17:27:38.529] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.529] { [17:27:38.529] inherits <- base::inherits [17:27:38.529] invokeRestart <- base::invokeRestart [17:27:38.529] is.null <- base::is.null [17:27:38.529] muffled <- FALSE [17:27:38.529] if (inherits(cond, "message")) { [17:27:38.529] muffled <- grepl(pattern, "muffleMessage") [17:27:38.529] if (muffled) [17:27:38.529] invokeRestart("muffleMessage") [17:27:38.529] } [17:27:38.529] else if (inherits(cond, "warning")) { [17:27:38.529] muffled <- grepl(pattern, "muffleWarning") [17:27:38.529] if (muffled) [17:27:38.529] invokeRestart("muffleWarning") [17:27:38.529] } [17:27:38.529] else if (inherits(cond, "condition")) { [17:27:38.529] if (!is.null(pattern)) { [17:27:38.529] computeRestarts <- base::computeRestarts [17:27:38.529] grepl <- base::grepl [17:27:38.529] restarts <- computeRestarts(cond) [17:27:38.529] for (restart in restarts) { [17:27:38.529] name <- restart$name [17:27:38.529] if (is.null(name)) [17:27:38.529] next [17:27:38.529] if (!grepl(pattern, name)) [17:27:38.529] next [17:27:38.529] invokeRestart(restart) [17:27:38.529] muffled <- TRUE [17:27:38.529] break [17:27:38.529] } [17:27:38.529] } [17:27:38.529] } [17:27:38.529] invisible(muffled) [17:27:38.529] } [17:27:38.529] muffleCondition(cond) [17:27:38.529] }) [17:27:38.529] })) [17:27:38.529] future::FutureResult(value = ...future.value$value, [17:27:38.529] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.529] ...future.rng), globalenv = if (FALSE) [17:27:38.529] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:38.529] ...future.globalenv.names)) [17:27:38.529] else NULL, started = ...future.startTime, version = "1.8") [17:27:38.529] }, condition = base::local({ [17:27:38.529] c <- base::c [17:27:38.529] inherits <- base::inherits [17:27:38.529] invokeRestart <- base::invokeRestart [17:27:38.529] length <- base::length [17:27:38.529] list <- base::list [17:27:38.529] seq.int <- base::seq.int [17:27:38.529] signalCondition <- base::signalCondition [17:27:38.529] sys.calls <- base::sys.calls [17:27:38.529] `[[` <- base::`[[` [17:27:38.529] `+` <- base::`+` [17:27:38.529] `<<-` <- base::`<<-` [17:27:38.529] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:38.529] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:38.529] 3L)] [17:27:38.529] } [17:27:38.529] function(cond) { [17:27:38.529] is_error <- inherits(cond, "error") [17:27:38.529] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:38.529] NULL) [17:27:38.529] if (is_error) { [17:27:38.529] sessionInformation <- function() { [17:27:38.529] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:38.529] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:38.529] search = base::search(), system = base::Sys.info()) [17:27:38.529] } [17:27:38.529] ...future.conditions[[length(...future.conditions) + [17:27:38.529] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:38.529] cond$call), session = sessionInformation(), [17:27:38.529] timestamp = base::Sys.time(), signaled = 0L) [17:27:38.529] signalCondition(cond) [17:27:38.529] } [17:27:38.529] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:38.529] "immediateCondition"))) { [17:27:38.529] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:38.529] ...future.conditions[[length(...future.conditions) + [17:27:38.529] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:38.529] if (TRUE && !signal) { [17:27:38.529] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.529] { [17:27:38.529] inherits <- base::inherits [17:27:38.529] invokeRestart <- base::invokeRestart [17:27:38.529] is.null <- base::is.null [17:27:38.529] muffled <- FALSE [17:27:38.529] if (inherits(cond, "message")) { [17:27:38.529] muffled <- grepl(pattern, "muffleMessage") [17:27:38.529] if (muffled) [17:27:38.529] invokeRestart("muffleMessage") [17:27:38.529] } [17:27:38.529] else if (inherits(cond, "warning")) { [17:27:38.529] muffled <- grepl(pattern, "muffleWarning") [17:27:38.529] if (muffled) [17:27:38.529] invokeRestart("muffleWarning") [17:27:38.529] } [17:27:38.529] else if (inherits(cond, "condition")) { [17:27:38.529] if (!is.null(pattern)) { [17:27:38.529] computeRestarts <- base::computeRestarts [17:27:38.529] grepl <- base::grepl [17:27:38.529] restarts <- computeRestarts(cond) [17:27:38.529] for (restart in restarts) { [17:27:38.529] name <- restart$name [17:27:38.529] if (is.null(name)) [17:27:38.529] next [17:27:38.529] if (!grepl(pattern, name)) [17:27:38.529] next [17:27:38.529] invokeRestart(restart) [17:27:38.529] muffled <- TRUE [17:27:38.529] break [17:27:38.529] } [17:27:38.529] } [17:27:38.529] } [17:27:38.529] invisible(muffled) [17:27:38.529] } [17:27:38.529] muffleCondition(cond, pattern = "^muffle") [17:27:38.529] } [17:27:38.529] } [17:27:38.529] else { [17:27:38.529] if (TRUE) { [17:27:38.529] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.529] { [17:27:38.529] inherits <- base::inherits [17:27:38.529] invokeRestart <- base::invokeRestart [17:27:38.529] is.null <- base::is.null [17:27:38.529] muffled <- FALSE [17:27:38.529] if (inherits(cond, "message")) { [17:27:38.529] muffled <- grepl(pattern, "muffleMessage") [17:27:38.529] if (muffled) [17:27:38.529] invokeRestart("muffleMessage") [17:27:38.529] } [17:27:38.529] else if (inherits(cond, "warning")) { [17:27:38.529] muffled <- grepl(pattern, "muffleWarning") [17:27:38.529] if (muffled) [17:27:38.529] invokeRestart("muffleWarning") [17:27:38.529] } [17:27:38.529] else if (inherits(cond, "condition")) { [17:27:38.529] if (!is.null(pattern)) { [17:27:38.529] computeRestarts <- base::computeRestarts [17:27:38.529] grepl <- base::grepl [17:27:38.529] restarts <- computeRestarts(cond) [17:27:38.529] for (restart in restarts) { [17:27:38.529] name <- restart$name [17:27:38.529] if (is.null(name)) [17:27:38.529] next [17:27:38.529] if (!grepl(pattern, name)) [17:27:38.529] next [17:27:38.529] invokeRestart(restart) [17:27:38.529] muffled <- TRUE [17:27:38.529] break [17:27:38.529] } [17:27:38.529] } [17:27:38.529] } [17:27:38.529] invisible(muffled) [17:27:38.529] } [17:27:38.529] muffleCondition(cond, pattern = "^muffle") [17:27:38.529] } [17:27:38.529] } [17:27:38.529] } [17:27:38.529] })) [17:27:38.529] }, error = function(ex) { [17:27:38.529] base::structure(base::list(value = NULL, visible = NULL, [17:27:38.529] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.529] ...future.rng), started = ...future.startTime, [17:27:38.529] finished = Sys.time(), session_uuid = NA_character_, [17:27:38.529] version = "1.8"), class = "FutureResult") [17:27:38.529] }, finally = { [17:27:38.529] if (!identical(...future.workdir, getwd())) [17:27:38.529] setwd(...future.workdir) [17:27:38.529] { [17:27:38.529] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:38.529] ...future.oldOptions$nwarnings <- NULL [17:27:38.529] } [17:27:38.529] base::options(...future.oldOptions) [17:27:38.529] if (.Platform$OS.type == "windows") { [17:27:38.529] old_names <- names(...future.oldEnvVars) [17:27:38.529] envs <- base::Sys.getenv() [17:27:38.529] names <- names(envs) [17:27:38.529] common <- intersect(names, old_names) [17:27:38.529] added <- setdiff(names, old_names) [17:27:38.529] removed <- setdiff(old_names, names) [17:27:38.529] changed <- common[...future.oldEnvVars[common] != [17:27:38.529] envs[common]] [17:27:38.529] NAMES <- toupper(changed) [17:27:38.529] args <- list() [17:27:38.529] for (kk in seq_along(NAMES)) { [17:27:38.529] name <- changed[[kk]] [17:27:38.529] NAME <- NAMES[[kk]] [17:27:38.529] if (name != NAME && is.element(NAME, old_names)) [17:27:38.529] next [17:27:38.529] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.529] } [17:27:38.529] NAMES <- toupper(added) [17:27:38.529] for (kk in seq_along(NAMES)) { [17:27:38.529] name <- added[[kk]] [17:27:38.529] NAME <- NAMES[[kk]] [17:27:38.529] if (name != NAME && is.element(NAME, old_names)) [17:27:38.529] next [17:27:38.529] args[[name]] <- "" [17:27:38.529] } [17:27:38.529] NAMES <- toupper(removed) [17:27:38.529] for (kk in seq_along(NAMES)) { [17:27:38.529] name <- removed[[kk]] [17:27:38.529] NAME <- NAMES[[kk]] [17:27:38.529] if (name != NAME && is.element(NAME, old_names)) [17:27:38.529] next [17:27:38.529] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.529] } [17:27:38.529] if (length(args) > 0) [17:27:38.529] base::do.call(base::Sys.setenv, args = args) [17:27:38.529] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:38.529] } [17:27:38.529] else { [17:27:38.529] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:38.529] } [17:27:38.529] { [17:27:38.529] if (base::length(...future.futureOptionsAdded) > [17:27:38.529] 0L) { [17:27:38.529] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:38.529] base::names(opts) <- ...future.futureOptionsAdded [17:27:38.529] base::options(opts) [17:27:38.529] } [17:27:38.529] { [17:27:38.529] { [17:27:38.529] base::options(mc.cores = ...future.mc.cores.old) [17:27:38.529] NULL [17:27:38.529] } [17:27:38.529] options(future.plan = NULL) [17:27:38.529] if (is.na(NA_character_)) [17:27:38.529] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.529] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:38.529] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:38.529] .init = FALSE) [17:27:38.529] } [17:27:38.529] } [17:27:38.529] } [17:27:38.529] }) [17:27:38.529] if (TRUE) { [17:27:38.529] base::sink(type = "output", split = FALSE) [17:27:38.529] if (TRUE) { [17:27:38.529] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:38.529] } [17:27:38.529] else { [17:27:38.529] ...future.result["stdout"] <- base::list(NULL) [17:27:38.529] } [17:27:38.529] base::close(...future.stdout) [17:27:38.529] ...future.stdout <- NULL [17:27:38.529] } [17:27:38.529] ...future.result$conditions <- ...future.conditions [17:27:38.529] ...future.result$finished <- base::Sys.time() [17:27:38.529] ...future.result [17:27:38.529] } [17:27:38.648] MultisessionFuture started [17:27:38.649] result() for ClusterFuture ... [17:27:38.649] receiveMessageFromWorker() for ClusterFuture ... [17:27:38.649] - Validating connection of MultisessionFuture [17:27:38.740] - received message: FutureResult [17:27:38.740] - Received FutureResult [17:27:38.741] - Erased future from FutureRegistry [17:27:38.741] result() for ClusterFuture ... [17:27:38.741] - result already collected: FutureResult [17:27:38.742] result() for ClusterFuture ... done [17:27:38.742] receiveMessageFromWorker() for ClusterFuture ... done [17:27:38.742] result() for ClusterFuture ... done [17:27:38.742] result() for ClusterFuture ... [17:27:38.743] - result already collected: FutureResult [17:27:38.743] result() for ClusterFuture ... done [17:27:38.743] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [17:27:38.747] plan(): nbrOfWorkers() = 2 Dimensions: NULL [17:27:38.748] getGlobalsAndPackages() ... [17:27:38.748] Searching for globals... [17:27:38.749] [17:27:38.749] Searching for globals ... DONE [17:27:38.750] - globals: [0] [17:27:38.750] getGlobalsAndPackages() ... DONE [17:27:38.750] run() for 'Future' ... [17:27:38.751] - state: 'created' [17:27:38.751] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:38.774] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:38.775] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:38.779] - Field: 'node' [17:27:38.779] - Field: 'label' [17:27:38.780] - Field: 'local' [17:27:38.780] - Field: 'owner' [17:27:38.780] - Field: 'envir' [17:27:38.780] - Field: 'workers' [17:27:38.781] - Field: 'packages' [17:27:38.781] - Field: 'gc' [17:27:38.781] - Field: 'conditions' [17:27:38.782] - Field: 'persistent' [17:27:38.782] - Field: 'expr' [17:27:38.782] - Field: 'uuid' [17:27:38.783] - Field: 'seed' [17:27:38.783] - Field: 'version' [17:27:38.783] - Field: 'result' [17:27:38.783] - Field: 'asynchronous' [17:27:38.784] - Field: 'calls' [17:27:38.784] - Field: 'globals' [17:27:38.784] - Field: 'stdout' [17:27:38.785] - Field: 'earlySignal' [17:27:38.785] - Field: 'lazy' [17:27:38.786] - Field: 'state' [17:27:38.786] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:38.786] - Launch lazy future ... [17:27:38.787] Packages needed by the future expression (n = 0): [17:27:38.788] Packages needed by future strategies (n = 0): [17:27:38.789] { [17:27:38.789] { [17:27:38.789] { [17:27:38.789] ...future.startTime <- base::Sys.time() [17:27:38.789] { [17:27:38.789] { [17:27:38.789] { [17:27:38.789] { [17:27:38.789] base::local({ [17:27:38.789] has_future <- base::requireNamespace("future", [17:27:38.789] quietly = TRUE) [17:27:38.789] if (has_future) { [17:27:38.789] ns <- base::getNamespace("future") [17:27:38.789] version <- ns[[".package"]][["version"]] [17:27:38.789] if (is.null(version)) [17:27:38.789] version <- utils::packageVersion("future") [17:27:38.789] } [17:27:38.789] else { [17:27:38.789] version <- NULL [17:27:38.789] } [17:27:38.789] if (!has_future || version < "1.8.0") { [17:27:38.789] info <- base::c(r_version = base::gsub("R version ", [17:27:38.789] "", base::R.version$version.string), [17:27:38.789] platform = base::sprintf("%s (%s-bit)", [17:27:38.789] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:38.789] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:38.789] "release", "version")], collapse = " "), [17:27:38.789] hostname = base::Sys.info()[["nodename"]]) [17:27:38.789] info <- base::sprintf("%s: %s", base::names(info), [17:27:38.789] info) [17:27:38.789] info <- base::paste(info, collapse = "; ") [17:27:38.789] if (!has_future) { [17:27:38.789] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:38.789] info) [17:27:38.789] } [17:27:38.789] else { [17:27:38.789] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:38.789] info, version) [17:27:38.789] } [17:27:38.789] base::stop(msg) [17:27:38.789] } [17:27:38.789] }) [17:27:38.789] } [17:27:38.789] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:38.789] base::options(mc.cores = 1L) [17:27:38.789] } [17:27:38.789] ...future.strategy.old <- future::plan("list") [17:27:38.789] options(future.plan = NULL) [17:27:38.789] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.789] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:38.789] } [17:27:38.789] ...future.workdir <- getwd() [17:27:38.789] } [17:27:38.789] ...future.oldOptions <- base::as.list(base::.Options) [17:27:38.789] ...future.oldEnvVars <- base::Sys.getenv() [17:27:38.789] } [17:27:38.789] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:38.789] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:38.789] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:38.789] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:38.789] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:38.789] future.stdout.windows.reencode = NULL, width = 80L) [17:27:38.789] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:38.789] base::names(...future.oldOptions)) [17:27:38.789] } [17:27:38.789] if (FALSE) { [17:27:38.789] } [17:27:38.789] else { [17:27:38.789] if (TRUE) { [17:27:38.789] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:38.789] open = "w") [17:27:38.789] } [17:27:38.789] else { [17:27:38.789] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:38.789] windows = "NUL", "/dev/null"), open = "w") [17:27:38.789] } [17:27:38.789] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:38.789] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:38.789] base::sink(type = "output", split = FALSE) [17:27:38.789] base::close(...future.stdout) [17:27:38.789] }, add = TRUE) [17:27:38.789] } [17:27:38.789] ...future.frame <- base::sys.nframe() [17:27:38.789] ...future.conditions <- base::list() [17:27:38.789] ...future.rng <- base::globalenv()$.Random.seed [17:27:38.789] if (FALSE) { [17:27:38.789] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:38.789] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:38.789] } [17:27:38.789] ...future.result <- base::tryCatch({ [17:27:38.789] base::withCallingHandlers({ [17:27:38.789] ...future.value <- base::withVisible(base::local({ [17:27:38.789] ...future.makeSendCondition <- base::local({ [17:27:38.789] sendCondition <- NULL [17:27:38.789] function(frame = 1L) { [17:27:38.789] if (is.function(sendCondition)) [17:27:38.789] return(sendCondition) [17:27:38.789] ns <- getNamespace("parallel") [17:27:38.789] if (exists("sendData", mode = "function", [17:27:38.789] envir = ns)) { [17:27:38.789] parallel_sendData <- get("sendData", mode = "function", [17:27:38.789] envir = ns) [17:27:38.789] envir <- sys.frame(frame) [17:27:38.789] master <- NULL [17:27:38.789] while (!identical(envir, .GlobalEnv) && [17:27:38.789] !identical(envir, emptyenv())) { [17:27:38.789] if (exists("master", mode = "list", envir = envir, [17:27:38.789] inherits = FALSE)) { [17:27:38.789] master <- get("master", mode = "list", [17:27:38.789] envir = envir, inherits = FALSE) [17:27:38.789] if (inherits(master, c("SOCKnode", [17:27:38.789] "SOCK0node"))) { [17:27:38.789] sendCondition <<- function(cond) { [17:27:38.789] data <- list(type = "VALUE", value = cond, [17:27:38.789] success = TRUE) [17:27:38.789] parallel_sendData(master, data) [17:27:38.789] } [17:27:38.789] return(sendCondition) [17:27:38.789] } [17:27:38.789] } [17:27:38.789] frame <- frame + 1L [17:27:38.789] envir <- sys.frame(frame) [17:27:38.789] } [17:27:38.789] } [17:27:38.789] sendCondition <<- function(cond) NULL [17:27:38.789] } [17:27:38.789] }) [17:27:38.789] withCallingHandlers({ [17:27:38.789] 2 [17:27:38.789] }, immediateCondition = function(cond) { [17:27:38.789] sendCondition <- ...future.makeSendCondition() [17:27:38.789] sendCondition(cond) [17:27:38.789] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.789] { [17:27:38.789] inherits <- base::inherits [17:27:38.789] invokeRestart <- base::invokeRestart [17:27:38.789] is.null <- base::is.null [17:27:38.789] muffled <- FALSE [17:27:38.789] if (inherits(cond, "message")) { [17:27:38.789] muffled <- grepl(pattern, "muffleMessage") [17:27:38.789] if (muffled) [17:27:38.789] invokeRestart("muffleMessage") [17:27:38.789] } [17:27:38.789] else if (inherits(cond, "warning")) { [17:27:38.789] muffled <- grepl(pattern, "muffleWarning") [17:27:38.789] if (muffled) [17:27:38.789] invokeRestart("muffleWarning") [17:27:38.789] } [17:27:38.789] else if (inherits(cond, "condition")) { [17:27:38.789] if (!is.null(pattern)) { [17:27:38.789] computeRestarts <- base::computeRestarts [17:27:38.789] grepl <- base::grepl [17:27:38.789] restarts <- computeRestarts(cond) [17:27:38.789] for (restart in restarts) { [17:27:38.789] name <- restart$name [17:27:38.789] if (is.null(name)) [17:27:38.789] next [17:27:38.789] if (!grepl(pattern, name)) [17:27:38.789] next [17:27:38.789] invokeRestart(restart) [17:27:38.789] muffled <- TRUE [17:27:38.789] break [17:27:38.789] } [17:27:38.789] } [17:27:38.789] } [17:27:38.789] invisible(muffled) [17:27:38.789] } [17:27:38.789] muffleCondition(cond) [17:27:38.789] }) [17:27:38.789] })) [17:27:38.789] future::FutureResult(value = ...future.value$value, [17:27:38.789] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.789] ...future.rng), globalenv = if (FALSE) [17:27:38.789] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:38.789] ...future.globalenv.names)) [17:27:38.789] else NULL, started = ...future.startTime, version = "1.8") [17:27:38.789] }, condition = base::local({ [17:27:38.789] c <- base::c [17:27:38.789] inherits <- base::inherits [17:27:38.789] invokeRestart <- base::invokeRestart [17:27:38.789] length <- base::length [17:27:38.789] list <- base::list [17:27:38.789] seq.int <- base::seq.int [17:27:38.789] signalCondition <- base::signalCondition [17:27:38.789] sys.calls <- base::sys.calls [17:27:38.789] `[[` <- base::`[[` [17:27:38.789] `+` <- base::`+` [17:27:38.789] `<<-` <- base::`<<-` [17:27:38.789] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:38.789] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:38.789] 3L)] [17:27:38.789] } [17:27:38.789] function(cond) { [17:27:38.789] is_error <- inherits(cond, "error") [17:27:38.789] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:38.789] NULL) [17:27:38.789] if (is_error) { [17:27:38.789] sessionInformation <- function() { [17:27:38.789] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:38.789] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:38.789] search = base::search(), system = base::Sys.info()) [17:27:38.789] } [17:27:38.789] ...future.conditions[[length(...future.conditions) + [17:27:38.789] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:38.789] cond$call), session = sessionInformation(), [17:27:38.789] timestamp = base::Sys.time(), signaled = 0L) [17:27:38.789] signalCondition(cond) [17:27:38.789] } [17:27:38.789] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:38.789] "immediateCondition"))) { [17:27:38.789] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:38.789] ...future.conditions[[length(...future.conditions) + [17:27:38.789] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:38.789] if (TRUE && !signal) { [17:27:38.789] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.789] { [17:27:38.789] inherits <- base::inherits [17:27:38.789] invokeRestart <- base::invokeRestart [17:27:38.789] is.null <- base::is.null [17:27:38.789] muffled <- FALSE [17:27:38.789] if (inherits(cond, "message")) { [17:27:38.789] muffled <- grepl(pattern, "muffleMessage") [17:27:38.789] if (muffled) [17:27:38.789] invokeRestart("muffleMessage") [17:27:38.789] } [17:27:38.789] else if (inherits(cond, "warning")) { [17:27:38.789] muffled <- grepl(pattern, "muffleWarning") [17:27:38.789] if (muffled) [17:27:38.789] invokeRestart("muffleWarning") [17:27:38.789] } [17:27:38.789] else if (inherits(cond, "condition")) { [17:27:38.789] if (!is.null(pattern)) { [17:27:38.789] computeRestarts <- base::computeRestarts [17:27:38.789] grepl <- base::grepl [17:27:38.789] restarts <- computeRestarts(cond) [17:27:38.789] for (restart in restarts) { [17:27:38.789] name <- restart$name [17:27:38.789] if (is.null(name)) [17:27:38.789] next [17:27:38.789] if (!grepl(pattern, name)) [17:27:38.789] next [17:27:38.789] invokeRestart(restart) [17:27:38.789] muffled <- TRUE [17:27:38.789] break [17:27:38.789] } [17:27:38.789] } [17:27:38.789] } [17:27:38.789] invisible(muffled) [17:27:38.789] } [17:27:38.789] muffleCondition(cond, pattern = "^muffle") [17:27:38.789] } [17:27:38.789] } [17:27:38.789] else { [17:27:38.789] if (TRUE) { [17:27:38.789] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.789] { [17:27:38.789] inherits <- base::inherits [17:27:38.789] invokeRestart <- base::invokeRestart [17:27:38.789] is.null <- base::is.null [17:27:38.789] muffled <- FALSE [17:27:38.789] if (inherits(cond, "message")) { [17:27:38.789] muffled <- grepl(pattern, "muffleMessage") [17:27:38.789] if (muffled) [17:27:38.789] invokeRestart("muffleMessage") [17:27:38.789] } [17:27:38.789] else if (inherits(cond, "warning")) { [17:27:38.789] muffled <- grepl(pattern, "muffleWarning") [17:27:38.789] if (muffled) [17:27:38.789] invokeRestart("muffleWarning") [17:27:38.789] } [17:27:38.789] else if (inherits(cond, "condition")) { [17:27:38.789] if (!is.null(pattern)) { [17:27:38.789] computeRestarts <- base::computeRestarts [17:27:38.789] grepl <- base::grepl [17:27:38.789] restarts <- computeRestarts(cond) [17:27:38.789] for (restart in restarts) { [17:27:38.789] name <- restart$name [17:27:38.789] if (is.null(name)) [17:27:38.789] next [17:27:38.789] if (!grepl(pattern, name)) [17:27:38.789] next [17:27:38.789] invokeRestart(restart) [17:27:38.789] muffled <- TRUE [17:27:38.789] break [17:27:38.789] } [17:27:38.789] } [17:27:38.789] } [17:27:38.789] invisible(muffled) [17:27:38.789] } [17:27:38.789] muffleCondition(cond, pattern = "^muffle") [17:27:38.789] } [17:27:38.789] } [17:27:38.789] } [17:27:38.789] })) [17:27:38.789] }, error = function(ex) { [17:27:38.789] base::structure(base::list(value = NULL, visible = NULL, [17:27:38.789] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.789] ...future.rng), started = ...future.startTime, [17:27:38.789] finished = Sys.time(), session_uuid = NA_character_, [17:27:38.789] version = "1.8"), class = "FutureResult") [17:27:38.789] }, finally = { [17:27:38.789] if (!identical(...future.workdir, getwd())) [17:27:38.789] setwd(...future.workdir) [17:27:38.789] { [17:27:38.789] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:38.789] ...future.oldOptions$nwarnings <- NULL [17:27:38.789] } [17:27:38.789] base::options(...future.oldOptions) [17:27:38.789] if (.Platform$OS.type == "windows") { [17:27:38.789] old_names <- names(...future.oldEnvVars) [17:27:38.789] envs <- base::Sys.getenv() [17:27:38.789] names <- names(envs) [17:27:38.789] common <- intersect(names, old_names) [17:27:38.789] added <- setdiff(names, old_names) [17:27:38.789] removed <- setdiff(old_names, names) [17:27:38.789] changed <- common[...future.oldEnvVars[common] != [17:27:38.789] envs[common]] [17:27:38.789] NAMES <- toupper(changed) [17:27:38.789] args <- list() [17:27:38.789] for (kk in seq_along(NAMES)) { [17:27:38.789] name <- changed[[kk]] [17:27:38.789] NAME <- NAMES[[kk]] [17:27:38.789] if (name != NAME && is.element(NAME, old_names)) [17:27:38.789] next [17:27:38.789] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.789] } [17:27:38.789] NAMES <- toupper(added) [17:27:38.789] for (kk in seq_along(NAMES)) { [17:27:38.789] name <- added[[kk]] [17:27:38.789] NAME <- NAMES[[kk]] [17:27:38.789] if (name != NAME && is.element(NAME, old_names)) [17:27:38.789] next [17:27:38.789] args[[name]] <- "" [17:27:38.789] } [17:27:38.789] NAMES <- toupper(removed) [17:27:38.789] for (kk in seq_along(NAMES)) { [17:27:38.789] name <- removed[[kk]] [17:27:38.789] NAME <- NAMES[[kk]] [17:27:38.789] if (name != NAME && is.element(NAME, old_names)) [17:27:38.789] next [17:27:38.789] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.789] } [17:27:38.789] if (length(args) > 0) [17:27:38.789] base::do.call(base::Sys.setenv, args = args) [17:27:38.789] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:38.789] } [17:27:38.789] else { [17:27:38.789] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:38.789] } [17:27:38.789] { [17:27:38.789] if (base::length(...future.futureOptionsAdded) > [17:27:38.789] 0L) { [17:27:38.789] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:38.789] base::names(opts) <- ...future.futureOptionsAdded [17:27:38.789] base::options(opts) [17:27:38.789] } [17:27:38.789] { [17:27:38.789] { [17:27:38.789] base::options(mc.cores = ...future.mc.cores.old) [17:27:38.789] NULL [17:27:38.789] } [17:27:38.789] options(future.plan = NULL) [17:27:38.789] if (is.na(NA_character_)) [17:27:38.789] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.789] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:38.789] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:38.789] .init = FALSE) [17:27:38.789] } [17:27:38.789] } [17:27:38.789] } [17:27:38.789] }) [17:27:38.789] if (TRUE) { [17:27:38.789] base::sink(type = "output", split = FALSE) [17:27:38.789] if (TRUE) { [17:27:38.789] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:38.789] } [17:27:38.789] else { [17:27:38.789] ...future.result["stdout"] <- base::list(NULL) [17:27:38.789] } [17:27:38.789] base::close(...future.stdout) [17:27:38.789] ...future.stdout <- NULL [17:27:38.789] } [17:27:38.789] ...future.result$conditions <- ...future.conditions [17:27:38.789] ...future.result$finished <- base::Sys.time() [17:27:38.789] ...future.result [17:27:38.789] } [17:27:38.800] MultisessionFuture started [17:27:38.800] - Launch lazy future ... done [17:27:38.801] run() for 'MultisessionFuture' ... done [17:27:38.801] getGlobalsAndPackages() ... [17:27:38.801] Searching for globals... [17:27:38.802] [17:27:38.803] Searching for globals ... DONE [17:27:38.803] - globals: [0] [17:27:38.803] getGlobalsAndPackages() ... DONE [17:27:38.804] run() for 'Future' ... [17:27:38.804] - state: 'created' [17:27:38.805] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:38.828] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:38.829] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:38.829] - Field: 'node' [17:27:38.830] - Field: 'label' [17:27:38.830] - Field: 'local' [17:27:38.830] - Field: 'owner' [17:27:38.831] - Field: 'envir' [17:27:38.831] - Field: 'workers' [17:27:38.831] - Field: 'packages' [17:27:38.832] - Field: 'gc' [17:27:38.832] - Field: 'conditions' [17:27:38.833] - Field: 'persistent' [17:27:38.833] - Field: 'expr' [17:27:38.833] - Field: 'uuid' [17:27:38.834] - Field: 'seed' [17:27:38.834] - Field: 'version' [17:27:38.835] - Field: 'result' [17:27:38.835] - Field: 'asynchronous' [17:27:38.835] - Field: 'calls' [17:27:38.836] - Field: 'globals' [17:27:38.836] - Field: 'stdout' [17:27:38.837] - Field: 'earlySignal' [17:27:38.837] - Field: 'lazy' [17:27:38.837] - Field: 'state' [17:27:38.838] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:38.838] - Launch lazy future ... [17:27:38.839] Packages needed by the future expression (n = 0): [17:27:38.839] Packages needed by future strategies (n = 0): [17:27:38.840] { [17:27:38.840] { [17:27:38.840] { [17:27:38.840] ...future.startTime <- base::Sys.time() [17:27:38.840] { [17:27:38.840] { [17:27:38.840] { [17:27:38.840] { [17:27:38.840] base::local({ [17:27:38.840] has_future <- base::requireNamespace("future", [17:27:38.840] quietly = TRUE) [17:27:38.840] if (has_future) { [17:27:38.840] ns <- base::getNamespace("future") [17:27:38.840] version <- ns[[".package"]][["version"]] [17:27:38.840] if (is.null(version)) [17:27:38.840] version <- utils::packageVersion("future") [17:27:38.840] } [17:27:38.840] else { [17:27:38.840] version <- NULL [17:27:38.840] } [17:27:38.840] if (!has_future || version < "1.8.0") { [17:27:38.840] info <- base::c(r_version = base::gsub("R version ", [17:27:38.840] "", base::R.version$version.string), [17:27:38.840] platform = base::sprintf("%s (%s-bit)", [17:27:38.840] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:38.840] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:38.840] "release", "version")], collapse = " "), [17:27:38.840] hostname = base::Sys.info()[["nodename"]]) [17:27:38.840] info <- base::sprintf("%s: %s", base::names(info), [17:27:38.840] info) [17:27:38.840] info <- base::paste(info, collapse = "; ") [17:27:38.840] if (!has_future) { [17:27:38.840] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:38.840] info) [17:27:38.840] } [17:27:38.840] else { [17:27:38.840] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:38.840] info, version) [17:27:38.840] } [17:27:38.840] base::stop(msg) [17:27:38.840] } [17:27:38.840] }) [17:27:38.840] } [17:27:38.840] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:38.840] base::options(mc.cores = 1L) [17:27:38.840] } [17:27:38.840] ...future.strategy.old <- future::plan("list") [17:27:38.840] options(future.plan = NULL) [17:27:38.840] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.840] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:38.840] } [17:27:38.840] ...future.workdir <- getwd() [17:27:38.840] } [17:27:38.840] ...future.oldOptions <- base::as.list(base::.Options) [17:27:38.840] ...future.oldEnvVars <- base::Sys.getenv() [17:27:38.840] } [17:27:38.840] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:38.840] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:38.840] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:38.840] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:38.840] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:38.840] future.stdout.windows.reencode = NULL, width = 80L) [17:27:38.840] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:38.840] base::names(...future.oldOptions)) [17:27:38.840] } [17:27:38.840] if (FALSE) { [17:27:38.840] } [17:27:38.840] else { [17:27:38.840] if (TRUE) { [17:27:38.840] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:38.840] open = "w") [17:27:38.840] } [17:27:38.840] else { [17:27:38.840] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:38.840] windows = "NUL", "/dev/null"), open = "w") [17:27:38.840] } [17:27:38.840] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:38.840] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:38.840] base::sink(type = "output", split = FALSE) [17:27:38.840] base::close(...future.stdout) [17:27:38.840] }, add = TRUE) [17:27:38.840] } [17:27:38.840] ...future.frame <- base::sys.nframe() [17:27:38.840] ...future.conditions <- base::list() [17:27:38.840] ...future.rng <- base::globalenv()$.Random.seed [17:27:38.840] if (FALSE) { [17:27:38.840] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:38.840] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:38.840] } [17:27:38.840] ...future.result <- base::tryCatch({ [17:27:38.840] base::withCallingHandlers({ [17:27:38.840] ...future.value <- base::withVisible(base::local({ [17:27:38.840] ...future.makeSendCondition <- base::local({ [17:27:38.840] sendCondition <- NULL [17:27:38.840] function(frame = 1L) { [17:27:38.840] if (is.function(sendCondition)) [17:27:38.840] return(sendCondition) [17:27:38.840] ns <- getNamespace("parallel") [17:27:38.840] if (exists("sendData", mode = "function", [17:27:38.840] envir = ns)) { [17:27:38.840] parallel_sendData <- get("sendData", mode = "function", [17:27:38.840] envir = ns) [17:27:38.840] envir <- sys.frame(frame) [17:27:38.840] master <- NULL [17:27:38.840] while (!identical(envir, .GlobalEnv) && [17:27:38.840] !identical(envir, emptyenv())) { [17:27:38.840] if (exists("master", mode = "list", envir = envir, [17:27:38.840] inherits = FALSE)) { [17:27:38.840] master <- get("master", mode = "list", [17:27:38.840] envir = envir, inherits = FALSE) [17:27:38.840] if (inherits(master, c("SOCKnode", [17:27:38.840] "SOCK0node"))) { [17:27:38.840] sendCondition <<- function(cond) { [17:27:38.840] data <- list(type = "VALUE", value = cond, [17:27:38.840] success = TRUE) [17:27:38.840] parallel_sendData(master, data) [17:27:38.840] } [17:27:38.840] return(sendCondition) [17:27:38.840] } [17:27:38.840] } [17:27:38.840] frame <- frame + 1L [17:27:38.840] envir <- sys.frame(frame) [17:27:38.840] } [17:27:38.840] } [17:27:38.840] sendCondition <<- function(cond) NULL [17:27:38.840] } [17:27:38.840] }) [17:27:38.840] withCallingHandlers({ [17:27:38.840] NULL [17:27:38.840] }, immediateCondition = function(cond) { [17:27:38.840] sendCondition <- ...future.makeSendCondition() [17:27:38.840] sendCondition(cond) [17:27:38.840] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.840] { [17:27:38.840] inherits <- base::inherits [17:27:38.840] invokeRestart <- base::invokeRestart [17:27:38.840] is.null <- base::is.null [17:27:38.840] muffled <- FALSE [17:27:38.840] if (inherits(cond, "message")) { [17:27:38.840] muffled <- grepl(pattern, "muffleMessage") [17:27:38.840] if (muffled) [17:27:38.840] invokeRestart("muffleMessage") [17:27:38.840] } [17:27:38.840] else if (inherits(cond, "warning")) { [17:27:38.840] muffled <- grepl(pattern, "muffleWarning") [17:27:38.840] if (muffled) [17:27:38.840] invokeRestart("muffleWarning") [17:27:38.840] } [17:27:38.840] else if (inherits(cond, "condition")) { [17:27:38.840] if (!is.null(pattern)) { [17:27:38.840] computeRestarts <- base::computeRestarts [17:27:38.840] grepl <- base::grepl [17:27:38.840] restarts <- computeRestarts(cond) [17:27:38.840] for (restart in restarts) { [17:27:38.840] name <- restart$name [17:27:38.840] if (is.null(name)) [17:27:38.840] next [17:27:38.840] if (!grepl(pattern, name)) [17:27:38.840] next [17:27:38.840] invokeRestart(restart) [17:27:38.840] muffled <- TRUE [17:27:38.840] break [17:27:38.840] } [17:27:38.840] } [17:27:38.840] } [17:27:38.840] invisible(muffled) [17:27:38.840] } [17:27:38.840] muffleCondition(cond) [17:27:38.840] }) [17:27:38.840] })) [17:27:38.840] future::FutureResult(value = ...future.value$value, [17:27:38.840] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.840] ...future.rng), globalenv = if (FALSE) [17:27:38.840] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:38.840] ...future.globalenv.names)) [17:27:38.840] else NULL, started = ...future.startTime, version = "1.8") [17:27:38.840] }, condition = base::local({ [17:27:38.840] c <- base::c [17:27:38.840] inherits <- base::inherits [17:27:38.840] invokeRestart <- base::invokeRestart [17:27:38.840] length <- base::length [17:27:38.840] list <- base::list [17:27:38.840] seq.int <- base::seq.int [17:27:38.840] signalCondition <- base::signalCondition [17:27:38.840] sys.calls <- base::sys.calls [17:27:38.840] `[[` <- base::`[[` [17:27:38.840] `+` <- base::`+` [17:27:38.840] `<<-` <- base::`<<-` [17:27:38.840] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:38.840] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:38.840] 3L)] [17:27:38.840] } [17:27:38.840] function(cond) { [17:27:38.840] is_error <- inherits(cond, "error") [17:27:38.840] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:38.840] NULL) [17:27:38.840] if (is_error) { [17:27:38.840] sessionInformation <- function() { [17:27:38.840] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:38.840] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:38.840] search = base::search(), system = base::Sys.info()) [17:27:38.840] } [17:27:38.840] ...future.conditions[[length(...future.conditions) + [17:27:38.840] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:38.840] cond$call), session = sessionInformation(), [17:27:38.840] timestamp = base::Sys.time(), signaled = 0L) [17:27:38.840] signalCondition(cond) [17:27:38.840] } [17:27:38.840] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:38.840] "immediateCondition"))) { [17:27:38.840] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:38.840] ...future.conditions[[length(...future.conditions) + [17:27:38.840] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:38.840] if (TRUE && !signal) { [17:27:38.840] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.840] { [17:27:38.840] inherits <- base::inherits [17:27:38.840] invokeRestart <- base::invokeRestart [17:27:38.840] is.null <- base::is.null [17:27:38.840] muffled <- FALSE [17:27:38.840] if (inherits(cond, "message")) { [17:27:38.840] muffled <- grepl(pattern, "muffleMessage") [17:27:38.840] if (muffled) [17:27:38.840] invokeRestart("muffleMessage") [17:27:38.840] } [17:27:38.840] else if (inherits(cond, "warning")) { [17:27:38.840] muffled <- grepl(pattern, "muffleWarning") [17:27:38.840] if (muffled) [17:27:38.840] invokeRestart("muffleWarning") [17:27:38.840] } [17:27:38.840] else if (inherits(cond, "condition")) { [17:27:38.840] if (!is.null(pattern)) { [17:27:38.840] computeRestarts <- base::computeRestarts [17:27:38.840] grepl <- base::grepl [17:27:38.840] restarts <- computeRestarts(cond) [17:27:38.840] for (restart in restarts) { [17:27:38.840] name <- restart$name [17:27:38.840] if (is.null(name)) [17:27:38.840] next [17:27:38.840] if (!grepl(pattern, name)) [17:27:38.840] next [17:27:38.840] invokeRestart(restart) [17:27:38.840] muffled <- TRUE [17:27:38.840] break [17:27:38.840] } [17:27:38.840] } [17:27:38.840] } [17:27:38.840] invisible(muffled) [17:27:38.840] } [17:27:38.840] muffleCondition(cond, pattern = "^muffle") [17:27:38.840] } [17:27:38.840] } [17:27:38.840] else { [17:27:38.840] if (TRUE) { [17:27:38.840] muffleCondition <- function (cond, pattern = "^muffle") [17:27:38.840] { [17:27:38.840] inherits <- base::inherits [17:27:38.840] invokeRestart <- base::invokeRestart [17:27:38.840] is.null <- base::is.null [17:27:38.840] muffled <- FALSE [17:27:38.840] if (inherits(cond, "message")) { [17:27:38.840] muffled <- grepl(pattern, "muffleMessage") [17:27:38.840] if (muffled) [17:27:38.840] invokeRestart("muffleMessage") [17:27:38.840] } [17:27:38.840] else if (inherits(cond, "warning")) { [17:27:38.840] muffled <- grepl(pattern, "muffleWarning") [17:27:38.840] if (muffled) [17:27:38.840] invokeRestart("muffleWarning") [17:27:38.840] } [17:27:38.840] else if (inherits(cond, "condition")) { [17:27:38.840] if (!is.null(pattern)) { [17:27:38.840] computeRestarts <- base::computeRestarts [17:27:38.840] grepl <- base::grepl [17:27:38.840] restarts <- computeRestarts(cond) [17:27:38.840] for (restart in restarts) { [17:27:38.840] name <- restart$name [17:27:38.840] if (is.null(name)) [17:27:38.840] next [17:27:38.840] if (!grepl(pattern, name)) [17:27:38.840] next [17:27:38.840] invokeRestart(restart) [17:27:38.840] muffled <- TRUE [17:27:38.840] break [17:27:38.840] } [17:27:38.840] } [17:27:38.840] } [17:27:38.840] invisible(muffled) [17:27:38.840] } [17:27:38.840] muffleCondition(cond, pattern = "^muffle") [17:27:38.840] } [17:27:38.840] } [17:27:38.840] } [17:27:38.840] })) [17:27:38.840] }, error = function(ex) { [17:27:38.840] base::structure(base::list(value = NULL, visible = NULL, [17:27:38.840] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:38.840] ...future.rng), started = ...future.startTime, [17:27:38.840] finished = Sys.time(), session_uuid = NA_character_, [17:27:38.840] version = "1.8"), class = "FutureResult") [17:27:38.840] }, finally = { [17:27:38.840] if (!identical(...future.workdir, getwd())) [17:27:38.840] setwd(...future.workdir) [17:27:38.840] { [17:27:38.840] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:38.840] ...future.oldOptions$nwarnings <- NULL [17:27:38.840] } [17:27:38.840] base::options(...future.oldOptions) [17:27:38.840] if (.Platform$OS.type == "windows") { [17:27:38.840] old_names <- names(...future.oldEnvVars) [17:27:38.840] envs <- base::Sys.getenv() [17:27:38.840] names <- names(envs) [17:27:38.840] common <- intersect(names, old_names) [17:27:38.840] added <- setdiff(names, old_names) [17:27:38.840] removed <- setdiff(old_names, names) [17:27:38.840] changed <- common[...future.oldEnvVars[common] != [17:27:38.840] envs[common]] [17:27:38.840] NAMES <- toupper(changed) [17:27:38.840] args <- list() [17:27:38.840] for (kk in seq_along(NAMES)) { [17:27:38.840] name <- changed[[kk]] [17:27:38.840] NAME <- NAMES[[kk]] [17:27:38.840] if (name != NAME && is.element(NAME, old_names)) [17:27:38.840] next [17:27:38.840] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.840] } [17:27:38.840] NAMES <- toupper(added) [17:27:38.840] for (kk in seq_along(NAMES)) { [17:27:38.840] name <- added[[kk]] [17:27:38.840] NAME <- NAMES[[kk]] [17:27:38.840] if (name != NAME && is.element(NAME, old_names)) [17:27:38.840] next [17:27:38.840] args[[name]] <- "" [17:27:38.840] } [17:27:38.840] NAMES <- toupper(removed) [17:27:38.840] for (kk in seq_along(NAMES)) { [17:27:38.840] name <- removed[[kk]] [17:27:38.840] NAME <- NAMES[[kk]] [17:27:38.840] if (name != NAME && is.element(NAME, old_names)) [17:27:38.840] next [17:27:38.840] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:38.840] } [17:27:38.840] if (length(args) > 0) [17:27:38.840] base::do.call(base::Sys.setenv, args = args) [17:27:38.840] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:38.840] } [17:27:38.840] else { [17:27:38.840] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:38.840] } [17:27:38.840] { [17:27:38.840] if (base::length(...future.futureOptionsAdded) > [17:27:38.840] 0L) { [17:27:38.840] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:38.840] base::names(opts) <- ...future.futureOptionsAdded [17:27:38.840] base::options(opts) [17:27:38.840] } [17:27:38.840] { [17:27:38.840] { [17:27:38.840] base::options(mc.cores = ...future.mc.cores.old) [17:27:38.840] NULL [17:27:38.840] } [17:27:38.840] options(future.plan = NULL) [17:27:38.840] if (is.na(NA_character_)) [17:27:38.840] Sys.unsetenv("R_FUTURE_PLAN") [17:27:38.840] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:38.840] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:38.840] .init = FALSE) [17:27:38.840] } [17:27:38.840] } [17:27:38.840] } [17:27:38.840] }) [17:27:38.840] if (TRUE) { [17:27:38.840] base::sink(type = "output", split = FALSE) [17:27:38.840] if (TRUE) { [17:27:38.840] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:38.840] } [17:27:38.840] else { [17:27:38.840] ...future.result["stdout"] <- base::list(NULL) [17:27:38.840] } [17:27:38.840] base::close(...future.stdout) [17:27:38.840] ...future.stdout <- NULL [17:27:38.840] } [17:27:38.840] ...future.result$conditions <- ...future.conditions [17:27:38.840] ...future.result$finished <- base::Sys.time() [17:27:38.840] ...future.result [17:27:38.840] } [17:27:38.985] MultisessionFuture started [17:27:38.986] - Launch lazy future ... done [17:27:38.986] run() for 'MultisessionFuture' ... done [17:27:38.987] getGlobalsAndPackages() ... [17:27:38.988] Searching for globals... [17:27:38.989] - globals found: [1] '{' [17:27:38.990] Searching for globals ... DONE [17:27:38.990] Resolving globals: FALSE [17:27:38.991] [17:27:38.991] [17:27:38.991] getGlobalsAndPackages() ... DONE [17:27:38.992] run() for 'Future' ... [17:27:38.992] - state: 'created' [17:27:38.993] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.015] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.015] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.016] - Field: 'node' [17:27:39.016] - Field: 'label' [17:27:39.017] - Field: 'local' [17:27:39.017] - Field: 'owner' [17:27:39.017] - Field: 'envir' [17:27:39.017] - Field: 'workers' [17:27:39.017] - Field: 'packages' [17:27:39.018] - Field: 'gc' [17:27:39.018] - Field: 'conditions' [17:27:39.018] - Field: 'persistent' [17:27:39.018] - Field: 'expr' [17:27:39.019] - Field: 'uuid' [17:27:39.019] - Field: 'seed' [17:27:39.019] - Field: 'version' [17:27:39.019] - Field: 'result' [17:27:39.019] - Field: 'asynchronous' [17:27:39.020] - Field: 'calls' [17:27:39.020] - Field: 'globals' [17:27:39.020] - Field: 'stdout' [17:27:39.020] - Field: 'earlySignal' [17:27:39.020] - Field: 'lazy' [17:27:39.021] - Field: 'state' [17:27:39.021] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.021] - Launch lazy future ... [17:27:39.022] Packages needed by the future expression (n = 0): [17:27:39.022] Packages needed by future strategies (n = 0): [17:27:39.023] { [17:27:39.023] { [17:27:39.023] { [17:27:39.023] ...future.startTime <- base::Sys.time() [17:27:39.023] { [17:27:39.023] { [17:27:39.023] { [17:27:39.023] { [17:27:39.023] base::local({ [17:27:39.023] has_future <- base::requireNamespace("future", [17:27:39.023] quietly = TRUE) [17:27:39.023] if (has_future) { [17:27:39.023] ns <- base::getNamespace("future") [17:27:39.023] version <- ns[[".package"]][["version"]] [17:27:39.023] if (is.null(version)) [17:27:39.023] version <- utils::packageVersion("future") [17:27:39.023] } [17:27:39.023] else { [17:27:39.023] version <- NULL [17:27:39.023] } [17:27:39.023] if (!has_future || version < "1.8.0") { [17:27:39.023] info <- base::c(r_version = base::gsub("R version ", [17:27:39.023] "", base::R.version$version.string), [17:27:39.023] platform = base::sprintf("%s (%s-bit)", [17:27:39.023] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.023] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.023] "release", "version")], collapse = " "), [17:27:39.023] hostname = base::Sys.info()[["nodename"]]) [17:27:39.023] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.023] info) [17:27:39.023] info <- base::paste(info, collapse = "; ") [17:27:39.023] if (!has_future) { [17:27:39.023] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.023] info) [17:27:39.023] } [17:27:39.023] else { [17:27:39.023] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.023] info, version) [17:27:39.023] } [17:27:39.023] base::stop(msg) [17:27:39.023] } [17:27:39.023] }) [17:27:39.023] } [17:27:39.023] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.023] base::options(mc.cores = 1L) [17:27:39.023] } [17:27:39.023] ...future.strategy.old <- future::plan("list") [17:27:39.023] options(future.plan = NULL) [17:27:39.023] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.023] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.023] } [17:27:39.023] ...future.workdir <- getwd() [17:27:39.023] } [17:27:39.023] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.023] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.023] } [17:27:39.023] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.023] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.023] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.023] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.023] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.023] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.023] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.023] base::names(...future.oldOptions)) [17:27:39.023] } [17:27:39.023] if (FALSE) { [17:27:39.023] } [17:27:39.023] else { [17:27:39.023] if (TRUE) { [17:27:39.023] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.023] open = "w") [17:27:39.023] } [17:27:39.023] else { [17:27:39.023] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.023] windows = "NUL", "/dev/null"), open = "w") [17:27:39.023] } [17:27:39.023] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.023] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.023] base::sink(type = "output", split = FALSE) [17:27:39.023] base::close(...future.stdout) [17:27:39.023] }, add = TRUE) [17:27:39.023] } [17:27:39.023] ...future.frame <- base::sys.nframe() [17:27:39.023] ...future.conditions <- base::list() [17:27:39.023] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.023] if (FALSE) { [17:27:39.023] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.023] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.023] } [17:27:39.023] ...future.result <- base::tryCatch({ [17:27:39.023] base::withCallingHandlers({ [17:27:39.023] ...future.value <- base::withVisible(base::local({ [17:27:39.023] ...future.makeSendCondition <- base::local({ [17:27:39.023] sendCondition <- NULL [17:27:39.023] function(frame = 1L) { [17:27:39.023] if (is.function(sendCondition)) [17:27:39.023] return(sendCondition) [17:27:39.023] ns <- getNamespace("parallel") [17:27:39.023] if (exists("sendData", mode = "function", [17:27:39.023] envir = ns)) { [17:27:39.023] parallel_sendData <- get("sendData", mode = "function", [17:27:39.023] envir = ns) [17:27:39.023] envir <- sys.frame(frame) [17:27:39.023] master <- NULL [17:27:39.023] while (!identical(envir, .GlobalEnv) && [17:27:39.023] !identical(envir, emptyenv())) { [17:27:39.023] if (exists("master", mode = "list", envir = envir, [17:27:39.023] inherits = FALSE)) { [17:27:39.023] master <- get("master", mode = "list", [17:27:39.023] envir = envir, inherits = FALSE) [17:27:39.023] if (inherits(master, c("SOCKnode", [17:27:39.023] "SOCK0node"))) { [17:27:39.023] sendCondition <<- function(cond) { [17:27:39.023] data <- list(type = "VALUE", value = cond, [17:27:39.023] success = TRUE) [17:27:39.023] parallel_sendData(master, data) [17:27:39.023] } [17:27:39.023] return(sendCondition) [17:27:39.023] } [17:27:39.023] } [17:27:39.023] frame <- frame + 1L [17:27:39.023] envir <- sys.frame(frame) [17:27:39.023] } [17:27:39.023] } [17:27:39.023] sendCondition <<- function(cond) NULL [17:27:39.023] } [17:27:39.023] }) [17:27:39.023] withCallingHandlers({ [17:27:39.023] { [17:27:39.023] 4 [17:27:39.023] } [17:27:39.023] }, immediateCondition = function(cond) { [17:27:39.023] sendCondition <- ...future.makeSendCondition() [17:27:39.023] sendCondition(cond) [17:27:39.023] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.023] { [17:27:39.023] inherits <- base::inherits [17:27:39.023] invokeRestart <- base::invokeRestart [17:27:39.023] is.null <- base::is.null [17:27:39.023] muffled <- FALSE [17:27:39.023] if (inherits(cond, "message")) { [17:27:39.023] muffled <- grepl(pattern, "muffleMessage") [17:27:39.023] if (muffled) [17:27:39.023] invokeRestart("muffleMessage") [17:27:39.023] } [17:27:39.023] else if (inherits(cond, "warning")) { [17:27:39.023] muffled <- grepl(pattern, "muffleWarning") [17:27:39.023] if (muffled) [17:27:39.023] invokeRestart("muffleWarning") [17:27:39.023] } [17:27:39.023] else if (inherits(cond, "condition")) { [17:27:39.023] if (!is.null(pattern)) { [17:27:39.023] computeRestarts <- base::computeRestarts [17:27:39.023] grepl <- base::grepl [17:27:39.023] restarts <- computeRestarts(cond) [17:27:39.023] for (restart in restarts) { [17:27:39.023] name <- restart$name [17:27:39.023] if (is.null(name)) [17:27:39.023] next [17:27:39.023] if (!grepl(pattern, name)) [17:27:39.023] next [17:27:39.023] invokeRestart(restart) [17:27:39.023] muffled <- TRUE [17:27:39.023] break [17:27:39.023] } [17:27:39.023] } [17:27:39.023] } [17:27:39.023] invisible(muffled) [17:27:39.023] } [17:27:39.023] muffleCondition(cond) [17:27:39.023] }) [17:27:39.023] })) [17:27:39.023] future::FutureResult(value = ...future.value$value, [17:27:39.023] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.023] ...future.rng), globalenv = if (FALSE) [17:27:39.023] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.023] ...future.globalenv.names)) [17:27:39.023] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.023] }, condition = base::local({ [17:27:39.023] c <- base::c [17:27:39.023] inherits <- base::inherits [17:27:39.023] invokeRestart <- base::invokeRestart [17:27:39.023] length <- base::length [17:27:39.023] list <- base::list [17:27:39.023] seq.int <- base::seq.int [17:27:39.023] signalCondition <- base::signalCondition [17:27:39.023] sys.calls <- base::sys.calls [17:27:39.023] `[[` <- base::`[[` [17:27:39.023] `+` <- base::`+` [17:27:39.023] `<<-` <- base::`<<-` [17:27:39.023] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.023] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.023] 3L)] [17:27:39.023] } [17:27:39.023] function(cond) { [17:27:39.023] is_error <- inherits(cond, "error") [17:27:39.023] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.023] NULL) [17:27:39.023] if (is_error) { [17:27:39.023] sessionInformation <- function() { [17:27:39.023] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.023] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.023] search = base::search(), system = base::Sys.info()) [17:27:39.023] } [17:27:39.023] ...future.conditions[[length(...future.conditions) + [17:27:39.023] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.023] cond$call), session = sessionInformation(), [17:27:39.023] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.023] signalCondition(cond) [17:27:39.023] } [17:27:39.023] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.023] "immediateCondition"))) { [17:27:39.023] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.023] ...future.conditions[[length(...future.conditions) + [17:27:39.023] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.023] if (TRUE && !signal) { [17:27:39.023] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.023] { [17:27:39.023] inherits <- base::inherits [17:27:39.023] invokeRestart <- base::invokeRestart [17:27:39.023] is.null <- base::is.null [17:27:39.023] muffled <- FALSE [17:27:39.023] if (inherits(cond, "message")) { [17:27:39.023] muffled <- grepl(pattern, "muffleMessage") [17:27:39.023] if (muffled) [17:27:39.023] invokeRestart("muffleMessage") [17:27:39.023] } [17:27:39.023] else if (inherits(cond, "warning")) { [17:27:39.023] muffled <- grepl(pattern, "muffleWarning") [17:27:39.023] if (muffled) [17:27:39.023] invokeRestart("muffleWarning") [17:27:39.023] } [17:27:39.023] else if (inherits(cond, "condition")) { [17:27:39.023] if (!is.null(pattern)) { [17:27:39.023] computeRestarts <- base::computeRestarts [17:27:39.023] grepl <- base::grepl [17:27:39.023] restarts <- computeRestarts(cond) [17:27:39.023] for (restart in restarts) { [17:27:39.023] name <- restart$name [17:27:39.023] if (is.null(name)) [17:27:39.023] next [17:27:39.023] if (!grepl(pattern, name)) [17:27:39.023] next [17:27:39.023] invokeRestart(restart) [17:27:39.023] muffled <- TRUE [17:27:39.023] break [17:27:39.023] } [17:27:39.023] } [17:27:39.023] } [17:27:39.023] invisible(muffled) [17:27:39.023] } [17:27:39.023] muffleCondition(cond, pattern = "^muffle") [17:27:39.023] } [17:27:39.023] } [17:27:39.023] else { [17:27:39.023] if (TRUE) { [17:27:39.023] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.023] { [17:27:39.023] inherits <- base::inherits [17:27:39.023] invokeRestart <- base::invokeRestart [17:27:39.023] is.null <- base::is.null [17:27:39.023] muffled <- FALSE [17:27:39.023] if (inherits(cond, "message")) { [17:27:39.023] muffled <- grepl(pattern, "muffleMessage") [17:27:39.023] if (muffled) [17:27:39.023] invokeRestart("muffleMessage") [17:27:39.023] } [17:27:39.023] else if (inherits(cond, "warning")) { [17:27:39.023] muffled <- grepl(pattern, "muffleWarning") [17:27:39.023] if (muffled) [17:27:39.023] invokeRestart("muffleWarning") [17:27:39.023] } [17:27:39.023] else if (inherits(cond, "condition")) { [17:27:39.023] if (!is.null(pattern)) { [17:27:39.023] computeRestarts <- base::computeRestarts [17:27:39.023] grepl <- base::grepl [17:27:39.023] restarts <- computeRestarts(cond) [17:27:39.023] for (restart in restarts) { [17:27:39.023] name <- restart$name [17:27:39.023] if (is.null(name)) [17:27:39.023] next [17:27:39.023] if (!grepl(pattern, name)) [17:27:39.023] next [17:27:39.023] invokeRestart(restart) [17:27:39.023] muffled <- TRUE [17:27:39.023] break [17:27:39.023] } [17:27:39.023] } [17:27:39.023] } [17:27:39.023] invisible(muffled) [17:27:39.023] } [17:27:39.023] muffleCondition(cond, pattern = "^muffle") [17:27:39.023] } [17:27:39.023] } [17:27:39.023] } [17:27:39.023] })) [17:27:39.023] }, error = function(ex) { [17:27:39.023] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.023] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.023] ...future.rng), started = ...future.startTime, [17:27:39.023] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.023] version = "1.8"), class = "FutureResult") [17:27:39.023] }, finally = { [17:27:39.023] if (!identical(...future.workdir, getwd())) [17:27:39.023] setwd(...future.workdir) [17:27:39.023] { [17:27:39.023] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.023] ...future.oldOptions$nwarnings <- NULL [17:27:39.023] } [17:27:39.023] base::options(...future.oldOptions) [17:27:39.023] if (.Platform$OS.type == "windows") { [17:27:39.023] old_names <- names(...future.oldEnvVars) [17:27:39.023] envs <- base::Sys.getenv() [17:27:39.023] names <- names(envs) [17:27:39.023] common <- intersect(names, old_names) [17:27:39.023] added <- setdiff(names, old_names) [17:27:39.023] removed <- setdiff(old_names, names) [17:27:39.023] changed <- common[...future.oldEnvVars[common] != [17:27:39.023] envs[common]] [17:27:39.023] NAMES <- toupper(changed) [17:27:39.023] args <- list() [17:27:39.023] for (kk in seq_along(NAMES)) { [17:27:39.023] name <- changed[[kk]] [17:27:39.023] NAME <- NAMES[[kk]] [17:27:39.023] if (name != NAME && is.element(NAME, old_names)) [17:27:39.023] next [17:27:39.023] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.023] } [17:27:39.023] NAMES <- toupper(added) [17:27:39.023] for (kk in seq_along(NAMES)) { [17:27:39.023] name <- added[[kk]] [17:27:39.023] NAME <- NAMES[[kk]] [17:27:39.023] if (name != NAME && is.element(NAME, old_names)) [17:27:39.023] next [17:27:39.023] args[[name]] <- "" [17:27:39.023] } [17:27:39.023] NAMES <- toupper(removed) [17:27:39.023] for (kk in seq_along(NAMES)) { [17:27:39.023] name <- removed[[kk]] [17:27:39.023] NAME <- NAMES[[kk]] [17:27:39.023] if (name != NAME && is.element(NAME, old_names)) [17:27:39.023] next [17:27:39.023] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.023] } [17:27:39.023] if (length(args) > 0) [17:27:39.023] base::do.call(base::Sys.setenv, args = args) [17:27:39.023] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.023] } [17:27:39.023] else { [17:27:39.023] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.023] } [17:27:39.023] { [17:27:39.023] if (base::length(...future.futureOptionsAdded) > [17:27:39.023] 0L) { [17:27:39.023] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.023] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.023] base::options(opts) [17:27:39.023] } [17:27:39.023] { [17:27:39.023] { [17:27:39.023] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.023] NULL [17:27:39.023] } [17:27:39.023] options(future.plan = NULL) [17:27:39.023] if (is.na(NA_character_)) [17:27:39.023] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.023] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.023] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.023] .init = FALSE) [17:27:39.023] } [17:27:39.023] } [17:27:39.023] } [17:27:39.023] }) [17:27:39.023] if (TRUE) { [17:27:39.023] base::sink(type = "output", split = FALSE) [17:27:39.023] if (TRUE) { [17:27:39.023] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.023] } [17:27:39.023] else { [17:27:39.023] ...future.result["stdout"] <- base::list(NULL) [17:27:39.023] } [17:27:39.023] base::close(...future.stdout) [17:27:39.023] ...future.stdout <- NULL [17:27:39.023] } [17:27:39.023] ...future.result$conditions <- ...future.conditions [17:27:39.023] ...future.result$finished <- base::Sys.time() [17:27:39.023] ...future.result [17:27:39.023] } [17:27:39.028] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:39.049] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.049] - Validating connection of MultisessionFuture [17:27:39.050] - received message: FutureResult [17:27:39.050] - Received FutureResult [17:27:39.051] - Erased future from FutureRegistry [17:27:39.051] result() for ClusterFuture ... [17:27:39.051] - result already collected: FutureResult [17:27:39.051] result() for ClusterFuture ... done [17:27:39.052] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.052] result() for ClusterFuture ... [17:27:39.052] - result already collected: FutureResult [17:27:39.053] result() for ClusterFuture ... done [17:27:39.053] result() for ClusterFuture ... [17:27:39.053] - result already collected: FutureResult [17:27:39.054] result() for ClusterFuture ... done [17:27:39.056] MultisessionFuture started [17:27:39.056] - Launch lazy future ... done [17:27:39.056] run() for 'MultisessionFuture' ... done [17:27:39.092] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.092] - Validating connection of MultisessionFuture [17:27:39.093] - received message: FutureResult [17:27:39.093] - Received FutureResult [17:27:39.094] - Erased future from FutureRegistry [17:27:39.094] result() for ClusterFuture ... [17:27:39.094] - result already collected: FutureResult [17:27:39.095] result() for ClusterFuture ... done [17:27:39.095] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.096] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.096] - Validating connection of MultisessionFuture [17:27:39.097] - received message: FutureResult [17:27:39.097] - Received FutureResult [17:27:39.097] - Erased future from FutureRegistry [17:27:39.098] result() for ClusterFuture ... [17:27:39.098] - result already collected: FutureResult [17:27:39.098] result() for ClusterFuture ... done [17:27:39.099] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:39.101] resolve() on environment ... [17:27:39.101] recursive: 0 [17:27:39.101] elements: [4] 'a', 'b', 'c', 'd' [17:27:39.102] signalConditionsASAP(numeric, pos=1) ... [17:27:39.102] - nx: 4 [17:27:39.102] - relay: TRUE [17:27:39.102] - stdout: TRUE [17:27:39.102] - signal: TRUE [17:27:39.102] - resignal: FALSE [17:27:39.103] - force: TRUE [17:27:39.103] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.103] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.103] - until=2 [17:27:39.103] - relaying element #2 [17:27:39.103] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.103] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.104] signalConditionsASAP(NULL, pos=1) ... done [17:27:39.104] length: 3 (resolved future 1) [17:27:39.104] Future #2 [17:27:39.104] result() for ClusterFuture ... [17:27:39.104] - result already collected: FutureResult [17:27:39.104] result() for ClusterFuture ... done [17:27:39.105] result() for ClusterFuture ... [17:27:39.105] - result already collected: FutureResult [17:27:39.105] result() for ClusterFuture ... done [17:27:39.105] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:39.105] - nx: 4 [17:27:39.105] - relay: TRUE [17:27:39.106] - stdout: TRUE [17:27:39.106] - signal: TRUE [17:27:39.106] - resignal: FALSE [17:27:39.106] - force: TRUE [17:27:39.106] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.106] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.106] - until=2 [17:27:39.107] - relaying element #2 [17:27:39.107] result() for ClusterFuture ... [17:27:39.107] - result already collected: FutureResult [17:27:39.107] result() for ClusterFuture ... done [17:27:39.107] result() for ClusterFuture ... [17:27:39.107] - result already collected: FutureResult [17:27:39.107] result() for ClusterFuture ... done [17:27:39.108] result() for ClusterFuture ... [17:27:39.108] - result already collected: FutureResult [17:27:39.108] result() for ClusterFuture ... done [17:27:39.108] result() for ClusterFuture ... [17:27:39.108] - result already collected: FutureResult [17:27:39.108] result() for ClusterFuture ... done [17:27:39.109] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.109] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.109] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:39.109] length: 2 (resolved future 2) [17:27:39.109] Future #3 [17:27:39.109] result() for ClusterFuture ... [17:27:39.110] - result already collected: FutureResult [17:27:39.110] result() for ClusterFuture ... done [17:27:39.110] result() for ClusterFuture ... [17:27:39.110] - result already collected: FutureResult [17:27:39.110] result() for ClusterFuture ... done [17:27:39.110] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:39.111] - nx: 4 [17:27:39.111] - relay: TRUE [17:27:39.111] - stdout: TRUE [17:27:39.111] - signal: TRUE [17:27:39.112] - resignal: FALSE [17:27:39.112] - force: TRUE [17:27:39.112] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.113] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.113] - until=3 [17:27:39.113] - relaying element #3 [17:27:39.113] result() for ClusterFuture ... [17:27:39.114] - result already collected: FutureResult [17:27:39.114] result() for ClusterFuture ... done [17:27:39.114] result() for ClusterFuture ... [17:27:39.114] - result already collected: FutureResult [17:27:39.115] result() for ClusterFuture ... done [17:27:39.115] result() for ClusterFuture ... [17:27:39.115] - result already collected: FutureResult [17:27:39.115] result() for ClusterFuture ... done [17:27:39.116] result() for ClusterFuture ... [17:27:39.116] - result already collected: FutureResult [17:27:39.116] result() for ClusterFuture ... done [17:27:39.117] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.117] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.117] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:39.117] length: 1 (resolved future 3) [17:27:39.118] Future #4 [17:27:39.118] result() for ClusterFuture ... [17:27:39.118] - result already collected: FutureResult [17:27:39.119] result() for ClusterFuture ... done [17:27:39.119] result() for ClusterFuture ... [17:27:39.119] - result already collected: FutureResult [17:27:39.119] result() for ClusterFuture ... done [17:27:39.120] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:39.120] - nx: 4 [17:27:39.120] - relay: TRUE [17:27:39.120] - stdout: TRUE [17:27:39.121] - signal: TRUE [17:27:39.121] - resignal: FALSE [17:27:39.121] - force: TRUE [17:27:39.121] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.122] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.122] - until=4 [17:27:39.122] - relaying element #4 [17:27:39.123] result() for ClusterFuture ... [17:27:39.123] - result already collected: FutureResult [17:27:39.123] result() for ClusterFuture ... done [17:27:39.123] result() for ClusterFuture ... [17:27:39.124] - result already collected: FutureResult [17:27:39.124] result() for ClusterFuture ... done [17:27:39.124] result() for ClusterFuture ... [17:27:39.124] - result already collected: FutureResult [17:27:39.125] result() for ClusterFuture ... done [17:27:39.125] result() for ClusterFuture ... [17:27:39.125] - result already collected: FutureResult [17:27:39.125] result() for ClusterFuture ... done [17:27:39.126] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.126] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.126] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:39.127] length: 0 (resolved future 4) [17:27:39.127] Relaying remaining futures [17:27:39.127] signalConditionsASAP(NULL, pos=0) ... [17:27:39.127] - nx: 4 [17:27:39.128] - relay: TRUE [17:27:39.128] - stdout: TRUE [17:27:39.128] - signal: TRUE [17:27:39.128] - resignal: FALSE [17:27:39.129] - force: TRUE [17:27:39.129] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.129] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:39.130] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.130] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.130] signalConditionsASAP(NULL, pos=0) ... done [17:27:39.130] resolve() on environment ... DONE [17:27:39.131] result() for ClusterFuture ... [17:27:39.131] - result already collected: FutureResult [17:27:39.131] result() for ClusterFuture ... done [17:27:39.131] result() for ClusterFuture ... [17:27:39.132] - result already collected: FutureResult [17:27:39.132] result() for ClusterFuture ... done [17:27:39.132] result() for ClusterFuture ... [17:27:39.133] - result already collected: FutureResult [17:27:39.133] result() for ClusterFuture ... done [17:27:39.133] result() for ClusterFuture ... [17:27:39.133] - result already collected: FutureResult [17:27:39.134] result() for ClusterFuture ... done [17:27:39.134] result() for ClusterFuture ... [17:27:39.134] - result already collected: FutureResult [17:27:39.134] result() for ClusterFuture ... done [17:27:39.135] result() for ClusterFuture ... [17:27:39.135] - result already collected: FutureResult [17:27:39.135] result() for ClusterFuture ... done Dimensions: c(1, 6) [17:27:39.136] getGlobalsAndPackages() ... [17:27:39.137] Searching for globals... [17:27:39.137] [17:27:39.138] Searching for globals ... DONE [17:27:39.138] - globals: [0] [17:27:39.138] getGlobalsAndPackages() ... DONE [17:27:39.139] run() for 'Future' ... [17:27:39.139] - state: 'created' [17:27:39.139] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.159] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.160] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.160] - Field: 'node' [17:27:39.161] - Field: 'label' [17:27:39.161] - Field: 'local' [17:27:39.161] - Field: 'owner' [17:27:39.162] - Field: 'envir' [17:27:39.162] - Field: 'workers' [17:27:39.162] - Field: 'packages' [17:27:39.162] - Field: 'gc' [17:27:39.163] - Field: 'conditions' [17:27:39.163] - Field: 'persistent' [17:27:39.163] - Field: 'expr' [17:27:39.164] - Field: 'uuid' [17:27:39.164] - Field: 'seed' [17:27:39.164] - Field: 'version' [17:27:39.165] - Field: 'result' [17:27:39.165] - Field: 'asynchronous' [17:27:39.165] - Field: 'calls' [17:27:39.165] - Field: 'globals' [17:27:39.166] - Field: 'stdout' [17:27:39.166] - Field: 'earlySignal' [17:27:39.166] - Field: 'lazy' [17:27:39.167] - Field: 'state' [17:27:39.167] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.167] - Launch lazy future ... [17:27:39.168] Packages needed by the future expression (n = 0): [17:27:39.168] Packages needed by future strategies (n = 0): [17:27:39.169] { [17:27:39.169] { [17:27:39.169] { [17:27:39.169] ...future.startTime <- base::Sys.time() [17:27:39.169] { [17:27:39.169] { [17:27:39.169] { [17:27:39.169] { [17:27:39.169] base::local({ [17:27:39.169] has_future <- base::requireNamespace("future", [17:27:39.169] quietly = TRUE) [17:27:39.169] if (has_future) { [17:27:39.169] ns <- base::getNamespace("future") [17:27:39.169] version <- ns[[".package"]][["version"]] [17:27:39.169] if (is.null(version)) [17:27:39.169] version <- utils::packageVersion("future") [17:27:39.169] } [17:27:39.169] else { [17:27:39.169] version <- NULL [17:27:39.169] } [17:27:39.169] if (!has_future || version < "1.8.0") { [17:27:39.169] info <- base::c(r_version = base::gsub("R version ", [17:27:39.169] "", base::R.version$version.string), [17:27:39.169] platform = base::sprintf("%s (%s-bit)", [17:27:39.169] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.169] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.169] "release", "version")], collapse = " "), [17:27:39.169] hostname = base::Sys.info()[["nodename"]]) [17:27:39.169] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.169] info) [17:27:39.169] info <- base::paste(info, collapse = "; ") [17:27:39.169] if (!has_future) { [17:27:39.169] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.169] info) [17:27:39.169] } [17:27:39.169] else { [17:27:39.169] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.169] info, version) [17:27:39.169] } [17:27:39.169] base::stop(msg) [17:27:39.169] } [17:27:39.169] }) [17:27:39.169] } [17:27:39.169] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.169] base::options(mc.cores = 1L) [17:27:39.169] } [17:27:39.169] ...future.strategy.old <- future::plan("list") [17:27:39.169] options(future.plan = NULL) [17:27:39.169] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.169] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.169] } [17:27:39.169] ...future.workdir <- getwd() [17:27:39.169] } [17:27:39.169] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.169] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.169] } [17:27:39.169] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.169] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.169] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.169] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.169] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.169] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.169] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.169] base::names(...future.oldOptions)) [17:27:39.169] } [17:27:39.169] if (FALSE) { [17:27:39.169] } [17:27:39.169] else { [17:27:39.169] if (TRUE) { [17:27:39.169] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.169] open = "w") [17:27:39.169] } [17:27:39.169] else { [17:27:39.169] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.169] windows = "NUL", "/dev/null"), open = "w") [17:27:39.169] } [17:27:39.169] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.169] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.169] base::sink(type = "output", split = FALSE) [17:27:39.169] base::close(...future.stdout) [17:27:39.169] }, add = TRUE) [17:27:39.169] } [17:27:39.169] ...future.frame <- base::sys.nframe() [17:27:39.169] ...future.conditions <- base::list() [17:27:39.169] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.169] if (FALSE) { [17:27:39.169] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.169] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.169] } [17:27:39.169] ...future.result <- base::tryCatch({ [17:27:39.169] base::withCallingHandlers({ [17:27:39.169] ...future.value <- base::withVisible(base::local({ [17:27:39.169] ...future.makeSendCondition <- base::local({ [17:27:39.169] sendCondition <- NULL [17:27:39.169] function(frame = 1L) { [17:27:39.169] if (is.function(sendCondition)) [17:27:39.169] return(sendCondition) [17:27:39.169] ns <- getNamespace("parallel") [17:27:39.169] if (exists("sendData", mode = "function", [17:27:39.169] envir = ns)) { [17:27:39.169] parallel_sendData <- get("sendData", mode = "function", [17:27:39.169] envir = ns) [17:27:39.169] envir <- sys.frame(frame) [17:27:39.169] master <- NULL [17:27:39.169] while (!identical(envir, .GlobalEnv) && [17:27:39.169] !identical(envir, emptyenv())) { [17:27:39.169] if (exists("master", mode = "list", envir = envir, [17:27:39.169] inherits = FALSE)) { [17:27:39.169] master <- get("master", mode = "list", [17:27:39.169] envir = envir, inherits = FALSE) [17:27:39.169] if (inherits(master, c("SOCKnode", [17:27:39.169] "SOCK0node"))) { [17:27:39.169] sendCondition <<- function(cond) { [17:27:39.169] data <- list(type = "VALUE", value = cond, [17:27:39.169] success = TRUE) [17:27:39.169] parallel_sendData(master, data) [17:27:39.169] } [17:27:39.169] return(sendCondition) [17:27:39.169] } [17:27:39.169] } [17:27:39.169] frame <- frame + 1L [17:27:39.169] envir <- sys.frame(frame) [17:27:39.169] } [17:27:39.169] } [17:27:39.169] sendCondition <<- function(cond) NULL [17:27:39.169] } [17:27:39.169] }) [17:27:39.169] withCallingHandlers({ [17:27:39.169] 2 [17:27:39.169] }, immediateCondition = function(cond) { [17:27:39.169] sendCondition <- ...future.makeSendCondition() [17:27:39.169] sendCondition(cond) [17:27:39.169] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.169] { [17:27:39.169] inherits <- base::inherits [17:27:39.169] invokeRestart <- base::invokeRestart [17:27:39.169] is.null <- base::is.null [17:27:39.169] muffled <- FALSE [17:27:39.169] if (inherits(cond, "message")) { [17:27:39.169] muffled <- grepl(pattern, "muffleMessage") [17:27:39.169] if (muffled) [17:27:39.169] invokeRestart("muffleMessage") [17:27:39.169] } [17:27:39.169] else if (inherits(cond, "warning")) { [17:27:39.169] muffled <- grepl(pattern, "muffleWarning") [17:27:39.169] if (muffled) [17:27:39.169] invokeRestart("muffleWarning") [17:27:39.169] } [17:27:39.169] else if (inherits(cond, "condition")) { [17:27:39.169] if (!is.null(pattern)) { [17:27:39.169] computeRestarts <- base::computeRestarts [17:27:39.169] grepl <- base::grepl [17:27:39.169] restarts <- computeRestarts(cond) [17:27:39.169] for (restart in restarts) { [17:27:39.169] name <- restart$name [17:27:39.169] if (is.null(name)) [17:27:39.169] next [17:27:39.169] if (!grepl(pattern, name)) [17:27:39.169] next [17:27:39.169] invokeRestart(restart) [17:27:39.169] muffled <- TRUE [17:27:39.169] break [17:27:39.169] } [17:27:39.169] } [17:27:39.169] } [17:27:39.169] invisible(muffled) [17:27:39.169] } [17:27:39.169] muffleCondition(cond) [17:27:39.169] }) [17:27:39.169] })) [17:27:39.169] future::FutureResult(value = ...future.value$value, [17:27:39.169] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.169] ...future.rng), globalenv = if (FALSE) [17:27:39.169] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.169] ...future.globalenv.names)) [17:27:39.169] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.169] }, condition = base::local({ [17:27:39.169] c <- base::c [17:27:39.169] inherits <- base::inherits [17:27:39.169] invokeRestart <- base::invokeRestart [17:27:39.169] length <- base::length [17:27:39.169] list <- base::list [17:27:39.169] seq.int <- base::seq.int [17:27:39.169] signalCondition <- base::signalCondition [17:27:39.169] sys.calls <- base::sys.calls [17:27:39.169] `[[` <- base::`[[` [17:27:39.169] `+` <- base::`+` [17:27:39.169] `<<-` <- base::`<<-` [17:27:39.169] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.169] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.169] 3L)] [17:27:39.169] } [17:27:39.169] function(cond) { [17:27:39.169] is_error <- inherits(cond, "error") [17:27:39.169] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.169] NULL) [17:27:39.169] if (is_error) { [17:27:39.169] sessionInformation <- function() { [17:27:39.169] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.169] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.169] search = base::search(), system = base::Sys.info()) [17:27:39.169] } [17:27:39.169] ...future.conditions[[length(...future.conditions) + [17:27:39.169] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.169] cond$call), session = sessionInformation(), [17:27:39.169] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.169] signalCondition(cond) [17:27:39.169] } [17:27:39.169] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.169] "immediateCondition"))) { [17:27:39.169] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.169] ...future.conditions[[length(...future.conditions) + [17:27:39.169] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.169] if (TRUE && !signal) { [17:27:39.169] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.169] { [17:27:39.169] inherits <- base::inherits [17:27:39.169] invokeRestart <- base::invokeRestart [17:27:39.169] is.null <- base::is.null [17:27:39.169] muffled <- FALSE [17:27:39.169] if (inherits(cond, "message")) { [17:27:39.169] muffled <- grepl(pattern, "muffleMessage") [17:27:39.169] if (muffled) [17:27:39.169] invokeRestart("muffleMessage") [17:27:39.169] } [17:27:39.169] else if (inherits(cond, "warning")) { [17:27:39.169] muffled <- grepl(pattern, "muffleWarning") [17:27:39.169] if (muffled) [17:27:39.169] invokeRestart("muffleWarning") [17:27:39.169] } [17:27:39.169] else if (inherits(cond, "condition")) { [17:27:39.169] if (!is.null(pattern)) { [17:27:39.169] computeRestarts <- base::computeRestarts [17:27:39.169] grepl <- base::grepl [17:27:39.169] restarts <- computeRestarts(cond) [17:27:39.169] for (restart in restarts) { [17:27:39.169] name <- restart$name [17:27:39.169] if (is.null(name)) [17:27:39.169] next [17:27:39.169] if (!grepl(pattern, name)) [17:27:39.169] next [17:27:39.169] invokeRestart(restart) [17:27:39.169] muffled <- TRUE [17:27:39.169] break [17:27:39.169] } [17:27:39.169] } [17:27:39.169] } [17:27:39.169] invisible(muffled) [17:27:39.169] } [17:27:39.169] muffleCondition(cond, pattern = "^muffle") [17:27:39.169] } [17:27:39.169] } [17:27:39.169] else { [17:27:39.169] if (TRUE) { [17:27:39.169] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.169] { [17:27:39.169] inherits <- base::inherits [17:27:39.169] invokeRestart <- base::invokeRestart [17:27:39.169] is.null <- base::is.null [17:27:39.169] muffled <- FALSE [17:27:39.169] if (inherits(cond, "message")) { [17:27:39.169] muffled <- grepl(pattern, "muffleMessage") [17:27:39.169] if (muffled) [17:27:39.169] invokeRestart("muffleMessage") [17:27:39.169] } [17:27:39.169] else if (inherits(cond, "warning")) { [17:27:39.169] muffled <- grepl(pattern, "muffleWarning") [17:27:39.169] if (muffled) [17:27:39.169] invokeRestart("muffleWarning") [17:27:39.169] } [17:27:39.169] else if (inherits(cond, "condition")) { [17:27:39.169] if (!is.null(pattern)) { [17:27:39.169] computeRestarts <- base::computeRestarts [17:27:39.169] grepl <- base::grepl [17:27:39.169] restarts <- computeRestarts(cond) [17:27:39.169] for (restart in restarts) { [17:27:39.169] name <- restart$name [17:27:39.169] if (is.null(name)) [17:27:39.169] next [17:27:39.169] if (!grepl(pattern, name)) [17:27:39.169] next [17:27:39.169] invokeRestart(restart) [17:27:39.169] muffled <- TRUE [17:27:39.169] break [17:27:39.169] } [17:27:39.169] } [17:27:39.169] } [17:27:39.169] invisible(muffled) [17:27:39.169] } [17:27:39.169] muffleCondition(cond, pattern = "^muffle") [17:27:39.169] } [17:27:39.169] } [17:27:39.169] } [17:27:39.169] })) [17:27:39.169] }, error = function(ex) { [17:27:39.169] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.169] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.169] ...future.rng), started = ...future.startTime, [17:27:39.169] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.169] version = "1.8"), class = "FutureResult") [17:27:39.169] }, finally = { [17:27:39.169] if (!identical(...future.workdir, getwd())) [17:27:39.169] setwd(...future.workdir) [17:27:39.169] { [17:27:39.169] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.169] ...future.oldOptions$nwarnings <- NULL [17:27:39.169] } [17:27:39.169] base::options(...future.oldOptions) [17:27:39.169] if (.Platform$OS.type == "windows") { [17:27:39.169] old_names <- names(...future.oldEnvVars) [17:27:39.169] envs <- base::Sys.getenv() [17:27:39.169] names <- names(envs) [17:27:39.169] common <- intersect(names, old_names) [17:27:39.169] added <- setdiff(names, old_names) [17:27:39.169] removed <- setdiff(old_names, names) [17:27:39.169] changed <- common[...future.oldEnvVars[common] != [17:27:39.169] envs[common]] [17:27:39.169] NAMES <- toupper(changed) [17:27:39.169] args <- list() [17:27:39.169] for (kk in seq_along(NAMES)) { [17:27:39.169] name <- changed[[kk]] [17:27:39.169] NAME <- NAMES[[kk]] [17:27:39.169] if (name != NAME && is.element(NAME, old_names)) [17:27:39.169] next [17:27:39.169] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.169] } [17:27:39.169] NAMES <- toupper(added) [17:27:39.169] for (kk in seq_along(NAMES)) { [17:27:39.169] name <- added[[kk]] [17:27:39.169] NAME <- NAMES[[kk]] [17:27:39.169] if (name != NAME && is.element(NAME, old_names)) [17:27:39.169] next [17:27:39.169] args[[name]] <- "" [17:27:39.169] } [17:27:39.169] NAMES <- toupper(removed) [17:27:39.169] for (kk in seq_along(NAMES)) { [17:27:39.169] name <- removed[[kk]] [17:27:39.169] NAME <- NAMES[[kk]] [17:27:39.169] if (name != NAME && is.element(NAME, old_names)) [17:27:39.169] next [17:27:39.169] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.169] } [17:27:39.169] if (length(args) > 0) [17:27:39.169] base::do.call(base::Sys.setenv, args = args) [17:27:39.169] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.169] } [17:27:39.169] else { [17:27:39.169] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.169] } [17:27:39.169] { [17:27:39.169] if (base::length(...future.futureOptionsAdded) > [17:27:39.169] 0L) { [17:27:39.169] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.169] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.169] base::options(opts) [17:27:39.169] } [17:27:39.169] { [17:27:39.169] { [17:27:39.169] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.169] NULL [17:27:39.169] } [17:27:39.169] options(future.plan = NULL) [17:27:39.169] if (is.na(NA_character_)) [17:27:39.169] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.169] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.169] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.169] .init = FALSE) [17:27:39.169] } [17:27:39.169] } [17:27:39.169] } [17:27:39.169] }) [17:27:39.169] if (TRUE) { [17:27:39.169] base::sink(type = "output", split = FALSE) [17:27:39.169] if (TRUE) { [17:27:39.169] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.169] } [17:27:39.169] else { [17:27:39.169] ...future.result["stdout"] <- base::list(NULL) [17:27:39.169] } [17:27:39.169] base::close(...future.stdout) [17:27:39.169] ...future.stdout <- NULL [17:27:39.169] } [17:27:39.169] ...future.result$conditions <- ...future.conditions [17:27:39.169] ...future.result$finished <- base::Sys.time() [17:27:39.169] ...future.result [17:27:39.169] } [17:27:39.177] MultisessionFuture started [17:27:39.177] - Launch lazy future ... done [17:27:39.177] run() for 'MultisessionFuture' ... done [17:27:39.178] getGlobalsAndPackages() ... [17:27:39.178] Searching for globals... [17:27:39.179] [17:27:39.179] Searching for globals ... DONE [17:27:39.179] - globals: [0] [17:27:39.179] getGlobalsAndPackages() ... DONE [17:27:39.180] run() for 'Future' ... [17:27:39.180] - state: 'created' [17:27:39.181] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.200] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.200] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.201] - Field: 'node' [17:27:39.201] - Field: 'label' [17:27:39.201] - Field: 'local' [17:27:39.201] - Field: 'owner' [17:27:39.201] - Field: 'envir' [17:27:39.201] - Field: 'workers' [17:27:39.202] - Field: 'packages' [17:27:39.202] - Field: 'gc' [17:27:39.202] - Field: 'conditions' [17:27:39.202] - Field: 'persistent' [17:27:39.202] - Field: 'expr' [17:27:39.202] - Field: 'uuid' [17:27:39.203] - Field: 'seed' [17:27:39.203] - Field: 'version' [17:27:39.203] - Field: 'result' [17:27:39.203] - Field: 'asynchronous' [17:27:39.203] - Field: 'calls' [17:27:39.203] - Field: 'globals' [17:27:39.204] - Field: 'stdout' [17:27:39.204] - Field: 'earlySignal' [17:27:39.204] - Field: 'lazy' [17:27:39.204] - Field: 'state' [17:27:39.204] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.205] - Launch lazy future ... [17:27:39.205] Packages needed by the future expression (n = 0): [17:27:39.205] Packages needed by future strategies (n = 0): [17:27:39.206] { [17:27:39.206] { [17:27:39.206] { [17:27:39.206] ...future.startTime <- base::Sys.time() [17:27:39.206] { [17:27:39.206] { [17:27:39.206] { [17:27:39.206] { [17:27:39.206] base::local({ [17:27:39.206] has_future <- base::requireNamespace("future", [17:27:39.206] quietly = TRUE) [17:27:39.206] if (has_future) { [17:27:39.206] ns <- base::getNamespace("future") [17:27:39.206] version <- ns[[".package"]][["version"]] [17:27:39.206] if (is.null(version)) [17:27:39.206] version <- utils::packageVersion("future") [17:27:39.206] } [17:27:39.206] else { [17:27:39.206] version <- NULL [17:27:39.206] } [17:27:39.206] if (!has_future || version < "1.8.0") { [17:27:39.206] info <- base::c(r_version = base::gsub("R version ", [17:27:39.206] "", base::R.version$version.string), [17:27:39.206] platform = base::sprintf("%s (%s-bit)", [17:27:39.206] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.206] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.206] "release", "version")], collapse = " "), [17:27:39.206] hostname = base::Sys.info()[["nodename"]]) [17:27:39.206] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.206] info) [17:27:39.206] info <- base::paste(info, collapse = "; ") [17:27:39.206] if (!has_future) { [17:27:39.206] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.206] info) [17:27:39.206] } [17:27:39.206] else { [17:27:39.206] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.206] info, version) [17:27:39.206] } [17:27:39.206] base::stop(msg) [17:27:39.206] } [17:27:39.206] }) [17:27:39.206] } [17:27:39.206] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.206] base::options(mc.cores = 1L) [17:27:39.206] } [17:27:39.206] ...future.strategy.old <- future::plan("list") [17:27:39.206] options(future.plan = NULL) [17:27:39.206] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.206] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.206] } [17:27:39.206] ...future.workdir <- getwd() [17:27:39.206] } [17:27:39.206] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.206] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.206] } [17:27:39.206] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.206] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.206] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.206] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.206] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.206] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.206] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.206] base::names(...future.oldOptions)) [17:27:39.206] } [17:27:39.206] if (FALSE) { [17:27:39.206] } [17:27:39.206] else { [17:27:39.206] if (TRUE) { [17:27:39.206] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.206] open = "w") [17:27:39.206] } [17:27:39.206] else { [17:27:39.206] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.206] windows = "NUL", "/dev/null"), open = "w") [17:27:39.206] } [17:27:39.206] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.206] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.206] base::sink(type = "output", split = FALSE) [17:27:39.206] base::close(...future.stdout) [17:27:39.206] }, add = TRUE) [17:27:39.206] } [17:27:39.206] ...future.frame <- base::sys.nframe() [17:27:39.206] ...future.conditions <- base::list() [17:27:39.206] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.206] if (FALSE) { [17:27:39.206] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.206] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.206] } [17:27:39.206] ...future.result <- base::tryCatch({ [17:27:39.206] base::withCallingHandlers({ [17:27:39.206] ...future.value <- base::withVisible(base::local({ [17:27:39.206] ...future.makeSendCondition <- base::local({ [17:27:39.206] sendCondition <- NULL [17:27:39.206] function(frame = 1L) { [17:27:39.206] if (is.function(sendCondition)) [17:27:39.206] return(sendCondition) [17:27:39.206] ns <- getNamespace("parallel") [17:27:39.206] if (exists("sendData", mode = "function", [17:27:39.206] envir = ns)) { [17:27:39.206] parallel_sendData <- get("sendData", mode = "function", [17:27:39.206] envir = ns) [17:27:39.206] envir <- sys.frame(frame) [17:27:39.206] master <- NULL [17:27:39.206] while (!identical(envir, .GlobalEnv) && [17:27:39.206] !identical(envir, emptyenv())) { [17:27:39.206] if (exists("master", mode = "list", envir = envir, [17:27:39.206] inherits = FALSE)) { [17:27:39.206] master <- get("master", mode = "list", [17:27:39.206] envir = envir, inherits = FALSE) [17:27:39.206] if (inherits(master, c("SOCKnode", [17:27:39.206] "SOCK0node"))) { [17:27:39.206] sendCondition <<- function(cond) { [17:27:39.206] data <- list(type = "VALUE", value = cond, [17:27:39.206] success = TRUE) [17:27:39.206] parallel_sendData(master, data) [17:27:39.206] } [17:27:39.206] return(sendCondition) [17:27:39.206] } [17:27:39.206] } [17:27:39.206] frame <- frame + 1L [17:27:39.206] envir <- sys.frame(frame) [17:27:39.206] } [17:27:39.206] } [17:27:39.206] sendCondition <<- function(cond) NULL [17:27:39.206] } [17:27:39.206] }) [17:27:39.206] withCallingHandlers({ [17:27:39.206] NULL [17:27:39.206] }, immediateCondition = function(cond) { [17:27:39.206] sendCondition <- ...future.makeSendCondition() [17:27:39.206] sendCondition(cond) [17:27:39.206] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.206] { [17:27:39.206] inherits <- base::inherits [17:27:39.206] invokeRestart <- base::invokeRestart [17:27:39.206] is.null <- base::is.null [17:27:39.206] muffled <- FALSE [17:27:39.206] if (inherits(cond, "message")) { [17:27:39.206] muffled <- grepl(pattern, "muffleMessage") [17:27:39.206] if (muffled) [17:27:39.206] invokeRestart("muffleMessage") [17:27:39.206] } [17:27:39.206] else if (inherits(cond, "warning")) { [17:27:39.206] muffled <- grepl(pattern, "muffleWarning") [17:27:39.206] if (muffled) [17:27:39.206] invokeRestart("muffleWarning") [17:27:39.206] } [17:27:39.206] else if (inherits(cond, "condition")) { [17:27:39.206] if (!is.null(pattern)) { [17:27:39.206] computeRestarts <- base::computeRestarts [17:27:39.206] grepl <- base::grepl [17:27:39.206] restarts <- computeRestarts(cond) [17:27:39.206] for (restart in restarts) { [17:27:39.206] name <- restart$name [17:27:39.206] if (is.null(name)) [17:27:39.206] next [17:27:39.206] if (!grepl(pattern, name)) [17:27:39.206] next [17:27:39.206] invokeRestart(restart) [17:27:39.206] muffled <- TRUE [17:27:39.206] break [17:27:39.206] } [17:27:39.206] } [17:27:39.206] } [17:27:39.206] invisible(muffled) [17:27:39.206] } [17:27:39.206] muffleCondition(cond) [17:27:39.206] }) [17:27:39.206] })) [17:27:39.206] future::FutureResult(value = ...future.value$value, [17:27:39.206] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.206] ...future.rng), globalenv = if (FALSE) [17:27:39.206] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.206] ...future.globalenv.names)) [17:27:39.206] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.206] }, condition = base::local({ [17:27:39.206] c <- base::c [17:27:39.206] inherits <- base::inherits [17:27:39.206] invokeRestart <- base::invokeRestart [17:27:39.206] length <- base::length [17:27:39.206] list <- base::list [17:27:39.206] seq.int <- base::seq.int [17:27:39.206] signalCondition <- base::signalCondition [17:27:39.206] sys.calls <- base::sys.calls [17:27:39.206] `[[` <- base::`[[` [17:27:39.206] `+` <- base::`+` [17:27:39.206] `<<-` <- base::`<<-` [17:27:39.206] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.206] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.206] 3L)] [17:27:39.206] } [17:27:39.206] function(cond) { [17:27:39.206] is_error <- inherits(cond, "error") [17:27:39.206] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.206] NULL) [17:27:39.206] if (is_error) { [17:27:39.206] sessionInformation <- function() { [17:27:39.206] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.206] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.206] search = base::search(), system = base::Sys.info()) [17:27:39.206] } [17:27:39.206] ...future.conditions[[length(...future.conditions) + [17:27:39.206] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.206] cond$call), session = sessionInformation(), [17:27:39.206] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.206] signalCondition(cond) [17:27:39.206] } [17:27:39.206] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.206] "immediateCondition"))) { [17:27:39.206] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.206] ...future.conditions[[length(...future.conditions) + [17:27:39.206] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.206] if (TRUE && !signal) { [17:27:39.206] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.206] { [17:27:39.206] inherits <- base::inherits [17:27:39.206] invokeRestart <- base::invokeRestart [17:27:39.206] is.null <- base::is.null [17:27:39.206] muffled <- FALSE [17:27:39.206] if (inherits(cond, "message")) { [17:27:39.206] muffled <- grepl(pattern, "muffleMessage") [17:27:39.206] if (muffled) [17:27:39.206] invokeRestart("muffleMessage") [17:27:39.206] } [17:27:39.206] else if (inherits(cond, "warning")) { [17:27:39.206] muffled <- grepl(pattern, "muffleWarning") [17:27:39.206] if (muffled) [17:27:39.206] invokeRestart("muffleWarning") [17:27:39.206] } [17:27:39.206] else if (inherits(cond, "condition")) { [17:27:39.206] if (!is.null(pattern)) { [17:27:39.206] computeRestarts <- base::computeRestarts [17:27:39.206] grepl <- base::grepl [17:27:39.206] restarts <- computeRestarts(cond) [17:27:39.206] for (restart in restarts) { [17:27:39.206] name <- restart$name [17:27:39.206] if (is.null(name)) [17:27:39.206] next [17:27:39.206] if (!grepl(pattern, name)) [17:27:39.206] next [17:27:39.206] invokeRestart(restart) [17:27:39.206] muffled <- TRUE [17:27:39.206] break [17:27:39.206] } [17:27:39.206] } [17:27:39.206] } [17:27:39.206] invisible(muffled) [17:27:39.206] } [17:27:39.206] muffleCondition(cond, pattern = "^muffle") [17:27:39.206] } [17:27:39.206] } [17:27:39.206] else { [17:27:39.206] if (TRUE) { [17:27:39.206] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.206] { [17:27:39.206] inherits <- base::inherits [17:27:39.206] invokeRestart <- base::invokeRestart [17:27:39.206] is.null <- base::is.null [17:27:39.206] muffled <- FALSE [17:27:39.206] if (inherits(cond, "message")) { [17:27:39.206] muffled <- grepl(pattern, "muffleMessage") [17:27:39.206] if (muffled) [17:27:39.206] invokeRestart("muffleMessage") [17:27:39.206] } [17:27:39.206] else if (inherits(cond, "warning")) { [17:27:39.206] muffled <- grepl(pattern, "muffleWarning") [17:27:39.206] if (muffled) [17:27:39.206] invokeRestart("muffleWarning") [17:27:39.206] } [17:27:39.206] else if (inherits(cond, "condition")) { [17:27:39.206] if (!is.null(pattern)) { [17:27:39.206] computeRestarts <- base::computeRestarts [17:27:39.206] grepl <- base::grepl [17:27:39.206] restarts <- computeRestarts(cond) [17:27:39.206] for (restart in restarts) { [17:27:39.206] name <- restart$name [17:27:39.206] if (is.null(name)) [17:27:39.206] next [17:27:39.206] if (!grepl(pattern, name)) [17:27:39.206] next [17:27:39.206] invokeRestart(restart) [17:27:39.206] muffled <- TRUE [17:27:39.206] break [17:27:39.206] } [17:27:39.206] } [17:27:39.206] } [17:27:39.206] invisible(muffled) [17:27:39.206] } [17:27:39.206] muffleCondition(cond, pattern = "^muffle") [17:27:39.206] } [17:27:39.206] } [17:27:39.206] } [17:27:39.206] })) [17:27:39.206] }, error = function(ex) { [17:27:39.206] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.206] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.206] ...future.rng), started = ...future.startTime, [17:27:39.206] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.206] version = "1.8"), class = "FutureResult") [17:27:39.206] }, finally = { [17:27:39.206] if (!identical(...future.workdir, getwd())) [17:27:39.206] setwd(...future.workdir) [17:27:39.206] { [17:27:39.206] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.206] ...future.oldOptions$nwarnings <- NULL [17:27:39.206] } [17:27:39.206] base::options(...future.oldOptions) [17:27:39.206] if (.Platform$OS.type == "windows") { [17:27:39.206] old_names <- names(...future.oldEnvVars) [17:27:39.206] envs <- base::Sys.getenv() [17:27:39.206] names <- names(envs) [17:27:39.206] common <- intersect(names, old_names) [17:27:39.206] added <- setdiff(names, old_names) [17:27:39.206] removed <- setdiff(old_names, names) [17:27:39.206] changed <- common[...future.oldEnvVars[common] != [17:27:39.206] envs[common]] [17:27:39.206] NAMES <- toupper(changed) [17:27:39.206] args <- list() [17:27:39.206] for (kk in seq_along(NAMES)) { [17:27:39.206] name <- changed[[kk]] [17:27:39.206] NAME <- NAMES[[kk]] [17:27:39.206] if (name != NAME && is.element(NAME, old_names)) [17:27:39.206] next [17:27:39.206] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.206] } [17:27:39.206] NAMES <- toupper(added) [17:27:39.206] for (kk in seq_along(NAMES)) { [17:27:39.206] name <- added[[kk]] [17:27:39.206] NAME <- NAMES[[kk]] [17:27:39.206] if (name != NAME && is.element(NAME, old_names)) [17:27:39.206] next [17:27:39.206] args[[name]] <- "" [17:27:39.206] } [17:27:39.206] NAMES <- toupper(removed) [17:27:39.206] for (kk in seq_along(NAMES)) { [17:27:39.206] name <- removed[[kk]] [17:27:39.206] NAME <- NAMES[[kk]] [17:27:39.206] if (name != NAME && is.element(NAME, old_names)) [17:27:39.206] next [17:27:39.206] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.206] } [17:27:39.206] if (length(args) > 0) [17:27:39.206] base::do.call(base::Sys.setenv, args = args) [17:27:39.206] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.206] } [17:27:39.206] else { [17:27:39.206] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.206] } [17:27:39.206] { [17:27:39.206] if (base::length(...future.futureOptionsAdded) > [17:27:39.206] 0L) { [17:27:39.206] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.206] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.206] base::options(opts) [17:27:39.206] } [17:27:39.206] { [17:27:39.206] { [17:27:39.206] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.206] NULL [17:27:39.206] } [17:27:39.206] options(future.plan = NULL) [17:27:39.206] if (is.na(NA_character_)) [17:27:39.206] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.206] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.206] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.206] .init = FALSE) [17:27:39.206] } [17:27:39.206] } [17:27:39.206] } [17:27:39.206] }) [17:27:39.206] if (TRUE) { [17:27:39.206] base::sink(type = "output", split = FALSE) [17:27:39.206] if (TRUE) { [17:27:39.206] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.206] } [17:27:39.206] else { [17:27:39.206] ...future.result["stdout"] <- base::list(NULL) [17:27:39.206] } [17:27:39.206] base::close(...future.stdout) [17:27:39.206] ...future.stdout <- NULL [17:27:39.206] } [17:27:39.206] ...future.result$conditions <- ...future.conditions [17:27:39.206] ...future.result$finished <- base::Sys.time() [17:27:39.206] ...future.result [17:27:39.206] } [17:27:39.216] MultisessionFuture started [17:27:39.216] - Launch lazy future ... done [17:27:39.216] run() for 'MultisessionFuture' ... done [17:27:39.217] getGlobalsAndPackages() ... [17:27:39.217] Searching for globals... [17:27:39.219] - globals found: [1] '{' [17:27:39.219] Searching for globals ... DONE [17:27:39.219] Resolving globals: FALSE [17:27:39.220] [17:27:39.220] [17:27:39.220] getGlobalsAndPackages() ... DONE [17:27:39.221] run() for 'Future' ... [17:27:39.221] - state: 'created' [17:27:39.221] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.240] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.241] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.241] - Field: 'node' [17:27:39.241] - Field: 'label' [17:27:39.242] - Field: 'local' [17:27:39.242] - Field: 'owner' [17:27:39.242] - Field: 'envir' [17:27:39.243] - Field: 'workers' [17:27:39.243] - Field: 'packages' [17:27:39.243] - Field: 'gc' [17:27:39.243] - Field: 'conditions' [17:27:39.244] - Field: 'persistent' [17:27:39.244] - Field: 'expr' [17:27:39.244] - Field: 'uuid' [17:27:39.244] - Field: 'seed' [17:27:39.245] - Field: 'version' [17:27:39.245] - Field: 'result' [17:27:39.245] - Field: 'asynchronous' [17:27:39.245] - Field: 'calls' [17:27:39.246] - Field: 'globals' [17:27:39.246] - Field: 'stdout' [17:27:39.246] - Field: 'earlySignal' [17:27:39.247] - Field: 'lazy' [17:27:39.247] - Field: 'state' [17:27:39.247] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.247] - Launch lazy future ... [17:27:39.248] Packages needed by the future expression (n = 0): [17:27:39.248] Packages needed by future strategies (n = 0): [17:27:39.249] { [17:27:39.249] { [17:27:39.249] { [17:27:39.249] ...future.startTime <- base::Sys.time() [17:27:39.249] { [17:27:39.249] { [17:27:39.249] { [17:27:39.249] { [17:27:39.249] base::local({ [17:27:39.249] has_future <- base::requireNamespace("future", [17:27:39.249] quietly = TRUE) [17:27:39.249] if (has_future) { [17:27:39.249] ns <- base::getNamespace("future") [17:27:39.249] version <- ns[[".package"]][["version"]] [17:27:39.249] if (is.null(version)) [17:27:39.249] version <- utils::packageVersion("future") [17:27:39.249] } [17:27:39.249] else { [17:27:39.249] version <- NULL [17:27:39.249] } [17:27:39.249] if (!has_future || version < "1.8.0") { [17:27:39.249] info <- base::c(r_version = base::gsub("R version ", [17:27:39.249] "", base::R.version$version.string), [17:27:39.249] platform = base::sprintf("%s (%s-bit)", [17:27:39.249] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.249] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.249] "release", "version")], collapse = " "), [17:27:39.249] hostname = base::Sys.info()[["nodename"]]) [17:27:39.249] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.249] info) [17:27:39.249] info <- base::paste(info, collapse = "; ") [17:27:39.249] if (!has_future) { [17:27:39.249] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.249] info) [17:27:39.249] } [17:27:39.249] else { [17:27:39.249] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.249] info, version) [17:27:39.249] } [17:27:39.249] base::stop(msg) [17:27:39.249] } [17:27:39.249] }) [17:27:39.249] } [17:27:39.249] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.249] base::options(mc.cores = 1L) [17:27:39.249] } [17:27:39.249] ...future.strategy.old <- future::plan("list") [17:27:39.249] options(future.plan = NULL) [17:27:39.249] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.249] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.249] } [17:27:39.249] ...future.workdir <- getwd() [17:27:39.249] } [17:27:39.249] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.249] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.249] } [17:27:39.249] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.249] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.249] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.249] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.249] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.249] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.249] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.249] base::names(...future.oldOptions)) [17:27:39.249] } [17:27:39.249] if (FALSE) { [17:27:39.249] } [17:27:39.249] else { [17:27:39.249] if (TRUE) { [17:27:39.249] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.249] open = "w") [17:27:39.249] } [17:27:39.249] else { [17:27:39.249] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.249] windows = "NUL", "/dev/null"), open = "w") [17:27:39.249] } [17:27:39.249] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.249] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.249] base::sink(type = "output", split = FALSE) [17:27:39.249] base::close(...future.stdout) [17:27:39.249] }, add = TRUE) [17:27:39.249] } [17:27:39.249] ...future.frame <- base::sys.nframe() [17:27:39.249] ...future.conditions <- base::list() [17:27:39.249] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.249] if (FALSE) { [17:27:39.249] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.249] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.249] } [17:27:39.249] ...future.result <- base::tryCatch({ [17:27:39.249] base::withCallingHandlers({ [17:27:39.249] ...future.value <- base::withVisible(base::local({ [17:27:39.249] ...future.makeSendCondition <- base::local({ [17:27:39.249] sendCondition <- NULL [17:27:39.249] function(frame = 1L) { [17:27:39.249] if (is.function(sendCondition)) [17:27:39.249] return(sendCondition) [17:27:39.249] ns <- getNamespace("parallel") [17:27:39.249] if (exists("sendData", mode = "function", [17:27:39.249] envir = ns)) { [17:27:39.249] parallel_sendData <- get("sendData", mode = "function", [17:27:39.249] envir = ns) [17:27:39.249] envir <- sys.frame(frame) [17:27:39.249] master <- NULL [17:27:39.249] while (!identical(envir, .GlobalEnv) && [17:27:39.249] !identical(envir, emptyenv())) { [17:27:39.249] if (exists("master", mode = "list", envir = envir, [17:27:39.249] inherits = FALSE)) { [17:27:39.249] master <- get("master", mode = "list", [17:27:39.249] envir = envir, inherits = FALSE) [17:27:39.249] if (inherits(master, c("SOCKnode", [17:27:39.249] "SOCK0node"))) { [17:27:39.249] sendCondition <<- function(cond) { [17:27:39.249] data <- list(type = "VALUE", value = cond, [17:27:39.249] success = TRUE) [17:27:39.249] parallel_sendData(master, data) [17:27:39.249] } [17:27:39.249] return(sendCondition) [17:27:39.249] } [17:27:39.249] } [17:27:39.249] frame <- frame + 1L [17:27:39.249] envir <- sys.frame(frame) [17:27:39.249] } [17:27:39.249] } [17:27:39.249] sendCondition <<- function(cond) NULL [17:27:39.249] } [17:27:39.249] }) [17:27:39.249] withCallingHandlers({ [17:27:39.249] { [17:27:39.249] 4 [17:27:39.249] } [17:27:39.249] }, immediateCondition = function(cond) { [17:27:39.249] sendCondition <- ...future.makeSendCondition() [17:27:39.249] sendCondition(cond) [17:27:39.249] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.249] { [17:27:39.249] inherits <- base::inherits [17:27:39.249] invokeRestart <- base::invokeRestart [17:27:39.249] is.null <- base::is.null [17:27:39.249] muffled <- FALSE [17:27:39.249] if (inherits(cond, "message")) { [17:27:39.249] muffled <- grepl(pattern, "muffleMessage") [17:27:39.249] if (muffled) [17:27:39.249] invokeRestart("muffleMessage") [17:27:39.249] } [17:27:39.249] else if (inherits(cond, "warning")) { [17:27:39.249] muffled <- grepl(pattern, "muffleWarning") [17:27:39.249] if (muffled) [17:27:39.249] invokeRestart("muffleWarning") [17:27:39.249] } [17:27:39.249] else if (inherits(cond, "condition")) { [17:27:39.249] if (!is.null(pattern)) { [17:27:39.249] computeRestarts <- base::computeRestarts [17:27:39.249] grepl <- base::grepl [17:27:39.249] restarts <- computeRestarts(cond) [17:27:39.249] for (restart in restarts) { [17:27:39.249] name <- restart$name [17:27:39.249] if (is.null(name)) [17:27:39.249] next [17:27:39.249] if (!grepl(pattern, name)) [17:27:39.249] next [17:27:39.249] invokeRestart(restart) [17:27:39.249] muffled <- TRUE [17:27:39.249] break [17:27:39.249] } [17:27:39.249] } [17:27:39.249] } [17:27:39.249] invisible(muffled) [17:27:39.249] } [17:27:39.249] muffleCondition(cond) [17:27:39.249] }) [17:27:39.249] })) [17:27:39.249] future::FutureResult(value = ...future.value$value, [17:27:39.249] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.249] ...future.rng), globalenv = if (FALSE) [17:27:39.249] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.249] ...future.globalenv.names)) [17:27:39.249] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.249] }, condition = base::local({ [17:27:39.249] c <- base::c [17:27:39.249] inherits <- base::inherits [17:27:39.249] invokeRestart <- base::invokeRestart [17:27:39.249] length <- base::length [17:27:39.249] list <- base::list [17:27:39.249] seq.int <- base::seq.int [17:27:39.249] signalCondition <- base::signalCondition [17:27:39.249] sys.calls <- base::sys.calls [17:27:39.249] `[[` <- base::`[[` [17:27:39.249] `+` <- base::`+` [17:27:39.249] `<<-` <- base::`<<-` [17:27:39.249] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.249] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.249] 3L)] [17:27:39.249] } [17:27:39.249] function(cond) { [17:27:39.249] is_error <- inherits(cond, "error") [17:27:39.249] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.249] NULL) [17:27:39.249] if (is_error) { [17:27:39.249] sessionInformation <- function() { [17:27:39.249] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.249] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.249] search = base::search(), system = base::Sys.info()) [17:27:39.249] } [17:27:39.249] ...future.conditions[[length(...future.conditions) + [17:27:39.249] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.249] cond$call), session = sessionInformation(), [17:27:39.249] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.249] signalCondition(cond) [17:27:39.249] } [17:27:39.249] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.249] "immediateCondition"))) { [17:27:39.249] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.249] ...future.conditions[[length(...future.conditions) + [17:27:39.249] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.249] if (TRUE && !signal) { [17:27:39.249] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.249] { [17:27:39.249] inherits <- base::inherits [17:27:39.249] invokeRestart <- base::invokeRestart [17:27:39.249] is.null <- base::is.null [17:27:39.249] muffled <- FALSE [17:27:39.249] if (inherits(cond, "message")) { [17:27:39.249] muffled <- grepl(pattern, "muffleMessage") [17:27:39.249] if (muffled) [17:27:39.249] invokeRestart("muffleMessage") [17:27:39.249] } [17:27:39.249] else if (inherits(cond, "warning")) { [17:27:39.249] muffled <- grepl(pattern, "muffleWarning") [17:27:39.249] if (muffled) [17:27:39.249] invokeRestart("muffleWarning") [17:27:39.249] } [17:27:39.249] else if (inherits(cond, "condition")) { [17:27:39.249] if (!is.null(pattern)) { [17:27:39.249] computeRestarts <- base::computeRestarts [17:27:39.249] grepl <- base::grepl [17:27:39.249] restarts <- computeRestarts(cond) [17:27:39.249] for (restart in restarts) { [17:27:39.249] name <- restart$name [17:27:39.249] if (is.null(name)) [17:27:39.249] next [17:27:39.249] if (!grepl(pattern, name)) [17:27:39.249] next [17:27:39.249] invokeRestart(restart) [17:27:39.249] muffled <- TRUE [17:27:39.249] break [17:27:39.249] } [17:27:39.249] } [17:27:39.249] } [17:27:39.249] invisible(muffled) [17:27:39.249] } [17:27:39.249] muffleCondition(cond, pattern = "^muffle") [17:27:39.249] } [17:27:39.249] } [17:27:39.249] else { [17:27:39.249] if (TRUE) { [17:27:39.249] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.249] { [17:27:39.249] inherits <- base::inherits [17:27:39.249] invokeRestart <- base::invokeRestart [17:27:39.249] is.null <- base::is.null [17:27:39.249] muffled <- FALSE [17:27:39.249] if (inherits(cond, "message")) { [17:27:39.249] muffled <- grepl(pattern, "muffleMessage") [17:27:39.249] if (muffled) [17:27:39.249] invokeRestart("muffleMessage") [17:27:39.249] } [17:27:39.249] else if (inherits(cond, "warning")) { [17:27:39.249] muffled <- grepl(pattern, "muffleWarning") [17:27:39.249] if (muffled) [17:27:39.249] invokeRestart("muffleWarning") [17:27:39.249] } [17:27:39.249] else if (inherits(cond, "condition")) { [17:27:39.249] if (!is.null(pattern)) { [17:27:39.249] computeRestarts <- base::computeRestarts [17:27:39.249] grepl <- base::grepl [17:27:39.249] restarts <- computeRestarts(cond) [17:27:39.249] for (restart in restarts) { [17:27:39.249] name <- restart$name [17:27:39.249] if (is.null(name)) [17:27:39.249] next [17:27:39.249] if (!grepl(pattern, name)) [17:27:39.249] next [17:27:39.249] invokeRestart(restart) [17:27:39.249] muffled <- TRUE [17:27:39.249] break [17:27:39.249] } [17:27:39.249] } [17:27:39.249] } [17:27:39.249] invisible(muffled) [17:27:39.249] } [17:27:39.249] muffleCondition(cond, pattern = "^muffle") [17:27:39.249] } [17:27:39.249] } [17:27:39.249] } [17:27:39.249] })) [17:27:39.249] }, error = function(ex) { [17:27:39.249] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.249] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.249] ...future.rng), started = ...future.startTime, [17:27:39.249] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.249] version = "1.8"), class = "FutureResult") [17:27:39.249] }, finally = { [17:27:39.249] if (!identical(...future.workdir, getwd())) [17:27:39.249] setwd(...future.workdir) [17:27:39.249] { [17:27:39.249] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.249] ...future.oldOptions$nwarnings <- NULL [17:27:39.249] } [17:27:39.249] base::options(...future.oldOptions) [17:27:39.249] if (.Platform$OS.type == "windows") { [17:27:39.249] old_names <- names(...future.oldEnvVars) [17:27:39.249] envs <- base::Sys.getenv() [17:27:39.249] names <- names(envs) [17:27:39.249] common <- intersect(names, old_names) [17:27:39.249] added <- setdiff(names, old_names) [17:27:39.249] removed <- setdiff(old_names, names) [17:27:39.249] changed <- common[...future.oldEnvVars[common] != [17:27:39.249] envs[common]] [17:27:39.249] NAMES <- toupper(changed) [17:27:39.249] args <- list() [17:27:39.249] for (kk in seq_along(NAMES)) { [17:27:39.249] name <- changed[[kk]] [17:27:39.249] NAME <- NAMES[[kk]] [17:27:39.249] if (name != NAME && is.element(NAME, old_names)) [17:27:39.249] next [17:27:39.249] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.249] } [17:27:39.249] NAMES <- toupper(added) [17:27:39.249] for (kk in seq_along(NAMES)) { [17:27:39.249] name <- added[[kk]] [17:27:39.249] NAME <- NAMES[[kk]] [17:27:39.249] if (name != NAME && is.element(NAME, old_names)) [17:27:39.249] next [17:27:39.249] args[[name]] <- "" [17:27:39.249] } [17:27:39.249] NAMES <- toupper(removed) [17:27:39.249] for (kk in seq_along(NAMES)) { [17:27:39.249] name <- removed[[kk]] [17:27:39.249] NAME <- NAMES[[kk]] [17:27:39.249] if (name != NAME && is.element(NAME, old_names)) [17:27:39.249] next [17:27:39.249] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.249] } [17:27:39.249] if (length(args) > 0) [17:27:39.249] base::do.call(base::Sys.setenv, args = args) [17:27:39.249] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.249] } [17:27:39.249] else { [17:27:39.249] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.249] } [17:27:39.249] { [17:27:39.249] if (base::length(...future.futureOptionsAdded) > [17:27:39.249] 0L) { [17:27:39.249] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.249] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.249] base::options(opts) [17:27:39.249] } [17:27:39.249] { [17:27:39.249] { [17:27:39.249] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.249] NULL [17:27:39.249] } [17:27:39.249] options(future.plan = NULL) [17:27:39.249] if (is.na(NA_character_)) [17:27:39.249] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.249] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.249] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.249] .init = FALSE) [17:27:39.249] } [17:27:39.249] } [17:27:39.249] } [17:27:39.249] }) [17:27:39.249] if (TRUE) { [17:27:39.249] base::sink(type = "output", split = FALSE) [17:27:39.249] if (TRUE) { [17:27:39.249] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.249] } [17:27:39.249] else { [17:27:39.249] ...future.result["stdout"] <- base::list(NULL) [17:27:39.249] } [17:27:39.249] base::close(...future.stdout) [17:27:39.249] ...future.stdout <- NULL [17:27:39.249] } [17:27:39.249] ...future.result$conditions <- ...future.conditions [17:27:39.249] ...future.result$finished <- base::Sys.time() [17:27:39.249] ...future.result [17:27:39.249] } [17:27:39.257] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:39.307] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.308] - Validating connection of MultisessionFuture [17:27:39.308] - received message: FutureResult [17:27:39.309] - Received FutureResult [17:27:39.309] - Erased future from FutureRegistry [17:27:39.309] result() for ClusterFuture ... [17:27:39.310] - result already collected: FutureResult [17:27:39.310] result() for ClusterFuture ... done [17:27:39.310] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.311] result() for ClusterFuture ... [17:27:39.311] - result already collected: FutureResult [17:27:39.311] result() for ClusterFuture ... done [17:27:39.312] result() for ClusterFuture ... [17:27:39.312] - result already collected: FutureResult [17:27:39.312] result() for ClusterFuture ... done [17:27:39.315] MultisessionFuture started [17:27:39.316] - Launch lazy future ... done [17:27:39.316] run() for 'MultisessionFuture' ... done [17:27:39.320] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.320] - Validating connection of MultisessionFuture [17:27:39.321] - received message: FutureResult [17:27:39.321] - Received FutureResult [17:27:39.322] - Erased future from FutureRegistry [17:27:39.322] result() for ClusterFuture ... [17:27:39.322] - result already collected: FutureResult [17:27:39.323] result() for ClusterFuture ... done [17:27:39.323] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.341] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.341] - Validating connection of MultisessionFuture [17:27:39.342] - received message: FutureResult [17:27:39.342] - Received FutureResult [17:27:39.342] - Erased future from FutureRegistry [17:27:39.343] result() for ClusterFuture ... [17:27:39.343] - result already collected: FutureResult [17:27:39.343] result() for ClusterFuture ... done [17:27:39.343] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:39.346] resolve() on environment ... [17:27:39.346] recursive: 0 [17:27:39.347] elements: [4] 'a', 'b', 'c', 'd' [17:27:39.347] signalConditionsASAP(numeric, pos=1) ... [17:27:39.347] - nx: 4 [17:27:39.348] - relay: TRUE [17:27:39.348] - stdout: TRUE [17:27:39.348] - signal: TRUE [17:27:39.348] - resignal: FALSE [17:27:39.349] - force: TRUE [17:27:39.349] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.349] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.349] - until=2 [17:27:39.349] - relaying element #2 [17:27:39.350] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.350] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.350] signalConditionsASAP(NULL, pos=1) ... done [17:27:39.350] length: 3 (resolved future 1) [17:27:39.351] Future #2 [17:27:39.351] result() for ClusterFuture ... [17:27:39.351] - result already collected: FutureResult [17:27:39.351] result() for ClusterFuture ... done [17:27:39.352] result() for ClusterFuture ... [17:27:39.352] - result already collected: FutureResult [17:27:39.352] result() for ClusterFuture ... done [17:27:39.353] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:39.353] - nx: 4 [17:27:39.353] - relay: TRUE [17:27:39.353] - stdout: TRUE [17:27:39.353] - signal: TRUE [17:27:39.354] - resignal: FALSE [17:27:39.354] - force: TRUE [17:27:39.354] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.354] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.355] - until=2 [17:27:39.355] - relaying element #2 [17:27:39.355] result() for ClusterFuture ... [17:27:39.355] - result already collected: FutureResult [17:27:39.355] result() for ClusterFuture ... done [17:27:39.356] result() for ClusterFuture ... [17:27:39.356] - result already collected: FutureResult [17:27:39.356] result() for ClusterFuture ... done [17:27:39.357] result() for ClusterFuture ... [17:27:39.357] - result already collected: FutureResult [17:27:39.357] result() for ClusterFuture ... done [17:27:39.357] result() for ClusterFuture ... [17:27:39.357] - result already collected: FutureResult [17:27:39.358] result() for ClusterFuture ... done [17:27:39.358] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.358] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.358] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:39.359] length: 2 (resolved future 2) [17:27:39.359] Future #3 [17:27:39.359] result() for ClusterFuture ... [17:27:39.360] - result already collected: FutureResult [17:27:39.360] result() for ClusterFuture ... done [17:27:39.360] result() for ClusterFuture ... [17:27:39.360] - result already collected: FutureResult [17:27:39.360] result() for ClusterFuture ... done [17:27:39.361] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:39.361] - nx: 4 [17:27:39.361] - relay: TRUE [17:27:39.361] - stdout: TRUE [17:27:39.362] - signal: TRUE [17:27:39.362] - resignal: FALSE [17:27:39.362] - force: TRUE [17:27:39.362] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.363] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.363] - until=3 [17:27:39.363] - relaying element #3 [17:27:39.363] result() for ClusterFuture ... [17:27:39.364] - result already collected: FutureResult [17:27:39.364] result() for ClusterFuture ... done [17:27:39.364] result() for ClusterFuture ... [17:27:39.364] - result already collected: FutureResult [17:27:39.364] result() for ClusterFuture ... done [17:27:39.365] result() for ClusterFuture ... [17:27:39.365] - result already collected: FutureResult [17:27:39.365] result() for ClusterFuture ... done [17:27:39.366] result() for ClusterFuture ... [17:27:39.366] - result already collected: FutureResult [17:27:39.366] result() for ClusterFuture ... done [17:27:39.366] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.366] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.367] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:39.367] length: 1 (resolved future 3) [17:27:39.367] Future #4 [17:27:39.368] result() for ClusterFuture ... [17:27:39.368] - result already collected: FutureResult [17:27:39.368] result() for ClusterFuture ... done [17:27:39.368] result() for ClusterFuture ... [17:27:39.369] - result already collected: FutureResult [17:27:39.369] result() for ClusterFuture ... done [17:27:39.369] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:39.370] - nx: 4 [17:27:39.370] - relay: TRUE [17:27:39.370] - stdout: TRUE [17:27:39.370] - signal: TRUE [17:27:39.371] - resignal: FALSE [17:27:39.371] - force: TRUE [17:27:39.371] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.372] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.372] - until=4 [17:27:39.372] - relaying element #4 [17:27:39.372] result() for ClusterFuture ... [17:27:39.373] - result already collected: FutureResult [17:27:39.373] result() for ClusterFuture ... done [17:27:39.373] result() for ClusterFuture ... [17:27:39.374] - result already collected: FutureResult [17:27:39.374] result() for ClusterFuture ... done [17:27:39.374] result() for ClusterFuture ... [17:27:39.374] - result already collected: FutureResult [17:27:39.375] result() for ClusterFuture ... done [17:27:39.375] result() for ClusterFuture ... [17:27:39.375] - result already collected: FutureResult [17:27:39.376] result() for ClusterFuture ... done [17:27:39.376] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.376] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.376] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:39.377] length: 0 (resolved future 4) [17:27:39.377] Relaying remaining futures [17:27:39.377] signalConditionsASAP(NULL, pos=0) ... [17:27:39.378] - nx: 4 [17:27:39.378] - relay: TRUE [17:27:39.378] - stdout: TRUE [17:27:39.378] - signal: TRUE [17:27:39.379] - resignal: FALSE [17:27:39.379] - force: TRUE [17:27:39.379] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.379] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:39.380] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.380] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.380] signalConditionsASAP(NULL, pos=0) ... done [17:27:39.381] resolve() on environment ... DONE [17:27:39.381] result() for ClusterFuture ... [17:27:39.381] - result already collected: FutureResult [17:27:39.382] result() for ClusterFuture ... done [17:27:39.382] result() for ClusterFuture ... [17:27:39.382] - result already collected: FutureResult [17:27:39.382] result() for ClusterFuture ... done [17:27:39.383] result() for ClusterFuture ... [17:27:39.383] - result already collected: FutureResult [17:27:39.383] result() for ClusterFuture ... done [17:27:39.384] result() for ClusterFuture ... [17:27:39.384] - result already collected: FutureResult [17:27:39.384] result() for ClusterFuture ... done [17:27:39.384] result() for ClusterFuture ... [17:27:39.385] - result already collected: FutureResult [17:27:39.385] result() for ClusterFuture ... done [17:27:39.385] result() for ClusterFuture ... [17:27:39.386] - result already collected: FutureResult [17:27:39.386] result() for ClusterFuture ... done Dimensions: c(2, 3) [17:27:39.387] getGlobalsAndPackages() ... [17:27:39.387] Searching for globals... [17:27:39.388] [17:27:39.388] Searching for globals ... DONE [17:27:39.388] - globals: [0] [17:27:39.388] getGlobalsAndPackages() ... DONE [17:27:39.389] run() for 'Future' ... [17:27:39.389] - state: 'created' [17:27:39.390] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.407] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.408] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.408] - Field: 'node' [17:27:39.408] - Field: 'label' [17:27:39.408] - Field: 'local' [17:27:39.409] - Field: 'owner' [17:27:39.409] - Field: 'envir' [17:27:39.409] - Field: 'workers' [17:27:39.409] - Field: 'packages' [17:27:39.410] - Field: 'gc' [17:27:39.410] - Field: 'conditions' [17:27:39.410] - Field: 'persistent' [17:27:39.410] - Field: 'expr' [17:27:39.411] - Field: 'uuid' [17:27:39.411] - Field: 'seed' [17:27:39.411] - Field: 'version' [17:27:39.411] - Field: 'result' [17:27:39.411] - Field: 'asynchronous' [17:27:39.412] - Field: 'calls' [17:27:39.412] - Field: 'globals' [17:27:39.412] - Field: 'stdout' [17:27:39.413] - Field: 'earlySignal' [17:27:39.413] - Field: 'lazy' [17:27:39.413] - Field: 'state' [17:27:39.413] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.414] - Launch lazy future ... [17:27:39.414] Packages needed by the future expression (n = 0): [17:27:39.415] Packages needed by future strategies (n = 0): [17:27:39.415] { [17:27:39.415] { [17:27:39.415] { [17:27:39.415] ...future.startTime <- base::Sys.time() [17:27:39.415] { [17:27:39.415] { [17:27:39.415] { [17:27:39.415] { [17:27:39.415] base::local({ [17:27:39.415] has_future <- base::requireNamespace("future", [17:27:39.415] quietly = TRUE) [17:27:39.415] if (has_future) { [17:27:39.415] ns <- base::getNamespace("future") [17:27:39.415] version <- ns[[".package"]][["version"]] [17:27:39.415] if (is.null(version)) [17:27:39.415] version <- utils::packageVersion("future") [17:27:39.415] } [17:27:39.415] else { [17:27:39.415] version <- NULL [17:27:39.415] } [17:27:39.415] if (!has_future || version < "1.8.0") { [17:27:39.415] info <- base::c(r_version = base::gsub("R version ", [17:27:39.415] "", base::R.version$version.string), [17:27:39.415] platform = base::sprintf("%s (%s-bit)", [17:27:39.415] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.415] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.415] "release", "version")], collapse = " "), [17:27:39.415] hostname = base::Sys.info()[["nodename"]]) [17:27:39.415] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.415] info) [17:27:39.415] info <- base::paste(info, collapse = "; ") [17:27:39.415] if (!has_future) { [17:27:39.415] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.415] info) [17:27:39.415] } [17:27:39.415] else { [17:27:39.415] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.415] info, version) [17:27:39.415] } [17:27:39.415] base::stop(msg) [17:27:39.415] } [17:27:39.415] }) [17:27:39.415] } [17:27:39.415] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.415] base::options(mc.cores = 1L) [17:27:39.415] } [17:27:39.415] ...future.strategy.old <- future::plan("list") [17:27:39.415] options(future.plan = NULL) [17:27:39.415] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.415] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.415] } [17:27:39.415] ...future.workdir <- getwd() [17:27:39.415] } [17:27:39.415] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.415] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.415] } [17:27:39.415] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.415] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.415] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.415] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.415] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.415] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.415] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.415] base::names(...future.oldOptions)) [17:27:39.415] } [17:27:39.415] if (FALSE) { [17:27:39.415] } [17:27:39.415] else { [17:27:39.415] if (TRUE) { [17:27:39.415] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.415] open = "w") [17:27:39.415] } [17:27:39.415] else { [17:27:39.415] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.415] windows = "NUL", "/dev/null"), open = "w") [17:27:39.415] } [17:27:39.415] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.415] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.415] base::sink(type = "output", split = FALSE) [17:27:39.415] base::close(...future.stdout) [17:27:39.415] }, add = TRUE) [17:27:39.415] } [17:27:39.415] ...future.frame <- base::sys.nframe() [17:27:39.415] ...future.conditions <- base::list() [17:27:39.415] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.415] if (FALSE) { [17:27:39.415] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.415] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.415] } [17:27:39.415] ...future.result <- base::tryCatch({ [17:27:39.415] base::withCallingHandlers({ [17:27:39.415] ...future.value <- base::withVisible(base::local({ [17:27:39.415] ...future.makeSendCondition <- base::local({ [17:27:39.415] sendCondition <- NULL [17:27:39.415] function(frame = 1L) { [17:27:39.415] if (is.function(sendCondition)) [17:27:39.415] return(sendCondition) [17:27:39.415] ns <- getNamespace("parallel") [17:27:39.415] if (exists("sendData", mode = "function", [17:27:39.415] envir = ns)) { [17:27:39.415] parallel_sendData <- get("sendData", mode = "function", [17:27:39.415] envir = ns) [17:27:39.415] envir <- sys.frame(frame) [17:27:39.415] master <- NULL [17:27:39.415] while (!identical(envir, .GlobalEnv) && [17:27:39.415] !identical(envir, emptyenv())) { [17:27:39.415] if (exists("master", mode = "list", envir = envir, [17:27:39.415] inherits = FALSE)) { [17:27:39.415] master <- get("master", mode = "list", [17:27:39.415] envir = envir, inherits = FALSE) [17:27:39.415] if (inherits(master, c("SOCKnode", [17:27:39.415] "SOCK0node"))) { [17:27:39.415] sendCondition <<- function(cond) { [17:27:39.415] data <- list(type = "VALUE", value = cond, [17:27:39.415] success = TRUE) [17:27:39.415] parallel_sendData(master, data) [17:27:39.415] } [17:27:39.415] return(sendCondition) [17:27:39.415] } [17:27:39.415] } [17:27:39.415] frame <- frame + 1L [17:27:39.415] envir <- sys.frame(frame) [17:27:39.415] } [17:27:39.415] } [17:27:39.415] sendCondition <<- function(cond) NULL [17:27:39.415] } [17:27:39.415] }) [17:27:39.415] withCallingHandlers({ [17:27:39.415] 2 [17:27:39.415] }, immediateCondition = function(cond) { [17:27:39.415] sendCondition <- ...future.makeSendCondition() [17:27:39.415] sendCondition(cond) [17:27:39.415] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.415] { [17:27:39.415] inherits <- base::inherits [17:27:39.415] invokeRestart <- base::invokeRestart [17:27:39.415] is.null <- base::is.null [17:27:39.415] muffled <- FALSE [17:27:39.415] if (inherits(cond, "message")) { [17:27:39.415] muffled <- grepl(pattern, "muffleMessage") [17:27:39.415] if (muffled) [17:27:39.415] invokeRestart("muffleMessage") [17:27:39.415] } [17:27:39.415] else if (inherits(cond, "warning")) { [17:27:39.415] muffled <- grepl(pattern, "muffleWarning") [17:27:39.415] if (muffled) [17:27:39.415] invokeRestart("muffleWarning") [17:27:39.415] } [17:27:39.415] else if (inherits(cond, "condition")) { [17:27:39.415] if (!is.null(pattern)) { [17:27:39.415] computeRestarts <- base::computeRestarts [17:27:39.415] grepl <- base::grepl [17:27:39.415] restarts <- computeRestarts(cond) [17:27:39.415] for (restart in restarts) { [17:27:39.415] name <- restart$name [17:27:39.415] if (is.null(name)) [17:27:39.415] next [17:27:39.415] if (!grepl(pattern, name)) [17:27:39.415] next [17:27:39.415] invokeRestart(restart) [17:27:39.415] muffled <- TRUE [17:27:39.415] break [17:27:39.415] } [17:27:39.415] } [17:27:39.415] } [17:27:39.415] invisible(muffled) [17:27:39.415] } [17:27:39.415] muffleCondition(cond) [17:27:39.415] }) [17:27:39.415] })) [17:27:39.415] future::FutureResult(value = ...future.value$value, [17:27:39.415] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.415] ...future.rng), globalenv = if (FALSE) [17:27:39.415] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.415] ...future.globalenv.names)) [17:27:39.415] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.415] }, condition = base::local({ [17:27:39.415] c <- base::c [17:27:39.415] inherits <- base::inherits [17:27:39.415] invokeRestart <- base::invokeRestart [17:27:39.415] length <- base::length [17:27:39.415] list <- base::list [17:27:39.415] seq.int <- base::seq.int [17:27:39.415] signalCondition <- base::signalCondition [17:27:39.415] sys.calls <- base::sys.calls [17:27:39.415] `[[` <- base::`[[` [17:27:39.415] `+` <- base::`+` [17:27:39.415] `<<-` <- base::`<<-` [17:27:39.415] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.415] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.415] 3L)] [17:27:39.415] } [17:27:39.415] function(cond) { [17:27:39.415] is_error <- inherits(cond, "error") [17:27:39.415] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.415] NULL) [17:27:39.415] if (is_error) { [17:27:39.415] sessionInformation <- function() { [17:27:39.415] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.415] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.415] search = base::search(), system = base::Sys.info()) [17:27:39.415] } [17:27:39.415] ...future.conditions[[length(...future.conditions) + [17:27:39.415] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.415] cond$call), session = sessionInformation(), [17:27:39.415] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.415] signalCondition(cond) [17:27:39.415] } [17:27:39.415] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.415] "immediateCondition"))) { [17:27:39.415] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.415] ...future.conditions[[length(...future.conditions) + [17:27:39.415] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.415] if (TRUE && !signal) { [17:27:39.415] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.415] { [17:27:39.415] inherits <- base::inherits [17:27:39.415] invokeRestart <- base::invokeRestart [17:27:39.415] is.null <- base::is.null [17:27:39.415] muffled <- FALSE [17:27:39.415] if (inherits(cond, "message")) { [17:27:39.415] muffled <- grepl(pattern, "muffleMessage") [17:27:39.415] if (muffled) [17:27:39.415] invokeRestart("muffleMessage") [17:27:39.415] } [17:27:39.415] else if (inherits(cond, "warning")) { [17:27:39.415] muffled <- grepl(pattern, "muffleWarning") [17:27:39.415] if (muffled) [17:27:39.415] invokeRestart("muffleWarning") [17:27:39.415] } [17:27:39.415] else if (inherits(cond, "condition")) { [17:27:39.415] if (!is.null(pattern)) { [17:27:39.415] computeRestarts <- base::computeRestarts [17:27:39.415] grepl <- base::grepl [17:27:39.415] restarts <- computeRestarts(cond) [17:27:39.415] for (restart in restarts) { [17:27:39.415] name <- restart$name [17:27:39.415] if (is.null(name)) [17:27:39.415] next [17:27:39.415] if (!grepl(pattern, name)) [17:27:39.415] next [17:27:39.415] invokeRestart(restart) [17:27:39.415] muffled <- TRUE [17:27:39.415] break [17:27:39.415] } [17:27:39.415] } [17:27:39.415] } [17:27:39.415] invisible(muffled) [17:27:39.415] } [17:27:39.415] muffleCondition(cond, pattern = "^muffle") [17:27:39.415] } [17:27:39.415] } [17:27:39.415] else { [17:27:39.415] if (TRUE) { [17:27:39.415] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.415] { [17:27:39.415] inherits <- base::inherits [17:27:39.415] invokeRestart <- base::invokeRestart [17:27:39.415] is.null <- base::is.null [17:27:39.415] muffled <- FALSE [17:27:39.415] if (inherits(cond, "message")) { [17:27:39.415] muffled <- grepl(pattern, "muffleMessage") [17:27:39.415] if (muffled) [17:27:39.415] invokeRestart("muffleMessage") [17:27:39.415] } [17:27:39.415] else if (inherits(cond, "warning")) { [17:27:39.415] muffled <- grepl(pattern, "muffleWarning") [17:27:39.415] if (muffled) [17:27:39.415] invokeRestart("muffleWarning") [17:27:39.415] } [17:27:39.415] else if (inherits(cond, "condition")) { [17:27:39.415] if (!is.null(pattern)) { [17:27:39.415] computeRestarts <- base::computeRestarts [17:27:39.415] grepl <- base::grepl [17:27:39.415] restarts <- computeRestarts(cond) [17:27:39.415] for (restart in restarts) { [17:27:39.415] name <- restart$name [17:27:39.415] if (is.null(name)) [17:27:39.415] next [17:27:39.415] if (!grepl(pattern, name)) [17:27:39.415] next [17:27:39.415] invokeRestart(restart) [17:27:39.415] muffled <- TRUE [17:27:39.415] break [17:27:39.415] } [17:27:39.415] } [17:27:39.415] } [17:27:39.415] invisible(muffled) [17:27:39.415] } [17:27:39.415] muffleCondition(cond, pattern = "^muffle") [17:27:39.415] } [17:27:39.415] } [17:27:39.415] } [17:27:39.415] })) [17:27:39.415] }, error = function(ex) { [17:27:39.415] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.415] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.415] ...future.rng), started = ...future.startTime, [17:27:39.415] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.415] version = "1.8"), class = "FutureResult") [17:27:39.415] }, finally = { [17:27:39.415] if (!identical(...future.workdir, getwd())) [17:27:39.415] setwd(...future.workdir) [17:27:39.415] { [17:27:39.415] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.415] ...future.oldOptions$nwarnings <- NULL [17:27:39.415] } [17:27:39.415] base::options(...future.oldOptions) [17:27:39.415] if (.Platform$OS.type == "windows") { [17:27:39.415] old_names <- names(...future.oldEnvVars) [17:27:39.415] envs <- base::Sys.getenv() [17:27:39.415] names <- names(envs) [17:27:39.415] common <- intersect(names, old_names) [17:27:39.415] added <- setdiff(names, old_names) [17:27:39.415] removed <- setdiff(old_names, names) [17:27:39.415] changed <- common[...future.oldEnvVars[common] != [17:27:39.415] envs[common]] [17:27:39.415] NAMES <- toupper(changed) [17:27:39.415] args <- list() [17:27:39.415] for (kk in seq_along(NAMES)) { [17:27:39.415] name <- changed[[kk]] [17:27:39.415] NAME <- NAMES[[kk]] [17:27:39.415] if (name != NAME && is.element(NAME, old_names)) [17:27:39.415] next [17:27:39.415] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.415] } [17:27:39.415] NAMES <- toupper(added) [17:27:39.415] for (kk in seq_along(NAMES)) { [17:27:39.415] name <- added[[kk]] [17:27:39.415] NAME <- NAMES[[kk]] [17:27:39.415] if (name != NAME && is.element(NAME, old_names)) [17:27:39.415] next [17:27:39.415] args[[name]] <- "" [17:27:39.415] } [17:27:39.415] NAMES <- toupper(removed) [17:27:39.415] for (kk in seq_along(NAMES)) { [17:27:39.415] name <- removed[[kk]] [17:27:39.415] NAME <- NAMES[[kk]] [17:27:39.415] if (name != NAME && is.element(NAME, old_names)) [17:27:39.415] next [17:27:39.415] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.415] } [17:27:39.415] if (length(args) > 0) [17:27:39.415] base::do.call(base::Sys.setenv, args = args) [17:27:39.415] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.415] } [17:27:39.415] else { [17:27:39.415] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.415] } [17:27:39.415] { [17:27:39.415] if (base::length(...future.futureOptionsAdded) > [17:27:39.415] 0L) { [17:27:39.415] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.415] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.415] base::options(opts) [17:27:39.415] } [17:27:39.415] { [17:27:39.415] { [17:27:39.415] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.415] NULL [17:27:39.415] } [17:27:39.415] options(future.plan = NULL) [17:27:39.415] if (is.na(NA_character_)) [17:27:39.415] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.415] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.415] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.415] .init = FALSE) [17:27:39.415] } [17:27:39.415] } [17:27:39.415] } [17:27:39.415] }) [17:27:39.415] if (TRUE) { [17:27:39.415] base::sink(type = "output", split = FALSE) [17:27:39.415] if (TRUE) { [17:27:39.415] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.415] } [17:27:39.415] else { [17:27:39.415] ...future.result["stdout"] <- base::list(NULL) [17:27:39.415] } [17:27:39.415] base::close(...future.stdout) [17:27:39.415] ...future.stdout <- NULL [17:27:39.415] } [17:27:39.415] ...future.result$conditions <- ...future.conditions [17:27:39.415] ...future.result$finished <- base::Sys.time() [17:27:39.415] ...future.result [17:27:39.415] } [17:27:39.424] MultisessionFuture started [17:27:39.425] - Launch lazy future ... done [17:27:39.425] run() for 'MultisessionFuture' ... done [17:27:39.425] getGlobalsAndPackages() ... [17:27:39.426] Searching for globals... [17:27:39.426] [17:27:39.427] Searching for globals ... DONE [17:27:39.427] - globals: [0] [17:27:39.427] getGlobalsAndPackages() ... DONE [17:27:39.427] run() for 'Future' ... [17:27:39.428] - state: 'created' [17:27:39.428] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.447] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.447] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.448] - Field: 'node' [17:27:39.448] - Field: 'label' [17:27:39.448] - Field: 'local' [17:27:39.449] - Field: 'owner' [17:27:39.449] - Field: 'envir' [17:27:39.449] - Field: 'workers' [17:27:39.450] - Field: 'packages' [17:27:39.450] - Field: 'gc' [17:27:39.450] - Field: 'conditions' [17:27:39.451] - Field: 'persistent' [17:27:39.451] - Field: 'expr' [17:27:39.451] - Field: 'uuid' [17:27:39.451] - Field: 'seed' [17:27:39.452] - Field: 'version' [17:27:39.452] - Field: 'result' [17:27:39.452] - Field: 'asynchronous' [17:27:39.452] - Field: 'calls' [17:27:39.453] - Field: 'globals' [17:27:39.453] - Field: 'stdout' [17:27:39.453] - Field: 'earlySignal' [17:27:39.454] - Field: 'lazy' [17:27:39.454] - Field: 'state' [17:27:39.454] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.454] - Launch lazy future ... [17:27:39.455] Packages needed by the future expression (n = 0): [17:27:39.455] Packages needed by future strategies (n = 0): [17:27:39.456] { [17:27:39.456] { [17:27:39.456] { [17:27:39.456] ...future.startTime <- base::Sys.time() [17:27:39.456] { [17:27:39.456] { [17:27:39.456] { [17:27:39.456] { [17:27:39.456] base::local({ [17:27:39.456] has_future <- base::requireNamespace("future", [17:27:39.456] quietly = TRUE) [17:27:39.456] if (has_future) { [17:27:39.456] ns <- base::getNamespace("future") [17:27:39.456] version <- ns[[".package"]][["version"]] [17:27:39.456] if (is.null(version)) [17:27:39.456] version <- utils::packageVersion("future") [17:27:39.456] } [17:27:39.456] else { [17:27:39.456] version <- NULL [17:27:39.456] } [17:27:39.456] if (!has_future || version < "1.8.0") { [17:27:39.456] info <- base::c(r_version = base::gsub("R version ", [17:27:39.456] "", base::R.version$version.string), [17:27:39.456] platform = base::sprintf("%s (%s-bit)", [17:27:39.456] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.456] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.456] "release", "version")], collapse = " "), [17:27:39.456] hostname = base::Sys.info()[["nodename"]]) [17:27:39.456] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.456] info) [17:27:39.456] info <- base::paste(info, collapse = "; ") [17:27:39.456] if (!has_future) { [17:27:39.456] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.456] info) [17:27:39.456] } [17:27:39.456] else { [17:27:39.456] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.456] info, version) [17:27:39.456] } [17:27:39.456] base::stop(msg) [17:27:39.456] } [17:27:39.456] }) [17:27:39.456] } [17:27:39.456] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.456] base::options(mc.cores = 1L) [17:27:39.456] } [17:27:39.456] ...future.strategy.old <- future::plan("list") [17:27:39.456] options(future.plan = NULL) [17:27:39.456] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.456] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.456] } [17:27:39.456] ...future.workdir <- getwd() [17:27:39.456] } [17:27:39.456] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.456] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.456] } [17:27:39.456] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.456] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.456] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.456] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.456] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.456] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.456] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.456] base::names(...future.oldOptions)) [17:27:39.456] } [17:27:39.456] if (FALSE) { [17:27:39.456] } [17:27:39.456] else { [17:27:39.456] if (TRUE) { [17:27:39.456] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.456] open = "w") [17:27:39.456] } [17:27:39.456] else { [17:27:39.456] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.456] windows = "NUL", "/dev/null"), open = "w") [17:27:39.456] } [17:27:39.456] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.456] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.456] base::sink(type = "output", split = FALSE) [17:27:39.456] base::close(...future.stdout) [17:27:39.456] }, add = TRUE) [17:27:39.456] } [17:27:39.456] ...future.frame <- base::sys.nframe() [17:27:39.456] ...future.conditions <- base::list() [17:27:39.456] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.456] if (FALSE) { [17:27:39.456] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.456] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.456] } [17:27:39.456] ...future.result <- base::tryCatch({ [17:27:39.456] base::withCallingHandlers({ [17:27:39.456] ...future.value <- base::withVisible(base::local({ [17:27:39.456] ...future.makeSendCondition <- base::local({ [17:27:39.456] sendCondition <- NULL [17:27:39.456] function(frame = 1L) { [17:27:39.456] if (is.function(sendCondition)) [17:27:39.456] return(sendCondition) [17:27:39.456] ns <- getNamespace("parallel") [17:27:39.456] if (exists("sendData", mode = "function", [17:27:39.456] envir = ns)) { [17:27:39.456] parallel_sendData <- get("sendData", mode = "function", [17:27:39.456] envir = ns) [17:27:39.456] envir <- sys.frame(frame) [17:27:39.456] master <- NULL [17:27:39.456] while (!identical(envir, .GlobalEnv) && [17:27:39.456] !identical(envir, emptyenv())) { [17:27:39.456] if (exists("master", mode = "list", envir = envir, [17:27:39.456] inherits = FALSE)) { [17:27:39.456] master <- get("master", mode = "list", [17:27:39.456] envir = envir, inherits = FALSE) [17:27:39.456] if (inherits(master, c("SOCKnode", [17:27:39.456] "SOCK0node"))) { [17:27:39.456] sendCondition <<- function(cond) { [17:27:39.456] data <- list(type = "VALUE", value = cond, [17:27:39.456] success = TRUE) [17:27:39.456] parallel_sendData(master, data) [17:27:39.456] } [17:27:39.456] return(sendCondition) [17:27:39.456] } [17:27:39.456] } [17:27:39.456] frame <- frame + 1L [17:27:39.456] envir <- sys.frame(frame) [17:27:39.456] } [17:27:39.456] } [17:27:39.456] sendCondition <<- function(cond) NULL [17:27:39.456] } [17:27:39.456] }) [17:27:39.456] withCallingHandlers({ [17:27:39.456] NULL [17:27:39.456] }, immediateCondition = function(cond) { [17:27:39.456] sendCondition <- ...future.makeSendCondition() [17:27:39.456] sendCondition(cond) [17:27:39.456] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.456] { [17:27:39.456] inherits <- base::inherits [17:27:39.456] invokeRestart <- base::invokeRestart [17:27:39.456] is.null <- base::is.null [17:27:39.456] muffled <- FALSE [17:27:39.456] if (inherits(cond, "message")) { [17:27:39.456] muffled <- grepl(pattern, "muffleMessage") [17:27:39.456] if (muffled) [17:27:39.456] invokeRestart("muffleMessage") [17:27:39.456] } [17:27:39.456] else if (inherits(cond, "warning")) { [17:27:39.456] muffled <- grepl(pattern, "muffleWarning") [17:27:39.456] if (muffled) [17:27:39.456] invokeRestart("muffleWarning") [17:27:39.456] } [17:27:39.456] else if (inherits(cond, "condition")) { [17:27:39.456] if (!is.null(pattern)) { [17:27:39.456] computeRestarts <- base::computeRestarts [17:27:39.456] grepl <- base::grepl [17:27:39.456] restarts <- computeRestarts(cond) [17:27:39.456] for (restart in restarts) { [17:27:39.456] name <- restart$name [17:27:39.456] if (is.null(name)) [17:27:39.456] next [17:27:39.456] if (!grepl(pattern, name)) [17:27:39.456] next [17:27:39.456] invokeRestart(restart) [17:27:39.456] muffled <- TRUE [17:27:39.456] break [17:27:39.456] } [17:27:39.456] } [17:27:39.456] } [17:27:39.456] invisible(muffled) [17:27:39.456] } [17:27:39.456] muffleCondition(cond) [17:27:39.456] }) [17:27:39.456] })) [17:27:39.456] future::FutureResult(value = ...future.value$value, [17:27:39.456] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.456] ...future.rng), globalenv = if (FALSE) [17:27:39.456] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.456] ...future.globalenv.names)) [17:27:39.456] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.456] }, condition = base::local({ [17:27:39.456] c <- base::c [17:27:39.456] inherits <- base::inherits [17:27:39.456] invokeRestart <- base::invokeRestart [17:27:39.456] length <- base::length [17:27:39.456] list <- base::list [17:27:39.456] seq.int <- base::seq.int [17:27:39.456] signalCondition <- base::signalCondition [17:27:39.456] sys.calls <- base::sys.calls [17:27:39.456] `[[` <- base::`[[` [17:27:39.456] `+` <- base::`+` [17:27:39.456] `<<-` <- base::`<<-` [17:27:39.456] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.456] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.456] 3L)] [17:27:39.456] } [17:27:39.456] function(cond) { [17:27:39.456] is_error <- inherits(cond, "error") [17:27:39.456] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.456] NULL) [17:27:39.456] if (is_error) { [17:27:39.456] sessionInformation <- function() { [17:27:39.456] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.456] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.456] search = base::search(), system = base::Sys.info()) [17:27:39.456] } [17:27:39.456] ...future.conditions[[length(...future.conditions) + [17:27:39.456] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.456] cond$call), session = sessionInformation(), [17:27:39.456] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.456] signalCondition(cond) [17:27:39.456] } [17:27:39.456] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.456] "immediateCondition"))) { [17:27:39.456] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.456] ...future.conditions[[length(...future.conditions) + [17:27:39.456] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.456] if (TRUE && !signal) { [17:27:39.456] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.456] { [17:27:39.456] inherits <- base::inherits [17:27:39.456] invokeRestart <- base::invokeRestart [17:27:39.456] is.null <- base::is.null [17:27:39.456] muffled <- FALSE [17:27:39.456] if (inherits(cond, "message")) { [17:27:39.456] muffled <- grepl(pattern, "muffleMessage") [17:27:39.456] if (muffled) [17:27:39.456] invokeRestart("muffleMessage") [17:27:39.456] } [17:27:39.456] else if (inherits(cond, "warning")) { [17:27:39.456] muffled <- grepl(pattern, "muffleWarning") [17:27:39.456] if (muffled) [17:27:39.456] invokeRestart("muffleWarning") [17:27:39.456] } [17:27:39.456] else if (inherits(cond, "condition")) { [17:27:39.456] if (!is.null(pattern)) { [17:27:39.456] computeRestarts <- base::computeRestarts [17:27:39.456] grepl <- base::grepl [17:27:39.456] restarts <- computeRestarts(cond) [17:27:39.456] for (restart in restarts) { [17:27:39.456] name <- restart$name [17:27:39.456] if (is.null(name)) [17:27:39.456] next [17:27:39.456] if (!grepl(pattern, name)) [17:27:39.456] next [17:27:39.456] invokeRestart(restart) [17:27:39.456] muffled <- TRUE [17:27:39.456] break [17:27:39.456] } [17:27:39.456] } [17:27:39.456] } [17:27:39.456] invisible(muffled) [17:27:39.456] } [17:27:39.456] muffleCondition(cond, pattern = "^muffle") [17:27:39.456] } [17:27:39.456] } [17:27:39.456] else { [17:27:39.456] if (TRUE) { [17:27:39.456] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.456] { [17:27:39.456] inherits <- base::inherits [17:27:39.456] invokeRestart <- base::invokeRestart [17:27:39.456] is.null <- base::is.null [17:27:39.456] muffled <- FALSE [17:27:39.456] if (inherits(cond, "message")) { [17:27:39.456] muffled <- grepl(pattern, "muffleMessage") [17:27:39.456] if (muffled) [17:27:39.456] invokeRestart("muffleMessage") [17:27:39.456] } [17:27:39.456] else if (inherits(cond, "warning")) { [17:27:39.456] muffled <- grepl(pattern, "muffleWarning") [17:27:39.456] if (muffled) [17:27:39.456] invokeRestart("muffleWarning") [17:27:39.456] } [17:27:39.456] else if (inherits(cond, "condition")) { [17:27:39.456] if (!is.null(pattern)) { [17:27:39.456] computeRestarts <- base::computeRestarts [17:27:39.456] grepl <- base::grepl [17:27:39.456] restarts <- computeRestarts(cond) [17:27:39.456] for (restart in restarts) { [17:27:39.456] name <- restart$name [17:27:39.456] if (is.null(name)) [17:27:39.456] next [17:27:39.456] if (!grepl(pattern, name)) [17:27:39.456] next [17:27:39.456] invokeRestart(restart) [17:27:39.456] muffled <- TRUE [17:27:39.456] break [17:27:39.456] } [17:27:39.456] } [17:27:39.456] } [17:27:39.456] invisible(muffled) [17:27:39.456] } [17:27:39.456] muffleCondition(cond, pattern = "^muffle") [17:27:39.456] } [17:27:39.456] } [17:27:39.456] } [17:27:39.456] })) [17:27:39.456] }, error = function(ex) { [17:27:39.456] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.456] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.456] ...future.rng), started = ...future.startTime, [17:27:39.456] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.456] version = "1.8"), class = "FutureResult") [17:27:39.456] }, finally = { [17:27:39.456] if (!identical(...future.workdir, getwd())) [17:27:39.456] setwd(...future.workdir) [17:27:39.456] { [17:27:39.456] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.456] ...future.oldOptions$nwarnings <- NULL [17:27:39.456] } [17:27:39.456] base::options(...future.oldOptions) [17:27:39.456] if (.Platform$OS.type == "windows") { [17:27:39.456] old_names <- names(...future.oldEnvVars) [17:27:39.456] envs <- base::Sys.getenv() [17:27:39.456] names <- names(envs) [17:27:39.456] common <- intersect(names, old_names) [17:27:39.456] added <- setdiff(names, old_names) [17:27:39.456] removed <- setdiff(old_names, names) [17:27:39.456] changed <- common[...future.oldEnvVars[common] != [17:27:39.456] envs[common]] [17:27:39.456] NAMES <- toupper(changed) [17:27:39.456] args <- list() [17:27:39.456] for (kk in seq_along(NAMES)) { [17:27:39.456] name <- changed[[kk]] [17:27:39.456] NAME <- NAMES[[kk]] [17:27:39.456] if (name != NAME && is.element(NAME, old_names)) [17:27:39.456] next [17:27:39.456] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.456] } [17:27:39.456] NAMES <- toupper(added) [17:27:39.456] for (kk in seq_along(NAMES)) { [17:27:39.456] name <- added[[kk]] [17:27:39.456] NAME <- NAMES[[kk]] [17:27:39.456] if (name != NAME && is.element(NAME, old_names)) [17:27:39.456] next [17:27:39.456] args[[name]] <- "" [17:27:39.456] } [17:27:39.456] NAMES <- toupper(removed) [17:27:39.456] for (kk in seq_along(NAMES)) { [17:27:39.456] name <- removed[[kk]] [17:27:39.456] NAME <- NAMES[[kk]] [17:27:39.456] if (name != NAME && is.element(NAME, old_names)) [17:27:39.456] next [17:27:39.456] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.456] } [17:27:39.456] if (length(args) > 0) [17:27:39.456] base::do.call(base::Sys.setenv, args = args) [17:27:39.456] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.456] } [17:27:39.456] else { [17:27:39.456] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.456] } [17:27:39.456] { [17:27:39.456] if (base::length(...future.futureOptionsAdded) > [17:27:39.456] 0L) { [17:27:39.456] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.456] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.456] base::options(opts) [17:27:39.456] } [17:27:39.456] { [17:27:39.456] { [17:27:39.456] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.456] NULL [17:27:39.456] } [17:27:39.456] options(future.plan = NULL) [17:27:39.456] if (is.na(NA_character_)) [17:27:39.456] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.456] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.456] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.456] .init = FALSE) [17:27:39.456] } [17:27:39.456] } [17:27:39.456] } [17:27:39.456] }) [17:27:39.456] if (TRUE) { [17:27:39.456] base::sink(type = "output", split = FALSE) [17:27:39.456] if (TRUE) { [17:27:39.456] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.456] } [17:27:39.456] else { [17:27:39.456] ...future.result["stdout"] <- base::list(NULL) [17:27:39.456] } [17:27:39.456] base::close(...future.stdout) [17:27:39.456] ...future.stdout <- NULL [17:27:39.456] } [17:27:39.456] ...future.result$conditions <- ...future.conditions [17:27:39.456] ...future.result$finished <- base::Sys.time() [17:27:39.456] ...future.result [17:27:39.456] } [17:27:39.467] MultisessionFuture started [17:27:39.467] - Launch lazy future ... done [17:27:39.468] run() for 'MultisessionFuture' ... done [17:27:39.469] getGlobalsAndPackages() ... [17:27:39.469] Searching for globals... [17:27:39.471] - globals found: [1] '{' [17:27:39.471] Searching for globals ... DONE [17:27:39.471] Resolving globals: FALSE [17:27:39.472] [17:27:39.472] [17:27:39.473] getGlobalsAndPackages() ... DONE [17:27:39.473] run() for 'Future' ... [17:27:39.474] - state: 'created' [17:27:39.474] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.501] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.502] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.502] - Field: 'node' [17:27:39.503] - Field: 'label' [17:27:39.503] - Field: 'local' [17:27:39.503] - Field: 'owner' [17:27:39.504] - Field: 'envir' [17:27:39.504] - Field: 'workers' [17:27:39.504] - Field: 'packages' [17:27:39.505] - Field: 'gc' [17:27:39.505] - Field: 'conditions' [17:27:39.505] - Field: 'persistent' [17:27:39.506] - Field: 'expr' [17:27:39.506] - Field: 'uuid' [17:27:39.506] - Field: 'seed' [17:27:39.507] - Field: 'version' [17:27:39.507] - Field: 'result' [17:27:39.507] - Field: 'asynchronous' [17:27:39.508] - Field: 'calls' [17:27:39.508] - Field: 'globals' [17:27:39.509] - Field: 'stdout' [17:27:39.509] - Field: 'earlySignal' [17:27:39.509] - Field: 'lazy' [17:27:39.510] - Field: 'state' [17:27:39.510] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.510] - Launch lazy future ... [17:27:39.511] Packages needed by the future expression (n = 0): [17:27:39.511] Packages needed by future strategies (n = 0): [17:27:39.513] { [17:27:39.513] { [17:27:39.513] { [17:27:39.513] ...future.startTime <- base::Sys.time() [17:27:39.513] { [17:27:39.513] { [17:27:39.513] { [17:27:39.513] { [17:27:39.513] base::local({ [17:27:39.513] has_future <- base::requireNamespace("future", [17:27:39.513] quietly = TRUE) [17:27:39.513] if (has_future) { [17:27:39.513] ns <- base::getNamespace("future") [17:27:39.513] version <- ns[[".package"]][["version"]] [17:27:39.513] if (is.null(version)) [17:27:39.513] version <- utils::packageVersion("future") [17:27:39.513] } [17:27:39.513] else { [17:27:39.513] version <- NULL [17:27:39.513] } [17:27:39.513] if (!has_future || version < "1.8.0") { [17:27:39.513] info <- base::c(r_version = base::gsub("R version ", [17:27:39.513] "", base::R.version$version.string), [17:27:39.513] platform = base::sprintf("%s (%s-bit)", [17:27:39.513] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.513] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.513] "release", "version")], collapse = " "), [17:27:39.513] hostname = base::Sys.info()[["nodename"]]) [17:27:39.513] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.513] info) [17:27:39.513] info <- base::paste(info, collapse = "; ") [17:27:39.513] if (!has_future) { [17:27:39.513] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.513] info) [17:27:39.513] } [17:27:39.513] else { [17:27:39.513] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.513] info, version) [17:27:39.513] } [17:27:39.513] base::stop(msg) [17:27:39.513] } [17:27:39.513] }) [17:27:39.513] } [17:27:39.513] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.513] base::options(mc.cores = 1L) [17:27:39.513] } [17:27:39.513] ...future.strategy.old <- future::plan("list") [17:27:39.513] options(future.plan = NULL) [17:27:39.513] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.513] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.513] } [17:27:39.513] ...future.workdir <- getwd() [17:27:39.513] } [17:27:39.513] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.513] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.513] } [17:27:39.513] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.513] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.513] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.513] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.513] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.513] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.513] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.513] base::names(...future.oldOptions)) [17:27:39.513] } [17:27:39.513] if (FALSE) { [17:27:39.513] } [17:27:39.513] else { [17:27:39.513] if (TRUE) { [17:27:39.513] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.513] open = "w") [17:27:39.513] } [17:27:39.513] else { [17:27:39.513] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.513] windows = "NUL", "/dev/null"), open = "w") [17:27:39.513] } [17:27:39.513] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.513] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.513] base::sink(type = "output", split = FALSE) [17:27:39.513] base::close(...future.stdout) [17:27:39.513] }, add = TRUE) [17:27:39.513] } [17:27:39.513] ...future.frame <- base::sys.nframe() [17:27:39.513] ...future.conditions <- base::list() [17:27:39.513] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.513] if (FALSE) { [17:27:39.513] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.513] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.513] } [17:27:39.513] ...future.result <- base::tryCatch({ [17:27:39.513] base::withCallingHandlers({ [17:27:39.513] ...future.value <- base::withVisible(base::local({ [17:27:39.513] ...future.makeSendCondition <- base::local({ [17:27:39.513] sendCondition <- NULL [17:27:39.513] function(frame = 1L) { [17:27:39.513] if (is.function(sendCondition)) [17:27:39.513] return(sendCondition) [17:27:39.513] ns <- getNamespace("parallel") [17:27:39.513] if (exists("sendData", mode = "function", [17:27:39.513] envir = ns)) { [17:27:39.513] parallel_sendData <- get("sendData", mode = "function", [17:27:39.513] envir = ns) [17:27:39.513] envir <- sys.frame(frame) [17:27:39.513] master <- NULL [17:27:39.513] while (!identical(envir, .GlobalEnv) && [17:27:39.513] !identical(envir, emptyenv())) { [17:27:39.513] if (exists("master", mode = "list", envir = envir, [17:27:39.513] inherits = FALSE)) { [17:27:39.513] master <- get("master", mode = "list", [17:27:39.513] envir = envir, inherits = FALSE) [17:27:39.513] if (inherits(master, c("SOCKnode", [17:27:39.513] "SOCK0node"))) { [17:27:39.513] sendCondition <<- function(cond) { [17:27:39.513] data <- list(type = "VALUE", value = cond, [17:27:39.513] success = TRUE) [17:27:39.513] parallel_sendData(master, data) [17:27:39.513] } [17:27:39.513] return(sendCondition) [17:27:39.513] } [17:27:39.513] } [17:27:39.513] frame <- frame + 1L [17:27:39.513] envir <- sys.frame(frame) [17:27:39.513] } [17:27:39.513] } [17:27:39.513] sendCondition <<- function(cond) NULL [17:27:39.513] } [17:27:39.513] }) [17:27:39.513] withCallingHandlers({ [17:27:39.513] { [17:27:39.513] 4 [17:27:39.513] } [17:27:39.513] }, immediateCondition = function(cond) { [17:27:39.513] sendCondition <- ...future.makeSendCondition() [17:27:39.513] sendCondition(cond) [17:27:39.513] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.513] { [17:27:39.513] inherits <- base::inherits [17:27:39.513] invokeRestart <- base::invokeRestart [17:27:39.513] is.null <- base::is.null [17:27:39.513] muffled <- FALSE [17:27:39.513] if (inherits(cond, "message")) { [17:27:39.513] muffled <- grepl(pattern, "muffleMessage") [17:27:39.513] if (muffled) [17:27:39.513] invokeRestart("muffleMessage") [17:27:39.513] } [17:27:39.513] else if (inherits(cond, "warning")) { [17:27:39.513] muffled <- grepl(pattern, "muffleWarning") [17:27:39.513] if (muffled) [17:27:39.513] invokeRestart("muffleWarning") [17:27:39.513] } [17:27:39.513] else if (inherits(cond, "condition")) { [17:27:39.513] if (!is.null(pattern)) { [17:27:39.513] computeRestarts <- base::computeRestarts [17:27:39.513] grepl <- base::grepl [17:27:39.513] restarts <- computeRestarts(cond) [17:27:39.513] for (restart in restarts) { [17:27:39.513] name <- restart$name [17:27:39.513] if (is.null(name)) [17:27:39.513] next [17:27:39.513] if (!grepl(pattern, name)) [17:27:39.513] next [17:27:39.513] invokeRestart(restart) [17:27:39.513] muffled <- TRUE [17:27:39.513] break [17:27:39.513] } [17:27:39.513] } [17:27:39.513] } [17:27:39.513] invisible(muffled) [17:27:39.513] } [17:27:39.513] muffleCondition(cond) [17:27:39.513] }) [17:27:39.513] })) [17:27:39.513] future::FutureResult(value = ...future.value$value, [17:27:39.513] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.513] ...future.rng), globalenv = if (FALSE) [17:27:39.513] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.513] ...future.globalenv.names)) [17:27:39.513] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.513] }, condition = base::local({ [17:27:39.513] c <- base::c [17:27:39.513] inherits <- base::inherits [17:27:39.513] invokeRestart <- base::invokeRestart [17:27:39.513] length <- base::length [17:27:39.513] list <- base::list [17:27:39.513] seq.int <- base::seq.int [17:27:39.513] signalCondition <- base::signalCondition [17:27:39.513] sys.calls <- base::sys.calls [17:27:39.513] `[[` <- base::`[[` [17:27:39.513] `+` <- base::`+` [17:27:39.513] `<<-` <- base::`<<-` [17:27:39.513] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.513] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.513] 3L)] [17:27:39.513] } [17:27:39.513] function(cond) { [17:27:39.513] is_error <- inherits(cond, "error") [17:27:39.513] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.513] NULL) [17:27:39.513] if (is_error) { [17:27:39.513] sessionInformation <- function() { [17:27:39.513] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.513] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.513] search = base::search(), system = base::Sys.info()) [17:27:39.513] } [17:27:39.513] ...future.conditions[[length(...future.conditions) + [17:27:39.513] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.513] cond$call), session = sessionInformation(), [17:27:39.513] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.513] signalCondition(cond) [17:27:39.513] } [17:27:39.513] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.513] "immediateCondition"))) { [17:27:39.513] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.513] ...future.conditions[[length(...future.conditions) + [17:27:39.513] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.513] if (TRUE && !signal) { [17:27:39.513] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.513] { [17:27:39.513] inherits <- base::inherits [17:27:39.513] invokeRestart <- base::invokeRestart [17:27:39.513] is.null <- base::is.null [17:27:39.513] muffled <- FALSE [17:27:39.513] if (inherits(cond, "message")) { [17:27:39.513] muffled <- grepl(pattern, "muffleMessage") [17:27:39.513] if (muffled) [17:27:39.513] invokeRestart("muffleMessage") [17:27:39.513] } [17:27:39.513] else if (inherits(cond, "warning")) { [17:27:39.513] muffled <- grepl(pattern, "muffleWarning") [17:27:39.513] if (muffled) [17:27:39.513] invokeRestart("muffleWarning") [17:27:39.513] } [17:27:39.513] else if (inherits(cond, "condition")) { [17:27:39.513] if (!is.null(pattern)) { [17:27:39.513] computeRestarts <- base::computeRestarts [17:27:39.513] grepl <- base::grepl [17:27:39.513] restarts <- computeRestarts(cond) [17:27:39.513] for (restart in restarts) { [17:27:39.513] name <- restart$name [17:27:39.513] if (is.null(name)) [17:27:39.513] next [17:27:39.513] if (!grepl(pattern, name)) [17:27:39.513] next [17:27:39.513] invokeRestart(restart) [17:27:39.513] muffled <- TRUE [17:27:39.513] break [17:27:39.513] } [17:27:39.513] } [17:27:39.513] } [17:27:39.513] invisible(muffled) [17:27:39.513] } [17:27:39.513] muffleCondition(cond, pattern = "^muffle") [17:27:39.513] } [17:27:39.513] } [17:27:39.513] else { [17:27:39.513] if (TRUE) { [17:27:39.513] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.513] { [17:27:39.513] inherits <- base::inherits [17:27:39.513] invokeRestart <- base::invokeRestart [17:27:39.513] is.null <- base::is.null [17:27:39.513] muffled <- FALSE [17:27:39.513] if (inherits(cond, "message")) { [17:27:39.513] muffled <- grepl(pattern, "muffleMessage") [17:27:39.513] if (muffled) [17:27:39.513] invokeRestart("muffleMessage") [17:27:39.513] } [17:27:39.513] else if (inherits(cond, "warning")) { [17:27:39.513] muffled <- grepl(pattern, "muffleWarning") [17:27:39.513] if (muffled) [17:27:39.513] invokeRestart("muffleWarning") [17:27:39.513] } [17:27:39.513] else if (inherits(cond, "condition")) { [17:27:39.513] if (!is.null(pattern)) { [17:27:39.513] computeRestarts <- base::computeRestarts [17:27:39.513] grepl <- base::grepl [17:27:39.513] restarts <- computeRestarts(cond) [17:27:39.513] for (restart in restarts) { [17:27:39.513] name <- restart$name [17:27:39.513] if (is.null(name)) [17:27:39.513] next [17:27:39.513] if (!grepl(pattern, name)) [17:27:39.513] next [17:27:39.513] invokeRestart(restart) [17:27:39.513] muffled <- TRUE [17:27:39.513] break [17:27:39.513] } [17:27:39.513] } [17:27:39.513] } [17:27:39.513] invisible(muffled) [17:27:39.513] } [17:27:39.513] muffleCondition(cond, pattern = "^muffle") [17:27:39.513] } [17:27:39.513] } [17:27:39.513] } [17:27:39.513] })) [17:27:39.513] }, error = function(ex) { [17:27:39.513] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.513] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.513] ...future.rng), started = ...future.startTime, [17:27:39.513] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.513] version = "1.8"), class = "FutureResult") [17:27:39.513] }, finally = { [17:27:39.513] if (!identical(...future.workdir, getwd())) [17:27:39.513] setwd(...future.workdir) [17:27:39.513] { [17:27:39.513] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.513] ...future.oldOptions$nwarnings <- NULL [17:27:39.513] } [17:27:39.513] base::options(...future.oldOptions) [17:27:39.513] if (.Platform$OS.type == "windows") { [17:27:39.513] old_names <- names(...future.oldEnvVars) [17:27:39.513] envs <- base::Sys.getenv() [17:27:39.513] names <- names(envs) [17:27:39.513] common <- intersect(names, old_names) [17:27:39.513] added <- setdiff(names, old_names) [17:27:39.513] removed <- setdiff(old_names, names) [17:27:39.513] changed <- common[...future.oldEnvVars[common] != [17:27:39.513] envs[common]] [17:27:39.513] NAMES <- toupper(changed) [17:27:39.513] args <- list() [17:27:39.513] for (kk in seq_along(NAMES)) { [17:27:39.513] name <- changed[[kk]] [17:27:39.513] NAME <- NAMES[[kk]] [17:27:39.513] if (name != NAME && is.element(NAME, old_names)) [17:27:39.513] next [17:27:39.513] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.513] } [17:27:39.513] NAMES <- toupper(added) [17:27:39.513] for (kk in seq_along(NAMES)) { [17:27:39.513] name <- added[[kk]] [17:27:39.513] NAME <- NAMES[[kk]] [17:27:39.513] if (name != NAME && is.element(NAME, old_names)) [17:27:39.513] next [17:27:39.513] args[[name]] <- "" [17:27:39.513] } [17:27:39.513] NAMES <- toupper(removed) [17:27:39.513] for (kk in seq_along(NAMES)) { [17:27:39.513] name <- removed[[kk]] [17:27:39.513] NAME <- NAMES[[kk]] [17:27:39.513] if (name != NAME && is.element(NAME, old_names)) [17:27:39.513] next [17:27:39.513] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.513] } [17:27:39.513] if (length(args) > 0) [17:27:39.513] base::do.call(base::Sys.setenv, args = args) [17:27:39.513] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.513] } [17:27:39.513] else { [17:27:39.513] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.513] } [17:27:39.513] { [17:27:39.513] if (base::length(...future.futureOptionsAdded) > [17:27:39.513] 0L) { [17:27:39.513] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.513] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.513] base::options(opts) [17:27:39.513] } [17:27:39.513] { [17:27:39.513] { [17:27:39.513] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.513] NULL [17:27:39.513] } [17:27:39.513] options(future.plan = NULL) [17:27:39.513] if (is.na(NA_character_)) [17:27:39.513] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.513] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.513] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.513] .init = FALSE) [17:27:39.513] } [17:27:39.513] } [17:27:39.513] } [17:27:39.513] }) [17:27:39.513] if (TRUE) { [17:27:39.513] base::sink(type = "output", split = FALSE) [17:27:39.513] if (TRUE) { [17:27:39.513] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.513] } [17:27:39.513] else { [17:27:39.513] ...future.result["stdout"] <- base::list(NULL) [17:27:39.513] } [17:27:39.513] base::close(...future.stdout) [17:27:39.513] ...future.stdout <- NULL [17:27:39.513] } [17:27:39.513] ...future.result$conditions <- ...future.conditions [17:27:39.513] ...future.result$finished <- base::Sys.time() [17:27:39.513] ...future.result [17:27:39.513] } [17:27:39.521] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:39.533] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.534] - Validating connection of MultisessionFuture [17:27:39.534] - received message: FutureResult [17:27:39.535] - Received FutureResult [17:27:39.535] - Erased future from FutureRegistry [17:27:39.535] result() for ClusterFuture ... [17:27:39.535] - result already collected: FutureResult [17:27:39.536] result() for ClusterFuture ... done [17:27:39.536] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.536] result() for ClusterFuture ... [17:27:39.536] - result already collected: FutureResult [17:27:39.537] result() for ClusterFuture ... done [17:27:39.537] result() for ClusterFuture ... [17:27:39.537] - result already collected: FutureResult [17:27:39.538] result() for ClusterFuture ... done [17:27:39.540] MultisessionFuture started [17:27:39.540] - Launch lazy future ... done [17:27:39.540] run() for 'MultisessionFuture' ... done [17:27:39.544] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.544] - Validating connection of MultisessionFuture [17:27:39.545] - received message: FutureResult [17:27:39.545] - Received FutureResult [17:27:39.545] - Erased future from FutureRegistry [17:27:39.546] result() for ClusterFuture ... [17:27:39.546] - result already collected: FutureResult [17:27:39.546] result() for ClusterFuture ... done [17:27:39.546] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.559] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.559] - Validating connection of MultisessionFuture [17:27:39.560] - received message: FutureResult [17:27:39.560] - Received FutureResult [17:27:39.560] - Erased future from FutureRegistry [17:27:39.560] result() for ClusterFuture ... [17:27:39.561] - result already collected: FutureResult [17:27:39.561] result() for ClusterFuture ... done [17:27:39.561] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:39.563] resolve() on environment ... [17:27:39.563] recursive: 0 [17:27:39.564] elements: [4] 'a', 'b', 'c', 'd' [17:27:39.564] signalConditionsASAP(numeric, pos=1) ... [17:27:39.564] - nx: 4 [17:27:39.564] - relay: TRUE [17:27:39.565] - stdout: TRUE [17:27:39.565] - signal: TRUE [17:27:39.565] - resignal: FALSE [17:27:39.565] - force: TRUE [17:27:39.565] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.565] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.566] - until=2 [17:27:39.566] - relaying element #2 [17:27:39.566] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.566] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.566] signalConditionsASAP(NULL, pos=1) ... done [17:27:39.566] length: 3 (resolved future 1) [17:27:39.567] Future #2 [17:27:39.567] result() for ClusterFuture ... [17:27:39.567] - result already collected: FutureResult [17:27:39.567] result() for ClusterFuture ... done [17:27:39.567] result() for ClusterFuture ... [17:27:39.567] - result already collected: FutureResult [17:27:39.568] result() for ClusterFuture ... done [17:27:39.568] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:39.568] - nx: 4 [17:27:39.568] - relay: TRUE [17:27:39.568] - stdout: TRUE [17:27:39.568] - signal: TRUE [17:27:39.569] - resignal: FALSE [17:27:39.569] - force: TRUE [17:27:39.569] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.569] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.569] - until=2 [17:27:39.569] - relaying element #2 [17:27:39.570] result() for ClusterFuture ... [17:27:39.570] - result already collected: FutureResult [17:27:39.570] result() for ClusterFuture ... done [17:27:39.570] result() for ClusterFuture ... [17:27:39.570] - result already collected: FutureResult [17:27:39.570] result() for ClusterFuture ... done [17:27:39.571] result() for ClusterFuture ... [17:27:39.571] - result already collected: FutureResult [17:27:39.571] result() for ClusterFuture ... done [17:27:39.571] result() for ClusterFuture ... [17:27:39.571] - result already collected: FutureResult [17:27:39.571] result() for ClusterFuture ... done [17:27:39.572] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.572] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.572] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:39.572] length: 2 (resolved future 2) [17:27:39.572] Future #3 [17:27:39.572] result() for ClusterFuture ... [17:27:39.573] - result already collected: FutureResult [17:27:39.573] result() for ClusterFuture ... done [17:27:39.573] result() for ClusterFuture ... [17:27:39.573] - result already collected: FutureResult [17:27:39.573] result() for ClusterFuture ... done [17:27:39.573] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:39.574] - nx: 4 [17:27:39.574] - relay: TRUE [17:27:39.574] - stdout: TRUE [17:27:39.574] - signal: TRUE [17:27:39.574] - resignal: FALSE [17:27:39.574] - force: TRUE [17:27:39.575] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.575] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.575] - until=3 [17:27:39.575] - relaying element #3 [17:27:39.575] result() for ClusterFuture ... [17:27:39.575] - result already collected: FutureResult [17:27:39.575] result() for ClusterFuture ... done [17:27:39.576] result() for ClusterFuture ... [17:27:39.576] - result already collected: FutureResult [17:27:39.576] result() for ClusterFuture ... done [17:27:39.576] result() for ClusterFuture ... [17:27:39.576] - result already collected: FutureResult [17:27:39.576] result() for ClusterFuture ... done [17:27:39.577] result() for ClusterFuture ... [17:27:39.577] - result already collected: FutureResult [17:27:39.577] result() for ClusterFuture ... done [17:27:39.577] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.577] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.577] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:39.578] length: 1 (resolved future 3) [17:27:39.578] Future #4 [17:27:39.578] result() for ClusterFuture ... [17:27:39.578] - result already collected: FutureResult [17:27:39.578] result() for ClusterFuture ... done [17:27:39.578] result() for ClusterFuture ... [17:27:39.579] - result already collected: FutureResult [17:27:39.579] result() for ClusterFuture ... done [17:27:39.579] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:39.579] - nx: 4 [17:27:39.580] - relay: TRUE [17:27:39.580] - stdout: TRUE [17:27:39.580] - signal: TRUE [17:27:39.580] - resignal: FALSE [17:27:39.580] - force: TRUE [17:27:39.580] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.581] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.581] - until=4 [17:27:39.581] - relaying element #4 [17:27:39.581] result() for ClusterFuture ... [17:27:39.581] - result already collected: FutureResult [17:27:39.581] result() for ClusterFuture ... done [17:27:39.582] result() for ClusterFuture ... [17:27:39.584] - result already collected: FutureResult [17:27:39.585] result() for ClusterFuture ... done [17:27:39.585] result() for ClusterFuture ... [17:27:39.585] - result already collected: FutureResult [17:27:39.585] result() for ClusterFuture ... done [17:27:39.585] result() for ClusterFuture ... [17:27:39.586] - result already collected: FutureResult [17:27:39.586] result() for ClusterFuture ... done [17:27:39.586] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.586] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.586] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:39.587] length: 0 (resolved future 4) [17:27:39.587] Relaying remaining futures [17:27:39.587] signalConditionsASAP(NULL, pos=0) ... [17:27:39.587] - nx: 4 [17:27:39.587] - relay: TRUE [17:27:39.587] - stdout: TRUE [17:27:39.587] - signal: TRUE [17:27:39.588] - resignal: FALSE [17:27:39.588] - force: TRUE [17:27:39.588] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.588] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:39.588] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.588] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.589] signalConditionsASAP(NULL, pos=0) ... done [17:27:39.589] resolve() on environment ... DONE [17:27:39.589] result() for ClusterFuture ... [17:27:39.589] - result already collected: FutureResult [17:27:39.589] result() for ClusterFuture ... done [17:27:39.589] result() for ClusterFuture ... [17:27:39.590] - result already collected: FutureResult [17:27:39.590] result() for ClusterFuture ... done [17:27:39.590] result() for ClusterFuture ... [17:27:39.590] - result already collected: FutureResult [17:27:39.590] result() for ClusterFuture ... done [17:27:39.591] result() for ClusterFuture ... [17:27:39.591] - result already collected: FutureResult [17:27:39.591] result() for ClusterFuture ... done [17:27:39.591] result() for ClusterFuture ... [17:27:39.591] - result already collected: FutureResult [17:27:39.591] result() for ClusterFuture ... done [17:27:39.592] result() for ClusterFuture ... [17:27:39.592] - result already collected: FutureResult [17:27:39.592] result() for ClusterFuture ... done Dimensions: c(2, 3, 1) [17:27:39.593] getGlobalsAndPackages() ... [17:27:39.593] Searching for globals... [17:27:39.593] [17:27:39.593] Searching for globals ... DONE [17:27:39.594] - globals: [0] [17:27:39.594] getGlobalsAndPackages() ... DONE [17:27:39.594] run() for 'Future' ... [17:27:39.594] - state: 'created' [17:27:39.595] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.616] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.617] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.617] - Field: 'node' [17:27:39.617] - Field: 'label' [17:27:39.618] - Field: 'local' [17:27:39.618] - Field: 'owner' [17:27:39.618] - Field: 'envir' [17:27:39.619] - Field: 'workers' [17:27:39.619] - Field: 'packages' [17:27:39.619] - Field: 'gc' [17:27:39.619] - Field: 'conditions' [17:27:39.620] - Field: 'persistent' [17:27:39.620] - Field: 'expr' [17:27:39.620] - Field: 'uuid' [17:27:39.621] - Field: 'seed' [17:27:39.621] - Field: 'version' [17:27:39.621] - Field: 'result' [17:27:39.621] - Field: 'asynchronous' [17:27:39.622] - Field: 'calls' [17:27:39.622] - Field: 'globals' [17:27:39.622] - Field: 'stdout' [17:27:39.622] - Field: 'earlySignal' [17:27:39.623] - Field: 'lazy' [17:27:39.623] - Field: 'state' [17:27:39.623] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.624] - Launch lazy future ... [17:27:39.624] Packages needed by the future expression (n = 0): [17:27:39.625] Packages needed by future strategies (n = 0): [17:27:39.626] { [17:27:39.626] { [17:27:39.626] { [17:27:39.626] ...future.startTime <- base::Sys.time() [17:27:39.626] { [17:27:39.626] { [17:27:39.626] { [17:27:39.626] { [17:27:39.626] base::local({ [17:27:39.626] has_future <- base::requireNamespace("future", [17:27:39.626] quietly = TRUE) [17:27:39.626] if (has_future) { [17:27:39.626] ns <- base::getNamespace("future") [17:27:39.626] version <- ns[[".package"]][["version"]] [17:27:39.626] if (is.null(version)) [17:27:39.626] version <- utils::packageVersion("future") [17:27:39.626] } [17:27:39.626] else { [17:27:39.626] version <- NULL [17:27:39.626] } [17:27:39.626] if (!has_future || version < "1.8.0") { [17:27:39.626] info <- base::c(r_version = base::gsub("R version ", [17:27:39.626] "", base::R.version$version.string), [17:27:39.626] platform = base::sprintf("%s (%s-bit)", [17:27:39.626] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.626] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.626] "release", "version")], collapse = " "), [17:27:39.626] hostname = base::Sys.info()[["nodename"]]) [17:27:39.626] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.626] info) [17:27:39.626] info <- base::paste(info, collapse = "; ") [17:27:39.626] if (!has_future) { [17:27:39.626] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.626] info) [17:27:39.626] } [17:27:39.626] else { [17:27:39.626] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.626] info, version) [17:27:39.626] } [17:27:39.626] base::stop(msg) [17:27:39.626] } [17:27:39.626] }) [17:27:39.626] } [17:27:39.626] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.626] base::options(mc.cores = 1L) [17:27:39.626] } [17:27:39.626] ...future.strategy.old <- future::plan("list") [17:27:39.626] options(future.plan = NULL) [17:27:39.626] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.626] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.626] } [17:27:39.626] ...future.workdir <- getwd() [17:27:39.626] } [17:27:39.626] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.626] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.626] } [17:27:39.626] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.626] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.626] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.626] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.626] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.626] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.626] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.626] base::names(...future.oldOptions)) [17:27:39.626] } [17:27:39.626] if (FALSE) { [17:27:39.626] } [17:27:39.626] else { [17:27:39.626] if (TRUE) { [17:27:39.626] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.626] open = "w") [17:27:39.626] } [17:27:39.626] else { [17:27:39.626] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.626] windows = "NUL", "/dev/null"), open = "w") [17:27:39.626] } [17:27:39.626] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.626] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.626] base::sink(type = "output", split = FALSE) [17:27:39.626] base::close(...future.stdout) [17:27:39.626] }, add = TRUE) [17:27:39.626] } [17:27:39.626] ...future.frame <- base::sys.nframe() [17:27:39.626] ...future.conditions <- base::list() [17:27:39.626] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.626] if (FALSE) { [17:27:39.626] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.626] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.626] } [17:27:39.626] ...future.result <- base::tryCatch({ [17:27:39.626] base::withCallingHandlers({ [17:27:39.626] ...future.value <- base::withVisible(base::local({ [17:27:39.626] ...future.makeSendCondition <- base::local({ [17:27:39.626] sendCondition <- NULL [17:27:39.626] function(frame = 1L) { [17:27:39.626] if (is.function(sendCondition)) [17:27:39.626] return(sendCondition) [17:27:39.626] ns <- getNamespace("parallel") [17:27:39.626] if (exists("sendData", mode = "function", [17:27:39.626] envir = ns)) { [17:27:39.626] parallel_sendData <- get("sendData", mode = "function", [17:27:39.626] envir = ns) [17:27:39.626] envir <- sys.frame(frame) [17:27:39.626] master <- NULL [17:27:39.626] while (!identical(envir, .GlobalEnv) && [17:27:39.626] !identical(envir, emptyenv())) { [17:27:39.626] if (exists("master", mode = "list", envir = envir, [17:27:39.626] inherits = FALSE)) { [17:27:39.626] master <- get("master", mode = "list", [17:27:39.626] envir = envir, inherits = FALSE) [17:27:39.626] if (inherits(master, c("SOCKnode", [17:27:39.626] "SOCK0node"))) { [17:27:39.626] sendCondition <<- function(cond) { [17:27:39.626] data <- list(type = "VALUE", value = cond, [17:27:39.626] success = TRUE) [17:27:39.626] parallel_sendData(master, data) [17:27:39.626] } [17:27:39.626] return(sendCondition) [17:27:39.626] } [17:27:39.626] } [17:27:39.626] frame <- frame + 1L [17:27:39.626] envir <- sys.frame(frame) [17:27:39.626] } [17:27:39.626] } [17:27:39.626] sendCondition <<- function(cond) NULL [17:27:39.626] } [17:27:39.626] }) [17:27:39.626] withCallingHandlers({ [17:27:39.626] 2 [17:27:39.626] }, immediateCondition = function(cond) { [17:27:39.626] sendCondition <- ...future.makeSendCondition() [17:27:39.626] sendCondition(cond) [17:27:39.626] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.626] { [17:27:39.626] inherits <- base::inherits [17:27:39.626] invokeRestart <- base::invokeRestart [17:27:39.626] is.null <- base::is.null [17:27:39.626] muffled <- FALSE [17:27:39.626] if (inherits(cond, "message")) { [17:27:39.626] muffled <- grepl(pattern, "muffleMessage") [17:27:39.626] if (muffled) [17:27:39.626] invokeRestart("muffleMessage") [17:27:39.626] } [17:27:39.626] else if (inherits(cond, "warning")) { [17:27:39.626] muffled <- grepl(pattern, "muffleWarning") [17:27:39.626] if (muffled) [17:27:39.626] invokeRestart("muffleWarning") [17:27:39.626] } [17:27:39.626] else if (inherits(cond, "condition")) { [17:27:39.626] if (!is.null(pattern)) { [17:27:39.626] computeRestarts <- base::computeRestarts [17:27:39.626] grepl <- base::grepl [17:27:39.626] restarts <- computeRestarts(cond) [17:27:39.626] for (restart in restarts) { [17:27:39.626] name <- restart$name [17:27:39.626] if (is.null(name)) [17:27:39.626] next [17:27:39.626] if (!grepl(pattern, name)) [17:27:39.626] next [17:27:39.626] invokeRestart(restart) [17:27:39.626] muffled <- TRUE [17:27:39.626] break [17:27:39.626] } [17:27:39.626] } [17:27:39.626] } [17:27:39.626] invisible(muffled) [17:27:39.626] } [17:27:39.626] muffleCondition(cond) [17:27:39.626] }) [17:27:39.626] })) [17:27:39.626] future::FutureResult(value = ...future.value$value, [17:27:39.626] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.626] ...future.rng), globalenv = if (FALSE) [17:27:39.626] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.626] ...future.globalenv.names)) [17:27:39.626] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.626] }, condition = base::local({ [17:27:39.626] c <- base::c [17:27:39.626] inherits <- base::inherits [17:27:39.626] invokeRestart <- base::invokeRestart [17:27:39.626] length <- base::length [17:27:39.626] list <- base::list [17:27:39.626] seq.int <- base::seq.int [17:27:39.626] signalCondition <- base::signalCondition [17:27:39.626] sys.calls <- base::sys.calls [17:27:39.626] `[[` <- base::`[[` [17:27:39.626] `+` <- base::`+` [17:27:39.626] `<<-` <- base::`<<-` [17:27:39.626] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.626] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.626] 3L)] [17:27:39.626] } [17:27:39.626] function(cond) { [17:27:39.626] is_error <- inherits(cond, "error") [17:27:39.626] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.626] NULL) [17:27:39.626] if (is_error) { [17:27:39.626] sessionInformation <- function() { [17:27:39.626] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.626] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.626] search = base::search(), system = base::Sys.info()) [17:27:39.626] } [17:27:39.626] ...future.conditions[[length(...future.conditions) + [17:27:39.626] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.626] cond$call), session = sessionInformation(), [17:27:39.626] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.626] signalCondition(cond) [17:27:39.626] } [17:27:39.626] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.626] "immediateCondition"))) { [17:27:39.626] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.626] ...future.conditions[[length(...future.conditions) + [17:27:39.626] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.626] if (TRUE && !signal) { [17:27:39.626] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.626] { [17:27:39.626] inherits <- base::inherits [17:27:39.626] invokeRestart <- base::invokeRestart [17:27:39.626] is.null <- base::is.null [17:27:39.626] muffled <- FALSE [17:27:39.626] if (inherits(cond, "message")) { [17:27:39.626] muffled <- grepl(pattern, "muffleMessage") [17:27:39.626] if (muffled) [17:27:39.626] invokeRestart("muffleMessage") [17:27:39.626] } [17:27:39.626] else if (inherits(cond, "warning")) { [17:27:39.626] muffled <- grepl(pattern, "muffleWarning") [17:27:39.626] if (muffled) [17:27:39.626] invokeRestart("muffleWarning") [17:27:39.626] } [17:27:39.626] else if (inherits(cond, "condition")) { [17:27:39.626] if (!is.null(pattern)) { [17:27:39.626] computeRestarts <- base::computeRestarts [17:27:39.626] grepl <- base::grepl [17:27:39.626] restarts <- computeRestarts(cond) [17:27:39.626] for (restart in restarts) { [17:27:39.626] name <- restart$name [17:27:39.626] if (is.null(name)) [17:27:39.626] next [17:27:39.626] if (!grepl(pattern, name)) [17:27:39.626] next [17:27:39.626] invokeRestart(restart) [17:27:39.626] muffled <- TRUE [17:27:39.626] break [17:27:39.626] } [17:27:39.626] } [17:27:39.626] } [17:27:39.626] invisible(muffled) [17:27:39.626] } [17:27:39.626] muffleCondition(cond, pattern = "^muffle") [17:27:39.626] } [17:27:39.626] } [17:27:39.626] else { [17:27:39.626] if (TRUE) { [17:27:39.626] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.626] { [17:27:39.626] inherits <- base::inherits [17:27:39.626] invokeRestart <- base::invokeRestart [17:27:39.626] is.null <- base::is.null [17:27:39.626] muffled <- FALSE [17:27:39.626] if (inherits(cond, "message")) { [17:27:39.626] muffled <- grepl(pattern, "muffleMessage") [17:27:39.626] if (muffled) [17:27:39.626] invokeRestart("muffleMessage") [17:27:39.626] } [17:27:39.626] else if (inherits(cond, "warning")) { [17:27:39.626] muffled <- grepl(pattern, "muffleWarning") [17:27:39.626] if (muffled) [17:27:39.626] invokeRestart("muffleWarning") [17:27:39.626] } [17:27:39.626] else if (inherits(cond, "condition")) { [17:27:39.626] if (!is.null(pattern)) { [17:27:39.626] computeRestarts <- base::computeRestarts [17:27:39.626] grepl <- base::grepl [17:27:39.626] restarts <- computeRestarts(cond) [17:27:39.626] for (restart in restarts) { [17:27:39.626] name <- restart$name [17:27:39.626] if (is.null(name)) [17:27:39.626] next [17:27:39.626] if (!grepl(pattern, name)) [17:27:39.626] next [17:27:39.626] invokeRestart(restart) [17:27:39.626] muffled <- TRUE [17:27:39.626] break [17:27:39.626] } [17:27:39.626] } [17:27:39.626] } [17:27:39.626] invisible(muffled) [17:27:39.626] } [17:27:39.626] muffleCondition(cond, pattern = "^muffle") [17:27:39.626] } [17:27:39.626] } [17:27:39.626] } [17:27:39.626] })) [17:27:39.626] }, error = function(ex) { [17:27:39.626] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.626] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.626] ...future.rng), started = ...future.startTime, [17:27:39.626] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.626] version = "1.8"), class = "FutureResult") [17:27:39.626] }, finally = { [17:27:39.626] if (!identical(...future.workdir, getwd())) [17:27:39.626] setwd(...future.workdir) [17:27:39.626] { [17:27:39.626] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.626] ...future.oldOptions$nwarnings <- NULL [17:27:39.626] } [17:27:39.626] base::options(...future.oldOptions) [17:27:39.626] if (.Platform$OS.type == "windows") { [17:27:39.626] old_names <- names(...future.oldEnvVars) [17:27:39.626] envs <- base::Sys.getenv() [17:27:39.626] names <- names(envs) [17:27:39.626] common <- intersect(names, old_names) [17:27:39.626] added <- setdiff(names, old_names) [17:27:39.626] removed <- setdiff(old_names, names) [17:27:39.626] changed <- common[...future.oldEnvVars[common] != [17:27:39.626] envs[common]] [17:27:39.626] NAMES <- toupper(changed) [17:27:39.626] args <- list() [17:27:39.626] for (kk in seq_along(NAMES)) { [17:27:39.626] name <- changed[[kk]] [17:27:39.626] NAME <- NAMES[[kk]] [17:27:39.626] if (name != NAME && is.element(NAME, old_names)) [17:27:39.626] next [17:27:39.626] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.626] } [17:27:39.626] NAMES <- toupper(added) [17:27:39.626] for (kk in seq_along(NAMES)) { [17:27:39.626] name <- added[[kk]] [17:27:39.626] NAME <- NAMES[[kk]] [17:27:39.626] if (name != NAME && is.element(NAME, old_names)) [17:27:39.626] next [17:27:39.626] args[[name]] <- "" [17:27:39.626] } [17:27:39.626] NAMES <- toupper(removed) [17:27:39.626] for (kk in seq_along(NAMES)) { [17:27:39.626] name <- removed[[kk]] [17:27:39.626] NAME <- NAMES[[kk]] [17:27:39.626] if (name != NAME && is.element(NAME, old_names)) [17:27:39.626] next [17:27:39.626] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.626] } [17:27:39.626] if (length(args) > 0) [17:27:39.626] base::do.call(base::Sys.setenv, args = args) [17:27:39.626] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.626] } [17:27:39.626] else { [17:27:39.626] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.626] } [17:27:39.626] { [17:27:39.626] if (base::length(...future.futureOptionsAdded) > [17:27:39.626] 0L) { [17:27:39.626] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.626] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.626] base::options(opts) [17:27:39.626] } [17:27:39.626] { [17:27:39.626] { [17:27:39.626] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.626] NULL [17:27:39.626] } [17:27:39.626] options(future.plan = NULL) [17:27:39.626] if (is.na(NA_character_)) [17:27:39.626] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.626] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.626] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.626] .init = FALSE) [17:27:39.626] } [17:27:39.626] } [17:27:39.626] } [17:27:39.626] }) [17:27:39.626] if (TRUE) { [17:27:39.626] base::sink(type = "output", split = FALSE) [17:27:39.626] if (TRUE) { [17:27:39.626] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.626] } [17:27:39.626] else { [17:27:39.626] ...future.result["stdout"] <- base::list(NULL) [17:27:39.626] } [17:27:39.626] base::close(...future.stdout) [17:27:39.626] ...future.stdout <- NULL [17:27:39.626] } [17:27:39.626] ...future.result$conditions <- ...future.conditions [17:27:39.626] ...future.result$finished <- base::Sys.time() [17:27:39.626] ...future.result [17:27:39.626] } [17:27:39.635] MultisessionFuture started [17:27:39.636] - Launch lazy future ... done [17:27:39.636] run() for 'MultisessionFuture' ... done [17:27:39.636] getGlobalsAndPackages() ... [17:27:39.637] Searching for globals... [17:27:39.637] [17:27:39.638] Searching for globals ... DONE [17:27:39.638] - globals: [0] [17:27:39.638] getGlobalsAndPackages() ... DONE [17:27:39.639] run() for 'Future' ... [17:27:39.639] - state: 'created' [17:27:39.640] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.660] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.661] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.661] - Field: 'node' [17:27:39.662] - Field: 'label' [17:27:39.662] - Field: 'local' [17:27:39.662] - Field: 'owner' [17:27:39.663] - Field: 'envir' [17:27:39.663] - Field: 'workers' [17:27:39.663] - Field: 'packages' [17:27:39.663] - Field: 'gc' [17:27:39.664] - Field: 'conditions' [17:27:39.664] - Field: 'persistent' [17:27:39.665] - Field: 'expr' [17:27:39.665] - Field: 'uuid' [17:27:39.665] - Field: 'seed' [17:27:39.665] - Field: 'version' [17:27:39.666] - Field: 'result' [17:27:39.666] - Field: 'asynchronous' [17:27:39.666] - Field: 'calls' [17:27:39.667] - Field: 'globals' [17:27:39.667] - Field: 'stdout' [17:27:39.667] - Field: 'earlySignal' [17:27:39.668] - Field: 'lazy' [17:27:39.668] - Field: 'state' [17:27:39.668] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.669] - Launch lazy future ... [17:27:39.669] Packages needed by the future expression (n = 0): [17:27:39.670] Packages needed by future strategies (n = 0): [17:27:39.671] { [17:27:39.671] { [17:27:39.671] { [17:27:39.671] ...future.startTime <- base::Sys.time() [17:27:39.671] { [17:27:39.671] { [17:27:39.671] { [17:27:39.671] { [17:27:39.671] base::local({ [17:27:39.671] has_future <- base::requireNamespace("future", [17:27:39.671] quietly = TRUE) [17:27:39.671] if (has_future) { [17:27:39.671] ns <- base::getNamespace("future") [17:27:39.671] version <- ns[[".package"]][["version"]] [17:27:39.671] if (is.null(version)) [17:27:39.671] version <- utils::packageVersion("future") [17:27:39.671] } [17:27:39.671] else { [17:27:39.671] version <- NULL [17:27:39.671] } [17:27:39.671] if (!has_future || version < "1.8.0") { [17:27:39.671] info <- base::c(r_version = base::gsub("R version ", [17:27:39.671] "", base::R.version$version.string), [17:27:39.671] platform = base::sprintf("%s (%s-bit)", [17:27:39.671] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.671] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.671] "release", "version")], collapse = " "), [17:27:39.671] hostname = base::Sys.info()[["nodename"]]) [17:27:39.671] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.671] info) [17:27:39.671] info <- base::paste(info, collapse = "; ") [17:27:39.671] if (!has_future) { [17:27:39.671] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.671] info) [17:27:39.671] } [17:27:39.671] else { [17:27:39.671] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.671] info, version) [17:27:39.671] } [17:27:39.671] base::stop(msg) [17:27:39.671] } [17:27:39.671] }) [17:27:39.671] } [17:27:39.671] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.671] base::options(mc.cores = 1L) [17:27:39.671] } [17:27:39.671] ...future.strategy.old <- future::plan("list") [17:27:39.671] options(future.plan = NULL) [17:27:39.671] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.671] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.671] } [17:27:39.671] ...future.workdir <- getwd() [17:27:39.671] } [17:27:39.671] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.671] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.671] } [17:27:39.671] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.671] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.671] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.671] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.671] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.671] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.671] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.671] base::names(...future.oldOptions)) [17:27:39.671] } [17:27:39.671] if (FALSE) { [17:27:39.671] } [17:27:39.671] else { [17:27:39.671] if (TRUE) { [17:27:39.671] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.671] open = "w") [17:27:39.671] } [17:27:39.671] else { [17:27:39.671] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.671] windows = "NUL", "/dev/null"), open = "w") [17:27:39.671] } [17:27:39.671] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.671] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.671] base::sink(type = "output", split = FALSE) [17:27:39.671] base::close(...future.stdout) [17:27:39.671] }, add = TRUE) [17:27:39.671] } [17:27:39.671] ...future.frame <- base::sys.nframe() [17:27:39.671] ...future.conditions <- base::list() [17:27:39.671] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.671] if (FALSE) { [17:27:39.671] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.671] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.671] } [17:27:39.671] ...future.result <- base::tryCatch({ [17:27:39.671] base::withCallingHandlers({ [17:27:39.671] ...future.value <- base::withVisible(base::local({ [17:27:39.671] ...future.makeSendCondition <- base::local({ [17:27:39.671] sendCondition <- NULL [17:27:39.671] function(frame = 1L) { [17:27:39.671] if (is.function(sendCondition)) [17:27:39.671] return(sendCondition) [17:27:39.671] ns <- getNamespace("parallel") [17:27:39.671] if (exists("sendData", mode = "function", [17:27:39.671] envir = ns)) { [17:27:39.671] parallel_sendData <- get("sendData", mode = "function", [17:27:39.671] envir = ns) [17:27:39.671] envir <- sys.frame(frame) [17:27:39.671] master <- NULL [17:27:39.671] while (!identical(envir, .GlobalEnv) && [17:27:39.671] !identical(envir, emptyenv())) { [17:27:39.671] if (exists("master", mode = "list", envir = envir, [17:27:39.671] inherits = FALSE)) { [17:27:39.671] master <- get("master", mode = "list", [17:27:39.671] envir = envir, inherits = FALSE) [17:27:39.671] if (inherits(master, c("SOCKnode", [17:27:39.671] "SOCK0node"))) { [17:27:39.671] sendCondition <<- function(cond) { [17:27:39.671] data <- list(type = "VALUE", value = cond, [17:27:39.671] success = TRUE) [17:27:39.671] parallel_sendData(master, data) [17:27:39.671] } [17:27:39.671] return(sendCondition) [17:27:39.671] } [17:27:39.671] } [17:27:39.671] frame <- frame + 1L [17:27:39.671] envir <- sys.frame(frame) [17:27:39.671] } [17:27:39.671] } [17:27:39.671] sendCondition <<- function(cond) NULL [17:27:39.671] } [17:27:39.671] }) [17:27:39.671] withCallingHandlers({ [17:27:39.671] NULL [17:27:39.671] }, immediateCondition = function(cond) { [17:27:39.671] sendCondition <- ...future.makeSendCondition() [17:27:39.671] sendCondition(cond) [17:27:39.671] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.671] { [17:27:39.671] inherits <- base::inherits [17:27:39.671] invokeRestart <- base::invokeRestart [17:27:39.671] is.null <- base::is.null [17:27:39.671] muffled <- FALSE [17:27:39.671] if (inherits(cond, "message")) { [17:27:39.671] muffled <- grepl(pattern, "muffleMessage") [17:27:39.671] if (muffled) [17:27:39.671] invokeRestart("muffleMessage") [17:27:39.671] } [17:27:39.671] else if (inherits(cond, "warning")) { [17:27:39.671] muffled <- grepl(pattern, "muffleWarning") [17:27:39.671] if (muffled) [17:27:39.671] invokeRestart("muffleWarning") [17:27:39.671] } [17:27:39.671] else if (inherits(cond, "condition")) { [17:27:39.671] if (!is.null(pattern)) { [17:27:39.671] computeRestarts <- base::computeRestarts [17:27:39.671] grepl <- base::grepl [17:27:39.671] restarts <- computeRestarts(cond) [17:27:39.671] for (restart in restarts) { [17:27:39.671] name <- restart$name [17:27:39.671] if (is.null(name)) [17:27:39.671] next [17:27:39.671] if (!grepl(pattern, name)) [17:27:39.671] next [17:27:39.671] invokeRestart(restart) [17:27:39.671] muffled <- TRUE [17:27:39.671] break [17:27:39.671] } [17:27:39.671] } [17:27:39.671] } [17:27:39.671] invisible(muffled) [17:27:39.671] } [17:27:39.671] muffleCondition(cond) [17:27:39.671] }) [17:27:39.671] })) [17:27:39.671] future::FutureResult(value = ...future.value$value, [17:27:39.671] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.671] ...future.rng), globalenv = if (FALSE) [17:27:39.671] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.671] ...future.globalenv.names)) [17:27:39.671] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.671] }, condition = base::local({ [17:27:39.671] c <- base::c [17:27:39.671] inherits <- base::inherits [17:27:39.671] invokeRestart <- base::invokeRestart [17:27:39.671] length <- base::length [17:27:39.671] list <- base::list [17:27:39.671] seq.int <- base::seq.int [17:27:39.671] signalCondition <- base::signalCondition [17:27:39.671] sys.calls <- base::sys.calls [17:27:39.671] `[[` <- base::`[[` [17:27:39.671] `+` <- base::`+` [17:27:39.671] `<<-` <- base::`<<-` [17:27:39.671] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.671] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.671] 3L)] [17:27:39.671] } [17:27:39.671] function(cond) { [17:27:39.671] is_error <- inherits(cond, "error") [17:27:39.671] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.671] NULL) [17:27:39.671] if (is_error) { [17:27:39.671] sessionInformation <- function() { [17:27:39.671] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.671] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.671] search = base::search(), system = base::Sys.info()) [17:27:39.671] } [17:27:39.671] ...future.conditions[[length(...future.conditions) + [17:27:39.671] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.671] cond$call), session = sessionInformation(), [17:27:39.671] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.671] signalCondition(cond) [17:27:39.671] } [17:27:39.671] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.671] "immediateCondition"))) { [17:27:39.671] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.671] ...future.conditions[[length(...future.conditions) + [17:27:39.671] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.671] if (TRUE && !signal) { [17:27:39.671] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.671] { [17:27:39.671] inherits <- base::inherits [17:27:39.671] invokeRestart <- base::invokeRestart [17:27:39.671] is.null <- base::is.null [17:27:39.671] muffled <- FALSE [17:27:39.671] if (inherits(cond, "message")) { [17:27:39.671] muffled <- grepl(pattern, "muffleMessage") [17:27:39.671] if (muffled) [17:27:39.671] invokeRestart("muffleMessage") [17:27:39.671] } [17:27:39.671] else if (inherits(cond, "warning")) { [17:27:39.671] muffled <- grepl(pattern, "muffleWarning") [17:27:39.671] if (muffled) [17:27:39.671] invokeRestart("muffleWarning") [17:27:39.671] } [17:27:39.671] else if (inherits(cond, "condition")) { [17:27:39.671] if (!is.null(pattern)) { [17:27:39.671] computeRestarts <- base::computeRestarts [17:27:39.671] grepl <- base::grepl [17:27:39.671] restarts <- computeRestarts(cond) [17:27:39.671] for (restart in restarts) { [17:27:39.671] name <- restart$name [17:27:39.671] if (is.null(name)) [17:27:39.671] next [17:27:39.671] if (!grepl(pattern, name)) [17:27:39.671] next [17:27:39.671] invokeRestart(restart) [17:27:39.671] muffled <- TRUE [17:27:39.671] break [17:27:39.671] } [17:27:39.671] } [17:27:39.671] } [17:27:39.671] invisible(muffled) [17:27:39.671] } [17:27:39.671] muffleCondition(cond, pattern = "^muffle") [17:27:39.671] } [17:27:39.671] } [17:27:39.671] else { [17:27:39.671] if (TRUE) { [17:27:39.671] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.671] { [17:27:39.671] inherits <- base::inherits [17:27:39.671] invokeRestart <- base::invokeRestart [17:27:39.671] is.null <- base::is.null [17:27:39.671] muffled <- FALSE [17:27:39.671] if (inherits(cond, "message")) { [17:27:39.671] muffled <- grepl(pattern, "muffleMessage") [17:27:39.671] if (muffled) [17:27:39.671] invokeRestart("muffleMessage") [17:27:39.671] } [17:27:39.671] else if (inherits(cond, "warning")) { [17:27:39.671] muffled <- grepl(pattern, "muffleWarning") [17:27:39.671] if (muffled) [17:27:39.671] invokeRestart("muffleWarning") [17:27:39.671] } [17:27:39.671] else if (inherits(cond, "condition")) { [17:27:39.671] if (!is.null(pattern)) { [17:27:39.671] computeRestarts <- base::computeRestarts [17:27:39.671] grepl <- base::grepl [17:27:39.671] restarts <- computeRestarts(cond) [17:27:39.671] for (restart in restarts) { [17:27:39.671] name <- restart$name [17:27:39.671] if (is.null(name)) [17:27:39.671] next [17:27:39.671] if (!grepl(pattern, name)) [17:27:39.671] next [17:27:39.671] invokeRestart(restart) [17:27:39.671] muffled <- TRUE [17:27:39.671] break [17:27:39.671] } [17:27:39.671] } [17:27:39.671] } [17:27:39.671] invisible(muffled) [17:27:39.671] } [17:27:39.671] muffleCondition(cond, pattern = "^muffle") [17:27:39.671] } [17:27:39.671] } [17:27:39.671] } [17:27:39.671] })) [17:27:39.671] }, error = function(ex) { [17:27:39.671] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.671] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.671] ...future.rng), started = ...future.startTime, [17:27:39.671] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.671] version = "1.8"), class = "FutureResult") [17:27:39.671] }, finally = { [17:27:39.671] if (!identical(...future.workdir, getwd())) [17:27:39.671] setwd(...future.workdir) [17:27:39.671] { [17:27:39.671] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.671] ...future.oldOptions$nwarnings <- NULL [17:27:39.671] } [17:27:39.671] base::options(...future.oldOptions) [17:27:39.671] if (.Platform$OS.type == "windows") { [17:27:39.671] old_names <- names(...future.oldEnvVars) [17:27:39.671] envs <- base::Sys.getenv() [17:27:39.671] names <- names(envs) [17:27:39.671] common <- intersect(names, old_names) [17:27:39.671] added <- setdiff(names, old_names) [17:27:39.671] removed <- setdiff(old_names, names) [17:27:39.671] changed <- common[...future.oldEnvVars[common] != [17:27:39.671] envs[common]] [17:27:39.671] NAMES <- toupper(changed) [17:27:39.671] args <- list() [17:27:39.671] for (kk in seq_along(NAMES)) { [17:27:39.671] name <- changed[[kk]] [17:27:39.671] NAME <- NAMES[[kk]] [17:27:39.671] if (name != NAME && is.element(NAME, old_names)) [17:27:39.671] next [17:27:39.671] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.671] } [17:27:39.671] NAMES <- toupper(added) [17:27:39.671] for (kk in seq_along(NAMES)) { [17:27:39.671] name <- added[[kk]] [17:27:39.671] NAME <- NAMES[[kk]] [17:27:39.671] if (name != NAME && is.element(NAME, old_names)) [17:27:39.671] next [17:27:39.671] args[[name]] <- "" [17:27:39.671] } [17:27:39.671] NAMES <- toupper(removed) [17:27:39.671] for (kk in seq_along(NAMES)) { [17:27:39.671] name <- removed[[kk]] [17:27:39.671] NAME <- NAMES[[kk]] [17:27:39.671] if (name != NAME && is.element(NAME, old_names)) [17:27:39.671] next [17:27:39.671] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.671] } [17:27:39.671] if (length(args) > 0) [17:27:39.671] base::do.call(base::Sys.setenv, args = args) [17:27:39.671] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.671] } [17:27:39.671] else { [17:27:39.671] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.671] } [17:27:39.671] { [17:27:39.671] if (base::length(...future.futureOptionsAdded) > [17:27:39.671] 0L) { [17:27:39.671] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.671] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.671] base::options(opts) [17:27:39.671] } [17:27:39.671] { [17:27:39.671] { [17:27:39.671] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.671] NULL [17:27:39.671] } [17:27:39.671] options(future.plan = NULL) [17:27:39.671] if (is.na(NA_character_)) [17:27:39.671] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.671] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.671] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.671] .init = FALSE) [17:27:39.671] } [17:27:39.671] } [17:27:39.671] } [17:27:39.671] }) [17:27:39.671] if (TRUE) { [17:27:39.671] base::sink(type = "output", split = FALSE) [17:27:39.671] if (TRUE) { [17:27:39.671] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.671] } [17:27:39.671] else { [17:27:39.671] ...future.result["stdout"] <- base::list(NULL) [17:27:39.671] } [17:27:39.671] base::close(...future.stdout) [17:27:39.671] ...future.stdout <- NULL [17:27:39.671] } [17:27:39.671] ...future.result$conditions <- ...future.conditions [17:27:39.671] ...future.result$finished <- base::Sys.time() [17:27:39.671] ...future.result [17:27:39.671] } [17:27:39.681] MultisessionFuture started [17:27:39.681] - Launch lazy future ... done [17:27:39.682] run() for 'MultisessionFuture' ... done [17:27:39.682] getGlobalsAndPackages() ... [17:27:39.683] Searching for globals... [17:27:39.684] - globals found: [1] '{' [17:27:39.685] Searching for globals ... DONE [17:27:39.685] Resolving globals: FALSE [17:27:39.686] [17:27:39.686] [17:27:39.686] getGlobalsAndPackages() ... DONE [17:27:39.687] run() for 'Future' ... [17:27:39.687] - state: 'created' [17:27:39.687] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.707] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.708] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.708] - Field: 'node' [17:27:39.709] - Field: 'label' [17:27:39.709] - Field: 'local' [17:27:39.709] - Field: 'owner' [17:27:39.710] - Field: 'envir' [17:27:39.710] - Field: 'workers' [17:27:39.710] - Field: 'packages' [17:27:39.711] - Field: 'gc' [17:27:39.711] - Field: 'conditions' [17:27:39.711] - Field: 'persistent' [17:27:39.712] - Field: 'expr' [17:27:39.712] - Field: 'uuid' [17:27:39.712] - Field: 'seed' [17:27:39.713] - Field: 'version' [17:27:39.713] - Field: 'result' [17:27:39.713] - Field: 'asynchronous' [17:27:39.714] - Field: 'calls' [17:27:39.714] - Field: 'globals' [17:27:39.714] - Field: 'stdout' [17:27:39.715] - Field: 'earlySignal' [17:27:39.715] - Field: 'lazy' [17:27:39.715] - Field: 'state' [17:27:39.716] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.716] - Launch lazy future ... [17:27:39.717] Packages needed by the future expression (n = 0): [17:27:39.717] Packages needed by future strategies (n = 0): [17:27:39.718] { [17:27:39.718] { [17:27:39.718] { [17:27:39.718] ...future.startTime <- base::Sys.time() [17:27:39.718] { [17:27:39.718] { [17:27:39.718] { [17:27:39.718] { [17:27:39.718] base::local({ [17:27:39.718] has_future <- base::requireNamespace("future", [17:27:39.718] quietly = TRUE) [17:27:39.718] if (has_future) { [17:27:39.718] ns <- base::getNamespace("future") [17:27:39.718] version <- ns[[".package"]][["version"]] [17:27:39.718] if (is.null(version)) [17:27:39.718] version <- utils::packageVersion("future") [17:27:39.718] } [17:27:39.718] else { [17:27:39.718] version <- NULL [17:27:39.718] } [17:27:39.718] if (!has_future || version < "1.8.0") { [17:27:39.718] info <- base::c(r_version = base::gsub("R version ", [17:27:39.718] "", base::R.version$version.string), [17:27:39.718] platform = base::sprintf("%s (%s-bit)", [17:27:39.718] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.718] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.718] "release", "version")], collapse = " "), [17:27:39.718] hostname = base::Sys.info()[["nodename"]]) [17:27:39.718] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.718] info) [17:27:39.718] info <- base::paste(info, collapse = "; ") [17:27:39.718] if (!has_future) { [17:27:39.718] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.718] info) [17:27:39.718] } [17:27:39.718] else { [17:27:39.718] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.718] info, version) [17:27:39.718] } [17:27:39.718] base::stop(msg) [17:27:39.718] } [17:27:39.718] }) [17:27:39.718] } [17:27:39.718] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.718] base::options(mc.cores = 1L) [17:27:39.718] } [17:27:39.718] ...future.strategy.old <- future::plan("list") [17:27:39.718] options(future.plan = NULL) [17:27:39.718] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.718] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.718] } [17:27:39.718] ...future.workdir <- getwd() [17:27:39.718] } [17:27:39.718] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.718] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.718] } [17:27:39.718] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.718] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.718] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.718] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.718] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.718] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.718] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.718] base::names(...future.oldOptions)) [17:27:39.718] } [17:27:39.718] if (FALSE) { [17:27:39.718] } [17:27:39.718] else { [17:27:39.718] if (TRUE) { [17:27:39.718] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.718] open = "w") [17:27:39.718] } [17:27:39.718] else { [17:27:39.718] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.718] windows = "NUL", "/dev/null"), open = "w") [17:27:39.718] } [17:27:39.718] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.718] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.718] base::sink(type = "output", split = FALSE) [17:27:39.718] base::close(...future.stdout) [17:27:39.718] }, add = TRUE) [17:27:39.718] } [17:27:39.718] ...future.frame <- base::sys.nframe() [17:27:39.718] ...future.conditions <- base::list() [17:27:39.718] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.718] if (FALSE) { [17:27:39.718] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.718] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.718] } [17:27:39.718] ...future.result <- base::tryCatch({ [17:27:39.718] base::withCallingHandlers({ [17:27:39.718] ...future.value <- base::withVisible(base::local({ [17:27:39.718] ...future.makeSendCondition <- base::local({ [17:27:39.718] sendCondition <- NULL [17:27:39.718] function(frame = 1L) { [17:27:39.718] if (is.function(sendCondition)) [17:27:39.718] return(sendCondition) [17:27:39.718] ns <- getNamespace("parallel") [17:27:39.718] if (exists("sendData", mode = "function", [17:27:39.718] envir = ns)) { [17:27:39.718] parallel_sendData <- get("sendData", mode = "function", [17:27:39.718] envir = ns) [17:27:39.718] envir <- sys.frame(frame) [17:27:39.718] master <- NULL [17:27:39.718] while (!identical(envir, .GlobalEnv) && [17:27:39.718] !identical(envir, emptyenv())) { [17:27:39.718] if (exists("master", mode = "list", envir = envir, [17:27:39.718] inherits = FALSE)) { [17:27:39.718] master <- get("master", mode = "list", [17:27:39.718] envir = envir, inherits = FALSE) [17:27:39.718] if (inherits(master, c("SOCKnode", [17:27:39.718] "SOCK0node"))) { [17:27:39.718] sendCondition <<- function(cond) { [17:27:39.718] data <- list(type = "VALUE", value = cond, [17:27:39.718] success = TRUE) [17:27:39.718] parallel_sendData(master, data) [17:27:39.718] } [17:27:39.718] return(sendCondition) [17:27:39.718] } [17:27:39.718] } [17:27:39.718] frame <- frame + 1L [17:27:39.718] envir <- sys.frame(frame) [17:27:39.718] } [17:27:39.718] } [17:27:39.718] sendCondition <<- function(cond) NULL [17:27:39.718] } [17:27:39.718] }) [17:27:39.718] withCallingHandlers({ [17:27:39.718] { [17:27:39.718] 4 [17:27:39.718] } [17:27:39.718] }, immediateCondition = function(cond) { [17:27:39.718] sendCondition <- ...future.makeSendCondition() [17:27:39.718] sendCondition(cond) [17:27:39.718] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.718] { [17:27:39.718] inherits <- base::inherits [17:27:39.718] invokeRestart <- base::invokeRestart [17:27:39.718] is.null <- base::is.null [17:27:39.718] muffled <- FALSE [17:27:39.718] if (inherits(cond, "message")) { [17:27:39.718] muffled <- grepl(pattern, "muffleMessage") [17:27:39.718] if (muffled) [17:27:39.718] invokeRestart("muffleMessage") [17:27:39.718] } [17:27:39.718] else if (inherits(cond, "warning")) { [17:27:39.718] muffled <- grepl(pattern, "muffleWarning") [17:27:39.718] if (muffled) [17:27:39.718] invokeRestart("muffleWarning") [17:27:39.718] } [17:27:39.718] else if (inherits(cond, "condition")) { [17:27:39.718] if (!is.null(pattern)) { [17:27:39.718] computeRestarts <- base::computeRestarts [17:27:39.718] grepl <- base::grepl [17:27:39.718] restarts <- computeRestarts(cond) [17:27:39.718] for (restart in restarts) { [17:27:39.718] name <- restart$name [17:27:39.718] if (is.null(name)) [17:27:39.718] next [17:27:39.718] if (!grepl(pattern, name)) [17:27:39.718] next [17:27:39.718] invokeRestart(restart) [17:27:39.718] muffled <- TRUE [17:27:39.718] break [17:27:39.718] } [17:27:39.718] } [17:27:39.718] } [17:27:39.718] invisible(muffled) [17:27:39.718] } [17:27:39.718] muffleCondition(cond) [17:27:39.718] }) [17:27:39.718] })) [17:27:39.718] future::FutureResult(value = ...future.value$value, [17:27:39.718] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.718] ...future.rng), globalenv = if (FALSE) [17:27:39.718] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.718] ...future.globalenv.names)) [17:27:39.718] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.718] }, condition = base::local({ [17:27:39.718] c <- base::c [17:27:39.718] inherits <- base::inherits [17:27:39.718] invokeRestart <- base::invokeRestart [17:27:39.718] length <- base::length [17:27:39.718] list <- base::list [17:27:39.718] seq.int <- base::seq.int [17:27:39.718] signalCondition <- base::signalCondition [17:27:39.718] sys.calls <- base::sys.calls [17:27:39.718] `[[` <- base::`[[` [17:27:39.718] `+` <- base::`+` [17:27:39.718] `<<-` <- base::`<<-` [17:27:39.718] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.718] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.718] 3L)] [17:27:39.718] } [17:27:39.718] function(cond) { [17:27:39.718] is_error <- inherits(cond, "error") [17:27:39.718] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.718] NULL) [17:27:39.718] if (is_error) { [17:27:39.718] sessionInformation <- function() { [17:27:39.718] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.718] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.718] search = base::search(), system = base::Sys.info()) [17:27:39.718] } [17:27:39.718] ...future.conditions[[length(...future.conditions) + [17:27:39.718] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.718] cond$call), session = sessionInformation(), [17:27:39.718] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.718] signalCondition(cond) [17:27:39.718] } [17:27:39.718] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.718] "immediateCondition"))) { [17:27:39.718] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.718] ...future.conditions[[length(...future.conditions) + [17:27:39.718] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.718] if (TRUE && !signal) { [17:27:39.718] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.718] { [17:27:39.718] inherits <- base::inherits [17:27:39.718] invokeRestart <- base::invokeRestart [17:27:39.718] is.null <- base::is.null [17:27:39.718] muffled <- FALSE [17:27:39.718] if (inherits(cond, "message")) { [17:27:39.718] muffled <- grepl(pattern, "muffleMessage") [17:27:39.718] if (muffled) [17:27:39.718] invokeRestart("muffleMessage") [17:27:39.718] } [17:27:39.718] else if (inherits(cond, "warning")) { [17:27:39.718] muffled <- grepl(pattern, "muffleWarning") [17:27:39.718] if (muffled) [17:27:39.718] invokeRestart("muffleWarning") [17:27:39.718] } [17:27:39.718] else if (inherits(cond, "condition")) { [17:27:39.718] if (!is.null(pattern)) { [17:27:39.718] computeRestarts <- base::computeRestarts [17:27:39.718] grepl <- base::grepl [17:27:39.718] restarts <- computeRestarts(cond) [17:27:39.718] for (restart in restarts) { [17:27:39.718] name <- restart$name [17:27:39.718] if (is.null(name)) [17:27:39.718] next [17:27:39.718] if (!grepl(pattern, name)) [17:27:39.718] next [17:27:39.718] invokeRestart(restart) [17:27:39.718] muffled <- TRUE [17:27:39.718] break [17:27:39.718] } [17:27:39.718] } [17:27:39.718] } [17:27:39.718] invisible(muffled) [17:27:39.718] } [17:27:39.718] muffleCondition(cond, pattern = "^muffle") [17:27:39.718] } [17:27:39.718] } [17:27:39.718] else { [17:27:39.718] if (TRUE) { [17:27:39.718] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.718] { [17:27:39.718] inherits <- base::inherits [17:27:39.718] invokeRestart <- base::invokeRestart [17:27:39.718] is.null <- base::is.null [17:27:39.718] muffled <- FALSE [17:27:39.718] if (inherits(cond, "message")) { [17:27:39.718] muffled <- grepl(pattern, "muffleMessage") [17:27:39.718] if (muffled) [17:27:39.718] invokeRestart("muffleMessage") [17:27:39.718] } [17:27:39.718] else if (inherits(cond, "warning")) { [17:27:39.718] muffled <- grepl(pattern, "muffleWarning") [17:27:39.718] if (muffled) [17:27:39.718] invokeRestart("muffleWarning") [17:27:39.718] } [17:27:39.718] else if (inherits(cond, "condition")) { [17:27:39.718] if (!is.null(pattern)) { [17:27:39.718] computeRestarts <- base::computeRestarts [17:27:39.718] grepl <- base::grepl [17:27:39.718] restarts <- computeRestarts(cond) [17:27:39.718] for (restart in restarts) { [17:27:39.718] name <- restart$name [17:27:39.718] if (is.null(name)) [17:27:39.718] next [17:27:39.718] if (!grepl(pattern, name)) [17:27:39.718] next [17:27:39.718] invokeRestart(restart) [17:27:39.718] muffled <- TRUE [17:27:39.718] break [17:27:39.718] } [17:27:39.718] } [17:27:39.718] } [17:27:39.718] invisible(muffled) [17:27:39.718] } [17:27:39.718] muffleCondition(cond, pattern = "^muffle") [17:27:39.718] } [17:27:39.718] } [17:27:39.718] } [17:27:39.718] })) [17:27:39.718] }, error = function(ex) { [17:27:39.718] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.718] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.718] ...future.rng), started = ...future.startTime, [17:27:39.718] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.718] version = "1.8"), class = "FutureResult") [17:27:39.718] }, finally = { [17:27:39.718] if (!identical(...future.workdir, getwd())) [17:27:39.718] setwd(...future.workdir) [17:27:39.718] { [17:27:39.718] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.718] ...future.oldOptions$nwarnings <- NULL [17:27:39.718] } [17:27:39.718] base::options(...future.oldOptions) [17:27:39.718] if (.Platform$OS.type == "windows") { [17:27:39.718] old_names <- names(...future.oldEnvVars) [17:27:39.718] envs <- base::Sys.getenv() [17:27:39.718] names <- names(envs) [17:27:39.718] common <- intersect(names, old_names) [17:27:39.718] added <- setdiff(names, old_names) [17:27:39.718] removed <- setdiff(old_names, names) [17:27:39.718] changed <- common[...future.oldEnvVars[common] != [17:27:39.718] envs[common]] [17:27:39.718] NAMES <- toupper(changed) [17:27:39.718] args <- list() [17:27:39.718] for (kk in seq_along(NAMES)) { [17:27:39.718] name <- changed[[kk]] [17:27:39.718] NAME <- NAMES[[kk]] [17:27:39.718] if (name != NAME && is.element(NAME, old_names)) [17:27:39.718] next [17:27:39.718] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.718] } [17:27:39.718] NAMES <- toupper(added) [17:27:39.718] for (kk in seq_along(NAMES)) { [17:27:39.718] name <- added[[kk]] [17:27:39.718] NAME <- NAMES[[kk]] [17:27:39.718] if (name != NAME && is.element(NAME, old_names)) [17:27:39.718] next [17:27:39.718] args[[name]] <- "" [17:27:39.718] } [17:27:39.718] NAMES <- toupper(removed) [17:27:39.718] for (kk in seq_along(NAMES)) { [17:27:39.718] name <- removed[[kk]] [17:27:39.718] NAME <- NAMES[[kk]] [17:27:39.718] if (name != NAME && is.element(NAME, old_names)) [17:27:39.718] next [17:27:39.718] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.718] } [17:27:39.718] if (length(args) > 0) [17:27:39.718] base::do.call(base::Sys.setenv, args = args) [17:27:39.718] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.718] } [17:27:39.718] else { [17:27:39.718] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.718] } [17:27:39.718] { [17:27:39.718] if (base::length(...future.futureOptionsAdded) > [17:27:39.718] 0L) { [17:27:39.718] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.718] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.718] base::options(opts) [17:27:39.718] } [17:27:39.718] { [17:27:39.718] { [17:27:39.718] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.718] NULL [17:27:39.718] } [17:27:39.718] options(future.plan = NULL) [17:27:39.718] if (is.na(NA_character_)) [17:27:39.718] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.718] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.718] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.718] .init = FALSE) [17:27:39.718] } [17:27:39.718] } [17:27:39.718] } [17:27:39.718] }) [17:27:39.718] if (TRUE) { [17:27:39.718] base::sink(type = "output", split = FALSE) [17:27:39.718] if (TRUE) { [17:27:39.718] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.718] } [17:27:39.718] else { [17:27:39.718] ...future.result["stdout"] <- base::list(NULL) [17:27:39.718] } [17:27:39.718] base::close(...future.stdout) [17:27:39.718] ...future.stdout <- NULL [17:27:39.718] } [17:27:39.718] ...future.result$conditions <- ...future.conditions [17:27:39.718] ...future.result$finished <- base::Sys.time() [17:27:39.718] ...future.result [17:27:39.718] } [17:27:39.727] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:39.752] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.752] - Validating connection of MultisessionFuture [17:27:39.753] - received message: FutureResult [17:27:39.753] - Received FutureResult [17:27:39.753] - Erased future from FutureRegistry [17:27:39.754] result() for ClusterFuture ... [17:27:39.754] - result already collected: FutureResult [17:27:39.754] result() for ClusterFuture ... done [17:27:39.755] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.755] result() for ClusterFuture ... [17:27:39.755] - result already collected: FutureResult [17:27:39.756] result() for ClusterFuture ... done [17:27:39.756] result() for ClusterFuture ... [17:27:39.757] - result already collected: FutureResult [17:27:39.757] result() for ClusterFuture ... done [17:27:39.759] MultisessionFuture started [17:27:39.760] - Launch lazy future ... done [17:27:39.760] run() for 'MultisessionFuture' ... done [17:27:39.763] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.764] - Validating connection of MultisessionFuture [17:27:39.764] - received message: FutureResult [17:27:39.765] - Received FutureResult [17:27:39.765] - Erased future from FutureRegistry [17:27:39.765] result() for ClusterFuture ... [17:27:39.766] - result already collected: FutureResult [17:27:39.766] result() for ClusterFuture ... done [17:27:39.766] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.785] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.786] - Validating connection of MultisessionFuture [17:27:39.787] - received message: FutureResult [17:27:39.787] - Received FutureResult [17:27:39.788] - Erased future from FutureRegistry [17:27:39.788] result() for ClusterFuture ... [17:27:39.788] - result already collected: FutureResult [17:27:39.789] result() for ClusterFuture ... done [17:27:39.789] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:39.792] resolve() on environment ... [17:27:39.793] recursive: 0 [17:27:39.794] elements: [4] 'a', 'b', 'c', 'd' [17:27:39.795] signalConditionsASAP(numeric, pos=1) ... [17:27:39.795] - nx: 4 [17:27:39.795] - relay: TRUE [17:27:39.796] - stdout: TRUE [17:27:39.796] - signal: TRUE [17:27:39.796] - resignal: FALSE [17:27:39.797] - force: TRUE [17:27:39.797] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.797] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.798] - until=2 [17:27:39.798] - relaying element #2 [17:27:39.798] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.799] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.799] signalConditionsASAP(NULL, pos=1) ... done [17:27:39.799] length: 3 (resolved future 1) [17:27:39.800] Future #2 [17:27:39.800] result() for ClusterFuture ... [17:27:39.800] - result already collected: FutureResult [17:27:39.801] result() for ClusterFuture ... done [17:27:39.801] result() for ClusterFuture ... [17:27:39.801] - result already collected: FutureResult [17:27:39.802] result() for ClusterFuture ... done [17:27:39.802] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:39.802] - nx: 4 [17:27:39.802] - relay: TRUE [17:27:39.803] - stdout: TRUE [17:27:39.803] - signal: TRUE [17:27:39.803] - resignal: FALSE [17:27:39.803] - force: TRUE [17:27:39.804] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:39.804] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:39.804] - until=2 [17:27:39.805] - relaying element #2 [17:27:39.805] result() for ClusterFuture ... [17:27:39.805] - result already collected: FutureResult [17:27:39.805] result() for ClusterFuture ... done [17:27:39.806] result() for ClusterFuture ... [17:27:39.806] - result already collected: FutureResult [17:27:39.806] result() for ClusterFuture ... done [17:27:39.807] result() for ClusterFuture ... [17:27:39.807] - result already collected: FutureResult [17:27:39.807] result() for ClusterFuture ... done [17:27:39.807] result() for ClusterFuture ... [17:27:39.808] - result already collected: FutureResult [17:27:39.808] result() for ClusterFuture ... done [17:27:39.808] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.809] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.809] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:39.809] length: 2 (resolved future 2) [17:27:39.810] Future #3 [17:27:39.810] result() for ClusterFuture ... [17:27:39.810] - result already collected: FutureResult [17:27:39.810] result() for ClusterFuture ... done [17:27:39.811] result() for ClusterFuture ... [17:27:39.811] - result already collected: FutureResult [17:27:39.811] result() for ClusterFuture ... done [17:27:39.812] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:39.812] - nx: 4 [17:27:39.812] - relay: TRUE [17:27:39.812] - stdout: TRUE [17:27:39.813] - signal: TRUE [17:27:39.813] - resignal: FALSE [17:27:39.813] - force: TRUE [17:27:39.813] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:39.814] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:39.814] - until=3 [17:27:39.814] - relaying element #3 [17:27:39.815] result() for ClusterFuture ... [17:27:39.815] - result already collected: FutureResult [17:27:39.815] result() for ClusterFuture ... done [17:27:39.815] result() for ClusterFuture ... [17:27:39.816] - result already collected: FutureResult [17:27:39.816] result() for ClusterFuture ... done [17:27:39.816] result() for ClusterFuture ... [17:27:39.817] - result already collected: FutureResult [17:27:39.817] result() for ClusterFuture ... done [17:27:39.817] result() for ClusterFuture ... [17:27:39.817] - result already collected: FutureResult [17:27:39.818] result() for ClusterFuture ... done [17:27:39.818] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.818] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.818] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:39.819] length: 1 (resolved future 3) [17:27:39.819] Future #4 [17:27:39.820] result() for ClusterFuture ... [17:27:39.820] - result already collected: FutureResult [17:27:39.820] result() for ClusterFuture ... done [17:27:39.820] result() for ClusterFuture ... [17:27:39.821] - result already collected: FutureResult [17:27:39.821] result() for ClusterFuture ... done [17:27:39.821] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:39.822] - nx: 4 [17:27:39.822] - relay: TRUE [17:27:39.822] - stdout: TRUE [17:27:39.822] - signal: TRUE [17:27:39.823] - resignal: FALSE [17:27:39.823] - force: TRUE [17:27:39.823] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:39.823] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:39.824] - until=4 [17:27:39.824] - relaying element #4 [17:27:39.824] result() for ClusterFuture ... [17:27:39.825] - result already collected: FutureResult [17:27:39.825] result() for ClusterFuture ... done [17:27:39.825] result() for ClusterFuture ... [17:27:39.825] - result already collected: FutureResult [17:27:39.826] result() for ClusterFuture ... done [17:27:39.826] result() for ClusterFuture ... [17:27:39.826] - result already collected: FutureResult [17:27:39.827] result() for ClusterFuture ... done [17:27:39.827] result() for ClusterFuture ... [17:27:39.827] - result already collected: FutureResult [17:27:39.827] result() for ClusterFuture ... done [17:27:39.828] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.828] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.828] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:39.828] length: 0 (resolved future 4) [17:27:39.829] Relaying remaining futures [17:27:39.829] signalConditionsASAP(NULL, pos=0) ... [17:27:39.829] - nx: 4 [17:27:39.830] - relay: TRUE [17:27:39.830] - stdout: TRUE [17:27:39.830] - signal: TRUE [17:27:39.830] - resignal: FALSE [17:27:39.831] - force: TRUE [17:27:39.831] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.831] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:39.832] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:39.832] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:39.832] signalConditionsASAP(NULL, pos=0) ... done [17:27:39.832] resolve() on environment ... DONE [17:27:39.833] result() for ClusterFuture ... [17:27:39.833] - result already collected: FutureResult [17:27:39.833] result() for ClusterFuture ... done [17:27:39.834] result() for ClusterFuture ... [17:27:39.834] - result already collected: FutureResult [17:27:39.834] result() for ClusterFuture ... done [17:27:39.834] result() for ClusterFuture ... [17:27:39.835] - result already collected: FutureResult [17:27:39.835] result() for ClusterFuture ... done [17:27:39.835] result() for ClusterFuture ... [17:27:39.836] - result already collected: FutureResult [17:27:39.836] result() for ClusterFuture ... done [17:27:39.836] result() for ClusterFuture ... [17:27:39.836] - result already collected: FutureResult [17:27:39.837] result() for ClusterFuture ... done [17:27:39.837] result() for ClusterFuture ... [17:27:39.837] - result already collected: FutureResult [17:27:39.838] result() for ClusterFuture ... done Dimensions: c(2, 1, 3, 1) [17:27:39.839] getGlobalsAndPackages() ... [17:27:39.839] Searching for globals... [17:27:39.840] [17:27:39.840] Searching for globals ... DONE [17:27:39.840] - globals: [0] [17:27:39.840] getGlobalsAndPackages() ... DONE [17:27:39.841] run() for 'Future' ... [17:27:39.841] - state: 'created' [17:27:39.842] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.861] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.862] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.862] - Field: 'node' [17:27:39.863] - Field: 'label' [17:27:39.863] - Field: 'local' [17:27:39.863] - Field: 'owner' [17:27:39.864] - Field: 'envir' [17:27:39.864] - Field: 'workers' [17:27:39.864] - Field: 'packages' [17:27:39.864] - Field: 'gc' [17:27:39.865] - Field: 'conditions' [17:27:39.865] - Field: 'persistent' [17:27:39.865] - Field: 'expr' [17:27:39.866] - Field: 'uuid' [17:27:39.866] - Field: 'seed' [17:27:39.866] - Field: 'version' [17:27:39.867] - Field: 'result' [17:27:39.867] - Field: 'asynchronous' [17:27:39.867] - Field: 'calls' [17:27:39.868] - Field: 'globals' [17:27:39.868] - Field: 'stdout' [17:27:39.868] - Field: 'earlySignal' [17:27:39.868] - Field: 'lazy' [17:27:39.869] - Field: 'state' [17:27:39.869] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.869] - Launch lazy future ... [17:27:39.870] Packages needed by the future expression (n = 0): [17:27:39.870] Packages needed by future strategies (n = 0): [17:27:39.871] { [17:27:39.871] { [17:27:39.871] { [17:27:39.871] ...future.startTime <- base::Sys.time() [17:27:39.871] { [17:27:39.871] { [17:27:39.871] { [17:27:39.871] { [17:27:39.871] base::local({ [17:27:39.871] has_future <- base::requireNamespace("future", [17:27:39.871] quietly = TRUE) [17:27:39.871] if (has_future) { [17:27:39.871] ns <- base::getNamespace("future") [17:27:39.871] version <- ns[[".package"]][["version"]] [17:27:39.871] if (is.null(version)) [17:27:39.871] version <- utils::packageVersion("future") [17:27:39.871] } [17:27:39.871] else { [17:27:39.871] version <- NULL [17:27:39.871] } [17:27:39.871] if (!has_future || version < "1.8.0") { [17:27:39.871] info <- base::c(r_version = base::gsub("R version ", [17:27:39.871] "", base::R.version$version.string), [17:27:39.871] platform = base::sprintf("%s (%s-bit)", [17:27:39.871] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.871] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.871] "release", "version")], collapse = " "), [17:27:39.871] hostname = base::Sys.info()[["nodename"]]) [17:27:39.871] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.871] info) [17:27:39.871] info <- base::paste(info, collapse = "; ") [17:27:39.871] if (!has_future) { [17:27:39.871] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.871] info) [17:27:39.871] } [17:27:39.871] else { [17:27:39.871] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.871] info, version) [17:27:39.871] } [17:27:39.871] base::stop(msg) [17:27:39.871] } [17:27:39.871] }) [17:27:39.871] } [17:27:39.871] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.871] base::options(mc.cores = 1L) [17:27:39.871] } [17:27:39.871] ...future.strategy.old <- future::plan("list") [17:27:39.871] options(future.plan = NULL) [17:27:39.871] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.871] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.871] } [17:27:39.871] ...future.workdir <- getwd() [17:27:39.871] } [17:27:39.871] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.871] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.871] } [17:27:39.871] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.871] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.871] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.871] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.871] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.871] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.871] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.871] base::names(...future.oldOptions)) [17:27:39.871] } [17:27:39.871] if (FALSE) { [17:27:39.871] } [17:27:39.871] else { [17:27:39.871] if (TRUE) { [17:27:39.871] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.871] open = "w") [17:27:39.871] } [17:27:39.871] else { [17:27:39.871] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.871] windows = "NUL", "/dev/null"), open = "w") [17:27:39.871] } [17:27:39.871] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.871] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.871] base::sink(type = "output", split = FALSE) [17:27:39.871] base::close(...future.stdout) [17:27:39.871] }, add = TRUE) [17:27:39.871] } [17:27:39.871] ...future.frame <- base::sys.nframe() [17:27:39.871] ...future.conditions <- base::list() [17:27:39.871] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.871] if (FALSE) { [17:27:39.871] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.871] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.871] } [17:27:39.871] ...future.result <- base::tryCatch({ [17:27:39.871] base::withCallingHandlers({ [17:27:39.871] ...future.value <- base::withVisible(base::local({ [17:27:39.871] ...future.makeSendCondition <- base::local({ [17:27:39.871] sendCondition <- NULL [17:27:39.871] function(frame = 1L) { [17:27:39.871] if (is.function(sendCondition)) [17:27:39.871] return(sendCondition) [17:27:39.871] ns <- getNamespace("parallel") [17:27:39.871] if (exists("sendData", mode = "function", [17:27:39.871] envir = ns)) { [17:27:39.871] parallel_sendData <- get("sendData", mode = "function", [17:27:39.871] envir = ns) [17:27:39.871] envir <- sys.frame(frame) [17:27:39.871] master <- NULL [17:27:39.871] while (!identical(envir, .GlobalEnv) && [17:27:39.871] !identical(envir, emptyenv())) { [17:27:39.871] if (exists("master", mode = "list", envir = envir, [17:27:39.871] inherits = FALSE)) { [17:27:39.871] master <- get("master", mode = "list", [17:27:39.871] envir = envir, inherits = FALSE) [17:27:39.871] if (inherits(master, c("SOCKnode", [17:27:39.871] "SOCK0node"))) { [17:27:39.871] sendCondition <<- function(cond) { [17:27:39.871] data <- list(type = "VALUE", value = cond, [17:27:39.871] success = TRUE) [17:27:39.871] parallel_sendData(master, data) [17:27:39.871] } [17:27:39.871] return(sendCondition) [17:27:39.871] } [17:27:39.871] } [17:27:39.871] frame <- frame + 1L [17:27:39.871] envir <- sys.frame(frame) [17:27:39.871] } [17:27:39.871] } [17:27:39.871] sendCondition <<- function(cond) NULL [17:27:39.871] } [17:27:39.871] }) [17:27:39.871] withCallingHandlers({ [17:27:39.871] 2 [17:27:39.871] }, immediateCondition = function(cond) { [17:27:39.871] sendCondition <- ...future.makeSendCondition() [17:27:39.871] sendCondition(cond) [17:27:39.871] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.871] { [17:27:39.871] inherits <- base::inherits [17:27:39.871] invokeRestart <- base::invokeRestart [17:27:39.871] is.null <- base::is.null [17:27:39.871] muffled <- FALSE [17:27:39.871] if (inherits(cond, "message")) { [17:27:39.871] muffled <- grepl(pattern, "muffleMessage") [17:27:39.871] if (muffled) [17:27:39.871] invokeRestart("muffleMessage") [17:27:39.871] } [17:27:39.871] else if (inherits(cond, "warning")) { [17:27:39.871] muffled <- grepl(pattern, "muffleWarning") [17:27:39.871] if (muffled) [17:27:39.871] invokeRestart("muffleWarning") [17:27:39.871] } [17:27:39.871] else if (inherits(cond, "condition")) { [17:27:39.871] if (!is.null(pattern)) { [17:27:39.871] computeRestarts <- base::computeRestarts [17:27:39.871] grepl <- base::grepl [17:27:39.871] restarts <- computeRestarts(cond) [17:27:39.871] for (restart in restarts) { [17:27:39.871] name <- restart$name [17:27:39.871] if (is.null(name)) [17:27:39.871] next [17:27:39.871] if (!grepl(pattern, name)) [17:27:39.871] next [17:27:39.871] invokeRestart(restart) [17:27:39.871] muffled <- TRUE [17:27:39.871] break [17:27:39.871] } [17:27:39.871] } [17:27:39.871] } [17:27:39.871] invisible(muffled) [17:27:39.871] } [17:27:39.871] muffleCondition(cond) [17:27:39.871] }) [17:27:39.871] })) [17:27:39.871] future::FutureResult(value = ...future.value$value, [17:27:39.871] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.871] ...future.rng), globalenv = if (FALSE) [17:27:39.871] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.871] ...future.globalenv.names)) [17:27:39.871] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.871] }, condition = base::local({ [17:27:39.871] c <- base::c [17:27:39.871] inherits <- base::inherits [17:27:39.871] invokeRestart <- base::invokeRestart [17:27:39.871] length <- base::length [17:27:39.871] list <- base::list [17:27:39.871] seq.int <- base::seq.int [17:27:39.871] signalCondition <- base::signalCondition [17:27:39.871] sys.calls <- base::sys.calls [17:27:39.871] `[[` <- base::`[[` [17:27:39.871] `+` <- base::`+` [17:27:39.871] `<<-` <- base::`<<-` [17:27:39.871] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.871] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.871] 3L)] [17:27:39.871] } [17:27:39.871] function(cond) { [17:27:39.871] is_error <- inherits(cond, "error") [17:27:39.871] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.871] NULL) [17:27:39.871] if (is_error) { [17:27:39.871] sessionInformation <- function() { [17:27:39.871] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.871] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.871] search = base::search(), system = base::Sys.info()) [17:27:39.871] } [17:27:39.871] ...future.conditions[[length(...future.conditions) + [17:27:39.871] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.871] cond$call), session = sessionInformation(), [17:27:39.871] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.871] signalCondition(cond) [17:27:39.871] } [17:27:39.871] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.871] "immediateCondition"))) { [17:27:39.871] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.871] ...future.conditions[[length(...future.conditions) + [17:27:39.871] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.871] if (TRUE && !signal) { [17:27:39.871] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.871] { [17:27:39.871] inherits <- base::inherits [17:27:39.871] invokeRestart <- base::invokeRestart [17:27:39.871] is.null <- base::is.null [17:27:39.871] muffled <- FALSE [17:27:39.871] if (inherits(cond, "message")) { [17:27:39.871] muffled <- grepl(pattern, "muffleMessage") [17:27:39.871] if (muffled) [17:27:39.871] invokeRestart("muffleMessage") [17:27:39.871] } [17:27:39.871] else if (inherits(cond, "warning")) { [17:27:39.871] muffled <- grepl(pattern, "muffleWarning") [17:27:39.871] if (muffled) [17:27:39.871] invokeRestart("muffleWarning") [17:27:39.871] } [17:27:39.871] else if (inherits(cond, "condition")) { [17:27:39.871] if (!is.null(pattern)) { [17:27:39.871] computeRestarts <- base::computeRestarts [17:27:39.871] grepl <- base::grepl [17:27:39.871] restarts <- computeRestarts(cond) [17:27:39.871] for (restart in restarts) { [17:27:39.871] name <- restart$name [17:27:39.871] if (is.null(name)) [17:27:39.871] next [17:27:39.871] if (!grepl(pattern, name)) [17:27:39.871] next [17:27:39.871] invokeRestart(restart) [17:27:39.871] muffled <- TRUE [17:27:39.871] break [17:27:39.871] } [17:27:39.871] } [17:27:39.871] } [17:27:39.871] invisible(muffled) [17:27:39.871] } [17:27:39.871] muffleCondition(cond, pattern = "^muffle") [17:27:39.871] } [17:27:39.871] } [17:27:39.871] else { [17:27:39.871] if (TRUE) { [17:27:39.871] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.871] { [17:27:39.871] inherits <- base::inherits [17:27:39.871] invokeRestart <- base::invokeRestart [17:27:39.871] is.null <- base::is.null [17:27:39.871] muffled <- FALSE [17:27:39.871] if (inherits(cond, "message")) { [17:27:39.871] muffled <- grepl(pattern, "muffleMessage") [17:27:39.871] if (muffled) [17:27:39.871] invokeRestart("muffleMessage") [17:27:39.871] } [17:27:39.871] else if (inherits(cond, "warning")) { [17:27:39.871] muffled <- grepl(pattern, "muffleWarning") [17:27:39.871] if (muffled) [17:27:39.871] invokeRestart("muffleWarning") [17:27:39.871] } [17:27:39.871] else if (inherits(cond, "condition")) { [17:27:39.871] if (!is.null(pattern)) { [17:27:39.871] computeRestarts <- base::computeRestarts [17:27:39.871] grepl <- base::grepl [17:27:39.871] restarts <- computeRestarts(cond) [17:27:39.871] for (restart in restarts) { [17:27:39.871] name <- restart$name [17:27:39.871] if (is.null(name)) [17:27:39.871] next [17:27:39.871] if (!grepl(pattern, name)) [17:27:39.871] next [17:27:39.871] invokeRestart(restart) [17:27:39.871] muffled <- TRUE [17:27:39.871] break [17:27:39.871] } [17:27:39.871] } [17:27:39.871] } [17:27:39.871] invisible(muffled) [17:27:39.871] } [17:27:39.871] muffleCondition(cond, pattern = "^muffle") [17:27:39.871] } [17:27:39.871] } [17:27:39.871] } [17:27:39.871] })) [17:27:39.871] }, error = function(ex) { [17:27:39.871] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.871] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.871] ...future.rng), started = ...future.startTime, [17:27:39.871] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.871] version = "1.8"), class = "FutureResult") [17:27:39.871] }, finally = { [17:27:39.871] if (!identical(...future.workdir, getwd())) [17:27:39.871] setwd(...future.workdir) [17:27:39.871] { [17:27:39.871] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.871] ...future.oldOptions$nwarnings <- NULL [17:27:39.871] } [17:27:39.871] base::options(...future.oldOptions) [17:27:39.871] if (.Platform$OS.type == "windows") { [17:27:39.871] old_names <- names(...future.oldEnvVars) [17:27:39.871] envs <- base::Sys.getenv() [17:27:39.871] names <- names(envs) [17:27:39.871] common <- intersect(names, old_names) [17:27:39.871] added <- setdiff(names, old_names) [17:27:39.871] removed <- setdiff(old_names, names) [17:27:39.871] changed <- common[...future.oldEnvVars[common] != [17:27:39.871] envs[common]] [17:27:39.871] NAMES <- toupper(changed) [17:27:39.871] args <- list() [17:27:39.871] for (kk in seq_along(NAMES)) { [17:27:39.871] name <- changed[[kk]] [17:27:39.871] NAME <- NAMES[[kk]] [17:27:39.871] if (name != NAME && is.element(NAME, old_names)) [17:27:39.871] next [17:27:39.871] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.871] } [17:27:39.871] NAMES <- toupper(added) [17:27:39.871] for (kk in seq_along(NAMES)) { [17:27:39.871] name <- added[[kk]] [17:27:39.871] NAME <- NAMES[[kk]] [17:27:39.871] if (name != NAME && is.element(NAME, old_names)) [17:27:39.871] next [17:27:39.871] args[[name]] <- "" [17:27:39.871] } [17:27:39.871] NAMES <- toupper(removed) [17:27:39.871] for (kk in seq_along(NAMES)) { [17:27:39.871] name <- removed[[kk]] [17:27:39.871] NAME <- NAMES[[kk]] [17:27:39.871] if (name != NAME && is.element(NAME, old_names)) [17:27:39.871] next [17:27:39.871] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.871] } [17:27:39.871] if (length(args) > 0) [17:27:39.871] base::do.call(base::Sys.setenv, args = args) [17:27:39.871] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.871] } [17:27:39.871] else { [17:27:39.871] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.871] } [17:27:39.871] { [17:27:39.871] if (base::length(...future.futureOptionsAdded) > [17:27:39.871] 0L) { [17:27:39.871] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.871] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.871] base::options(opts) [17:27:39.871] } [17:27:39.871] { [17:27:39.871] { [17:27:39.871] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.871] NULL [17:27:39.871] } [17:27:39.871] options(future.plan = NULL) [17:27:39.871] if (is.na(NA_character_)) [17:27:39.871] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.871] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.871] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.871] .init = FALSE) [17:27:39.871] } [17:27:39.871] } [17:27:39.871] } [17:27:39.871] }) [17:27:39.871] if (TRUE) { [17:27:39.871] base::sink(type = "output", split = FALSE) [17:27:39.871] if (TRUE) { [17:27:39.871] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.871] } [17:27:39.871] else { [17:27:39.871] ...future.result["stdout"] <- base::list(NULL) [17:27:39.871] } [17:27:39.871] base::close(...future.stdout) [17:27:39.871] ...future.stdout <- NULL [17:27:39.871] } [17:27:39.871] ...future.result$conditions <- ...future.conditions [17:27:39.871] ...future.result$finished <- base::Sys.time() [17:27:39.871] ...future.result [17:27:39.871] } [17:27:39.881] MultisessionFuture started [17:27:39.881] - Launch lazy future ... done [17:27:39.881] run() for 'MultisessionFuture' ... done [17:27:39.882] getGlobalsAndPackages() ... [17:27:39.882] Searching for globals... [17:27:39.883] [17:27:39.883] Searching for globals ... DONE [17:27:39.883] - globals: [0] [17:27:39.884] getGlobalsAndPackages() ... DONE [17:27:39.884] run() for 'Future' ... [17:27:39.885] - state: 'created' [17:27:39.885] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.907] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.907] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.908] - Field: 'node' [17:27:39.908] - Field: 'label' [17:27:39.909] - Field: 'local' [17:27:39.909] - Field: 'owner' [17:27:39.909] - Field: 'envir' [17:27:39.910] - Field: 'workers' [17:27:39.910] - Field: 'packages' [17:27:39.911] - Field: 'gc' [17:27:39.911] - Field: 'conditions' [17:27:39.911] - Field: 'persistent' [17:27:39.912] - Field: 'expr' [17:27:39.912] - Field: 'uuid' [17:27:39.912] - Field: 'seed' [17:27:39.913] - Field: 'version' [17:27:39.913] - Field: 'result' [17:27:39.914] - Field: 'asynchronous' [17:27:39.914] - Field: 'calls' [17:27:39.914] - Field: 'globals' [17:27:39.915] - Field: 'stdout' [17:27:39.915] - Field: 'earlySignal' [17:27:39.915] - Field: 'lazy' [17:27:39.916] - Field: 'state' [17:27:39.916] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.917] - Launch lazy future ... [17:27:39.917] Packages needed by the future expression (n = 0): [17:27:39.918] Packages needed by future strategies (n = 0): [17:27:39.919] { [17:27:39.919] { [17:27:39.919] { [17:27:39.919] ...future.startTime <- base::Sys.time() [17:27:39.919] { [17:27:39.919] { [17:27:39.919] { [17:27:39.919] { [17:27:39.919] base::local({ [17:27:39.919] has_future <- base::requireNamespace("future", [17:27:39.919] quietly = TRUE) [17:27:39.919] if (has_future) { [17:27:39.919] ns <- base::getNamespace("future") [17:27:39.919] version <- ns[[".package"]][["version"]] [17:27:39.919] if (is.null(version)) [17:27:39.919] version <- utils::packageVersion("future") [17:27:39.919] } [17:27:39.919] else { [17:27:39.919] version <- NULL [17:27:39.919] } [17:27:39.919] if (!has_future || version < "1.8.0") { [17:27:39.919] info <- base::c(r_version = base::gsub("R version ", [17:27:39.919] "", base::R.version$version.string), [17:27:39.919] platform = base::sprintf("%s (%s-bit)", [17:27:39.919] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.919] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.919] "release", "version")], collapse = " "), [17:27:39.919] hostname = base::Sys.info()[["nodename"]]) [17:27:39.919] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.919] info) [17:27:39.919] info <- base::paste(info, collapse = "; ") [17:27:39.919] if (!has_future) { [17:27:39.919] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.919] info) [17:27:39.919] } [17:27:39.919] else { [17:27:39.919] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.919] info, version) [17:27:39.919] } [17:27:39.919] base::stop(msg) [17:27:39.919] } [17:27:39.919] }) [17:27:39.919] } [17:27:39.919] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.919] base::options(mc.cores = 1L) [17:27:39.919] } [17:27:39.919] ...future.strategy.old <- future::plan("list") [17:27:39.919] options(future.plan = NULL) [17:27:39.919] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.919] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.919] } [17:27:39.919] ...future.workdir <- getwd() [17:27:39.919] } [17:27:39.919] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.919] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.919] } [17:27:39.919] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.919] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.919] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.919] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.919] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.919] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.919] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.919] base::names(...future.oldOptions)) [17:27:39.919] } [17:27:39.919] if (FALSE) { [17:27:39.919] } [17:27:39.919] else { [17:27:39.919] if (TRUE) { [17:27:39.919] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.919] open = "w") [17:27:39.919] } [17:27:39.919] else { [17:27:39.919] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.919] windows = "NUL", "/dev/null"), open = "w") [17:27:39.919] } [17:27:39.919] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.919] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.919] base::sink(type = "output", split = FALSE) [17:27:39.919] base::close(...future.stdout) [17:27:39.919] }, add = TRUE) [17:27:39.919] } [17:27:39.919] ...future.frame <- base::sys.nframe() [17:27:39.919] ...future.conditions <- base::list() [17:27:39.919] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.919] if (FALSE) { [17:27:39.919] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.919] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.919] } [17:27:39.919] ...future.result <- base::tryCatch({ [17:27:39.919] base::withCallingHandlers({ [17:27:39.919] ...future.value <- base::withVisible(base::local({ [17:27:39.919] ...future.makeSendCondition <- base::local({ [17:27:39.919] sendCondition <- NULL [17:27:39.919] function(frame = 1L) { [17:27:39.919] if (is.function(sendCondition)) [17:27:39.919] return(sendCondition) [17:27:39.919] ns <- getNamespace("parallel") [17:27:39.919] if (exists("sendData", mode = "function", [17:27:39.919] envir = ns)) { [17:27:39.919] parallel_sendData <- get("sendData", mode = "function", [17:27:39.919] envir = ns) [17:27:39.919] envir <- sys.frame(frame) [17:27:39.919] master <- NULL [17:27:39.919] while (!identical(envir, .GlobalEnv) && [17:27:39.919] !identical(envir, emptyenv())) { [17:27:39.919] if (exists("master", mode = "list", envir = envir, [17:27:39.919] inherits = FALSE)) { [17:27:39.919] master <- get("master", mode = "list", [17:27:39.919] envir = envir, inherits = FALSE) [17:27:39.919] if (inherits(master, c("SOCKnode", [17:27:39.919] "SOCK0node"))) { [17:27:39.919] sendCondition <<- function(cond) { [17:27:39.919] data <- list(type = "VALUE", value = cond, [17:27:39.919] success = TRUE) [17:27:39.919] parallel_sendData(master, data) [17:27:39.919] } [17:27:39.919] return(sendCondition) [17:27:39.919] } [17:27:39.919] } [17:27:39.919] frame <- frame + 1L [17:27:39.919] envir <- sys.frame(frame) [17:27:39.919] } [17:27:39.919] } [17:27:39.919] sendCondition <<- function(cond) NULL [17:27:39.919] } [17:27:39.919] }) [17:27:39.919] withCallingHandlers({ [17:27:39.919] NULL [17:27:39.919] }, immediateCondition = function(cond) { [17:27:39.919] sendCondition <- ...future.makeSendCondition() [17:27:39.919] sendCondition(cond) [17:27:39.919] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.919] { [17:27:39.919] inherits <- base::inherits [17:27:39.919] invokeRestart <- base::invokeRestart [17:27:39.919] is.null <- base::is.null [17:27:39.919] muffled <- FALSE [17:27:39.919] if (inherits(cond, "message")) { [17:27:39.919] muffled <- grepl(pattern, "muffleMessage") [17:27:39.919] if (muffled) [17:27:39.919] invokeRestart("muffleMessage") [17:27:39.919] } [17:27:39.919] else if (inherits(cond, "warning")) { [17:27:39.919] muffled <- grepl(pattern, "muffleWarning") [17:27:39.919] if (muffled) [17:27:39.919] invokeRestart("muffleWarning") [17:27:39.919] } [17:27:39.919] else if (inherits(cond, "condition")) { [17:27:39.919] if (!is.null(pattern)) { [17:27:39.919] computeRestarts <- base::computeRestarts [17:27:39.919] grepl <- base::grepl [17:27:39.919] restarts <- computeRestarts(cond) [17:27:39.919] for (restart in restarts) { [17:27:39.919] name <- restart$name [17:27:39.919] if (is.null(name)) [17:27:39.919] next [17:27:39.919] if (!grepl(pattern, name)) [17:27:39.919] next [17:27:39.919] invokeRestart(restart) [17:27:39.919] muffled <- TRUE [17:27:39.919] break [17:27:39.919] } [17:27:39.919] } [17:27:39.919] } [17:27:39.919] invisible(muffled) [17:27:39.919] } [17:27:39.919] muffleCondition(cond) [17:27:39.919] }) [17:27:39.919] })) [17:27:39.919] future::FutureResult(value = ...future.value$value, [17:27:39.919] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.919] ...future.rng), globalenv = if (FALSE) [17:27:39.919] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.919] ...future.globalenv.names)) [17:27:39.919] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.919] }, condition = base::local({ [17:27:39.919] c <- base::c [17:27:39.919] inherits <- base::inherits [17:27:39.919] invokeRestart <- base::invokeRestart [17:27:39.919] length <- base::length [17:27:39.919] list <- base::list [17:27:39.919] seq.int <- base::seq.int [17:27:39.919] signalCondition <- base::signalCondition [17:27:39.919] sys.calls <- base::sys.calls [17:27:39.919] `[[` <- base::`[[` [17:27:39.919] `+` <- base::`+` [17:27:39.919] `<<-` <- base::`<<-` [17:27:39.919] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.919] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.919] 3L)] [17:27:39.919] } [17:27:39.919] function(cond) { [17:27:39.919] is_error <- inherits(cond, "error") [17:27:39.919] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.919] NULL) [17:27:39.919] if (is_error) { [17:27:39.919] sessionInformation <- function() { [17:27:39.919] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.919] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.919] search = base::search(), system = base::Sys.info()) [17:27:39.919] } [17:27:39.919] ...future.conditions[[length(...future.conditions) + [17:27:39.919] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.919] cond$call), session = sessionInformation(), [17:27:39.919] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.919] signalCondition(cond) [17:27:39.919] } [17:27:39.919] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.919] "immediateCondition"))) { [17:27:39.919] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.919] ...future.conditions[[length(...future.conditions) + [17:27:39.919] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.919] if (TRUE && !signal) { [17:27:39.919] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.919] { [17:27:39.919] inherits <- base::inherits [17:27:39.919] invokeRestart <- base::invokeRestart [17:27:39.919] is.null <- base::is.null [17:27:39.919] muffled <- FALSE [17:27:39.919] if (inherits(cond, "message")) { [17:27:39.919] muffled <- grepl(pattern, "muffleMessage") [17:27:39.919] if (muffled) [17:27:39.919] invokeRestart("muffleMessage") [17:27:39.919] } [17:27:39.919] else if (inherits(cond, "warning")) { [17:27:39.919] muffled <- grepl(pattern, "muffleWarning") [17:27:39.919] if (muffled) [17:27:39.919] invokeRestart("muffleWarning") [17:27:39.919] } [17:27:39.919] else if (inherits(cond, "condition")) { [17:27:39.919] if (!is.null(pattern)) { [17:27:39.919] computeRestarts <- base::computeRestarts [17:27:39.919] grepl <- base::grepl [17:27:39.919] restarts <- computeRestarts(cond) [17:27:39.919] for (restart in restarts) { [17:27:39.919] name <- restart$name [17:27:39.919] if (is.null(name)) [17:27:39.919] next [17:27:39.919] if (!grepl(pattern, name)) [17:27:39.919] next [17:27:39.919] invokeRestart(restart) [17:27:39.919] muffled <- TRUE [17:27:39.919] break [17:27:39.919] } [17:27:39.919] } [17:27:39.919] } [17:27:39.919] invisible(muffled) [17:27:39.919] } [17:27:39.919] muffleCondition(cond, pattern = "^muffle") [17:27:39.919] } [17:27:39.919] } [17:27:39.919] else { [17:27:39.919] if (TRUE) { [17:27:39.919] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.919] { [17:27:39.919] inherits <- base::inherits [17:27:39.919] invokeRestart <- base::invokeRestart [17:27:39.919] is.null <- base::is.null [17:27:39.919] muffled <- FALSE [17:27:39.919] if (inherits(cond, "message")) { [17:27:39.919] muffled <- grepl(pattern, "muffleMessage") [17:27:39.919] if (muffled) [17:27:39.919] invokeRestart("muffleMessage") [17:27:39.919] } [17:27:39.919] else if (inherits(cond, "warning")) { [17:27:39.919] muffled <- grepl(pattern, "muffleWarning") [17:27:39.919] if (muffled) [17:27:39.919] invokeRestart("muffleWarning") [17:27:39.919] } [17:27:39.919] else if (inherits(cond, "condition")) { [17:27:39.919] if (!is.null(pattern)) { [17:27:39.919] computeRestarts <- base::computeRestarts [17:27:39.919] grepl <- base::grepl [17:27:39.919] restarts <- computeRestarts(cond) [17:27:39.919] for (restart in restarts) { [17:27:39.919] name <- restart$name [17:27:39.919] if (is.null(name)) [17:27:39.919] next [17:27:39.919] if (!grepl(pattern, name)) [17:27:39.919] next [17:27:39.919] invokeRestart(restart) [17:27:39.919] muffled <- TRUE [17:27:39.919] break [17:27:39.919] } [17:27:39.919] } [17:27:39.919] } [17:27:39.919] invisible(muffled) [17:27:39.919] } [17:27:39.919] muffleCondition(cond, pattern = "^muffle") [17:27:39.919] } [17:27:39.919] } [17:27:39.919] } [17:27:39.919] })) [17:27:39.919] }, error = function(ex) { [17:27:39.919] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.919] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.919] ...future.rng), started = ...future.startTime, [17:27:39.919] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.919] version = "1.8"), class = "FutureResult") [17:27:39.919] }, finally = { [17:27:39.919] if (!identical(...future.workdir, getwd())) [17:27:39.919] setwd(...future.workdir) [17:27:39.919] { [17:27:39.919] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.919] ...future.oldOptions$nwarnings <- NULL [17:27:39.919] } [17:27:39.919] base::options(...future.oldOptions) [17:27:39.919] if (.Platform$OS.type == "windows") { [17:27:39.919] old_names <- names(...future.oldEnvVars) [17:27:39.919] envs <- base::Sys.getenv() [17:27:39.919] names <- names(envs) [17:27:39.919] common <- intersect(names, old_names) [17:27:39.919] added <- setdiff(names, old_names) [17:27:39.919] removed <- setdiff(old_names, names) [17:27:39.919] changed <- common[...future.oldEnvVars[common] != [17:27:39.919] envs[common]] [17:27:39.919] NAMES <- toupper(changed) [17:27:39.919] args <- list() [17:27:39.919] for (kk in seq_along(NAMES)) { [17:27:39.919] name <- changed[[kk]] [17:27:39.919] NAME <- NAMES[[kk]] [17:27:39.919] if (name != NAME && is.element(NAME, old_names)) [17:27:39.919] next [17:27:39.919] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.919] } [17:27:39.919] NAMES <- toupper(added) [17:27:39.919] for (kk in seq_along(NAMES)) { [17:27:39.919] name <- added[[kk]] [17:27:39.919] NAME <- NAMES[[kk]] [17:27:39.919] if (name != NAME && is.element(NAME, old_names)) [17:27:39.919] next [17:27:39.919] args[[name]] <- "" [17:27:39.919] } [17:27:39.919] NAMES <- toupper(removed) [17:27:39.919] for (kk in seq_along(NAMES)) { [17:27:39.919] name <- removed[[kk]] [17:27:39.919] NAME <- NAMES[[kk]] [17:27:39.919] if (name != NAME && is.element(NAME, old_names)) [17:27:39.919] next [17:27:39.919] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.919] } [17:27:39.919] if (length(args) > 0) [17:27:39.919] base::do.call(base::Sys.setenv, args = args) [17:27:39.919] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.919] } [17:27:39.919] else { [17:27:39.919] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.919] } [17:27:39.919] { [17:27:39.919] if (base::length(...future.futureOptionsAdded) > [17:27:39.919] 0L) { [17:27:39.919] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.919] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.919] base::options(opts) [17:27:39.919] } [17:27:39.919] { [17:27:39.919] { [17:27:39.919] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.919] NULL [17:27:39.919] } [17:27:39.919] options(future.plan = NULL) [17:27:39.919] if (is.na(NA_character_)) [17:27:39.919] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.919] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.919] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.919] .init = FALSE) [17:27:39.919] } [17:27:39.919] } [17:27:39.919] } [17:27:39.919] }) [17:27:39.919] if (TRUE) { [17:27:39.919] base::sink(type = "output", split = FALSE) [17:27:39.919] if (TRUE) { [17:27:39.919] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.919] } [17:27:39.919] else { [17:27:39.919] ...future.result["stdout"] <- base::list(NULL) [17:27:39.919] } [17:27:39.919] base::close(...future.stdout) [17:27:39.919] ...future.stdout <- NULL [17:27:39.919] } [17:27:39.919] ...future.result$conditions <- ...future.conditions [17:27:39.919] ...future.result$finished <- base::Sys.time() [17:27:39.919] ...future.result [17:27:39.919] } [17:27:39.931] MultisessionFuture started [17:27:39.931] - Launch lazy future ... done [17:27:39.931] run() for 'MultisessionFuture' ... done [17:27:39.932] getGlobalsAndPackages() ... [17:27:39.932] Searching for globals... [17:27:39.934] - globals found: [1] '{' [17:27:39.934] Searching for globals ... DONE [17:27:39.934] Resolving globals: FALSE [17:27:39.935] [17:27:39.935] [17:27:39.935] getGlobalsAndPackages() ... DONE [17:27:39.936] run() for 'Future' ... [17:27:39.936] - state: 'created' [17:27:39.937] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:39.960] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:39.960] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:39.961] - Field: 'node' [17:27:39.961] - Field: 'label' [17:27:39.961] - Field: 'local' [17:27:39.961] - Field: 'owner' [17:27:39.961] - Field: 'envir' [17:27:39.961] - Field: 'workers' [17:27:39.962] - Field: 'packages' [17:27:39.962] - Field: 'gc' [17:27:39.962] - Field: 'conditions' [17:27:39.962] - Field: 'persistent' [17:27:39.962] - Field: 'expr' [17:27:39.962] - Field: 'uuid' [17:27:39.963] - Field: 'seed' [17:27:39.963] - Field: 'version' [17:27:39.963] - Field: 'result' [17:27:39.963] - Field: 'asynchronous' [17:27:39.963] - Field: 'calls' [17:27:39.963] - Field: 'globals' [17:27:39.964] - Field: 'stdout' [17:27:39.964] - Field: 'earlySignal' [17:27:39.964] - Field: 'lazy' [17:27:39.964] - Field: 'state' [17:27:39.964] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:39.964] - Launch lazy future ... [17:27:39.965] Packages needed by the future expression (n = 0): [17:27:39.965] Packages needed by future strategies (n = 0): [17:27:39.966] { [17:27:39.966] { [17:27:39.966] { [17:27:39.966] ...future.startTime <- base::Sys.time() [17:27:39.966] { [17:27:39.966] { [17:27:39.966] { [17:27:39.966] { [17:27:39.966] base::local({ [17:27:39.966] has_future <- base::requireNamespace("future", [17:27:39.966] quietly = TRUE) [17:27:39.966] if (has_future) { [17:27:39.966] ns <- base::getNamespace("future") [17:27:39.966] version <- ns[[".package"]][["version"]] [17:27:39.966] if (is.null(version)) [17:27:39.966] version <- utils::packageVersion("future") [17:27:39.966] } [17:27:39.966] else { [17:27:39.966] version <- NULL [17:27:39.966] } [17:27:39.966] if (!has_future || version < "1.8.0") { [17:27:39.966] info <- base::c(r_version = base::gsub("R version ", [17:27:39.966] "", base::R.version$version.string), [17:27:39.966] platform = base::sprintf("%s (%s-bit)", [17:27:39.966] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:39.966] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:39.966] "release", "version")], collapse = " "), [17:27:39.966] hostname = base::Sys.info()[["nodename"]]) [17:27:39.966] info <- base::sprintf("%s: %s", base::names(info), [17:27:39.966] info) [17:27:39.966] info <- base::paste(info, collapse = "; ") [17:27:39.966] if (!has_future) { [17:27:39.966] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:39.966] info) [17:27:39.966] } [17:27:39.966] else { [17:27:39.966] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:39.966] info, version) [17:27:39.966] } [17:27:39.966] base::stop(msg) [17:27:39.966] } [17:27:39.966] }) [17:27:39.966] } [17:27:39.966] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:39.966] base::options(mc.cores = 1L) [17:27:39.966] } [17:27:39.966] ...future.strategy.old <- future::plan("list") [17:27:39.966] options(future.plan = NULL) [17:27:39.966] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.966] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:39.966] } [17:27:39.966] ...future.workdir <- getwd() [17:27:39.966] } [17:27:39.966] ...future.oldOptions <- base::as.list(base::.Options) [17:27:39.966] ...future.oldEnvVars <- base::Sys.getenv() [17:27:39.966] } [17:27:39.966] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:39.966] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:39.966] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:39.966] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:39.966] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:39.966] future.stdout.windows.reencode = NULL, width = 80L) [17:27:39.966] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:39.966] base::names(...future.oldOptions)) [17:27:39.966] } [17:27:39.966] if (FALSE) { [17:27:39.966] } [17:27:39.966] else { [17:27:39.966] if (TRUE) { [17:27:39.966] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:39.966] open = "w") [17:27:39.966] } [17:27:39.966] else { [17:27:39.966] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:39.966] windows = "NUL", "/dev/null"), open = "w") [17:27:39.966] } [17:27:39.966] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:39.966] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:39.966] base::sink(type = "output", split = FALSE) [17:27:39.966] base::close(...future.stdout) [17:27:39.966] }, add = TRUE) [17:27:39.966] } [17:27:39.966] ...future.frame <- base::sys.nframe() [17:27:39.966] ...future.conditions <- base::list() [17:27:39.966] ...future.rng <- base::globalenv()$.Random.seed [17:27:39.966] if (FALSE) { [17:27:39.966] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:39.966] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:39.966] } [17:27:39.966] ...future.result <- base::tryCatch({ [17:27:39.966] base::withCallingHandlers({ [17:27:39.966] ...future.value <- base::withVisible(base::local({ [17:27:39.966] ...future.makeSendCondition <- base::local({ [17:27:39.966] sendCondition <- NULL [17:27:39.966] function(frame = 1L) { [17:27:39.966] if (is.function(sendCondition)) [17:27:39.966] return(sendCondition) [17:27:39.966] ns <- getNamespace("parallel") [17:27:39.966] if (exists("sendData", mode = "function", [17:27:39.966] envir = ns)) { [17:27:39.966] parallel_sendData <- get("sendData", mode = "function", [17:27:39.966] envir = ns) [17:27:39.966] envir <- sys.frame(frame) [17:27:39.966] master <- NULL [17:27:39.966] while (!identical(envir, .GlobalEnv) && [17:27:39.966] !identical(envir, emptyenv())) { [17:27:39.966] if (exists("master", mode = "list", envir = envir, [17:27:39.966] inherits = FALSE)) { [17:27:39.966] master <- get("master", mode = "list", [17:27:39.966] envir = envir, inherits = FALSE) [17:27:39.966] if (inherits(master, c("SOCKnode", [17:27:39.966] "SOCK0node"))) { [17:27:39.966] sendCondition <<- function(cond) { [17:27:39.966] data <- list(type = "VALUE", value = cond, [17:27:39.966] success = TRUE) [17:27:39.966] parallel_sendData(master, data) [17:27:39.966] } [17:27:39.966] return(sendCondition) [17:27:39.966] } [17:27:39.966] } [17:27:39.966] frame <- frame + 1L [17:27:39.966] envir <- sys.frame(frame) [17:27:39.966] } [17:27:39.966] } [17:27:39.966] sendCondition <<- function(cond) NULL [17:27:39.966] } [17:27:39.966] }) [17:27:39.966] withCallingHandlers({ [17:27:39.966] { [17:27:39.966] 4 [17:27:39.966] } [17:27:39.966] }, immediateCondition = function(cond) { [17:27:39.966] sendCondition <- ...future.makeSendCondition() [17:27:39.966] sendCondition(cond) [17:27:39.966] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.966] { [17:27:39.966] inherits <- base::inherits [17:27:39.966] invokeRestart <- base::invokeRestart [17:27:39.966] is.null <- base::is.null [17:27:39.966] muffled <- FALSE [17:27:39.966] if (inherits(cond, "message")) { [17:27:39.966] muffled <- grepl(pattern, "muffleMessage") [17:27:39.966] if (muffled) [17:27:39.966] invokeRestart("muffleMessage") [17:27:39.966] } [17:27:39.966] else if (inherits(cond, "warning")) { [17:27:39.966] muffled <- grepl(pattern, "muffleWarning") [17:27:39.966] if (muffled) [17:27:39.966] invokeRestart("muffleWarning") [17:27:39.966] } [17:27:39.966] else if (inherits(cond, "condition")) { [17:27:39.966] if (!is.null(pattern)) { [17:27:39.966] computeRestarts <- base::computeRestarts [17:27:39.966] grepl <- base::grepl [17:27:39.966] restarts <- computeRestarts(cond) [17:27:39.966] for (restart in restarts) { [17:27:39.966] name <- restart$name [17:27:39.966] if (is.null(name)) [17:27:39.966] next [17:27:39.966] if (!grepl(pattern, name)) [17:27:39.966] next [17:27:39.966] invokeRestart(restart) [17:27:39.966] muffled <- TRUE [17:27:39.966] break [17:27:39.966] } [17:27:39.966] } [17:27:39.966] } [17:27:39.966] invisible(muffled) [17:27:39.966] } [17:27:39.966] muffleCondition(cond) [17:27:39.966] }) [17:27:39.966] })) [17:27:39.966] future::FutureResult(value = ...future.value$value, [17:27:39.966] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.966] ...future.rng), globalenv = if (FALSE) [17:27:39.966] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:39.966] ...future.globalenv.names)) [17:27:39.966] else NULL, started = ...future.startTime, version = "1.8") [17:27:39.966] }, condition = base::local({ [17:27:39.966] c <- base::c [17:27:39.966] inherits <- base::inherits [17:27:39.966] invokeRestart <- base::invokeRestart [17:27:39.966] length <- base::length [17:27:39.966] list <- base::list [17:27:39.966] seq.int <- base::seq.int [17:27:39.966] signalCondition <- base::signalCondition [17:27:39.966] sys.calls <- base::sys.calls [17:27:39.966] `[[` <- base::`[[` [17:27:39.966] `+` <- base::`+` [17:27:39.966] `<<-` <- base::`<<-` [17:27:39.966] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:39.966] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:39.966] 3L)] [17:27:39.966] } [17:27:39.966] function(cond) { [17:27:39.966] is_error <- inherits(cond, "error") [17:27:39.966] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:39.966] NULL) [17:27:39.966] if (is_error) { [17:27:39.966] sessionInformation <- function() { [17:27:39.966] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:39.966] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:39.966] search = base::search(), system = base::Sys.info()) [17:27:39.966] } [17:27:39.966] ...future.conditions[[length(...future.conditions) + [17:27:39.966] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:39.966] cond$call), session = sessionInformation(), [17:27:39.966] timestamp = base::Sys.time(), signaled = 0L) [17:27:39.966] signalCondition(cond) [17:27:39.966] } [17:27:39.966] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:39.966] "immediateCondition"))) { [17:27:39.966] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:39.966] ...future.conditions[[length(...future.conditions) + [17:27:39.966] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:39.966] if (TRUE && !signal) { [17:27:39.966] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.966] { [17:27:39.966] inherits <- base::inherits [17:27:39.966] invokeRestart <- base::invokeRestart [17:27:39.966] is.null <- base::is.null [17:27:39.966] muffled <- FALSE [17:27:39.966] if (inherits(cond, "message")) { [17:27:39.966] muffled <- grepl(pattern, "muffleMessage") [17:27:39.966] if (muffled) [17:27:39.966] invokeRestart("muffleMessage") [17:27:39.966] } [17:27:39.966] else if (inherits(cond, "warning")) { [17:27:39.966] muffled <- grepl(pattern, "muffleWarning") [17:27:39.966] if (muffled) [17:27:39.966] invokeRestart("muffleWarning") [17:27:39.966] } [17:27:39.966] else if (inherits(cond, "condition")) { [17:27:39.966] if (!is.null(pattern)) { [17:27:39.966] computeRestarts <- base::computeRestarts [17:27:39.966] grepl <- base::grepl [17:27:39.966] restarts <- computeRestarts(cond) [17:27:39.966] for (restart in restarts) { [17:27:39.966] name <- restart$name [17:27:39.966] if (is.null(name)) [17:27:39.966] next [17:27:39.966] if (!grepl(pattern, name)) [17:27:39.966] next [17:27:39.966] invokeRestart(restart) [17:27:39.966] muffled <- TRUE [17:27:39.966] break [17:27:39.966] } [17:27:39.966] } [17:27:39.966] } [17:27:39.966] invisible(muffled) [17:27:39.966] } [17:27:39.966] muffleCondition(cond, pattern = "^muffle") [17:27:39.966] } [17:27:39.966] } [17:27:39.966] else { [17:27:39.966] if (TRUE) { [17:27:39.966] muffleCondition <- function (cond, pattern = "^muffle") [17:27:39.966] { [17:27:39.966] inherits <- base::inherits [17:27:39.966] invokeRestart <- base::invokeRestart [17:27:39.966] is.null <- base::is.null [17:27:39.966] muffled <- FALSE [17:27:39.966] if (inherits(cond, "message")) { [17:27:39.966] muffled <- grepl(pattern, "muffleMessage") [17:27:39.966] if (muffled) [17:27:39.966] invokeRestart("muffleMessage") [17:27:39.966] } [17:27:39.966] else if (inherits(cond, "warning")) { [17:27:39.966] muffled <- grepl(pattern, "muffleWarning") [17:27:39.966] if (muffled) [17:27:39.966] invokeRestart("muffleWarning") [17:27:39.966] } [17:27:39.966] else if (inherits(cond, "condition")) { [17:27:39.966] if (!is.null(pattern)) { [17:27:39.966] computeRestarts <- base::computeRestarts [17:27:39.966] grepl <- base::grepl [17:27:39.966] restarts <- computeRestarts(cond) [17:27:39.966] for (restart in restarts) { [17:27:39.966] name <- restart$name [17:27:39.966] if (is.null(name)) [17:27:39.966] next [17:27:39.966] if (!grepl(pattern, name)) [17:27:39.966] next [17:27:39.966] invokeRestart(restart) [17:27:39.966] muffled <- TRUE [17:27:39.966] break [17:27:39.966] } [17:27:39.966] } [17:27:39.966] } [17:27:39.966] invisible(muffled) [17:27:39.966] } [17:27:39.966] muffleCondition(cond, pattern = "^muffle") [17:27:39.966] } [17:27:39.966] } [17:27:39.966] } [17:27:39.966] })) [17:27:39.966] }, error = function(ex) { [17:27:39.966] base::structure(base::list(value = NULL, visible = NULL, [17:27:39.966] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:39.966] ...future.rng), started = ...future.startTime, [17:27:39.966] finished = Sys.time(), session_uuid = NA_character_, [17:27:39.966] version = "1.8"), class = "FutureResult") [17:27:39.966] }, finally = { [17:27:39.966] if (!identical(...future.workdir, getwd())) [17:27:39.966] setwd(...future.workdir) [17:27:39.966] { [17:27:39.966] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:39.966] ...future.oldOptions$nwarnings <- NULL [17:27:39.966] } [17:27:39.966] base::options(...future.oldOptions) [17:27:39.966] if (.Platform$OS.type == "windows") { [17:27:39.966] old_names <- names(...future.oldEnvVars) [17:27:39.966] envs <- base::Sys.getenv() [17:27:39.966] names <- names(envs) [17:27:39.966] common <- intersect(names, old_names) [17:27:39.966] added <- setdiff(names, old_names) [17:27:39.966] removed <- setdiff(old_names, names) [17:27:39.966] changed <- common[...future.oldEnvVars[common] != [17:27:39.966] envs[common]] [17:27:39.966] NAMES <- toupper(changed) [17:27:39.966] args <- list() [17:27:39.966] for (kk in seq_along(NAMES)) { [17:27:39.966] name <- changed[[kk]] [17:27:39.966] NAME <- NAMES[[kk]] [17:27:39.966] if (name != NAME && is.element(NAME, old_names)) [17:27:39.966] next [17:27:39.966] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.966] } [17:27:39.966] NAMES <- toupper(added) [17:27:39.966] for (kk in seq_along(NAMES)) { [17:27:39.966] name <- added[[kk]] [17:27:39.966] NAME <- NAMES[[kk]] [17:27:39.966] if (name != NAME && is.element(NAME, old_names)) [17:27:39.966] next [17:27:39.966] args[[name]] <- "" [17:27:39.966] } [17:27:39.966] NAMES <- toupper(removed) [17:27:39.966] for (kk in seq_along(NAMES)) { [17:27:39.966] name <- removed[[kk]] [17:27:39.966] NAME <- NAMES[[kk]] [17:27:39.966] if (name != NAME && is.element(NAME, old_names)) [17:27:39.966] next [17:27:39.966] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:39.966] } [17:27:39.966] if (length(args) > 0) [17:27:39.966] base::do.call(base::Sys.setenv, args = args) [17:27:39.966] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:39.966] } [17:27:39.966] else { [17:27:39.966] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:39.966] } [17:27:39.966] { [17:27:39.966] if (base::length(...future.futureOptionsAdded) > [17:27:39.966] 0L) { [17:27:39.966] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:39.966] base::names(opts) <- ...future.futureOptionsAdded [17:27:39.966] base::options(opts) [17:27:39.966] } [17:27:39.966] { [17:27:39.966] { [17:27:39.966] base::options(mc.cores = ...future.mc.cores.old) [17:27:39.966] NULL [17:27:39.966] } [17:27:39.966] options(future.plan = NULL) [17:27:39.966] if (is.na(NA_character_)) [17:27:39.966] Sys.unsetenv("R_FUTURE_PLAN") [17:27:39.966] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:39.966] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:39.966] .init = FALSE) [17:27:39.966] } [17:27:39.966] } [17:27:39.966] } [17:27:39.966] }) [17:27:39.966] if (TRUE) { [17:27:39.966] base::sink(type = "output", split = FALSE) [17:27:39.966] if (TRUE) { [17:27:39.966] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:39.966] } [17:27:39.966] else { [17:27:39.966] ...future.result["stdout"] <- base::list(NULL) [17:27:39.966] } [17:27:39.966] base::close(...future.stdout) [17:27:39.966] ...future.stdout <- NULL [17:27:39.966] } [17:27:39.966] ...future.result$conditions <- ...future.conditions [17:27:39.966] ...future.result$finished <- base::Sys.time() [17:27:39.966] ...future.result [17:27:39.966] } [17:27:39.971] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:39.986] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.987] - Validating connection of MultisessionFuture [17:27:39.987] - received message: FutureResult [17:27:39.987] - Received FutureResult [17:27:39.988] - Erased future from FutureRegistry [17:27:39.988] result() for ClusterFuture ... [17:27:39.988] - result already collected: FutureResult [17:27:39.988] result() for ClusterFuture ... done [17:27:39.989] receiveMessageFromWorker() for ClusterFuture ... done [17:27:39.989] result() for ClusterFuture ... [17:27:39.989] - result already collected: FutureResult [17:27:39.990] result() for ClusterFuture ... done [17:27:39.990] result() for ClusterFuture ... [17:27:39.990] - result already collected: FutureResult [17:27:39.990] result() for ClusterFuture ... done [17:27:39.993] MultisessionFuture started [17:27:39.993] - Launch lazy future ... done [17:27:39.993] run() for 'MultisessionFuture' ... done [17:27:39.996] receiveMessageFromWorker() for ClusterFuture ... [17:27:39.997] - Validating connection of MultisessionFuture [17:27:39.997] - received message: FutureResult [17:27:39.997] - Received FutureResult [17:27:39.998] - Erased future from FutureRegistry [17:27:39.998] result() for ClusterFuture ... [17:27:39.998] - result already collected: FutureResult [17:27:39.998] result() for ClusterFuture ... done [17:27:39.998] receiveMessageFromWorker() for ClusterFuture ... done [17:27:40.022] receiveMessageFromWorker() for ClusterFuture ... [17:27:40.023] - Validating connection of MultisessionFuture [17:27:40.024] - received message: FutureResult [17:27:40.024] - Received FutureResult [17:27:40.025] - Erased future from FutureRegistry [17:27:40.025] result() for ClusterFuture ... [17:27:40.025] - result already collected: FutureResult [17:27:40.025] result() for ClusterFuture ... done [17:27:40.026] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [17:27:40.028] resolve() on environment ... [17:27:40.029] recursive: 0 [17:27:40.030] elements: [4] 'a', 'b', 'c', 'd' [17:27:40.030] signalConditionsASAP(numeric, pos=1) ... [17:27:40.030] - nx: 4 [17:27:40.031] - relay: TRUE [17:27:40.031] - stdout: TRUE [17:27:40.031] - signal: TRUE [17:27:40.031] - resignal: FALSE [17:27:40.032] - force: TRUE [17:27:40.032] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:40.032] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:40.033] - until=2 [17:27:40.033] - relaying element #2 [17:27:40.033] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:40.033] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:40.034] signalConditionsASAP(NULL, pos=1) ... done [17:27:40.034] length: 3 (resolved future 1) [17:27:40.034] Future #2 [17:27:40.034] result() for ClusterFuture ... [17:27:40.035] - result already collected: FutureResult [17:27:40.035] result() for ClusterFuture ... done [17:27:40.035] result() for ClusterFuture ... [17:27:40.035] - result already collected: FutureResult [17:27:40.036] result() for ClusterFuture ... done [17:27:40.036] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:40.036] - nx: 4 [17:27:40.037] - relay: TRUE [17:27:40.037] - stdout: TRUE [17:27:40.037] - signal: TRUE [17:27:40.037] - resignal: FALSE [17:27:40.038] - force: TRUE [17:27:40.038] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [17:27:40.038] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [17:27:40.039] - until=2 [17:27:40.039] - relaying element #2 [17:27:40.039] result() for ClusterFuture ... [17:27:40.040] - result already collected: FutureResult [17:27:40.040] result() for ClusterFuture ... done [17:27:40.040] result() for ClusterFuture ... [17:27:40.040] - result already collected: FutureResult [17:27:40.041] result() for ClusterFuture ... done [17:27:40.041] result() for ClusterFuture ... [17:27:40.041] - result already collected: FutureResult [17:27:40.042] result() for ClusterFuture ... done [17:27:40.042] result() for ClusterFuture ... [17:27:40.042] - result already collected: FutureResult [17:27:40.042] result() for ClusterFuture ... done [17:27:40.043] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:40.043] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:40.043] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:40.044] length: 2 (resolved future 2) [17:27:40.044] Future #3 [17:27:40.044] result() for ClusterFuture ... [17:27:40.044] - result already collected: FutureResult [17:27:40.045] result() for ClusterFuture ... done [17:27:40.045] result() for ClusterFuture ... [17:27:40.045] - result already collected: FutureResult [17:27:40.045] result() for ClusterFuture ... done [17:27:40.046] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:40.046] - nx: 4 [17:27:40.046] - relay: TRUE [17:27:40.046] - stdout: TRUE [17:27:40.047] - signal: TRUE [17:27:40.047] - resignal: FALSE [17:27:40.047] - force: TRUE [17:27:40.048] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [17:27:40.048] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [17:27:40.048] - until=3 [17:27:40.048] - relaying element #3 [17:27:40.049] result() for ClusterFuture ... [17:27:40.049] - result already collected: FutureResult [17:27:40.049] result() for ClusterFuture ... done [17:27:40.050] result() for ClusterFuture ... [17:27:40.050] - result already collected: FutureResult [17:27:40.050] result() for ClusterFuture ... done [17:27:40.051] result() for ClusterFuture ... [17:27:40.051] - result already collected: FutureResult [17:27:40.051] result() for ClusterFuture ... done [17:27:40.051] result() for ClusterFuture ... [17:27:40.052] - result already collected: FutureResult [17:27:40.052] result() for ClusterFuture ... done [17:27:40.052] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:40.053] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:40.053] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:40.053] length: 1 (resolved future 3) [17:27:40.053] Future #4 [17:27:40.054] result() for ClusterFuture ... [17:27:40.054] - result already collected: FutureResult [17:27:40.054] result() for ClusterFuture ... done [17:27:40.055] result() for ClusterFuture ... [17:27:40.055] - result already collected: FutureResult [17:27:40.055] result() for ClusterFuture ... done [17:27:40.055] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:40.056] - nx: 4 [17:27:40.056] - relay: TRUE [17:27:40.056] - stdout: TRUE [17:27:40.057] - signal: TRUE [17:27:40.057] - resignal: FALSE [17:27:40.057] - force: TRUE [17:27:40.057] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [17:27:40.058] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [17:27:40.058] - until=4 [17:27:40.058] - relaying element #4 [17:27:40.059] result() for ClusterFuture ... [17:27:40.059] - result already collected: FutureResult [17:27:40.059] result() for ClusterFuture ... done [17:27:40.059] result() for ClusterFuture ... [17:27:40.060] - result already collected: FutureResult [17:27:40.060] result() for ClusterFuture ... done [17:27:40.060] result() for ClusterFuture ... [17:27:40.061] - result already collected: FutureResult [17:27:40.061] result() for ClusterFuture ... done [17:27:40.061] result() for ClusterFuture ... [17:27:40.061] - result already collected: FutureResult [17:27:40.062] result() for ClusterFuture ... done [17:27:40.062] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:40.062] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:40.062] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:40.063] length: 0 (resolved future 4) [17:27:40.063] Relaying remaining futures [17:27:40.063] signalConditionsASAP(NULL, pos=0) ... [17:27:40.064] - nx: 4 [17:27:40.064] - relay: TRUE [17:27:40.064] - stdout: TRUE [17:27:40.064] - signal: TRUE [17:27:40.065] - resignal: FALSE [17:27:40.065] - force: TRUE [17:27:40.065] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:40.066] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [17:27:40.066] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [17:27:40.066] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [17:27:40.067] signalConditionsASAP(NULL, pos=0) ... done [17:27:40.067] resolve() on environment ... DONE [17:27:40.067] result() for ClusterFuture ... [17:27:40.067] - result already collected: FutureResult [17:27:40.068] result() for ClusterFuture ... done [17:27:40.068] result() for ClusterFuture ... [17:27:40.068] - result already collected: FutureResult [17:27:40.069] result() for ClusterFuture ... done [17:27:40.069] result() for ClusterFuture ... [17:27:40.069] - result already collected: FutureResult [17:27:40.069] result() for ClusterFuture ... done [17:27:40.070] result() for ClusterFuture ... [17:27:40.070] - result already collected: FutureResult [17:27:40.070] result() for ClusterFuture ... done [17:27:40.071] result() for ClusterFuture ... [17:27:40.071] - result already collected: FutureResult [17:27:40.071] result() for ClusterFuture ... done [17:27:40.072] result() for ClusterFuture ... [17:27:40.072] - result already collected: FutureResult [17:27:40.072] result() for ClusterFuture ... done *** futures() - environment ... DONE Type of object: listenv Type of future: multisession [17:27:40.073] plan(): Setting new future strategy stack: [17:27:40.074] List of future strategies: [17:27:40.074] 1. multisession: [17:27:40.074] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:40.074] - tweaked: FALSE [17:27:40.074] - call: plan(strategy) [17:27:40.083] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [17:27:40.084] multisession: [17:27:40.084] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:40.084] - tweaked: FALSE [17:27:40.084] - call: plan(strategy) [17:27:40.088] getGlobalsAndPackages() ... [17:27:40.088] Not searching for globals [17:27:40.089] - globals: [0] [17:27:40.089] getGlobalsAndPackages() ... DONE [17:27:40.090] [local output] makeClusterPSOCK() ... [17:27:40.094] [local output] Workers: [n = 2] 'localhost', 'localhost' [17:27:40.097] [local output] Base port: 33784 [17:27:40.098] [local output] Getting setup options for 2 cluster nodes ... [17:27:40.098] [local output] - Node #1 of 2 ... [17:27:40.099] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:40.101] [local output] Rscript port: 33784 [17:27:40.102] [local output] - Node #2 of 2 ... [17:27:40.103] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:40.104] [local output] Rscript port: 33784 [17:27:40.105] [local output] Getting setup options for 2 cluster nodes ... done [17:27:40.106] [local output] - Parallel setup requested for some PSOCK nodes [17:27:40.106] [local output] Setting up PSOCK nodes in parallel [17:27:40.106] List of 36 [17:27:40.106] $ worker : chr "localhost" [17:27:40.106] ..- attr(*, "localhost")= logi TRUE [17:27:40.106] $ master : chr "localhost" [17:27:40.106] $ port : int 33784 [17:27:40.106] $ connectTimeout : num 120 [17:27:40.106] $ timeout : num 120 [17:27:40.106] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [17:27:40.106] $ homogeneous : logi TRUE [17:27:40.106] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=futures.R:101676:CRANWIN3:CRAN\""| __truncated__ [17:27:40.106] $ rscript_envs : NULL [17:27:40.106] $ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:40.106] $ rscript_startup : NULL [17:27:40.106] $ rscript_sh : chr [1:2] "cmd" "cmd" [17:27:40.106] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:40.106] $ methods : logi TRUE [17:27:40.106] $ socketOptions : chr "no-delay" [17:27:40.106] $ useXDR : logi FALSE [17:27:40.106] $ outfile : chr "/dev/null" [17:27:40.106] $ renice : int NA [17:27:40.106] $ rshcmd : NULL [17:27:40.106] $ user : chr(0) [17:27:40.106] $ revtunnel : logi FALSE [17:27:40.106] $ rshlogfile : NULL [17:27:40.106] $ rshopts : chr(0) [17:27:40.106] $ rank : int 1 [17:27:40.106] $ manual : logi FALSE [17:27:40.106] $ dryrun : logi FALSE [17:27:40.106] $ quiet : logi FALSE [17:27:40.106] $ setup_strategy : chr "parallel" [17:27:40.106] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:40.106] $ pidfile : chr "D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c445844f2.pid" [17:27:40.106] $ rshcmd_label : NULL [17:27:40.106] $ rsh_call : NULL [17:27:40.106] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:40.106] $ localMachine : logi TRUE [17:27:40.106] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [17:27:40.106] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [17:27:40.106] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [17:27:40.106] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [17:27:40.106] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [17:27:40.106] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [17:27:40.106] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [17:27:40.106] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [17:27:40.106] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [17:27:40.106] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [17:27:40.106] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [17:27:40.106] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [17:27:40.106] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [17:27:40.106] "parallel"), action = c("launch", "options"), verbose = FALSE) [17:27:40.106] $ arguments :List of 28 [17:27:40.106] ..$ worker : chr "localhost" [17:27:40.106] ..$ master : NULL [17:27:40.106] ..$ port : int 33784 [17:27:40.106] ..$ connectTimeout : num 120 [17:27:40.106] ..$ timeout : num 120 [17:27:40.106] ..$ rscript : NULL [17:27:40.106] ..$ homogeneous : NULL [17:27:40.106] ..$ rscript_args : NULL [17:27:40.106] ..$ rscript_envs : NULL [17:27:40.106] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:40.106] ..$ rscript_startup : NULL [17:27:40.106] ..$ rscript_sh : chr "auto" [17:27:40.106] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:40.106] ..$ methods : logi TRUE [17:27:40.106] ..$ socketOptions : chr "no-delay" [17:27:40.106] ..$ useXDR : logi FALSE [17:27:40.106] ..$ outfile : chr "/dev/null" [17:27:40.106] ..$ renice : int NA [17:27:40.106] ..$ rshcmd : NULL [17:27:40.106] ..$ user : NULL [17:27:40.106] ..$ revtunnel : logi NA [17:27:40.106] ..$ rshlogfile : NULL [17:27:40.106] ..$ rshopts : NULL [17:27:40.106] ..$ rank : int 1 [17:27:40.106] ..$ manual : logi FALSE [17:27:40.106] ..$ dryrun : logi FALSE [17:27:40.106] ..$ quiet : logi FALSE [17:27:40.106] ..$ setup_strategy : chr "parallel" [17:27:40.106] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [17:27:40.136] [local output] System call to launch all workers: [17:27:40.137] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=futures.R:101676:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpGqvBBC/worker.rank=1.parallelly.parent=101676.18d2c445844f2.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=33784 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [17:27:40.137] [local output] Starting PSOCK main server [17:27:40.145] [local output] Workers launched [17:27:40.145] [local output] Waiting for workers to connect back [17:27:40.146] - [local output] 0 workers out of 2 ready [17:27:40.405] - [local output] 0 workers out of 2 ready [17:27:40.406] - [local output] 1 workers out of 2 ready [17:27:40.407] - [local output] 1 workers out of 2 ready [17:27:40.407] - [local output] 2 workers out of 2 ready [17:27:40.408] [local output] Launching of 2 workers completed [17:27:40.408] [local output] Number of nodes in cluster: 2 [17:27:40.408] [local output] Collecting session information from 2 workers [17:27:40.409] [local output] - Worker #1 of 2 [17:27:40.411] [local output] - Worker #2 of 2 [17:27:40.411] [local output] makeClusterPSOCK() ... done [17:27:40.426] Packages needed by the future expression (n = 0): [17:27:40.427] Packages needed by future strategies (n = 0): [17:27:40.428] { [17:27:40.428] { [17:27:40.428] { [17:27:40.428] ...future.startTime <- base::Sys.time() [17:27:40.428] { [17:27:40.428] { [17:27:40.428] { [17:27:40.428] { [17:27:40.428] base::local({ [17:27:40.428] has_future <- base::requireNamespace("future", [17:27:40.428] quietly = TRUE) [17:27:40.428] if (has_future) { [17:27:40.428] ns <- base::getNamespace("future") [17:27:40.428] version <- ns[[".package"]][["version"]] [17:27:40.428] if (is.null(version)) [17:27:40.428] version <- utils::packageVersion("future") [17:27:40.428] } [17:27:40.428] else { [17:27:40.428] version <- NULL [17:27:40.428] } [17:27:40.428] if (!has_future || version < "1.8.0") { [17:27:40.428] info <- base::c(r_version = base::gsub("R version ", [17:27:40.428] "", base::R.version$version.string), [17:27:40.428] platform = base::sprintf("%s (%s-bit)", [17:27:40.428] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:40.428] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:40.428] "release", "version")], collapse = " "), [17:27:40.428] hostname = base::Sys.info()[["nodename"]]) [17:27:40.428] info <- base::sprintf("%s: %s", base::names(info), [17:27:40.428] info) [17:27:40.428] info <- base::paste(info, collapse = "; ") [17:27:40.428] if (!has_future) { [17:27:40.428] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:40.428] info) [17:27:40.428] } [17:27:40.428] else { [17:27:40.428] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:40.428] info, version) [17:27:40.428] } [17:27:40.428] base::stop(msg) [17:27:40.428] } [17:27:40.428] }) [17:27:40.428] } [17:27:40.428] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:40.428] base::options(mc.cores = 1L) [17:27:40.428] } [17:27:40.428] ...future.strategy.old <- future::plan("list") [17:27:40.428] options(future.plan = NULL) [17:27:40.428] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.428] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:40.428] } [17:27:40.428] ...future.workdir <- getwd() [17:27:40.428] } [17:27:40.428] ...future.oldOptions <- base::as.list(base::.Options) [17:27:40.428] ...future.oldEnvVars <- base::Sys.getenv() [17:27:40.428] } [17:27:40.428] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:40.428] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:40.428] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:40.428] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:40.428] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:40.428] future.stdout.windows.reencode = NULL, width = 80L) [17:27:40.428] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:40.428] base::names(...future.oldOptions)) [17:27:40.428] } [17:27:40.428] if (FALSE) { [17:27:40.428] } [17:27:40.428] else { [17:27:40.428] if (TRUE) { [17:27:40.428] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:40.428] open = "w") [17:27:40.428] } [17:27:40.428] else { [17:27:40.428] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:40.428] windows = "NUL", "/dev/null"), open = "w") [17:27:40.428] } [17:27:40.428] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:40.428] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:40.428] base::sink(type = "output", split = FALSE) [17:27:40.428] base::close(...future.stdout) [17:27:40.428] }, add = TRUE) [17:27:40.428] } [17:27:40.428] ...future.frame <- base::sys.nframe() [17:27:40.428] ...future.conditions <- base::list() [17:27:40.428] ...future.rng <- base::globalenv()$.Random.seed [17:27:40.428] if (FALSE) { [17:27:40.428] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:40.428] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:40.428] } [17:27:40.428] ...future.result <- base::tryCatch({ [17:27:40.428] base::withCallingHandlers({ [17:27:40.428] ...future.value <- base::withVisible(base::local({ [17:27:40.428] ...future.makeSendCondition <- base::local({ [17:27:40.428] sendCondition <- NULL [17:27:40.428] function(frame = 1L) { [17:27:40.428] if (is.function(sendCondition)) [17:27:40.428] return(sendCondition) [17:27:40.428] ns <- getNamespace("parallel") [17:27:40.428] if (exists("sendData", mode = "function", [17:27:40.428] envir = ns)) { [17:27:40.428] parallel_sendData <- get("sendData", mode = "function", [17:27:40.428] envir = ns) [17:27:40.428] envir <- sys.frame(frame) [17:27:40.428] master <- NULL [17:27:40.428] while (!identical(envir, .GlobalEnv) && [17:27:40.428] !identical(envir, emptyenv())) { [17:27:40.428] if (exists("master", mode = "list", envir = envir, [17:27:40.428] inherits = FALSE)) { [17:27:40.428] master <- get("master", mode = "list", [17:27:40.428] envir = envir, inherits = FALSE) [17:27:40.428] if (inherits(master, c("SOCKnode", [17:27:40.428] "SOCK0node"))) { [17:27:40.428] sendCondition <<- function(cond) { [17:27:40.428] data <- list(type = "VALUE", value = cond, [17:27:40.428] success = TRUE) [17:27:40.428] parallel_sendData(master, data) [17:27:40.428] } [17:27:40.428] return(sendCondition) [17:27:40.428] } [17:27:40.428] } [17:27:40.428] frame <- frame + 1L [17:27:40.428] envir <- sys.frame(frame) [17:27:40.428] } [17:27:40.428] } [17:27:40.428] sendCondition <<- function(cond) NULL [17:27:40.428] } [17:27:40.428] }) [17:27:40.428] withCallingHandlers({ [17:27:40.428] NA [17:27:40.428] }, immediateCondition = function(cond) { [17:27:40.428] sendCondition <- ...future.makeSendCondition() [17:27:40.428] sendCondition(cond) [17:27:40.428] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.428] { [17:27:40.428] inherits <- base::inherits [17:27:40.428] invokeRestart <- base::invokeRestart [17:27:40.428] is.null <- base::is.null [17:27:40.428] muffled <- FALSE [17:27:40.428] if (inherits(cond, "message")) { [17:27:40.428] muffled <- grepl(pattern, "muffleMessage") [17:27:40.428] if (muffled) [17:27:40.428] invokeRestart("muffleMessage") [17:27:40.428] } [17:27:40.428] else if (inherits(cond, "warning")) { [17:27:40.428] muffled <- grepl(pattern, "muffleWarning") [17:27:40.428] if (muffled) [17:27:40.428] invokeRestart("muffleWarning") [17:27:40.428] } [17:27:40.428] else if (inherits(cond, "condition")) { [17:27:40.428] if (!is.null(pattern)) { [17:27:40.428] computeRestarts <- base::computeRestarts [17:27:40.428] grepl <- base::grepl [17:27:40.428] restarts <- computeRestarts(cond) [17:27:40.428] for (restart in restarts) { [17:27:40.428] name <- restart$name [17:27:40.428] if (is.null(name)) [17:27:40.428] next [17:27:40.428] if (!grepl(pattern, name)) [17:27:40.428] next [17:27:40.428] invokeRestart(restart) [17:27:40.428] muffled <- TRUE [17:27:40.428] break [17:27:40.428] } [17:27:40.428] } [17:27:40.428] } [17:27:40.428] invisible(muffled) [17:27:40.428] } [17:27:40.428] muffleCondition(cond) [17:27:40.428] }) [17:27:40.428] })) [17:27:40.428] future::FutureResult(value = ...future.value$value, [17:27:40.428] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.428] ...future.rng), globalenv = if (FALSE) [17:27:40.428] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:40.428] ...future.globalenv.names)) [17:27:40.428] else NULL, started = ...future.startTime, version = "1.8") [17:27:40.428] }, condition = base::local({ [17:27:40.428] c <- base::c [17:27:40.428] inherits <- base::inherits [17:27:40.428] invokeRestart <- base::invokeRestart [17:27:40.428] length <- base::length [17:27:40.428] list <- base::list [17:27:40.428] seq.int <- base::seq.int [17:27:40.428] signalCondition <- base::signalCondition [17:27:40.428] sys.calls <- base::sys.calls [17:27:40.428] `[[` <- base::`[[` [17:27:40.428] `+` <- base::`+` [17:27:40.428] `<<-` <- base::`<<-` [17:27:40.428] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:40.428] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:40.428] 3L)] [17:27:40.428] } [17:27:40.428] function(cond) { [17:27:40.428] is_error <- inherits(cond, "error") [17:27:40.428] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:40.428] NULL) [17:27:40.428] if (is_error) { [17:27:40.428] sessionInformation <- function() { [17:27:40.428] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:40.428] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:40.428] search = base::search(), system = base::Sys.info()) [17:27:40.428] } [17:27:40.428] ...future.conditions[[length(...future.conditions) + [17:27:40.428] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:40.428] cond$call), session = sessionInformation(), [17:27:40.428] timestamp = base::Sys.time(), signaled = 0L) [17:27:40.428] signalCondition(cond) [17:27:40.428] } [17:27:40.428] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:40.428] "immediateCondition"))) { [17:27:40.428] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:40.428] ...future.conditions[[length(...future.conditions) + [17:27:40.428] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:40.428] if (TRUE && !signal) { [17:27:40.428] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.428] { [17:27:40.428] inherits <- base::inherits [17:27:40.428] invokeRestart <- base::invokeRestart [17:27:40.428] is.null <- base::is.null [17:27:40.428] muffled <- FALSE [17:27:40.428] if (inherits(cond, "message")) { [17:27:40.428] muffled <- grepl(pattern, "muffleMessage") [17:27:40.428] if (muffled) [17:27:40.428] invokeRestart("muffleMessage") [17:27:40.428] } [17:27:40.428] else if (inherits(cond, "warning")) { [17:27:40.428] muffled <- grepl(pattern, "muffleWarning") [17:27:40.428] if (muffled) [17:27:40.428] invokeRestart("muffleWarning") [17:27:40.428] } [17:27:40.428] else if (inherits(cond, "condition")) { [17:27:40.428] if (!is.null(pattern)) { [17:27:40.428] computeRestarts <- base::computeRestarts [17:27:40.428] grepl <- base::grepl [17:27:40.428] restarts <- computeRestarts(cond) [17:27:40.428] for (restart in restarts) { [17:27:40.428] name <- restart$name [17:27:40.428] if (is.null(name)) [17:27:40.428] next [17:27:40.428] if (!grepl(pattern, name)) [17:27:40.428] next [17:27:40.428] invokeRestart(restart) [17:27:40.428] muffled <- TRUE [17:27:40.428] break [17:27:40.428] } [17:27:40.428] } [17:27:40.428] } [17:27:40.428] invisible(muffled) [17:27:40.428] } [17:27:40.428] muffleCondition(cond, pattern = "^muffle") [17:27:40.428] } [17:27:40.428] } [17:27:40.428] else { [17:27:40.428] if (TRUE) { [17:27:40.428] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.428] { [17:27:40.428] inherits <- base::inherits [17:27:40.428] invokeRestart <- base::invokeRestart [17:27:40.428] is.null <- base::is.null [17:27:40.428] muffled <- FALSE [17:27:40.428] if (inherits(cond, "message")) { [17:27:40.428] muffled <- grepl(pattern, "muffleMessage") [17:27:40.428] if (muffled) [17:27:40.428] invokeRestart("muffleMessage") [17:27:40.428] } [17:27:40.428] else if (inherits(cond, "warning")) { [17:27:40.428] muffled <- grepl(pattern, "muffleWarning") [17:27:40.428] if (muffled) [17:27:40.428] invokeRestart("muffleWarning") [17:27:40.428] } [17:27:40.428] else if (inherits(cond, "condition")) { [17:27:40.428] if (!is.null(pattern)) { [17:27:40.428] computeRestarts <- base::computeRestarts [17:27:40.428] grepl <- base::grepl [17:27:40.428] restarts <- computeRestarts(cond) [17:27:40.428] for (restart in restarts) { [17:27:40.428] name <- restart$name [17:27:40.428] if (is.null(name)) [17:27:40.428] next [17:27:40.428] if (!grepl(pattern, name)) [17:27:40.428] next [17:27:40.428] invokeRestart(restart) [17:27:40.428] muffled <- TRUE [17:27:40.428] break [17:27:40.428] } [17:27:40.428] } [17:27:40.428] } [17:27:40.428] invisible(muffled) [17:27:40.428] } [17:27:40.428] muffleCondition(cond, pattern = "^muffle") [17:27:40.428] } [17:27:40.428] } [17:27:40.428] } [17:27:40.428] })) [17:27:40.428] }, error = function(ex) { [17:27:40.428] base::structure(base::list(value = NULL, visible = NULL, [17:27:40.428] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.428] ...future.rng), started = ...future.startTime, [17:27:40.428] finished = Sys.time(), session_uuid = NA_character_, [17:27:40.428] version = "1.8"), class = "FutureResult") [17:27:40.428] }, finally = { [17:27:40.428] if (!identical(...future.workdir, getwd())) [17:27:40.428] setwd(...future.workdir) [17:27:40.428] { [17:27:40.428] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:40.428] ...future.oldOptions$nwarnings <- NULL [17:27:40.428] } [17:27:40.428] base::options(...future.oldOptions) [17:27:40.428] if (.Platform$OS.type == "windows") { [17:27:40.428] old_names <- names(...future.oldEnvVars) [17:27:40.428] envs <- base::Sys.getenv() [17:27:40.428] names <- names(envs) [17:27:40.428] common <- intersect(names, old_names) [17:27:40.428] added <- setdiff(names, old_names) [17:27:40.428] removed <- setdiff(old_names, names) [17:27:40.428] changed <- common[...future.oldEnvVars[common] != [17:27:40.428] envs[common]] [17:27:40.428] NAMES <- toupper(changed) [17:27:40.428] args <- list() [17:27:40.428] for (kk in seq_along(NAMES)) { [17:27:40.428] name <- changed[[kk]] [17:27:40.428] NAME <- NAMES[[kk]] [17:27:40.428] if (name != NAME && is.element(NAME, old_names)) [17:27:40.428] next [17:27:40.428] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.428] } [17:27:40.428] NAMES <- toupper(added) [17:27:40.428] for (kk in seq_along(NAMES)) { [17:27:40.428] name <- added[[kk]] [17:27:40.428] NAME <- NAMES[[kk]] [17:27:40.428] if (name != NAME && is.element(NAME, old_names)) [17:27:40.428] next [17:27:40.428] args[[name]] <- "" [17:27:40.428] } [17:27:40.428] NAMES <- toupper(removed) [17:27:40.428] for (kk in seq_along(NAMES)) { [17:27:40.428] name <- removed[[kk]] [17:27:40.428] NAME <- NAMES[[kk]] [17:27:40.428] if (name != NAME && is.element(NAME, old_names)) [17:27:40.428] next [17:27:40.428] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.428] } [17:27:40.428] if (length(args) > 0) [17:27:40.428] base::do.call(base::Sys.setenv, args = args) [17:27:40.428] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:40.428] } [17:27:40.428] else { [17:27:40.428] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:40.428] } [17:27:40.428] { [17:27:40.428] if (base::length(...future.futureOptionsAdded) > [17:27:40.428] 0L) { [17:27:40.428] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:40.428] base::names(opts) <- ...future.futureOptionsAdded [17:27:40.428] base::options(opts) [17:27:40.428] } [17:27:40.428] { [17:27:40.428] { [17:27:40.428] base::options(mc.cores = ...future.mc.cores.old) [17:27:40.428] NULL [17:27:40.428] } [17:27:40.428] options(future.plan = NULL) [17:27:40.428] if (is.na(NA_character_)) [17:27:40.428] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.428] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:40.428] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:40.428] .init = FALSE) [17:27:40.428] } [17:27:40.428] } [17:27:40.428] } [17:27:40.428] }) [17:27:40.428] if (TRUE) { [17:27:40.428] base::sink(type = "output", split = FALSE) [17:27:40.428] if (TRUE) { [17:27:40.428] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:40.428] } [17:27:40.428] else { [17:27:40.428] ...future.result["stdout"] <- base::list(NULL) [17:27:40.428] } [17:27:40.428] base::close(...future.stdout) [17:27:40.428] ...future.stdout <- NULL [17:27:40.428] } [17:27:40.428] ...future.result$conditions <- ...future.conditions [17:27:40.428] ...future.result$finished <- base::Sys.time() [17:27:40.428] ...future.result [17:27:40.428] } [17:27:40.575] MultisessionFuture started [17:27:40.576] result() for ClusterFuture ... [17:27:40.576] receiveMessageFromWorker() for ClusterFuture ... [17:27:40.577] - Validating connection of MultisessionFuture [17:27:40.664] - received message: FutureResult [17:27:40.665] - Received FutureResult [17:27:40.665] - Erased future from FutureRegistry [17:27:40.665] result() for ClusterFuture ... [17:27:40.666] - result already collected: FutureResult [17:27:40.666] result() for ClusterFuture ... done [17:27:40.666] receiveMessageFromWorker() for ClusterFuture ... done [17:27:40.667] result() for ClusterFuture ... done [17:27:40.667] result() for ClusterFuture ... [17:27:40.667] - result already collected: FutureResult [17:27:40.667] result() for ClusterFuture ... done [17:27:40.668] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [17:27:40.672] plan(): nbrOfWorkers() = 2 Dimensions: NULL [17:27:40.672] getGlobalsAndPackages() ... [17:27:40.673] Searching for globals... [17:27:40.674] [17:27:40.674] Searching for globals ... DONE [17:27:40.674] - globals: [0] [17:27:40.674] getGlobalsAndPackages() ... DONE [17:27:40.675] run() for 'Future' ... [17:27:40.675] - state: 'created' [17:27:40.676] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:40.696] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:40.697] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:40.697] - Field: 'node' [17:27:40.698] - Field: 'label' [17:27:40.698] - Field: 'local' [17:27:40.698] - Field: 'owner' [17:27:40.699] - Field: 'envir' [17:27:40.699] - Field: 'workers' [17:27:40.699] - Field: 'packages' [17:27:40.699] - Field: 'gc' [17:27:40.700] - Field: 'conditions' [17:27:40.700] - Field: 'persistent' [17:27:40.700] - Field: 'expr' [17:27:40.701] - Field: 'uuid' [17:27:40.701] - Field: 'seed' [17:27:40.701] - Field: 'version' [17:27:40.702] - Field: 'result' [17:27:40.702] - Field: 'asynchronous' [17:27:40.702] - Field: 'calls' [17:27:40.702] - Field: 'globals' [17:27:40.703] - Field: 'stdout' [17:27:40.703] - Field: 'earlySignal' [17:27:40.703] - Field: 'lazy' [17:27:40.703] - Field: 'state' [17:27:40.704] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:40.704] - Launch lazy future ... [17:27:40.705] Packages needed by the future expression (n = 0): [17:27:40.705] Packages needed by future strategies (n = 0): [17:27:40.706] { [17:27:40.706] { [17:27:40.706] { [17:27:40.706] ...future.startTime <- base::Sys.time() [17:27:40.706] { [17:27:40.706] { [17:27:40.706] { [17:27:40.706] { [17:27:40.706] base::local({ [17:27:40.706] has_future <- base::requireNamespace("future", [17:27:40.706] quietly = TRUE) [17:27:40.706] if (has_future) { [17:27:40.706] ns <- base::getNamespace("future") [17:27:40.706] version <- ns[[".package"]][["version"]] [17:27:40.706] if (is.null(version)) [17:27:40.706] version <- utils::packageVersion("future") [17:27:40.706] } [17:27:40.706] else { [17:27:40.706] version <- NULL [17:27:40.706] } [17:27:40.706] if (!has_future || version < "1.8.0") { [17:27:40.706] info <- base::c(r_version = base::gsub("R version ", [17:27:40.706] "", base::R.version$version.string), [17:27:40.706] platform = base::sprintf("%s (%s-bit)", [17:27:40.706] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:40.706] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:40.706] "release", "version")], collapse = " "), [17:27:40.706] hostname = base::Sys.info()[["nodename"]]) [17:27:40.706] info <- base::sprintf("%s: %s", base::names(info), [17:27:40.706] info) [17:27:40.706] info <- base::paste(info, collapse = "; ") [17:27:40.706] if (!has_future) { [17:27:40.706] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:40.706] info) [17:27:40.706] } [17:27:40.706] else { [17:27:40.706] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:40.706] info, version) [17:27:40.706] } [17:27:40.706] base::stop(msg) [17:27:40.706] } [17:27:40.706] }) [17:27:40.706] } [17:27:40.706] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:40.706] base::options(mc.cores = 1L) [17:27:40.706] } [17:27:40.706] ...future.strategy.old <- future::plan("list") [17:27:40.706] options(future.plan = NULL) [17:27:40.706] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.706] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:40.706] } [17:27:40.706] ...future.workdir <- getwd() [17:27:40.706] } [17:27:40.706] ...future.oldOptions <- base::as.list(base::.Options) [17:27:40.706] ...future.oldEnvVars <- base::Sys.getenv() [17:27:40.706] } [17:27:40.706] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:40.706] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:40.706] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:40.706] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:40.706] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:40.706] future.stdout.windows.reencode = NULL, width = 80L) [17:27:40.706] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:40.706] base::names(...future.oldOptions)) [17:27:40.706] } [17:27:40.706] if (FALSE) { [17:27:40.706] } [17:27:40.706] else { [17:27:40.706] if (TRUE) { [17:27:40.706] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:40.706] open = "w") [17:27:40.706] } [17:27:40.706] else { [17:27:40.706] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:40.706] windows = "NUL", "/dev/null"), open = "w") [17:27:40.706] } [17:27:40.706] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:40.706] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:40.706] base::sink(type = "output", split = FALSE) [17:27:40.706] base::close(...future.stdout) [17:27:40.706] }, add = TRUE) [17:27:40.706] } [17:27:40.706] ...future.frame <- base::sys.nframe() [17:27:40.706] ...future.conditions <- base::list() [17:27:40.706] ...future.rng <- base::globalenv()$.Random.seed [17:27:40.706] if (FALSE) { [17:27:40.706] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:40.706] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:40.706] } [17:27:40.706] ...future.result <- base::tryCatch({ [17:27:40.706] base::withCallingHandlers({ [17:27:40.706] ...future.value <- base::withVisible(base::local({ [17:27:40.706] ...future.makeSendCondition <- base::local({ [17:27:40.706] sendCondition <- NULL [17:27:40.706] function(frame = 1L) { [17:27:40.706] if (is.function(sendCondition)) [17:27:40.706] return(sendCondition) [17:27:40.706] ns <- getNamespace("parallel") [17:27:40.706] if (exists("sendData", mode = "function", [17:27:40.706] envir = ns)) { [17:27:40.706] parallel_sendData <- get("sendData", mode = "function", [17:27:40.706] envir = ns) [17:27:40.706] envir <- sys.frame(frame) [17:27:40.706] master <- NULL [17:27:40.706] while (!identical(envir, .GlobalEnv) && [17:27:40.706] !identical(envir, emptyenv())) { [17:27:40.706] if (exists("master", mode = "list", envir = envir, [17:27:40.706] inherits = FALSE)) { [17:27:40.706] master <- get("master", mode = "list", [17:27:40.706] envir = envir, inherits = FALSE) [17:27:40.706] if (inherits(master, c("SOCKnode", [17:27:40.706] "SOCK0node"))) { [17:27:40.706] sendCondition <<- function(cond) { [17:27:40.706] data <- list(type = "VALUE", value = cond, [17:27:40.706] success = TRUE) [17:27:40.706] parallel_sendData(master, data) [17:27:40.706] } [17:27:40.706] return(sendCondition) [17:27:40.706] } [17:27:40.706] } [17:27:40.706] frame <- frame + 1L [17:27:40.706] envir <- sys.frame(frame) [17:27:40.706] } [17:27:40.706] } [17:27:40.706] sendCondition <<- function(cond) NULL [17:27:40.706] } [17:27:40.706] }) [17:27:40.706] withCallingHandlers({ [17:27:40.706] 2 [17:27:40.706] }, immediateCondition = function(cond) { [17:27:40.706] sendCondition <- ...future.makeSendCondition() [17:27:40.706] sendCondition(cond) [17:27:40.706] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.706] { [17:27:40.706] inherits <- base::inherits [17:27:40.706] invokeRestart <- base::invokeRestart [17:27:40.706] is.null <- base::is.null [17:27:40.706] muffled <- FALSE [17:27:40.706] if (inherits(cond, "message")) { [17:27:40.706] muffled <- grepl(pattern, "muffleMessage") [17:27:40.706] if (muffled) [17:27:40.706] invokeRestart("muffleMessage") [17:27:40.706] } [17:27:40.706] else if (inherits(cond, "warning")) { [17:27:40.706] muffled <- grepl(pattern, "muffleWarning") [17:27:40.706] if (muffled) [17:27:40.706] invokeRestart("muffleWarning") [17:27:40.706] } [17:27:40.706] else if (inherits(cond, "condition")) { [17:27:40.706] if (!is.null(pattern)) { [17:27:40.706] computeRestarts <- base::computeRestarts [17:27:40.706] grepl <- base::grepl [17:27:40.706] restarts <- computeRestarts(cond) [17:27:40.706] for (restart in restarts) { [17:27:40.706] name <- restart$name [17:27:40.706] if (is.null(name)) [17:27:40.706] next [17:27:40.706] if (!grepl(pattern, name)) [17:27:40.706] next [17:27:40.706] invokeRestart(restart) [17:27:40.706] muffled <- TRUE [17:27:40.706] break [17:27:40.706] } [17:27:40.706] } [17:27:40.706] } [17:27:40.706] invisible(muffled) [17:27:40.706] } [17:27:40.706] muffleCondition(cond) [17:27:40.706] }) [17:27:40.706] })) [17:27:40.706] future::FutureResult(value = ...future.value$value, [17:27:40.706] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.706] ...future.rng), globalenv = if (FALSE) [17:27:40.706] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:40.706] ...future.globalenv.names)) [17:27:40.706] else NULL, started = ...future.startTime, version = "1.8") [17:27:40.706] }, condition = base::local({ [17:27:40.706] c <- base::c [17:27:40.706] inherits <- base::inherits [17:27:40.706] invokeRestart <- base::invokeRestart [17:27:40.706] length <- base::length [17:27:40.706] list <- base::list [17:27:40.706] seq.int <- base::seq.int [17:27:40.706] signalCondition <- base::signalCondition [17:27:40.706] sys.calls <- base::sys.calls [17:27:40.706] `[[` <- base::`[[` [17:27:40.706] `+` <- base::`+` [17:27:40.706] `<<-` <- base::`<<-` [17:27:40.706] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:40.706] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:40.706] 3L)] [17:27:40.706] } [17:27:40.706] function(cond) { [17:27:40.706] is_error <- inherits(cond, "error") [17:27:40.706] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:40.706] NULL) [17:27:40.706] if (is_error) { [17:27:40.706] sessionInformation <- function() { [17:27:40.706] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:40.706] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:40.706] search = base::search(), system = base::Sys.info()) [17:27:40.706] } [17:27:40.706] ...future.conditions[[length(...future.conditions) + [17:27:40.706] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:40.706] cond$call), session = sessionInformation(), [17:27:40.706] timestamp = base::Sys.time(), signaled = 0L) [17:27:40.706] signalCondition(cond) [17:27:40.706] } [17:27:40.706] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:40.706] "immediateCondition"))) { [17:27:40.706] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:40.706] ...future.conditions[[length(...future.conditions) + [17:27:40.706] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:40.706] if (TRUE && !signal) { [17:27:40.706] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.706] { [17:27:40.706] inherits <- base::inherits [17:27:40.706] invokeRestart <- base::invokeRestart [17:27:40.706] is.null <- base::is.null [17:27:40.706] muffled <- FALSE [17:27:40.706] if (inherits(cond, "message")) { [17:27:40.706] muffled <- grepl(pattern, "muffleMessage") [17:27:40.706] if (muffled) [17:27:40.706] invokeRestart("muffleMessage") [17:27:40.706] } [17:27:40.706] else if (inherits(cond, "warning")) { [17:27:40.706] muffled <- grepl(pattern, "muffleWarning") [17:27:40.706] if (muffled) [17:27:40.706] invokeRestart("muffleWarning") [17:27:40.706] } [17:27:40.706] else if (inherits(cond, "condition")) { [17:27:40.706] if (!is.null(pattern)) { [17:27:40.706] computeRestarts <- base::computeRestarts [17:27:40.706] grepl <- base::grepl [17:27:40.706] restarts <- computeRestarts(cond) [17:27:40.706] for (restart in restarts) { [17:27:40.706] name <- restart$name [17:27:40.706] if (is.null(name)) [17:27:40.706] next [17:27:40.706] if (!grepl(pattern, name)) [17:27:40.706] next [17:27:40.706] invokeRestart(restart) [17:27:40.706] muffled <- TRUE [17:27:40.706] break [17:27:40.706] } [17:27:40.706] } [17:27:40.706] } [17:27:40.706] invisible(muffled) [17:27:40.706] } [17:27:40.706] muffleCondition(cond, pattern = "^muffle") [17:27:40.706] } [17:27:40.706] } [17:27:40.706] else { [17:27:40.706] if (TRUE) { [17:27:40.706] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.706] { [17:27:40.706] inherits <- base::inherits [17:27:40.706] invokeRestart <- base::invokeRestart [17:27:40.706] is.null <- base::is.null [17:27:40.706] muffled <- FALSE [17:27:40.706] if (inherits(cond, "message")) { [17:27:40.706] muffled <- grepl(pattern, "muffleMessage") [17:27:40.706] if (muffled) [17:27:40.706] invokeRestart("muffleMessage") [17:27:40.706] } [17:27:40.706] else if (inherits(cond, "warning")) { [17:27:40.706] muffled <- grepl(pattern, "muffleWarning") [17:27:40.706] if (muffled) [17:27:40.706] invokeRestart("muffleWarning") [17:27:40.706] } [17:27:40.706] else if (inherits(cond, "condition")) { [17:27:40.706] if (!is.null(pattern)) { [17:27:40.706] computeRestarts <- base::computeRestarts [17:27:40.706] grepl <- base::grepl [17:27:40.706] restarts <- computeRestarts(cond) [17:27:40.706] for (restart in restarts) { [17:27:40.706] name <- restart$name [17:27:40.706] if (is.null(name)) [17:27:40.706] next [17:27:40.706] if (!grepl(pattern, name)) [17:27:40.706] next [17:27:40.706] invokeRestart(restart) [17:27:40.706] muffled <- TRUE [17:27:40.706] break [17:27:40.706] } [17:27:40.706] } [17:27:40.706] } [17:27:40.706] invisible(muffled) [17:27:40.706] } [17:27:40.706] muffleCondition(cond, pattern = "^muffle") [17:27:40.706] } [17:27:40.706] } [17:27:40.706] } [17:27:40.706] })) [17:27:40.706] }, error = function(ex) { [17:27:40.706] base::structure(base::list(value = NULL, visible = NULL, [17:27:40.706] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.706] ...future.rng), started = ...future.startTime, [17:27:40.706] finished = Sys.time(), session_uuid = NA_character_, [17:27:40.706] version = "1.8"), class = "FutureResult") [17:27:40.706] }, finally = { [17:27:40.706] if (!identical(...future.workdir, getwd())) [17:27:40.706] setwd(...future.workdir) [17:27:40.706] { [17:27:40.706] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:40.706] ...future.oldOptions$nwarnings <- NULL [17:27:40.706] } [17:27:40.706] base::options(...future.oldOptions) [17:27:40.706] if (.Platform$OS.type == "windows") { [17:27:40.706] old_names <- names(...future.oldEnvVars) [17:27:40.706] envs <- base::Sys.getenv() [17:27:40.706] names <- names(envs) [17:27:40.706] common <- intersect(names, old_names) [17:27:40.706] added <- setdiff(names, old_names) [17:27:40.706] removed <- setdiff(old_names, names) [17:27:40.706] changed <- common[...future.oldEnvVars[common] != [17:27:40.706] envs[common]] [17:27:40.706] NAMES <- toupper(changed) [17:27:40.706] args <- list() [17:27:40.706] for (kk in seq_along(NAMES)) { [17:27:40.706] name <- changed[[kk]] [17:27:40.706] NAME <- NAMES[[kk]] [17:27:40.706] if (name != NAME && is.element(NAME, old_names)) [17:27:40.706] next [17:27:40.706] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.706] } [17:27:40.706] NAMES <- toupper(added) [17:27:40.706] for (kk in seq_along(NAMES)) { [17:27:40.706] name <- added[[kk]] [17:27:40.706] NAME <- NAMES[[kk]] [17:27:40.706] if (name != NAME && is.element(NAME, old_names)) [17:27:40.706] next [17:27:40.706] args[[name]] <- "" [17:27:40.706] } [17:27:40.706] NAMES <- toupper(removed) [17:27:40.706] for (kk in seq_along(NAMES)) { [17:27:40.706] name <- removed[[kk]] [17:27:40.706] NAME <- NAMES[[kk]] [17:27:40.706] if (name != NAME && is.element(NAME, old_names)) [17:27:40.706] next [17:27:40.706] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.706] } [17:27:40.706] if (length(args) > 0) [17:27:40.706] base::do.call(base::Sys.setenv, args = args) [17:27:40.706] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:40.706] } [17:27:40.706] else { [17:27:40.706] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:40.706] } [17:27:40.706] { [17:27:40.706] if (base::length(...future.futureOptionsAdded) > [17:27:40.706] 0L) { [17:27:40.706] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:40.706] base::names(opts) <- ...future.futureOptionsAdded [17:27:40.706] base::options(opts) [17:27:40.706] } [17:27:40.706] { [17:27:40.706] { [17:27:40.706] base::options(mc.cores = ...future.mc.cores.old) [17:27:40.706] NULL [17:27:40.706] } [17:27:40.706] options(future.plan = NULL) [17:27:40.706] if (is.na(NA_character_)) [17:27:40.706] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.706] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:40.706] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:40.706] .init = FALSE) [17:27:40.706] } [17:27:40.706] } [17:27:40.706] } [17:27:40.706] }) [17:27:40.706] if (TRUE) { [17:27:40.706] base::sink(type = "output", split = FALSE) [17:27:40.706] if (TRUE) { [17:27:40.706] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:40.706] } [17:27:40.706] else { [17:27:40.706] ...future.result["stdout"] <- base::list(NULL) [17:27:40.706] } [17:27:40.706] base::close(...future.stdout) [17:27:40.706] ...future.stdout <- NULL [17:27:40.706] } [17:27:40.706] ...future.result$conditions <- ...future.conditions [17:27:40.706] ...future.result$finished <- base::Sys.time() [17:27:40.706] ...future.result [17:27:40.706] } [17:27:40.715] MultisessionFuture started [17:27:40.716] - Launch lazy future ... done [17:27:40.716] run() for 'MultisessionFuture' ... done [17:27:40.716] getGlobalsAndPackages() ... [17:27:40.717] Searching for globals... [17:27:40.717] [17:27:40.718] Searching for globals ... DONE [17:27:40.718] - globals: [0] [17:27:40.718] getGlobalsAndPackages() ... DONE [17:27:40.723] run() for 'Future' ... [17:27:40.723] - state: 'created' [17:27:40.724] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:40.744] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:40.744] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:40.745] - Field: 'node' [17:27:40.745] - Field: 'label' [17:27:40.745] - Field: 'local' [17:27:40.746] - Field: 'owner' [17:27:40.746] - Field: 'envir' [17:27:40.746] - Field: 'workers' [17:27:40.747] - Field: 'packages' [17:27:40.747] - Field: 'gc' [17:27:40.747] - Field: 'conditions' [17:27:40.747] - Field: 'persistent' [17:27:40.748] - Field: 'expr' [17:27:40.748] - Field: 'uuid' [17:27:40.748] - Field: 'seed' [17:27:40.748] - Field: 'version' [17:27:40.749] - Field: 'result' [17:27:40.749] - Field: 'asynchronous' [17:27:40.749] - Field: 'calls' [17:27:40.750] - Field: 'globals' [17:27:40.750] - Field: 'stdout' [17:27:40.750] - Field: 'earlySignal' [17:27:40.750] - Field: 'lazy' [17:27:40.751] - Field: 'state' [17:27:40.751] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:40.751] - Launch lazy future ... [17:27:40.752] Packages needed by the future expression (n = 0): [17:27:40.752] Packages needed by future strategies (n = 0): [17:27:40.753] { [17:27:40.753] { [17:27:40.753] { [17:27:40.753] ...future.startTime <- base::Sys.time() [17:27:40.753] { [17:27:40.753] { [17:27:40.753] { [17:27:40.753] { [17:27:40.753] base::local({ [17:27:40.753] has_future <- base::requireNamespace("future", [17:27:40.753] quietly = TRUE) [17:27:40.753] if (has_future) { [17:27:40.753] ns <- base::getNamespace("future") [17:27:40.753] version <- ns[[".package"]][["version"]] [17:27:40.753] if (is.null(version)) [17:27:40.753] version <- utils::packageVersion("future") [17:27:40.753] } [17:27:40.753] else { [17:27:40.753] version <- NULL [17:27:40.753] } [17:27:40.753] if (!has_future || version < "1.8.0") { [17:27:40.753] info <- base::c(r_version = base::gsub("R version ", [17:27:40.753] "", base::R.version$version.string), [17:27:40.753] platform = base::sprintf("%s (%s-bit)", [17:27:40.753] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:40.753] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:40.753] "release", "version")], collapse = " "), [17:27:40.753] hostname = base::Sys.info()[["nodename"]]) [17:27:40.753] info <- base::sprintf("%s: %s", base::names(info), [17:27:40.753] info) [17:27:40.753] info <- base::paste(info, collapse = "; ") [17:27:40.753] if (!has_future) { [17:27:40.753] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:40.753] info) [17:27:40.753] } [17:27:40.753] else { [17:27:40.753] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:40.753] info, version) [17:27:40.753] } [17:27:40.753] base::stop(msg) [17:27:40.753] } [17:27:40.753] }) [17:27:40.753] } [17:27:40.753] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:40.753] base::options(mc.cores = 1L) [17:27:40.753] } [17:27:40.753] ...future.strategy.old <- future::plan("list") [17:27:40.753] options(future.plan = NULL) [17:27:40.753] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.753] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:40.753] } [17:27:40.753] ...future.workdir <- getwd() [17:27:40.753] } [17:27:40.753] ...future.oldOptions <- base::as.list(base::.Options) [17:27:40.753] ...future.oldEnvVars <- base::Sys.getenv() [17:27:40.753] } [17:27:40.753] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:40.753] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:40.753] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:40.753] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:40.753] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:40.753] future.stdout.windows.reencode = NULL, width = 80L) [17:27:40.753] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:40.753] base::names(...future.oldOptions)) [17:27:40.753] } [17:27:40.753] if (FALSE) { [17:27:40.753] } [17:27:40.753] else { [17:27:40.753] if (TRUE) { [17:27:40.753] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:40.753] open = "w") [17:27:40.753] } [17:27:40.753] else { [17:27:40.753] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:40.753] windows = "NUL", "/dev/null"), open = "w") [17:27:40.753] } [17:27:40.753] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:40.753] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:40.753] base::sink(type = "output", split = FALSE) [17:27:40.753] base::close(...future.stdout) [17:27:40.753] }, add = TRUE) [17:27:40.753] } [17:27:40.753] ...future.frame <- base::sys.nframe() [17:27:40.753] ...future.conditions <- base::list() [17:27:40.753] ...future.rng <- base::globalenv()$.Random.seed [17:27:40.753] if (FALSE) { [17:27:40.753] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:40.753] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:40.753] } [17:27:40.753] ...future.result <- base::tryCatch({ [17:27:40.753] base::withCallingHandlers({ [17:27:40.753] ...future.value <- base::withVisible(base::local({ [17:27:40.753] ...future.makeSendCondition <- base::local({ [17:27:40.753] sendCondition <- NULL [17:27:40.753] function(frame = 1L) { [17:27:40.753] if (is.function(sendCondition)) [17:27:40.753] return(sendCondition) [17:27:40.753] ns <- getNamespace("parallel") [17:27:40.753] if (exists("sendData", mode = "function", [17:27:40.753] envir = ns)) { [17:27:40.753] parallel_sendData <- get("sendData", mode = "function", [17:27:40.753] envir = ns) [17:27:40.753] envir <- sys.frame(frame) [17:27:40.753] master <- NULL [17:27:40.753] while (!identical(envir, .GlobalEnv) && [17:27:40.753] !identical(envir, emptyenv())) { [17:27:40.753] if (exists("master", mode = "list", envir = envir, [17:27:40.753] inherits = FALSE)) { [17:27:40.753] master <- get("master", mode = "list", [17:27:40.753] envir = envir, inherits = FALSE) [17:27:40.753] if (inherits(master, c("SOCKnode", [17:27:40.753] "SOCK0node"))) { [17:27:40.753] sendCondition <<- function(cond) { [17:27:40.753] data <- list(type = "VALUE", value = cond, [17:27:40.753] success = TRUE) [17:27:40.753] parallel_sendData(master, data) [17:27:40.753] } [17:27:40.753] return(sendCondition) [17:27:40.753] } [17:27:40.753] } [17:27:40.753] frame <- frame + 1L [17:27:40.753] envir <- sys.frame(frame) [17:27:40.753] } [17:27:40.753] } [17:27:40.753] sendCondition <<- function(cond) NULL [17:27:40.753] } [17:27:40.753] }) [17:27:40.753] withCallingHandlers({ [17:27:40.753] NULL [17:27:40.753] }, immediateCondition = function(cond) { [17:27:40.753] sendCondition <- ...future.makeSendCondition() [17:27:40.753] sendCondition(cond) [17:27:40.753] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.753] { [17:27:40.753] inherits <- base::inherits [17:27:40.753] invokeRestart <- base::invokeRestart [17:27:40.753] is.null <- base::is.null [17:27:40.753] muffled <- FALSE [17:27:40.753] if (inherits(cond, "message")) { [17:27:40.753] muffled <- grepl(pattern, "muffleMessage") [17:27:40.753] if (muffled) [17:27:40.753] invokeRestart("muffleMessage") [17:27:40.753] } [17:27:40.753] else if (inherits(cond, "warning")) { [17:27:40.753] muffled <- grepl(pattern, "muffleWarning") [17:27:40.753] if (muffled) [17:27:40.753] invokeRestart("muffleWarning") [17:27:40.753] } [17:27:40.753] else if (inherits(cond, "condition")) { [17:27:40.753] if (!is.null(pattern)) { [17:27:40.753] computeRestarts <- base::computeRestarts [17:27:40.753] grepl <- base::grepl [17:27:40.753] restarts <- computeRestarts(cond) [17:27:40.753] for (restart in restarts) { [17:27:40.753] name <- restart$name [17:27:40.753] if (is.null(name)) [17:27:40.753] next [17:27:40.753] if (!grepl(pattern, name)) [17:27:40.753] next [17:27:40.753] invokeRestart(restart) [17:27:40.753] muffled <- TRUE [17:27:40.753] break [17:27:40.753] } [17:27:40.753] } [17:27:40.753] } [17:27:40.753] invisible(muffled) [17:27:40.753] } [17:27:40.753] muffleCondition(cond) [17:27:40.753] }) [17:27:40.753] })) [17:27:40.753] future::FutureResult(value = ...future.value$value, [17:27:40.753] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.753] ...future.rng), globalenv = if (FALSE) [17:27:40.753] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:40.753] ...future.globalenv.names)) [17:27:40.753] else NULL, started = ...future.startTime, version = "1.8") [17:27:40.753] }, condition = base::local({ [17:27:40.753] c <- base::c [17:27:40.753] inherits <- base::inherits [17:27:40.753] invokeRestart <- base::invokeRestart [17:27:40.753] length <- base::length [17:27:40.753] list <- base::list [17:27:40.753] seq.int <- base::seq.int [17:27:40.753] signalCondition <- base::signalCondition [17:27:40.753] sys.calls <- base::sys.calls [17:27:40.753] `[[` <- base::`[[` [17:27:40.753] `+` <- base::`+` [17:27:40.753] `<<-` <- base::`<<-` [17:27:40.753] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:40.753] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:40.753] 3L)] [17:27:40.753] } [17:27:40.753] function(cond) { [17:27:40.753] is_error <- inherits(cond, "error") [17:27:40.753] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:40.753] NULL) [17:27:40.753] if (is_error) { [17:27:40.753] sessionInformation <- function() { [17:27:40.753] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:40.753] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:40.753] search = base::search(), system = base::Sys.info()) [17:27:40.753] } [17:27:40.753] ...future.conditions[[length(...future.conditions) + [17:27:40.753] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:40.753] cond$call), session = sessionInformation(), [17:27:40.753] timestamp = base::Sys.time(), signaled = 0L) [17:27:40.753] signalCondition(cond) [17:27:40.753] } [17:27:40.753] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:40.753] "immediateCondition"))) { [17:27:40.753] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:40.753] ...future.conditions[[length(...future.conditions) + [17:27:40.753] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:40.753] if (TRUE && !signal) { [17:27:40.753] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.753] { [17:27:40.753] inherits <- base::inherits [17:27:40.753] invokeRestart <- base::invokeRestart [17:27:40.753] is.null <- base::is.null [17:27:40.753] muffled <- FALSE [17:27:40.753] if (inherits(cond, "message")) { [17:27:40.753] muffled <- grepl(pattern, "muffleMessage") [17:27:40.753] if (muffled) [17:27:40.753] invokeRestart("muffleMessage") [17:27:40.753] } [17:27:40.753] else if (inherits(cond, "warning")) { [17:27:40.753] muffled <- grepl(pattern, "muffleWarning") [17:27:40.753] if (muffled) [17:27:40.753] invokeRestart("muffleWarning") [17:27:40.753] } [17:27:40.753] else if (inherits(cond, "condition")) { [17:27:40.753] if (!is.null(pattern)) { [17:27:40.753] computeRestarts <- base::computeRestarts [17:27:40.753] grepl <- base::grepl [17:27:40.753] restarts <- computeRestarts(cond) [17:27:40.753] for (restart in restarts) { [17:27:40.753] name <- restart$name [17:27:40.753] if (is.null(name)) [17:27:40.753] next [17:27:40.753] if (!grepl(pattern, name)) [17:27:40.753] next [17:27:40.753] invokeRestart(restart) [17:27:40.753] muffled <- TRUE [17:27:40.753] break [17:27:40.753] } [17:27:40.753] } [17:27:40.753] } [17:27:40.753] invisible(muffled) [17:27:40.753] } [17:27:40.753] muffleCondition(cond, pattern = "^muffle") [17:27:40.753] } [17:27:40.753] } [17:27:40.753] else { [17:27:40.753] if (TRUE) { [17:27:40.753] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.753] { [17:27:40.753] inherits <- base::inherits [17:27:40.753] invokeRestart <- base::invokeRestart [17:27:40.753] is.null <- base::is.null [17:27:40.753] muffled <- FALSE [17:27:40.753] if (inherits(cond, "message")) { [17:27:40.753] muffled <- grepl(pattern, "muffleMessage") [17:27:40.753] if (muffled) [17:27:40.753] invokeRestart("muffleMessage") [17:27:40.753] } [17:27:40.753] else if (inherits(cond, "warning")) { [17:27:40.753] muffled <- grepl(pattern, "muffleWarning") [17:27:40.753] if (muffled) [17:27:40.753] invokeRestart("muffleWarning") [17:27:40.753] } [17:27:40.753] else if (inherits(cond, "condition")) { [17:27:40.753] if (!is.null(pattern)) { [17:27:40.753] computeRestarts <- base::computeRestarts [17:27:40.753] grepl <- base::grepl [17:27:40.753] restarts <- computeRestarts(cond) [17:27:40.753] for (restart in restarts) { [17:27:40.753] name <- restart$name [17:27:40.753] if (is.null(name)) [17:27:40.753] next [17:27:40.753] if (!grepl(pattern, name)) [17:27:40.753] next [17:27:40.753] invokeRestart(restart) [17:27:40.753] muffled <- TRUE [17:27:40.753] break [17:27:40.753] } [17:27:40.753] } [17:27:40.753] } [17:27:40.753] invisible(muffled) [17:27:40.753] } [17:27:40.753] muffleCondition(cond, pattern = "^muffle") [17:27:40.753] } [17:27:40.753] } [17:27:40.753] } [17:27:40.753] })) [17:27:40.753] }, error = function(ex) { [17:27:40.753] base::structure(base::list(value = NULL, visible = NULL, [17:27:40.753] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.753] ...future.rng), started = ...future.startTime, [17:27:40.753] finished = Sys.time(), session_uuid = NA_character_, [17:27:40.753] version = "1.8"), class = "FutureResult") [17:27:40.753] }, finally = { [17:27:40.753] if (!identical(...future.workdir, getwd())) [17:27:40.753] setwd(...future.workdir) [17:27:40.753] { [17:27:40.753] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:40.753] ...future.oldOptions$nwarnings <- NULL [17:27:40.753] } [17:27:40.753] base::options(...future.oldOptions) [17:27:40.753] if (.Platform$OS.type == "windows") { [17:27:40.753] old_names <- names(...future.oldEnvVars) [17:27:40.753] envs <- base::Sys.getenv() [17:27:40.753] names <- names(envs) [17:27:40.753] common <- intersect(names, old_names) [17:27:40.753] added <- setdiff(names, old_names) [17:27:40.753] removed <- setdiff(old_names, names) [17:27:40.753] changed <- common[...future.oldEnvVars[common] != [17:27:40.753] envs[common]] [17:27:40.753] NAMES <- toupper(changed) [17:27:40.753] args <- list() [17:27:40.753] for (kk in seq_along(NAMES)) { [17:27:40.753] name <- changed[[kk]] [17:27:40.753] NAME <- NAMES[[kk]] [17:27:40.753] if (name != NAME && is.element(NAME, old_names)) [17:27:40.753] next [17:27:40.753] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.753] } [17:27:40.753] NAMES <- toupper(added) [17:27:40.753] for (kk in seq_along(NAMES)) { [17:27:40.753] name <- added[[kk]] [17:27:40.753] NAME <- NAMES[[kk]] [17:27:40.753] if (name != NAME && is.element(NAME, old_names)) [17:27:40.753] next [17:27:40.753] args[[name]] <- "" [17:27:40.753] } [17:27:40.753] NAMES <- toupper(removed) [17:27:40.753] for (kk in seq_along(NAMES)) { [17:27:40.753] name <- removed[[kk]] [17:27:40.753] NAME <- NAMES[[kk]] [17:27:40.753] if (name != NAME && is.element(NAME, old_names)) [17:27:40.753] next [17:27:40.753] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.753] } [17:27:40.753] if (length(args) > 0) [17:27:40.753] base::do.call(base::Sys.setenv, args = args) [17:27:40.753] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:40.753] } [17:27:40.753] else { [17:27:40.753] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:40.753] } [17:27:40.753] { [17:27:40.753] if (base::length(...future.futureOptionsAdded) > [17:27:40.753] 0L) { [17:27:40.753] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:40.753] base::names(opts) <- ...future.futureOptionsAdded [17:27:40.753] base::options(opts) [17:27:40.753] } [17:27:40.753] { [17:27:40.753] { [17:27:40.753] base::options(mc.cores = ...future.mc.cores.old) [17:27:40.753] NULL [17:27:40.753] } [17:27:40.753] options(future.plan = NULL) [17:27:40.753] if (is.na(NA_character_)) [17:27:40.753] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.753] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:40.753] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:40.753] .init = FALSE) [17:27:40.753] } [17:27:40.753] } [17:27:40.753] } [17:27:40.753] }) [17:27:40.753] if (TRUE) { [17:27:40.753] base::sink(type = "output", split = FALSE) [17:27:40.753] if (TRUE) { [17:27:40.753] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:40.753] } [17:27:40.753] else { [17:27:40.753] ...future.result["stdout"] <- base::list(NULL) [17:27:40.753] } [17:27:40.753] base::close(...future.stdout) [17:27:40.753] ...future.stdout <- NULL [17:27:40.753] } [17:27:40.753] ...future.result$conditions <- ...future.conditions [17:27:40.753] ...future.result$finished <- base::Sys.time() [17:27:40.753] ...future.result [17:27:40.753] } [17:27:40.897] MultisessionFuture started [17:27:40.897] - Launch lazy future ... done [17:27:40.898] run() for 'MultisessionFuture' ... done [17:27:40.898] getGlobalsAndPackages() ... [17:27:40.899] Searching for globals... [17:27:40.899] - globals found: [1] '{' [17:27:40.900] Searching for globals ... DONE [17:27:40.900] Resolving globals: FALSE [17:27:40.900] [17:27:40.900] [17:27:40.901] getGlobalsAndPackages() ... DONE [17:27:40.901] run() for 'Future' ... [17:27:40.901] - state: 'created' [17:27:40.901] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:40.920] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:40.921] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:40.921] - Field: 'node' [17:27:40.921] - Field: 'label' [17:27:40.922] - Field: 'local' [17:27:40.922] - Field: 'owner' [17:27:40.922] - Field: 'envir' [17:27:40.923] - Field: 'workers' [17:27:40.923] - Field: 'packages' [17:27:40.923] - Field: 'gc' [17:27:40.924] - Field: 'conditions' [17:27:40.924] - Field: 'persistent' [17:27:40.924] - Field: 'expr' [17:27:40.924] - Field: 'uuid' [17:27:40.925] - Field: 'seed' [17:27:40.925] - Field: 'version' [17:27:40.925] - Field: 'result' [17:27:40.926] - Field: 'asynchronous' [17:27:40.926] - Field: 'calls' [17:27:40.926] - Field: 'globals' [17:27:40.926] - Field: 'stdout' [17:27:40.927] - Field: 'earlySignal' [17:27:40.927] - Field: 'lazy' [17:27:40.927] - Field: 'state' [17:27:40.928] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:40.928] - Launch lazy future ... [17:27:40.929] Packages needed by the future expression (n = 0): [17:27:40.929] Packages needed by future strategies (n = 0): [17:27:40.930] { [17:27:40.930] { [17:27:40.930] { [17:27:40.930] ...future.startTime <- base::Sys.time() [17:27:40.930] { [17:27:40.930] { [17:27:40.930] { [17:27:40.930] { [17:27:40.930] base::local({ [17:27:40.930] has_future <- base::requireNamespace("future", [17:27:40.930] quietly = TRUE) [17:27:40.930] if (has_future) { [17:27:40.930] ns <- base::getNamespace("future") [17:27:40.930] version <- ns[[".package"]][["version"]] [17:27:40.930] if (is.null(version)) [17:27:40.930] version <- utils::packageVersion("future") [17:27:40.930] } [17:27:40.930] else { [17:27:40.930] version <- NULL [17:27:40.930] } [17:27:40.930] if (!has_future || version < "1.8.0") { [17:27:40.930] info <- base::c(r_version = base::gsub("R version ", [17:27:40.930] "", base::R.version$version.string), [17:27:40.930] platform = base::sprintf("%s (%s-bit)", [17:27:40.930] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:40.930] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:40.930] "release", "version")], collapse = " "), [17:27:40.930] hostname = base::Sys.info()[["nodename"]]) [17:27:40.930] info <- base::sprintf("%s: %s", base::names(info), [17:27:40.930] info) [17:27:40.930] info <- base::paste(info, collapse = "; ") [17:27:40.930] if (!has_future) { [17:27:40.930] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:40.930] info) [17:27:40.930] } [17:27:40.930] else { [17:27:40.930] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:40.930] info, version) [17:27:40.930] } [17:27:40.930] base::stop(msg) [17:27:40.930] } [17:27:40.930] }) [17:27:40.930] } [17:27:40.930] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:40.930] base::options(mc.cores = 1L) [17:27:40.930] } [17:27:40.930] ...future.strategy.old <- future::plan("list") [17:27:40.930] options(future.plan = NULL) [17:27:40.930] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.930] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:40.930] } [17:27:40.930] ...future.workdir <- getwd() [17:27:40.930] } [17:27:40.930] ...future.oldOptions <- base::as.list(base::.Options) [17:27:40.930] ...future.oldEnvVars <- base::Sys.getenv() [17:27:40.930] } [17:27:40.930] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:40.930] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:40.930] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:40.930] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:40.930] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:40.930] future.stdout.windows.reencode = NULL, width = 80L) [17:27:40.930] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:40.930] base::names(...future.oldOptions)) [17:27:40.930] } [17:27:40.930] if (FALSE) { [17:27:40.930] } [17:27:40.930] else { [17:27:40.930] if (TRUE) { [17:27:40.930] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:40.930] open = "w") [17:27:40.930] } [17:27:40.930] else { [17:27:40.930] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:40.930] windows = "NUL", "/dev/null"), open = "w") [17:27:40.930] } [17:27:40.930] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:40.930] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:40.930] base::sink(type = "output", split = FALSE) [17:27:40.930] base::close(...future.stdout) [17:27:40.930] }, add = TRUE) [17:27:40.930] } [17:27:40.930] ...future.frame <- base::sys.nframe() [17:27:40.930] ...future.conditions <- base::list() [17:27:40.930] ...future.rng <- base::globalenv()$.Random.seed [17:27:40.930] if (FALSE) { [17:27:40.930] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:40.930] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:40.930] } [17:27:40.930] ...future.result <- base::tryCatch({ [17:27:40.930] base::withCallingHandlers({ [17:27:40.930] ...future.value <- base::withVisible(base::local({ [17:27:40.930] ...future.makeSendCondition <- base::local({ [17:27:40.930] sendCondition <- NULL [17:27:40.930] function(frame = 1L) { [17:27:40.930] if (is.function(sendCondition)) [17:27:40.930] return(sendCondition) [17:27:40.930] ns <- getNamespace("parallel") [17:27:40.930] if (exists("sendData", mode = "function", [17:27:40.930] envir = ns)) { [17:27:40.930] parallel_sendData <- get("sendData", mode = "function", [17:27:40.930] envir = ns) [17:27:40.930] envir <- sys.frame(frame) [17:27:40.930] master <- NULL [17:27:40.930] while (!identical(envir, .GlobalEnv) && [17:27:40.930] !identical(envir, emptyenv())) { [17:27:40.930] if (exists("master", mode = "list", envir = envir, [17:27:40.930] inherits = FALSE)) { [17:27:40.930] master <- get("master", mode = "list", [17:27:40.930] envir = envir, inherits = FALSE) [17:27:40.930] if (inherits(master, c("SOCKnode", [17:27:40.930] "SOCK0node"))) { [17:27:40.930] sendCondition <<- function(cond) { [17:27:40.930] data <- list(type = "VALUE", value = cond, [17:27:40.930] success = TRUE) [17:27:40.930] parallel_sendData(master, data) [17:27:40.930] } [17:27:40.930] return(sendCondition) [17:27:40.930] } [17:27:40.930] } [17:27:40.930] frame <- frame + 1L [17:27:40.930] envir <- sys.frame(frame) [17:27:40.930] } [17:27:40.930] } [17:27:40.930] sendCondition <<- function(cond) NULL [17:27:40.930] } [17:27:40.930] }) [17:27:40.930] withCallingHandlers({ [17:27:40.930] { [17:27:40.930] 4 [17:27:40.930] } [17:27:40.930] }, immediateCondition = function(cond) { [17:27:40.930] sendCondition <- ...future.makeSendCondition() [17:27:40.930] sendCondition(cond) [17:27:40.930] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.930] { [17:27:40.930] inherits <- base::inherits [17:27:40.930] invokeRestart <- base::invokeRestart [17:27:40.930] is.null <- base::is.null [17:27:40.930] muffled <- FALSE [17:27:40.930] if (inherits(cond, "message")) { [17:27:40.930] muffled <- grepl(pattern, "muffleMessage") [17:27:40.930] if (muffled) [17:27:40.930] invokeRestart("muffleMessage") [17:27:40.930] } [17:27:40.930] else if (inherits(cond, "warning")) { [17:27:40.930] muffled <- grepl(pattern, "muffleWarning") [17:27:40.930] if (muffled) [17:27:40.930] invokeRestart("muffleWarning") [17:27:40.930] } [17:27:40.930] else if (inherits(cond, "condition")) { [17:27:40.930] if (!is.null(pattern)) { [17:27:40.930] computeRestarts <- base::computeRestarts [17:27:40.930] grepl <- base::grepl [17:27:40.930] restarts <- computeRestarts(cond) [17:27:40.930] for (restart in restarts) { [17:27:40.930] name <- restart$name [17:27:40.930] if (is.null(name)) [17:27:40.930] next [17:27:40.930] if (!grepl(pattern, name)) [17:27:40.930] next [17:27:40.930] invokeRestart(restart) [17:27:40.930] muffled <- TRUE [17:27:40.930] break [17:27:40.930] } [17:27:40.930] } [17:27:40.930] } [17:27:40.930] invisible(muffled) [17:27:40.930] } [17:27:40.930] muffleCondition(cond) [17:27:40.930] }) [17:27:40.930] })) [17:27:40.930] future::FutureResult(value = ...future.value$value, [17:27:40.930] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.930] ...future.rng), globalenv = if (FALSE) [17:27:40.930] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:40.930] ...future.globalenv.names)) [17:27:40.930] else NULL, started = ...future.startTime, version = "1.8") [17:27:40.930] }, condition = base::local({ [17:27:40.930] c <- base::c [17:27:40.930] inherits <- base::inherits [17:27:40.930] invokeRestart <- base::invokeRestart [17:27:40.930] length <- base::length [17:27:40.930] list <- base::list [17:27:40.930] seq.int <- base::seq.int [17:27:40.930] signalCondition <- base::signalCondition [17:27:40.930] sys.calls <- base::sys.calls [17:27:40.930] `[[` <- base::`[[` [17:27:40.930] `+` <- base::`+` [17:27:40.930] `<<-` <- base::`<<-` [17:27:40.930] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:40.930] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:40.930] 3L)] [17:27:40.930] } [17:27:40.930] function(cond) { [17:27:40.930] is_error <- inherits(cond, "error") [17:27:40.930] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:40.930] NULL) [17:27:40.930] if (is_error) { [17:27:40.930] sessionInformation <- function() { [17:27:40.930] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:40.930] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:40.930] search = base::search(), system = base::Sys.info()) [17:27:40.930] } [17:27:40.930] ...future.conditions[[length(...future.conditions) + [17:27:40.930] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:40.930] cond$call), session = sessionInformation(), [17:27:40.930] timestamp = base::Sys.time(), signaled = 0L) [17:27:40.930] signalCondition(cond) [17:27:40.930] } [17:27:40.930] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:40.930] "immediateCondition"))) { [17:27:40.930] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:40.930] ...future.conditions[[length(...future.conditions) + [17:27:40.930] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:40.930] if (TRUE && !signal) { [17:27:40.930] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.930] { [17:27:40.930] inherits <- base::inherits [17:27:40.930] invokeRestart <- base::invokeRestart [17:27:40.930] is.null <- base::is.null [17:27:40.930] muffled <- FALSE [17:27:40.930] if (inherits(cond, "message")) { [17:27:40.930] muffled <- grepl(pattern, "muffleMessage") [17:27:40.930] if (muffled) [17:27:40.930] invokeRestart("muffleMessage") [17:27:40.930] } [17:27:40.930] else if (inherits(cond, "warning")) { [17:27:40.930] muffled <- grepl(pattern, "muffleWarning") [17:27:40.930] if (muffled) [17:27:40.930] invokeRestart("muffleWarning") [17:27:40.930] } [17:27:40.930] else if (inherits(cond, "condition")) { [17:27:40.930] if (!is.null(pattern)) { [17:27:40.930] computeRestarts <- base::computeRestarts [17:27:40.930] grepl <- base::grepl [17:27:40.930] restarts <- computeRestarts(cond) [17:27:40.930] for (restart in restarts) { [17:27:40.930] name <- restart$name [17:27:40.930] if (is.null(name)) [17:27:40.930] next [17:27:40.930] if (!grepl(pattern, name)) [17:27:40.930] next [17:27:40.930] invokeRestart(restart) [17:27:40.930] muffled <- TRUE [17:27:40.930] break [17:27:40.930] } [17:27:40.930] } [17:27:40.930] } [17:27:40.930] invisible(muffled) [17:27:40.930] } [17:27:40.930] muffleCondition(cond, pattern = "^muffle") [17:27:40.930] } [17:27:40.930] } [17:27:40.930] else { [17:27:40.930] if (TRUE) { [17:27:40.930] muffleCondition <- function (cond, pattern = "^muffle") [17:27:40.930] { [17:27:40.930] inherits <- base::inherits [17:27:40.930] invokeRestart <- base::invokeRestart [17:27:40.930] is.null <- base::is.null [17:27:40.930] muffled <- FALSE [17:27:40.930] if (inherits(cond, "message")) { [17:27:40.930] muffled <- grepl(pattern, "muffleMessage") [17:27:40.930] if (muffled) [17:27:40.930] invokeRestart("muffleMessage") [17:27:40.930] } [17:27:40.930] else if (inherits(cond, "warning")) { [17:27:40.930] muffled <- grepl(pattern, "muffleWarning") [17:27:40.930] if (muffled) [17:27:40.930] invokeRestart("muffleWarning") [17:27:40.930] } [17:27:40.930] else if (inherits(cond, "condition")) { [17:27:40.930] if (!is.null(pattern)) { [17:27:40.930] computeRestarts <- base::computeRestarts [17:27:40.930] grepl <- base::grepl [17:27:40.930] restarts <- computeRestarts(cond) [17:27:40.930] for (restart in restarts) { [17:27:40.930] name <- restart$name [17:27:40.930] if (is.null(name)) [17:27:40.930] next [17:27:40.930] if (!grepl(pattern, name)) [17:27:40.930] next [17:27:40.930] invokeRestart(restart) [17:27:40.930] muffled <- TRUE [17:27:40.930] break [17:27:40.930] } [17:27:40.930] } [17:27:40.930] } [17:27:40.930] invisible(muffled) [17:27:40.930] } [17:27:40.930] muffleCondition(cond, pattern = "^muffle") [17:27:40.930] } [17:27:40.930] } [17:27:40.930] } [17:27:40.930] })) [17:27:40.930] }, error = function(ex) { [17:27:40.930] base::structure(base::list(value = NULL, visible = NULL, [17:27:40.930] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:40.930] ...future.rng), started = ...future.startTime, [17:27:40.930] finished = Sys.time(), session_uuid = NA_character_, [17:27:40.930] version = "1.8"), class = "FutureResult") [17:27:40.930] }, finally = { [17:27:40.930] if (!identical(...future.workdir, getwd())) [17:27:40.930] setwd(...future.workdir) [17:27:40.930] { [17:27:40.930] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:40.930] ...future.oldOptions$nwarnings <- NULL [17:27:40.930] } [17:27:40.930] base::options(...future.oldOptions) [17:27:40.930] if (.Platform$OS.type == "windows") { [17:27:40.930] old_names <- names(...future.oldEnvVars) [17:27:40.930] envs <- base::Sys.getenv() [17:27:40.930] names <- names(envs) [17:27:40.930] common <- intersect(names, old_names) [17:27:40.930] added <- setdiff(names, old_names) [17:27:40.930] removed <- setdiff(old_names, names) [17:27:40.930] changed <- common[...future.oldEnvVars[common] != [17:27:40.930] envs[common]] [17:27:40.930] NAMES <- toupper(changed) [17:27:40.930] args <- list() [17:27:40.930] for (kk in seq_along(NAMES)) { [17:27:40.930] name <- changed[[kk]] [17:27:40.930] NAME <- NAMES[[kk]] [17:27:40.930] if (name != NAME && is.element(NAME, old_names)) [17:27:40.930] next [17:27:40.930] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.930] } [17:27:40.930] NAMES <- toupper(added) [17:27:40.930] for (kk in seq_along(NAMES)) { [17:27:40.930] name <- added[[kk]] [17:27:40.930] NAME <- NAMES[[kk]] [17:27:40.930] if (name != NAME && is.element(NAME, old_names)) [17:27:40.930] next [17:27:40.930] args[[name]] <- "" [17:27:40.930] } [17:27:40.930] NAMES <- toupper(removed) [17:27:40.930] for (kk in seq_along(NAMES)) { [17:27:40.930] name <- removed[[kk]] [17:27:40.930] NAME <- NAMES[[kk]] [17:27:40.930] if (name != NAME && is.element(NAME, old_names)) [17:27:40.930] next [17:27:40.930] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:40.930] } [17:27:40.930] if (length(args) > 0) [17:27:40.930] base::do.call(base::Sys.setenv, args = args) [17:27:40.930] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:40.930] } [17:27:40.930] else { [17:27:40.930] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:40.930] } [17:27:40.930] { [17:27:40.930] if (base::length(...future.futureOptionsAdded) > [17:27:40.930] 0L) { [17:27:40.930] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:40.930] base::names(opts) <- ...future.futureOptionsAdded [17:27:40.930] base::options(opts) [17:27:40.930] } [17:27:40.930] { [17:27:40.930] { [17:27:40.930] base::options(mc.cores = ...future.mc.cores.old) [17:27:40.930] NULL [17:27:40.930] } [17:27:40.930] options(future.plan = NULL) [17:27:40.930] if (is.na(NA_character_)) [17:27:40.930] Sys.unsetenv("R_FUTURE_PLAN") [17:27:40.930] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:40.930] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:40.930] .init = FALSE) [17:27:40.930] } [17:27:40.930] } [17:27:40.930] } [17:27:40.930] }) [17:27:40.930] if (TRUE) { [17:27:40.930] base::sink(type = "output", split = FALSE) [17:27:40.930] if (TRUE) { [17:27:40.930] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:40.930] } [17:27:40.930] else { [17:27:40.930] ...future.result["stdout"] <- base::list(NULL) [17:27:40.930] } [17:27:40.930] base::close(...future.stdout) [17:27:40.930] ...future.stdout <- NULL [17:27:40.930] } [17:27:40.930] ...future.result$conditions <- ...future.conditions [17:27:40.930] ...future.result$finished <- base::Sys.time() [17:27:40.930] ...future.result [17:27:40.930] } [17:27:40.938] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:40.955] receiveMessageFromWorker() for ClusterFuture ... [17:27:40.955] - Validating connection of MultisessionFuture [17:27:40.956] - received message: FutureResult [17:27:40.956] - Received FutureResult [17:27:40.957] - Erased future from FutureRegistry [17:27:40.957] result() for ClusterFuture ... [17:27:40.957] - result already collected: FutureResult [17:27:40.958] result() for ClusterFuture ... done [17:27:40.958] receiveMessageFromWorker() for ClusterFuture ... done [17:27:40.958] result() for ClusterFuture ... [17:27:40.959] - result already collected: FutureResult [17:27:40.959] result() for ClusterFuture ... done [17:27:40.959] result() for ClusterFuture ... [17:27:40.959] - result already collected: FutureResult [17:27:40.960] result() for ClusterFuture ... done [17:27:40.962] MultisessionFuture started [17:27:40.962] - Launch lazy future ... done [17:27:40.963] run() for 'MultisessionFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' [17:27:40.988] receiveMessageFromWorker() for ClusterFuture ... [17:27:40.989] - Validating connection of MultisessionFuture [17:27:40.989] - received message: FutureResult [17:27:40.989] - Received FutureResult [17:27:40.990] - Erased future from FutureRegistry [17:27:40.990] result() for ClusterFuture ... [17:27:40.990] - result already collected: FutureResult [17:27:40.990] result() for ClusterFuture ... done [17:27:40.990] receiveMessageFromWorker() for ClusterFuture ... done [17:27:40.991] receiveMessageFromWorker() for ClusterFuture ... [17:27:40.991] - Validating connection of MultisessionFuture [17:27:40.991] - received message: FutureResult [17:27:40.992] - Received FutureResult [17:27:40.992] - Erased future from FutureRegistry [17:27:40.992] result() for ClusterFuture ... [17:27:40.992] - result already collected: FutureResult [17:27:40.992] result() for ClusterFuture ... done [17:27:40.992] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:40.995] resolve() on list environment ... [17:27:40.995] recursive: 0 [17:27:40.998] length: 6 [17:27:40.998] elements: 'a', 'b', 'c', 'd', '', '' [17:27:40.998] signalConditionsASAP(numeric, pos=1) ... [17:27:40.998] - nx: 6 [17:27:40.999] - relay: TRUE [17:27:40.999] - stdout: TRUE [17:27:40.999] - signal: TRUE [17:27:40.999] - resignal: FALSE [17:27:41.000] - force: TRUE [17:27:41.000] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.000] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.000] - until=2 [17:27:41.001] - relaying element #2 [17:27:41.001] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.001] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.002] signalConditionsASAP(NULL, pos=1) ... done [17:27:41.002] length: 5 (resolved future 1) [17:27:41.002] Future #2 [17:27:41.002] result() for ClusterFuture ... [17:27:41.003] - result already collected: FutureResult [17:27:41.003] result() for ClusterFuture ... done [17:27:41.003] result() for ClusterFuture ... [17:27:41.003] - result already collected: FutureResult [17:27:41.003] result() for ClusterFuture ... done [17:27:41.004] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:41.004] - nx: 6 [17:27:41.004] - relay: TRUE [17:27:41.004] - stdout: TRUE [17:27:41.005] - signal: TRUE [17:27:41.005] - resignal: FALSE [17:27:41.005] - force: TRUE [17:27:41.005] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.006] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.006] - until=2 [17:27:41.006] - relaying element #2 [17:27:41.006] result() for ClusterFuture ... [17:27:41.007] - result already collected: FutureResult [17:27:41.007] result() for ClusterFuture ... done [17:27:41.007] result() for ClusterFuture ... [17:27:41.008] - result already collected: FutureResult [17:27:41.008] result() for ClusterFuture ... done [17:27:41.008] result() for ClusterFuture ... [17:27:41.008] - result already collected: FutureResult [17:27:41.009] result() for ClusterFuture ... done [17:27:41.009] result() for ClusterFuture ... [17:27:41.009] - result already collected: FutureResult [17:27:41.009] result() for ClusterFuture ... done [17:27:41.010] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.010] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.010] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:41.011] length: 4 (resolved future 2) [17:27:41.011] Future #3 [17:27:41.011] result() for ClusterFuture ... [17:27:41.012] - result already collected: FutureResult [17:27:41.012] result() for ClusterFuture ... done [17:27:41.012] result() for ClusterFuture ... [17:27:41.012] - result already collected: FutureResult [17:27:41.013] result() for ClusterFuture ... done [17:27:41.013] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:41.013] - nx: 6 [17:27:41.013] - relay: TRUE [17:27:41.014] - stdout: TRUE [17:27:41.014] - signal: TRUE [17:27:41.014] - resignal: FALSE [17:27:41.014] - force: TRUE [17:27:41.015] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.015] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.015] - until=3 [17:27:41.016] - relaying element #3 [17:27:41.016] result() for ClusterFuture ... [17:27:41.016] - result already collected: FutureResult [17:27:41.016] result() for ClusterFuture ... done [17:27:41.017] result() for ClusterFuture ... [17:27:41.017] - result already collected: FutureResult [17:27:41.017] result() for ClusterFuture ... done [17:27:41.018] result() for ClusterFuture ... [17:27:41.018] - result already collected: FutureResult [17:27:41.018] result() for ClusterFuture ... done [17:27:41.018] result() for ClusterFuture ... [17:27:41.019] - result already collected: FutureResult [17:27:41.019] result() for ClusterFuture ... done [17:27:41.019] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.019] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.020] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:41.020] length: 3 (resolved future 3) [17:27:41.020] Future #4 [17:27:41.021] result() for ClusterFuture ... [17:27:41.021] - result already collected: FutureResult [17:27:41.021] result() for ClusterFuture ... done [17:27:41.021] result() for ClusterFuture ... [17:27:41.022] - result already collected: FutureResult [17:27:41.022] result() for ClusterFuture ... done [17:27:41.022] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:41.023] - nx: 6 [17:27:41.023] - relay: TRUE [17:27:41.023] - stdout: TRUE [17:27:41.023] - signal: TRUE [17:27:41.024] - resignal: FALSE [17:27:41.024] - force: TRUE [17:27:41.024] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.024] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.025] - until=4 [17:27:41.025] - relaying element #4 [17:27:41.025] result() for ClusterFuture ... [17:27:41.025] - result already collected: FutureResult [17:27:41.026] result() for ClusterFuture ... done [17:27:41.026] result() for ClusterFuture ... [17:27:41.026] - result already collected: FutureResult [17:27:41.026] result() for ClusterFuture ... done [17:27:41.027] result() for ClusterFuture ... [17:27:41.027] - result already collected: FutureResult [17:27:41.027] result() for ClusterFuture ... done [17:27:41.028] result() for ClusterFuture ... [17:27:41.028] - result already collected: FutureResult [17:27:41.028] result() for ClusterFuture ... done [17:27:41.028] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.029] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.029] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:41.029] length: 2 (resolved future 4) [17:27:41.030] signalConditionsASAP(NULL, pos=5) ... [17:27:41.030] - nx: 6 [17:27:41.030] - relay: TRUE [17:27:41.030] - stdout: TRUE [17:27:41.031] - signal: TRUE [17:27:41.031] - resignal: FALSE [17:27:41.031] - force: TRUE [17:27:41.031] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.032] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.032] - until=6 [17:27:41.032] - relaying element #6 [17:27:41.032] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.033] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.033] signalConditionsASAP(NULL, pos=5) ... done [17:27:41.033] length: 1 (resolved future 5) [17:27:41.034] signalConditionsASAP(numeric, pos=6) ... [17:27:41.034] - nx: 6 [17:27:41.034] - relay: TRUE [17:27:41.034] - stdout: TRUE [17:27:41.035] - signal: TRUE [17:27:41.035] - resignal: FALSE [17:27:41.035] - force: TRUE [17:27:41.035] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.035] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.036] - until=6 [17:27:41.036] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.036] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.037] signalConditionsASAP(numeric, pos=6) ... done [17:27:41.037] length: 0 (resolved future 6) [17:27:41.037] Relaying remaining futures [17:27:41.037] signalConditionsASAP(NULL, pos=0) ... [17:27:41.037] - nx: 6 [17:27:41.038] - relay: TRUE [17:27:41.038] - stdout: TRUE [17:27:41.038] - signal: TRUE [17:27:41.038] - resignal: FALSE [17:27:41.039] - force: TRUE [17:27:41.039] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.039] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:41.039] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.040] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.040] signalConditionsASAP(NULL, pos=0) ... done [17:27:41.040] resolve() on list environment ... DONE [17:27:41.041] result() for ClusterFuture ... [17:27:41.041] - result already collected: FutureResult [17:27:41.041] result() for ClusterFuture ... done [17:27:41.041] result() for ClusterFuture ... [17:27:41.042] - result already collected: FutureResult [17:27:41.042] result() for ClusterFuture ... done [17:27:41.042] result() for ClusterFuture ... [17:27:41.042] - result already collected: FutureResult [17:27:41.043] result() for ClusterFuture ... done [17:27:41.043] result() for ClusterFuture ... [17:27:41.043] - result already collected: FutureResult [17:27:41.043] result() for ClusterFuture ... done [17:27:41.044] result() for ClusterFuture ... [17:27:41.044] - result already collected: FutureResult [17:27:41.044] result() for ClusterFuture ... done [17:27:41.045] result() for ClusterFuture ... [17:27:41.045] - result already collected: FutureResult [17:27:41.045] result() for ClusterFuture ... done Classes 'listenv', 'environment' Dimensions: c(1, 6) [17:27:41.046] getGlobalsAndPackages() ... [17:27:41.046] Searching for globals... [17:27:41.047] [17:27:41.047] Searching for globals ... DONE [17:27:41.048] - globals: [0] [17:27:41.048] getGlobalsAndPackages() ... DONE [17:27:41.049] run() for 'Future' ... [17:27:41.049] - state: 'created' [17:27:41.049] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.068] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.068] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.068] - Field: 'node' [17:27:41.069] - Field: 'label' [17:27:41.069] - Field: 'local' [17:27:41.069] - Field: 'owner' [17:27:41.069] - Field: 'envir' [17:27:41.070] - Field: 'workers' [17:27:41.070] - Field: 'packages' [17:27:41.070] - Field: 'gc' [17:27:41.070] - Field: 'conditions' [17:27:41.071] - Field: 'persistent' [17:27:41.071] - Field: 'expr' [17:27:41.071] - Field: 'uuid' [17:27:41.071] - Field: 'seed' [17:27:41.072] - Field: 'version' [17:27:41.072] - Field: 'result' [17:27:41.072] - Field: 'asynchronous' [17:27:41.072] - Field: 'calls' [17:27:41.073] - Field: 'globals' [17:27:41.073] - Field: 'stdout' [17:27:41.073] - Field: 'earlySignal' [17:27:41.073] - Field: 'lazy' [17:27:41.074] - Field: 'state' [17:27:41.074] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.074] - Launch lazy future ... [17:27:41.075] Packages needed by the future expression (n = 0): [17:27:41.075] Packages needed by future strategies (n = 0): [17:27:41.076] { [17:27:41.076] { [17:27:41.076] { [17:27:41.076] ...future.startTime <- base::Sys.time() [17:27:41.076] { [17:27:41.076] { [17:27:41.076] { [17:27:41.076] { [17:27:41.076] base::local({ [17:27:41.076] has_future <- base::requireNamespace("future", [17:27:41.076] quietly = TRUE) [17:27:41.076] if (has_future) { [17:27:41.076] ns <- base::getNamespace("future") [17:27:41.076] version <- ns[[".package"]][["version"]] [17:27:41.076] if (is.null(version)) [17:27:41.076] version <- utils::packageVersion("future") [17:27:41.076] } [17:27:41.076] else { [17:27:41.076] version <- NULL [17:27:41.076] } [17:27:41.076] if (!has_future || version < "1.8.0") { [17:27:41.076] info <- base::c(r_version = base::gsub("R version ", [17:27:41.076] "", base::R.version$version.string), [17:27:41.076] platform = base::sprintf("%s (%s-bit)", [17:27:41.076] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.076] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.076] "release", "version")], collapse = " "), [17:27:41.076] hostname = base::Sys.info()[["nodename"]]) [17:27:41.076] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.076] info) [17:27:41.076] info <- base::paste(info, collapse = "; ") [17:27:41.076] if (!has_future) { [17:27:41.076] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.076] info) [17:27:41.076] } [17:27:41.076] else { [17:27:41.076] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.076] info, version) [17:27:41.076] } [17:27:41.076] base::stop(msg) [17:27:41.076] } [17:27:41.076] }) [17:27:41.076] } [17:27:41.076] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.076] base::options(mc.cores = 1L) [17:27:41.076] } [17:27:41.076] ...future.strategy.old <- future::plan("list") [17:27:41.076] options(future.plan = NULL) [17:27:41.076] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.076] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.076] } [17:27:41.076] ...future.workdir <- getwd() [17:27:41.076] } [17:27:41.076] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.076] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.076] } [17:27:41.076] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.076] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.076] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.076] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.076] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.076] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.076] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.076] base::names(...future.oldOptions)) [17:27:41.076] } [17:27:41.076] if (FALSE) { [17:27:41.076] } [17:27:41.076] else { [17:27:41.076] if (TRUE) { [17:27:41.076] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.076] open = "w") [17:27:41.076] } [17:27:41.076] else { [17:27:41.076] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.076] windows = "NUL", "/dev/null"), open = "w") [17:27:41.076] } [17:27:41.076] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.076] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.076] base::sink(type = "output", split = FALSE) [17:27:41.076] base::close(...future.stdout) [17:27:41.076] }, add = TRUE) [17:27:41.076] } [17:27:41.076] ...future.frame <- base::sys.nframe() [17:27:41.076] ...future.conditions <- base::list() [17:27:41.076] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.076] if (FALSE) { [17:27:41.076] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.076] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.076] } [17:27:41.076] ...future.result <- base::tryCatch({ [17:27:41.076] base::withCallingHandlers({ [17:27:41.076] ...future.value <- base::withVisible(base::local({ [17:27:41.076] ...future.makeSendCondition <- base::local({ [17:27:41.076] sendCondition <- NULL [17:27:41.076] function(frame = 1L) { [17:27:41.076] if (is.function(sendCondition)) [17:27:41.076] return(sendCondition) [17:27:41.076] ns <- getNamespace("parallel") [17:27:41.076] if (exists("sendData", mode = "function", [17:27:41.076] envir = ns)) { [17:27:41.076] parallel_sendData <- get("sendData", mode = "function", [17:27:41.076] envir = ns) [17:27:41.076] envir <- sys.frame(frame) [17:27:41.076] master <- NULL [17:27:41.076] while (!identical(envir, .GlobalEnv) && [17:27:41.076] !identical(envir, emptyenv())) { [17:27:41.076] if (exists("master", mode = "list", envir = envir, [17:27:41.076] inherits = FALSE)) { [17:27:41.076] master <- get("master", mode = "list", [17:27:41.076] envir = envir, inherits = FALSE) [17:27:41.076] if (inherits(master, c("SOCKnode", [17:27:41.076] "SOCK0node"))) { [17:27:41.076] sendCondition <<- function(cond) { [17:27:41.076] data <- list(type = "VALUE", value = cond, [17:27:41.076] success = TRUE) [17:27:41.076] parallel_sendData(master, data) [17:27:41.076] } [17:27:41.076] return(sendCondition) [17:27:41.076] } [17:27:41.076] } [17:27:41.076] frame <- frame + 1L [17:27:41.076] envir <- sys.frame(frame) [17:27:41.076] } [17:27:41.076] } [17:27:41.076] sendCondition <<- function(cond) NULL [17:27:41.076] } [17:27:41.076] }) [17:27:41.076] withCallingHandlers({ [17:27:41.076] 2 [17:27:41.076] }, immediateCondition = function(cond) { [17:27:41.076] sendCondition <- ...future.makeSendCondition() [17:27:41.076] sendCondition(cond) [17:27:41.076] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.076] { [17:27:41.076] inherits <- base::inherits [17:27:41.076] invokeRestart <- base::invokeRestart [17:27:41.076] is.null <- base::is.null [17:27:41.076] muffled <- FALSE [17:27:41.076] if (inherits(cond, "message")) { [17:27:41.076] muffled <- grepl(pattern, "muffleMessage") [17:27:41.076] if (muffled) [17:27:41.076] invokeRestart("muffleMessage") [17:27:41.076] } [17:27:41.076] else if (inherits(cond, "warning")) { [17:27:41.076] muffled <- grepl(pattern, "muffleWarning") [17:27:41.076] if (muffled) [17:27:41.076] invokeRestart("muffleWarning") [17:27:41.076] } [17:27:41.076] else if (inherits(cond, "condition")) { [17:27:41.076] if (!is.null(pattern)) { [17:27:41.076] computeRestarts <- base::computeRestarts [17:27:41.076] grepl <- base::grepl [17:27:41.076] restarts <- computeRestarts(cond) [17:27:41.076] for (restart in restarts) { [17:27:41.076] name <- restart$name [17:27:41.076] if (is.null(name)) [17:27:41.076] next [17:27:41.076] if (!grepl(pattern, name)) [17:27:41.076] next [17:27:41.076] invokeRestart(restart) [17:27:41.076] muffled <- TRUE [17:27:41.076] break [17:27:41.076] } [17:27:41.076] } [17:27:41.076] } [17:27:41.076] invisible(muffled) [17:27:41.076] } [17:27:41.076] muffleCondition(cond) [17:27:41.076] }) [17:27:41.076] })) [17:27:41.076] future::FutureResult(value = ...future.value$value, [17:27:41.076] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.076] ...future.rng), globalenv = if (FALSE) [17:27:41.076] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.076] ...future.globalenv.names)) [17:27:41.076] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.076] }, condition = base::local({ [17:27:41.076] c <- base::c [17:27:41.076] inherits <- base::inherits [17:27:41.076] invokeRestart <- base::invokeRestart [17:27:41.076] length <- base::length [17:27:41.076] list <- base::list [17:27:41.076] seq.int <- base::seq.int [17:27:41.076] signalCondition <- base::signalCondition [17:27:41.076] sys.calls <- base::sys.calls [17:27:41.076] `[[` <- base::`[[` [17:27:41.076] `+` <- base::`+` [17:27:41.076] `<<-` <- base::`<<-` [17:27:41.076] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.076] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.076] 3L)] [17:27:41.076] } [17:27:41.076] function(cond) { [17:27:41.076] is_error <- inherits(cond, "error") [17:27:41.076] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.076] NULL) [17:27:41.076] if (is_error) { [17:27:41.076] sessionInformation <- function() { [17:27:41.076] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.076] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.076] search = base::search(), system = base::Sys.info()) [17:27:41.076] } [17:27:41.076] ...future.conditions[[length(...future.conditions) + [17:27:41.076] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.076] cond$call), session = sessionInformation(), [17:27:41.076] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.076] signalCondition(cond) [17:27:41.076] } [17:27:41.076] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.076] "immediateCondition"))) { [17:27:41.076] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.076] ...future.conditions[[length(...future.conditions) + [17:27:41.076] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.076] if (TRUE && !signal) { [17:27:41.076] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.076] { [17:27:41.076] inherits <- base::inherits [17:27:41.076] invokeRestart <- base::invokeRestart [17:27:41.076] is.null <- base::is.null [17:27:41.076] muffled <- FALSE [17:27:41.076] if (inherits(cond, "message")) { [17:27:41.076] muffled <- grepl(pattern, "muffleMessage") [17:27:41.076] if (muffled) [17:27:41.076] invokeRestart("muffleMessage") [17:27:41.076] } [17:27:41.076] else if (inherits(cond, "warning")) { [17:27:41.076] muffled <- grepl(pattern, "muffleWarning") [17:27:41.076] if (muffled) [17:27:41.076] invokeRestart("muffleWarning") [17:27:41.076] } [17:27:41.076] else if (inherits(cond, "condition")) { [17:27:41.076] if (!is.null(pattern)) { [17:27:41.076] computeRestarts <- base::computeRestarts [17:27:41.076] grepl <- base::grepl [17:27:41.076] restarts <- computeRestarts(cond) [17:27:41.076] for (restart in restarts) { [17:27:41.076] name <- restart$name [17:27:41.076] if (is.null(name)) [17:27:41.076] next [17:27:41.076] if (!grepl(pattern, name)) [17:27:41.076] next [17:27:41.076] invokeRestart(restart) [17:27:41.076] muffled <- TRUE [17:27:41.076] break [17:27:41.076] } [17:27:41.076] } [17:27:41.076] } [17:27:41.076] invisible(muffled) [17:27:41.076] } [17:27:41.076] muffleCondition(cond, pattern = "^muffle") [17:27:41.076] } [17:27:41.076] } [17:27:41.076] else { [17:27:41.076] if (TRUE) { [17:27:41.076] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.076] { [17:27:41.076] inherits <- base::inherits [17:27:41.076] invokeRestart <- base::invokeRestart [17:27:41.076] is.null <- base::is.null [17:27:41.076] muffled <- FALSE [17:27:41.076] if (inherits(cond, "message")) { [17:27:41.076] muffled <- grepl(pattern, "muffleMessage") [17:27:41.076] if (muffled) [17:27:41.076] invokeRestart("muffleMessage") [17:27:41.076] } [17:27:41.076] else if (inherits(cond, "warning")) { [17:27:41.076] muffled <- grepl(pattern, "muffleWarning") [17:27:41.076] if (muffled) [17:27:41.076] invokeRestart("muffleWarning") [17:27:41.076] } [17:27:41.076] else if (inherits(cond, "condition")) { [17:27:41.076] if (!is.null(pattern)) { [17:27:41.076] computeRestarts <- base::computeRestarts [17:27:41.076] grepl <- base::grepl [17:27:41.076] restarts <- computeRestarts(cond) [17:27:41.076] for (restart in restarts) { [17:27:41.076] name <- restart$name [17:27:41.076] if (is.null(name)) [17:27:41.076] next [17:27:41.076] if (!grepl(pattern, name)) [17:27:41.076] next [17:27:41.076] invokeRestart(restart) [17:27:41.076] muffled <- TRUE [17:27:41.076] break [17:27:41.076] } [17:27:41.076] } [17:27:41.076] } [17:27:41.076] invisible(muffled) [17:27:41.076] } [17:27:41.076] muffleCondition(cond, pattern = "^muffle") [17:27:41.076] } [17:27:41.076] } [17:27:41.076] } [17:27:41.076] })) [17:27:41.076] }, error = function(ex) { [17:27:41.076] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.076] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.076] ...future.rng), started = ...future.startTime, [17:27:41.076] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.076] version = "1.8"), class = "FutureResult") [17:27:41.076] }, finally = { [17:27:41.076] if (!identical(...future.workdir, getwd())) [17:27:41.076] setwd(...future.workdir) [17:27:41.076] { [17:27:41.076] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.076] ...future.oldOptions$nwarnings <- NULL [17:27:41.076] } [17:27:41.076] base::options(...future.oldOptions) [17:27:41.076] if (.Platform$OS.type == "windows") { [17:27:41.076] old_names <- names(...future.oldEnvVars) [17:27:41.076] envs <- base::Sys.getenv() [17:27:41.076] names <- names(envs) [17:27:41.076] common <- intersect(names, old_names) [17:27:41.076] added <- setdiff(names, old_names) [17:27:41.076] removed <- setdiff(old_names, names) [17:27:41.076] changed <- common[...future.oldEnvVars[common] != [17:27:41.076] envs[common]] [17:27:41.076] NAMES <- toupper(changed) [17:27:41.076] args <- list() [17:27:41.076] for (kk in seq_along(NAMES)) { [17:27:41.076] name <- changed[[kk]] [17:27:41.076] NAME <- NAMES[[kk]] [17:27:41.076] if (name != NAME && is.element(NAME, old_names)) [17:27:41.076] next [17:27:41.076] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.076] } [17:27:41.076] NAMES <- toupper(added) [17:27:41.076] for (kk in seq_along(NAMES)) { [17:27:41.076] name <- added[[kk]] [17:27:41.076] NAME <- NAMES[[kk]] [17:27:41.076] if (name != NAME && is.element(NAME, old_names)) [17:27:41.076] next [17:27:41.076] args[[name]] <- "" [17:27:41.076] } [17:27:41.076] NAMES <- toupper(removed) [17:27:41.076] for (kk in seq_along(NAMES)) { [17:27:41.076] name <- removed[[kk]] [17:27:41.076] NAME <- NAMES[[kk]] [17:27:41.076] if (name != NAME && is.element(NAME, old_names)) [17:27:41.076] next [17:27:41.076] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.076] } [17:27:41.076] if (length(args) > 0) [17:27:41.076] base::do.call(base::Sys.setenv, args = args) [17:27:41.076] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.076] } [17:27:41.076] else { [17:27:41.076] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.076] } [17:27:41.076] { [17:27:41.076] if (base::length(...future.futureOptionsAdded) > [17:27:41.076] 0L) { [17:27:41.076] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.076] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.076] base::options(opts) [17:27:41.076] } [17:27:41.076] { [17:27:41.076] { [17:27:41.076] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.076] NULL [17:27:41.076] } [17:27:41.076] options(future.plan = NULL) [17:27:41.076] if (is.na(NA_character_)) [17:27:41.076] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.076] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.076] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.076] .init = FALSE) [17:27:41.076] } [17:27:41.076] } [17:27:41.076] } [17:27:41.076] }) [17:27:41.076] if (TRUE) { [17:27:41.076] base::sink(type = "output", split = FALSE) [17:27:41.076] if (TRUE) { [17:27:41.076] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.076] } [17:27:41.076] else { [17:27:41.076] ...future.result["stdout"] <- base::list(NULL) [17:27:41.076] } [17:27:41.076] base::close(...future.stdout) [17:27:41.076] ...future.stdout <- NULL [17:27:41.076] } [17:27:41.076] ...future.result$conditions <- ...future.conditions [17:27:41.076] ...future.result$finished <- base::Sys.time() [17:27:41.076] ...future.result [17:27:41.076] } [17:27:41.085] MultisessionFuture started [17:27:41.086] - Launch lazy future ... done [17:27:41.086] run() for 'MultisessionFuture' ... done [17:27:41.086] getGlobalsAndPackages() ... [17:27:41.087] Searching for globals... [17:27:41.087] [17:27:41.088] Searching for globals ... DONE [17:27:41.088] - globals: [0] [17:27:41.088] getGlobalsAndPackages() ... DONE [17:27:41.089] run() for 'Future' ... [17:27:41.089] - state: 'created' [17:27:41.090] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.110] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.110] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.111] - Field: 'node' [17:27:41.111] - Field: 'label' [17:27:41.111] - Field: 'local' [17:27:41.111] - Field: 'owner' [17:27:41.112] - Field: 'envir' [17:27:41.112] - Field: 'workers' [17:27:41.112] - Field: 'packages' [17:27:41.112] - Field: 'gc' [17:27:41.112] - Field: 'conditions' [17:27:41.113] - Field: 'persistent' [17:27:41.113] - Field: 'expr' [17:27:41.113] - Field: 'uuid' [17:27:41.113] - Field: 'seed' [17:27:41.113] - Field: 'version' [17:27:41.114] - Field: 'result' [17:27:41.114] - Field: 'asynchronous' [17:27:41.114] - Field: 'calls' [17:27:41.114] - Field: 'globals' [17:27:41.114] - Field: 'stdout' [17:27:41.115] - Field: 'earlySignal' [17:27:41.115] - Field: 'lazy' [17:27:41.115] - Field: 'state' [17:27:41.115] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.115] - Launch lazy future ... [17:27:41.116] Packages needed by the future expression (n = 0): [17:27:41.116] Packages needed by future strategies (n = 0): [17:27:41.117] { [17:27:41.117] { [17:27:41.117] { [17:27:41.117] ...future.startTime <- base::Sys.time() [17:27:41.117] { [17:27:41.117] { [17:27:41.117] { [17:27:41.117] { [17:27:41.117] base::local({ [17:27:41.117] has_future <- base::requireNamespace("future", [17:27:41.117] quietly = TRUE) [17:27:41.117] if (has_future) { [17:27:41.117] ns <- base::getNamespace("future") [17:27:41.117] version <- ns[[".package"]][["version"]] [17:27:41.117] if (is.null(version)) [17:27:41.117] version <- utils::packageVersion("future") [17:27:41.117] } [17:27:41.117] else { [17:27:41.117] version <- NULL [17:27:41.117] } [17:27:41.117] if (!has_future || version < "1.8.0") { [17:27:41.117] info <- base::c(r_version = base::gsub("R version ", [17:27:41.117] "", base::R.version$version.string), [17:27:41.117] platform = base::sprintf("%s (%s-bit)", [17:27:41.117] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.117] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.117] "release", "version")], collapse = " "), [17:27:41.117] hostname = base::Sys.info()[["nodename"]]) [17:27:41.117] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.117] info) [17:27:41.117] info <- base::paste(info, collapse = "; ") [17:27:41.117] if (!has_future) { [17:27:41.117] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.117] info) [17:27:41.117] } [17:27:41.117] else { [17:27:41.117] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.117] info, version) [17:27:41.117] } [17:27:41.117] base::stop(msg) [17:27:41.117] } [17:27:41.117] }) [17:27:41.117] } [17:27:41.117] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.117] base::options(mc.cores = 1L) [17:27:41.117] } [17:27:41.117] ...future.strategy.old <- future::plan("list") [17:27:41.117] options(future.plan = NULL) [17:27:41.117] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.117] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.117] } [17:27:41.117] ...future.workdir <- getwd() [17:27:41.117] } [17:27:41.117] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.117] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.117] } [17:27:41.117] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.117] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.117] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.117] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.117] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.117] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.117] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.117] base::names(...future.oldOptions)) [17:27:41.117] } [17:27:41.117] if (FALSE) { [17:27:41.117] } [17:27:41.117] else { [17:27:41.117] if (TRUE) { [17:27:41.117] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.117] open = "w") [17:27:41.117] } [17:27:41.117] else { [17:27:41.117] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.117] windows = "NUL", "/dev/null"), open = "w") [17:27:41.117] } [17:27:41.117] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.117] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.117] base::sink(type = "output", split = FALSE) [17:27:41.117] base::close(...future.stdout) [17:27:41.117] }, add = TRUE) [17:27:41.117] } [17:27:41.117] ...future.frame <- base::sys.nframe() [17:27:41.117] ...future.conditions <- base::list() [17:27:41.117] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.117] if (FALSE) { [17:27:41.117] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.117] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.117] } [17:27:41.117] ...future.result <- base::tryCatch({ [17:27:41.117] base::withCallingHandlers({ [17:27:41.117] ...future.value <- base::withVisible(base::local({ [17:27:41.117] ...future.makeSendCondition <- base::local({ [17:27:41.117] sendCondition <- NULL [17:27:41.117] function(frame = 1L) { [17:27:41.117] if (is.function(sendCondition)) [17:27:41.117] return(sendCondition) [17:27:41.117] ns <- getNamespace("parallel") [17:27:41.117] if (exists("sendData", mode = "function", [17:27:41.117] envir = ns)) { [17:27:41.117] parallel_sendData <- get("sendData", mode = "function", [17:27:41.117] envir = ns) [17:27:41.117] envir <- sys.frame(frame) [17:27:41.117] master <- NULL [17:27:41.117] while (!identical(envir, .GlobalEnv) && [17:27:41.117] !identical(envir, emptyenv())) { [17:27:41.117] if (exists("master", mode = "list", envir = envir, [17:27:41.117] inherits = FALSE)) { [17:27:41.117] master <- get("master", mode = "list", [17:27:41.117] envir = envir, inherits = FALSE) [17:27:41.117] if (inherits(master, c("SOCKnode", [17:27:41.117] "SOCK0node"))) { [17:27:41.117] sendCondition <<- function(cond) { [17:27:41.117] data <- list(type = "VALUE", value = cond, [17:27:41.117] success = TRUE) [17:27:41.117] parallel_sendData(master, data) [17:27:41.117] } [17:27:41.117] return(sendCondition) [17:27:41.117] } [17:27:41.117] } [17:27:41.117] frame <- frame + 1L [17:27:41.117] envir <- sys.frame(frame) [17:27:41.117] } [17:27:41.117] } [17:27:41.117] sendCondition <<- function(cond) NULL [17:27:41.117] } [17:27:41.117] }) [17:27:41.117] withCallingHandlers({ [17:27:41.117] NULL [17:27:41.117] }, immediateCondition = function(cond) { [17:27:41.117] sendCondition <- ...future.makeSendCondition() [17:27:41.117] sendCondition(cond) [17:27:41.117] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.117] { [17:27:41.117] inherits <- base::inherits [17:27:41.117] invokeRestart <- base::invokeRestart [17:27:41.117] is.null <- base::is.null [17:27:41.117] muffled <- FALSE [17:27:41.117] if (inherits(cond, "message")) { [17:27:41.117] muffled <- grepl(pattern, "muffleMessage") [17:27:41.117] if (muffled) [17:27:41.117] invokeRestart("muffleMessage") [17:27:41.117] } [17:27:41.117] else if (inherits(cond, "warning")) { [17:27:41.117] muffled <- grepl(pattern, "muffleWarning") [17:27:41.117] if (muffled) [17:27:41.117] invokeRestart("muffleWarning") [17:27:41.117] } [17:27:41.117] else if (inherits(cond, "condition")) { [17:27:41.117] if (!is.null(pattern)) { [17:27:41.117] computeRestarts <- base::computeRestarts [17:27:41.117] grepl <- base::grepl [17:27:41.117] restarts <- computeRestarts(cond) [17:27:41.117] for (restart in restarts) { [17:27:41.117] name <- restart$name [17:27:41.117] if (is.null(name)) [17:27:41.117] next [17:27:41.117] if (!grepl(pattern, name)) [17:27:41.117] next [17:27:41.117] invokeRestart(restart) [17:27:41.117] muffled <- TRUE [17:27:41.117] break [17:27:41.117] } [17:27:41.117] } [17:27:41.117] } [17:27:41.117] invisible(muffled) [17:27:41.117] } [17:27:41.117] muffleCondition(cond) [17:27:41.117] }) [17:27:41.117] })) [17:27:41.117] future::FutureResult(value = ...future.value$value, [17:27:41.117] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.117] ...future.rng), globalenv = if (FALSE) [17:27:41.117] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.117] ...future.globalenv.names)) [17:27:41.117] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.117] }, condition = base::local({ [17:27:41.117] c <- base::c [17:27:41.117] inherits <- base::inherits [17:27:41.117] invokeRestart <- base::invokeRestart [17:27:41.117] length <- base::length [17:27:41.117] list <- base::list [17:27:41.117] seq.int <- base::seq.int [17:27:41.117] signalCondition <- base::signalCondition [17:27:41.117] sys.calls <- base::sys.calls [17:27:41.117] `[[` <- base::`[[` [17:27:41.117] `+` <- base::`+` [17:27:41.117] `<<-` <- base::`<<-` [17:27:41.117] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.117] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.117] 3L)] [17:27:41.117] } [17:27:41.117] function(cond) { [17:27:41.117] is_error <- inherits(cond, "error") [17:27:41.117] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.117] NULL) [17:27:41.117] if (is_error) { [17:27:41.117] sessionInformation <- function() { [17:27:41.117] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.117] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.117] search = base::search(), system = base::Sys.info()) [17:27:41.117] } [17:27:41.117] ...future.conditions[[length(...future.conditions) + [17:27:41.117] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.117] cond$call), session = sessionInformation(), [17:27:41.117] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.117] signalCondition(cond) [17:27:41.117] } [17:27:41.117] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.117] "immediateCondition"))) { [17:27:41.117] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.117] ...future.conditions[[length(...future.conditions) + [17:27:41.117] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.117] if (TRUE && !signal) { [17:27:41.117] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.117] { [17:27:41.117] inherits <- base::inherits [17:27:41.117] invokeRestart <- base::invokeRestart [17:27:41.117] is.null <- base::is.null [17:27:41.117] muffled <- FALSE [17:27:41.117] if (inherits(cond, "message")) { [17:27:41.117] muffled <- grepl(pattern, "muffleMessage") [17:27:41.117] if (muffled) [17:27:41.117] invokeRestart("muffleMessage") [17:27:41.117] } [17:27:41.117] else if (inherits(cond, "warning")) { [17:27:41.117] muffled <- grepl(pattern, "muffleWarning") [17:27:41.117] if (muffled) [17:27:41.117] invokeRestart("muffleWarning") [17:27:41.117] } [17:27:41.117] else if (inherits(cond, "condition")) { [17:27:41.117] if (!is.null(pattern)) { [17:27:41.117] computeRestarts <- base::computeRestarts [17:27:41.117] grepl <- base::grepl [17:27:41.117] restarts <- computeRestarts(cond) [17:27:41.117] for (restart in restarts) { [17:27:41.117] name <- restart$name [17:27:41.117] if (is.null(name)) [17:27:41.117] next [17:27:41.117] if (!grepl(pattern, name)) [17:27:41.117] next [17:27:41.117] invokeRestart(restart) [17:27:41.117] muffled <- TRUE [17:27:41.117] break [17:27:41.117] } [17:27:41.117] } [17:27:41.117] } [17:27:41.117] invisible(muffled) [17:27:41.117] } [17:27:41.117] muffleCondition(cond, pattern = "^muffle") [17:27:41.117] } [17:27:41.117] } [17:27:41.117] else { [17:27:41.117] if (TRUE) { [17:27:41.117] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.117] { [17:27:41.117] inherits <- base::inherits [17:27:41.117] invokeRestart <- base::invokeRestart [17:27:41.117] is.null <- base::is.null [17:27:41.117] muffled <- FALSE [17:27:41.117] if (inherits(cond, "message")) { [17:27:41.117] muffled <- grepl(pattern, "muffleMessage") [17:27:41.117] if (muffled) [17:27:41.117] invokeRestart("muffleMessage") [17:27:41.117] } [17:27:41.117] else if (inherits(cond, "warning")) { [17:27:41.117] muffled <- grepl(pattern, "muffleWarning") [17:27:41.117] if (muffled) [17:27:41.117] invokeRestart("muffleWarning") [17:27:41.117] } [17:27:41.117] else if (inherits(cond, "condition")) { [17:27:41.117] if (!is.null(pattern)) { [17:27:41.117] computeRestarts <- base::computeRestarts [17:27:41.117] grepl <- base::grepl [17:27:41.117] restarts <- computeRestarts(cond) [17:27:41.117] for (restart in restarts) { [17:27:41.117] name <- restart$name [17:27:41.117] if (is.null(name)) [17:27:41.117] next [17:27:41.117] if (!grepl(pattern, name)) [17:27:41.117] next [17:27:41.117] invokeRestart(restart) [17:27:41.117] muffled <- TRUE [17:27:41.117] break [17:27:41.117] } [17:27:41.117] } [17:27:41.117] } [17:27:41.117] invisible(muffled) [17:27:41.117] } [17:27:41.117] muffleCondition(cond, pattern = "^muffle") [17:27:41.117] } [17:27:41.117] } [17:27:41.117] } [17:27:41.117] })) [17:27:41.117] }, error = function(ex) { [17:27:41.117] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.117] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.117] ...future.rng), started = ...future.startTime, [17:27:41.117] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.117] version = "1.8"), class = "FutureResult") [17:27:41.117] }, finally = { [17:27:41.117] if (!identical(...future.workdir, getwd())) [17:27:41.117] setwd(...future.workdir) [17:27:41.117] { [17:27:41.117] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.117] ...future.oldOptions$nwarnings <- NULL [17:27:41.117] } [17:27:41.117] base::options(...future.oldOptions) [17:27:41.117] if (.Platform$OS.type == "windows") { [17:27:41.117] old_names <- names(...future.oldEnvVars) [17:27:41.117] envs <- base::Sys.getenv() [17:27:41.117] names <- names(envs) [17:27:41.117] common <- intersect(names, old_names) [17:27:41.117] added <- setdiff(names, old_names) [17:27:41.117] removed <- setdiff(old_names, names) [17:27:41.117] changed <- common[...future.oldEnvVars[common] != [17:27:41.117] envs[common]] [17:27:41.117] NAMES <- toupper(changed) [17:27:41.117] args <- list() [17:27:41.117] for (kk in seq_along(NAMES)) { [17:27:41.117] name <- changed[[kk]] [17:27:41.117] NAME <- NAMES[[kk]] [17:27:41.117] if (name != NAME && is.element(NAME, old_names)) [17:27:41.117] next [17:27:41.117] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.117] } [17:27:41.117] NAMES <- toupper(added) [17:27:41.117] for (kk in seq_along(NAMES)) { [17:27:41.117] name <- added[[kk]] [17:27:41.117] NAME <- NAMES[[kk]] [17:27:41.117] if (name != NAME && is.element(NAME, old_names)) [17:27:41.117] next [17:27:41.117] args[[name]] <- "" [17:27:41.117] } [17:27:41.117] NAMES <- toupper(removed) [17:27:41.117] for (kk in seq_along(NAMES)) { [17:27:41.117] name <- removed[[kk]] [17:27:41.117] NAME <- NAMES[[kk]] [17:27:41.117] if (name != NAME && is.element(NAME, old_names)) [17:27:41.117] next [17:27:41.117] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.117] } [17:27:41.117] if (length(args) > 0) [17:27:41.117] base::do.call(base::Sys.setenv, args = args) [17:27:41.117] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.117] } [17:27:41.117] else { [17:27:41.117] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.117] } [17:27:41.117] { [17:27:41.117] if (base::length(...future.futureOptionsAdded) > [17:27:41.117] 0L) { [17:27:41.117] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.117] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.117] base::options(opts) [17:27:41.117] } [17:27:41.117] { [17:27:41.117] { [17:27:41.117] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.117] NULL [17:27:41.117] } [17:27:41.117] options(future.plan = NULL) [17:27:41.117] if (is.na(NA_character_)) [17:27:41.117] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.117] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.117] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.117] .init = FALSE) [17:27:41.117] } [17:27:41.117] } [17:27:41.117] } [17:27:41.117] }) [17:27:41.117] if (TRUE) { [17:27:41.117] base::sink(type = "output", split = FALSE) [17:27:41.117] if (TRUE) { [17:27:41.117] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.117] } [17:27:41.117] else { [17:27:41.117] ...future.result["stdout"] <- base::list(NULL) [17:27:41.117] } [17:27:41.117] base::close(...future.stdout) [17:27:41.117] ...future.stdout <- NULL [17:27:41.117] } [17:27:41.117] ...future.result$conditions <- ...future.conditions [17:27:41.117] ...future.result$finished <- base::Sys.time() [17:27:41.117] ...future.result [17:27:41.117] } [17:27:41.124] MultisessionFuture started [17:27:41.124] - Launch lazy future ... done [17:27:41.125] run() for 'MultisessionFuture' ... done [17:27:41.125] getGlobalsAndPackages() ... [17:27:41.125] Searching for globals... [17:27:41.126] - globals found: [1] '{' [17:27:41.127] Searching for globals ... DONE [17:27:41.127] Resolving globals: FALSE [17:27:41.128] [17:27:41.128] [17:27:41.128] getGlobalsAndPackages() ... DONE [17:27:41.128] run() for 'Future' ... [17:27:41.129] - state: 'created' [17:27:41.129] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.148] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.149] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.149] - Field: 'node' [17:27:41.150] - Field: 'label' [17:27:41.150] - Field: 'local' [17:27:41.150] - Field: 'owner' [17:27:41.151] - Field: 'envir' [17:27:41.151] - Field: 'workers' [17:27:41.152] - Field: 'packages' [17:27:41.152] - Field: 'gc' [17:27:41.152] - Field: 'conditions' [17:27:41.153] - Field: 'persistent' [17:27:41.153] - Field: 'expr' [17:27:41.153] - Field: 'uuid' [17:27:41.154] - Field: 'seed' [17:27:41.154] - Field: 'version' [17:27:41.155] - Field: 'result' [17:27:41.155] - Field: 'asynchronous' [17:27:41.155] - Field: 'calls' [17:27:41.156] - Field: 'globals' [17:27:41.156] - Field: 'stdout' [17:27:41.156] - Field: 'earlySignal' [17:27:41.157] - Field: 'lazy' [17:27:41.157] - Field: 'state' [17:27:41.158] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.158] - Launch lazy future ... [17:27:41.159] Packages needed by the future expression (n = 0): [17:27:41.159] Packages needed by future strategies (n = 0): [17:27:41.160] { [17:27:41.160] { [17:27:41.160] { [17:27:41.160] ...future.startTime <- base::Sys.time() [17:27:41.160] { [17:27:41.160] { [17:27:41.160] { [17:27:41.160] { [17:27:41.160] base::local({ [17:27:41.160] has_future <- base::requireNamespace("future", [17:27:41.160] quietly = TRUE) [17:27:41.160] if (has_future) { [17:27:41.160] ns <- base::getNamespace("future") [17:27:41.160] version <- ns[[".package"]][["version"]] [17:27:41.160] if (is.null(version)) [17:27:41.160] version <- utils::packageVersion("future") [17:27:41.160] } [17:27:41.160] else { [17:27:41.160] version <- NULL [17:27:41.160] } [17:27:41.160] if (!has_future || version < "1.8.0") { [17:27:41.160] info <- base::c(r_version = base::gsub("R version ", [17:27:41.160] "", base::R.version$version.string), [17:27:41.160] platform = base::sprintf("%s (%s-bit)", [17:27:41.160] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.160] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.160] "release", "version")], collapse = " "), [17:27:41.160] hostname = base::Sys.info()[["nodename"]]) [17:27:41.160] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.160] info) [17:27:41.160] info <- base::paste(info, collapse = "; ") [17:27:41.160] if (!has_future) { [17:27:41.160] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.160] info) [17:27:41.160] } [17:27:41.160] else { [17:27:41.160] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.160] info, version) [17:27:41.160] } [17:27:41.160] base::stop(msg) [17:27:41.160] } [17:27:41.160] }) [17:27:41.160] } [17:27:41.160] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.160] base::options(mc.cores = 1L) [17:27:41.160] } [17:27:41.160] ...future.strategy.old <- future::plan("list") [17:27:41.160] options(future.plan = NULL) [17:27:41.160] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.160] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.160] } [17:27:41.160] ...future.workdir <- getwd() [17:27:41.160] } [17:27:41.160] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.160] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.160] } [17:27:41.160] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.160] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.160] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.160] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.160] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.160] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.160] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.160] base::names(...future.oldOptions)) [17:27:41.160] } [17:27:41.160] if (FALSE) { [17:27:41.160] } [17:27:41.160] else { [17:27:41.160] if (TRUE) { [17:27:41.160] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.160] open = "w") [17:27:41.160] } [17:27:41.160] else { [17:27:41.160] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.160] windows = "NUL", "/dev/null"), open = "w") [17:27:41.160] } [17:27:41.160] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.160] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.160] base::sink(type = "output", split = FALSE) [17:27:41.160] base::close(...future.stdout) [17:27:41.160] }, add = TRUE) [17:27:41.160] } [17:27:41.160] ...future.frame <- base::sys.nframe() [17:27:41.160] ...future.conditions <- base::list() [17:27:41.160] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.160] if (FALSE) { [17:27:41.160] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.160] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.160] } [17:27:41.160] ...future.result <- base::tryCatch({ [17:27:41.160] base::withCallingHandlers({ [17:27:41.160] ...future.value <- base::withVisible(base::local({ [17:27:41.160] ...future.makeSendCondition <- base::local({ [17:27:41.160] sendCondition <- NULL [17:27:41.160] function(frame = 1L) { [17:27:41.160] if (is.function(sendCondition)) [17:27:41.160] return(sendCondition) [17:27:41.160] ns <- getNamespace("parallel") [17:27:41.160] if (exists("sendData", mode = "function", [17:27:41.160] envir = ns)) { [17:27:41.160] parallel_sendData <- get("sendData", mode = "function", [17:27:41.160] envir = ns) [17:27:41.160] envir <- sys.frame(frame) [17:27:41.160] master <- NULL [17:27:41.160] while (!identical(envir, .GlobalEnv) && [17:27:41.160] !identical(envir, emptyenv())) { [17:27:41.160] if (exists("master", mode = "list", envir = envir, [17:27:41.160] inherits = FALSE)) { [17:27:41.160] master <- get("master", mode = "list", [17:27:41.160] envir = envir, inherits = FALSE) [17:27:41.160] if (inherits(master, c("SOCKnode", [17:27:41.160] "SOCK0node"))) { [17:27:41.160] sendCondition <<- function(cond) { [17:27:41.160] data <- list(type = "VALUE", value = cond, [17:27:41.160] success = TRUE) [17:27:41.160] parallel_sendData(master, data) [17:27:41.160] } [17:27:41.160] return(sendCondition) [17:27:41.160] } [17:27:41.160] } [17:27:41.160] frame <- frame + 1L [17:27:41.160] envir <- sys.frame(frame) [17:27:41.160] } [17:27:41.160] } [17:27:41.160] sendCondition <<- function(cond) NULL [17:27:41.160] } [17:27:41.160] }) [17:27:41.160] withCallingHandlers({ [17:27:41.160] { [17:27:41.160] 4 [17:27:41.160] } [17:27:41.160] }, immediateCondition = function(cond) { [17:27:41.160] sendCondition <- ...future.makeSendCondition() [17:27:41.160] sendCondition(cond) [17:27:41.160] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.160] { [17:27:41.160] inherits <- base::inherits [17:27:41.160] invokeRestart <- base::invokeRestart [17:27:41.160] is.null <- base::is.null [17:27:41.160] muffled <- FALSE [17:27:41.160] if (inherits(cond, "message")) { [17:27:41.160] muffled <- grepl(pattern, "muffleMessage") [17:27:41.160] if (muffled) [17:27:41.160] invokeRestart("muffleMessage") [17:27:41.160] } [17:27:41.160] else if (inherits(cond, "warning")) { [17:27:41.160] muffled <- grepl(pattern, "muffleWarning") [17:27:41.160] if (muffled) [17:27:41.160] invokeRestart("muffleWarning") [17:27:41.160] } [17:27:41.160] else if (inherits(cond, "condition")) { [17:27:41.160] if (!is.null(pattern)) { [17:27:41.160] computeRestarts <- base::computeRestarts [17:27:41.160] grepl <- base::grepl [17:27:41.160] restarts <- computeRestarts(cond) [17:27:41.160] for (restart in restarts) { [17:27:41.160] name <- restart$name [17:27:41.160] if (is.null(name)) [17:27:41.160] next [17:27:41.160] if (!grepl(pattern, name)) [17:27:41.160] next [17:27:41.160] invokeRestart(restart) [17:27:41.160] muffled <- TRUE [17:27:41.160] break [17:27:41.160] } [17:27:41.160] } [17:27:41.160] } [17:27:41.160] invisible(muffled) [17:27:41.160] } [17:27:41.160] muffleCondition(cond) [17:27:41.160] }) [17:27:41.160] })) [17:27:41.160] future::FutureResult(value = ...future.value$value, [17:27:41.160] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.160] ...future.rng), globalenv = if (FALSE) [17:27:41.160] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.160] ...future.globalenv.names)) [17:27:41.160] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.160] }, condition = base::local({ [17:27:41.160] c <- base::c [17:27:41.160] inherits <- base::inherits [17:27:41.160] invokeRestart <- base::invokeRestart [17:27:41.160] length <- base::length [17:27:41.160] list <- base::list [17:27:41.160] seq.int <- base::seq.int [17:27:41.160] signalCondition <- base::signalCondition [17:27:41.160] sys.calls <- base::sys.calls [17:27:41.160] `[[` <- base::`[[` [17:27:41.160] `+` <- base::`+` [17:27:41.160] `<<-` <- base::`<<-` [17:27:41.160] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.160] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.160] 3L)] [17:27:41.160] } [17:27:41.160] function(cond) { [17:27:41.160] is_error <- inherits(cond, "error") [17:27:41.160] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.160] NULL) [17:27:41.160] if (is_error) { [17:27:41.160] sessionInformation <- function() { [17:27:41.160] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.160] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.160] search = base::search(), system = base::Sys.info()) [17:27:41.160] } [17:27:41.160] ...future.conditions[[length(...future.conditions) + [17:27:41.160] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.160] cond$call), session = sessionInformation(), [17:27:41.160] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.160] signalCondition(cond) [17:27:41.160] } [17:27:41.160] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.160] "immediateCondition"))) { [17:27:41.160] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.160] ...future.conditions[[length(...future.conditions) + [17:27:41.160] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.160] if (TRUE && !signal) { [17:27:41.160] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.160] { [17:27:41.160] inherits <- base::inherits [17:27:41.160] invokeRestart <- base::invokeRestart [17:27:41.160] is.null <- base::is.null [17:27:41.160] muffled <- FALSE [17:27:41.160] if (inherits(cond, "message")) { [17:27:41.160] muffled <- grepl(pattern, "muffleMessage") [17:27:41.160] if (muffled) [17:27:41.160] invokeRestart("muffleMessage") [17:27:41.160] } [17:27:41.160] else if (inherits(cond, "warning")) { [17:27:41.160] muffled <- grepl(pattern, "muffleWarning") [17:27:41.160] if (muffled) [17:27:41.160] invokeRestart("muffleWarning") [17:27:41.160] } [17:27:41.160] else if (inherits(cond, "condition")) { [17:27:41.160] if (!is.null(pattern)) { [17:27:41.160] computeRestarts <- base::computeRestarts [17:27:41.160] grepl <- base::grepl [17:27:41.160] restarts <- computeRestarts(cond) [17:27:41.160] for (restart in restarts) { [17:27:41.160] name <- restart$name [17:27:41.160] if (is.null(name)) [17:27:41.160] next [17:27:41.160] if (!grepl(pattern, name)) [17:27:41.160] next [17:27:41.160] invokeRestart(restart) [17:27:41.160] muffled <- TRUE [17:27:41.160] break [17:27:41.160] } [17:27:41.160] } [17:27:41.160] } [17:27:41.160] invisible(muffled) [17:27:41.160] } [17:27:41.160] muffleCondition(cond, pattern = "^muffle") [17:27:41.160] } [17:27:41.160] } [17:27:41.160] else { [17:27:41.160] if (TRUE) { [17:27:41.160] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.160] { [17:27:41.160] inherits <- base::inherits [17:27:41.160] invokeRestart <- base::invokeRestart [17:27:41.160] is.null <- base::is.null [17:27:41.160] muffled <- FALSE [17:27:41.160] if (inherits(cond, "message")) { [17:27:41.160] muffled <- grepl(pattern, "muffleMessage") [17:27:41.160] if (muffled) [17:27:41.160] invokeRestart("muffleMessage") [17:27:41.160] } [17:27:41.160] else if (inherits(cond, "warning")) { [17:27:41.160] muffled <- grepl(pattern, "muffleWarning") [17:27:41.160] if (muffled) [17:27:41.160] invokeRestart("muffleWarning") [17:27:41.160] } [17:27:41.160] else if (inherits(cond, "condition")) { [17:27:41.160] if (!is.null(pattern)) { [17:27:41.160] computeRestarts <- base::computeRestarts [17:27:41.160] grepl <- base::grepl [17:27:41.160] restarts <- computeRestarts(cond) [17:27:41.160] for (restart in restarts) { [17:27:41.160] name <- restart$name [17:27:41.160] if (is.null(name)) [17:27:41.160] next [17:27:41.160] if (!grepl(pattern, name)) [17:27:41.160] next [17:27:41.160] invokeRestart(restart) [17:27:41.160] muffled <- TRUE [17:27:41.160] break [17:27:41.160] } [17:27:41.160] } [17:27:41.160] } [17:27:41.160] invisible(muffled) [17:27:41.160] } [17:27:41.160] muffleCondition(cond, pattern = "^muffle") [17:27:41.160] } [17:27:41.160] } [17:27:41.160] } [17:27:41.160] })) [17:27:41.160] }, error = function(ex) { [17:27:41.160] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.160] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.160] ...future.rng), started = ...future.startTime, [17:27:41.160] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.160] version = "1.8"), class = "FutureResult") [17:27:41.160] }, finally = { [17:27:41.160] if (!identical(...future.workdir, getwd())) [17:27:41.160] setwd(...future.workdir) [17:27:41.160] { [17:27:41.160] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.160] ...future.oldOptions$nwarnings <- NULL [17:27:41.160] } [17:27:41.160] base::options(...future.oldOptions) [17:27:41.160] if (.Platform$OS.type == "windows") { [17:27:41.160] old_names <- names(...future.oldEnvVars) [17:27:41.160] envs <- base::Sys.getenv() [17:27:41.160] names <- names(envs) [17:27:41.160] common <- intersect(names, old_names) [17:27:41.160] added <- setdiff(names, old_names) [17:27:41.160] removed <- setdiff(old_names, names) [17:27:41.160] changed <- common[...future.oldEnvVars[common] != [17:27:41.160] envs[common]] [17:27:41.160] NAMES <- toupper(changed) [17:27:41.160] args <- list() [17:27:41.160] for (kk in seq_along(NAMES)) { [17:27:41.160] name <- changed[[kk]] [17:27:41.160] NAME <- NAMES[[kk]] [17:27:41.160] if (name != NAME && is.element(NAME, old_names)) [17:27:41.160] next [17:27:41.160] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.160] } [17:27:41.160] NAMES <- toupper(added) [17:27:41.160] for (kk in seq_along(NAMES)) { [17:27:41.160] name <- added[[kk]] [17:27:41.160] NAME <- NAMES[[kk]] [17:27:41.160] if (name != NAME && is.element(NAME, old_names)) [17:27:41.160] next [17:27:41.160] args[[name]] <- "" [17:27:41.160] } [17:27:41.160] NAMES <- toupper(removed) [17:27:41.160] for (kk in seq_along(NAMES)) { [17:27:41.160] name <- removed[[kk]] [17:27:41.160] NAME <- NAMES[[kk]] [17:27:41.160] if (name != NAME && is.element(NAME, old_names)) [17:27:41.160] next [17:27:41.160] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.160] } [17:27:41.160] if (length(args) > 0) [17:27:41.160] base::do.call(base::Sys.setenv, args = args) [17:27:41.160] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.160] } [17:27:41.160] else { [17:27:41.160] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.160] } [17:27:41.160] { [17:27:41.160] if (base::length(...future.futureOptionsAdded) > [17:27:41.160] 0L) { [17:27:41.160] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.160] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.160] base::options(opts) [17:27:41.160] } [17:27:41.160] { [17:27:41.160] { [17:27:41.160] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.160] NULL [17:27:41.160] } [17:27:41.160] options(future.plan = NULL) [17:27:41.160] if (is.na(NA_character_)) [17:27:41.160] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.160] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.160] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.160] .init = FALSE) [17:27:41.160] } [17:27:41.160] } [17:27:41.160] } [17:27:41.160] }) [17:27:41.160] if (TRUE) { [17:27:41.160] base::sink(type = "output", split = FALSE) [17:27:41.160] if (TRUE) { [17:27:41.160] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.160] } [17:27:41.160] else { [17:27:41.160] ...future.result["stdout"] <- base::list(NULL) [17:27:41.160] } [17:27:41.160] base::close(...future.stdout) [17:27:41.160] ...future.stdout <- NULL [17:27:41.160] } [17:27:41.160] ...future.result$conditions <- ...future.conditions [17:27:41.160] ...future.result$finished <- base::Sys.time() [17:27:41.160] ...future.result [17:27:41.160] } [17:27:41.169] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:41.189] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.190] - Validating connection of MultisessionFuture [17:27:41.190] - received message: FutureResult [17:27:41.191] - Received FutureResult [17:27:41.191] - Erased future from FutureRegistry [17:27:41.191] result() for ClusterFuture ... [17:27:41.191] - result already collected: FutureResult [17:27:41.192] result() for ClusterFuture ... done [17:27:41.192] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.192] result() for ClusterFuture ... [17:27:41.196] - result already collected: FutureResult [17:27:41.196] result() for ClusterFuture ... done [17:27:41.197] result() for ClusterFuture ... [17:27:41.197] - result already collected: FutureResult [17:27:41.197] result() for ClusterFuture ... done [17:27:41.199] MultisessionFuture started [17:27:41.199] - Launch lazy future ... done [17:27:41.200] run() for 'MultisessionFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 1 6 - attr(*, "dimnames.")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... [17:27:41.207] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.207] - Validating connection of MultisessionFuture [17:27:41.208] - received message: FutureResult [17:27:41.208] - Received FutureResult [17:27:41.208] - Erased future from FutureRegistry [17:27:41.209] result() for ClusterFuture ... [17:27:41.209] - result already collected: FutureResult [17:27:41.209] result() for ClusterFuture ... done [17:27:41.209] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.228] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.228] - Validating connection of MultisessionFuture [17:27:41.229] - received message: FutureResult [17:27:41.229] - Received FutureResult [17:27:41.229] - Erased future from FutureRegistry [17:27:41.230] result() for ClusterFuture ... [17:27:41.230] - result already collected: FutureResult [17:27:41.230] result() for ClusterFuture ... done [17:27:41.230] receiveMessageFromWorker() for ClusterFuture ... done logi [1, 1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:41.236] resolve() on list environment ... [17:27:41.237] recursive: 0 [17:27:41.239] length: 6 [17:27:41.239] elements: 'a', 'b', 'c', 'd', '', '' [17:27:41.239] signalConditionsASAP(numeric, pos=1) ... [17:27:41.240] - nx: 6 [17:27:41.240] - relay: TRUE [17:27:41.240] - stdout: TRUE [17:27:41.241] - signal: TRUE [17:27:41.241] - resignal: FALSE [17:27:41.241] - force: TRUE [17:27:41.241] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.242] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.242] - until=2 [17:27:41.242] - relaying element #2 [17:27:41.243] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.243] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.243] signalConditionsASAP(NULL, pos=1) ... done [17:27:41.243] length: 5 (resolved future 1) [17:27:41.244] Future #2 [17:27:41.244] result() for ClusterFuture ... [17:27:41.244] - result already collected: FutureResult [17:27:41.244] result() for ClusterFuture ... done [17:27:41.244] result() for ClusterFuture ... [17:27:41.245] - result already collected: FutureResult [17:27:41.245] result() for ClusterFuture ... done [17:27:41.245] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:41.245] - nx: 6 [17:27:41.245] - relay: TRUE [17:27:41.246] - stdout: TRUE [17:27:41.246] - signal: TRUE [17:27:41.246] - resignal: FALSE [17:27:41.246] - force: TRUE [17:27:41.247] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.247] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.247] - until=2 [17:27:41.247] - relaying element #2 [17:27:41.247] result() for ClusterFuture ... [17:27:41.248] - result already collected: FutureResult [17:27:41.248] result() for ClusterFuture ... done [17:27:41.248] result() for ClusterFuture ... [17:27:41.248] - result already collected: FutureResult [17:27:41.248] result() for ClusterFuture ... done [17:27:41.249] result() for ClusterFuture ... [17:27:41.249] - result already collected: FutureResult [17:27:41.249] result() for ClusterFuture ... done [17:27:41.249] result() for ClusterFuture ... [17:27:41.249] - result already collected: FutureResult [17:27:41.249] result() for ClusterFuture ... done [17:27:41.250] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.250] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.250] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:41.250] length: 4 (resolved future 2) [17:27:41.251] Future #3 [17:27:41.251] result() for ClusterFuture ... [17:27:41.251] - result already collected: FutureResult [17:27:41.251] result() for ClusterFuture ... done [17:27:41.252] result() for ClusterFuture ... [17:27:41.252] - result already collected: FutureResult [17:27:41.252] result() for ClusterFuture ... done [17:27:41.252] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:41.253] - nx: 6 [17:27:41.253] - relay: TRUE [17:27:41.253] - stdout: TRUE [17:27:41.254] - signal: TRUE [17:27:41.254] - resignal: FALSE [17:27:41.254] - force: TRUE [17:27:41.254] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.255] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.255] - until=3 [17:27:41.255] - relaying element #3 [17:27:41.255] result() for ClusterFuture ... [17:27:41.256] - result already collected: FutureResult [17:27:41.256] result() for ClusterFuture ... done [17:27:41.256] result() for ClusterFuture ... [17:27:41.257] - result already collected: FutureResult [17:27:41.257] result() for ClusterFuture ... done [17:27:41.257] result() for ClusterFuture ... [17:27:41.257] - result already collected: FutureResult [17:27:41.258] result() for ClusterFuture ... done [17:27:41.258] result() for ClusterFuture ... [17:27:41.258] - result already collected: FutureResult [17:27:41.259] result() for ClusterFuture ... done [17:27:41.259] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.259] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.259] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:41.260] length: 3 (resolved future 3) [17:27:41.260] Future #4 [17:27:41.260] result() for ClusterFuture ... [17:27:41.261] - result already collected: FutureResult [17:27:41.261] result() for ClusterFuture ... done [17:27:41.261] result() for ClusterFuture ... [17:27:41.261] - result already collected: FutureResult [17:27:41.262] result() for ClusterFuture ... done [17:27:41.262] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:41.263] - nx: 6 [17:27:41.263] - relay: TRUE [17:27:41.263] - stdout: TRUE [17:27:41.263] - signal: TRUE [17:27:41.264] - resignal: FALSE [17:27:41.264] - force: TRUE [17:27:41.264] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.264] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.265] - until=4 [17:27:41.265] - relaying element #4 [17:27:41.265] result() for ClusterFuture ... [17:27:41.266] - result already collected: FutureResult [17:27:41.266] result() for ClusterFuture ... done [17:27:41.266] result() for ClusterFuture ... [17:27:41.266] - result already collected: FutureResult [17:27:41.267] result() for ClusterFuture ... done [17:27:41.267] result() for ClusterFuture ... [17:27:41.267] - result already collected: FutureResult [17:27:41.268] result() for ClusterFuture ... done [17:27:41.268] result() for ClusterFuture ... [17:27:41.268] - result already collected: FutureResult [17:27:41.268] result() for ClusterFuture ... done [17:27:41.269] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.269] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.269] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:41.270] length: 2 (resolved future 4) [17:27:41.270] signalConditionsASAP(NULL, pos=5) ... [17:27:41.270] - nx: 6 [17:27:41.270] - relay: TRUE [17:27:41.271] - stdout: TRUE [17:27:41.271] - signal: TRUE [17:27:41.271] - resignal: FALSE [17:27:41.271] - force: TRUE [17:27:41.272] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.272] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.272] - until=6 [17:27:41.273] - relaying element #6 [17:27:41.273] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.273] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.273] signalConditionsASAP(NULL, pos=5) ... done [17:27:41.274] length: 1 (resolved future 5) [17:27:41.274] signalConditionsASAP(numeric, pos=6) ... [17:27:41.274] - nx: 6 [17:27:41.275] - relay: TRUE [17:27:41.275] - stdout: TRUE [17:27:41.275] - signal: TRUE [17:27:41.275] - resignal: FALSE [17:27:41.276] - force: TRUE [17:27:41.276] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.276] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.276] - until=6 [17:27:41.277] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.277] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.277] signalConditionsASAP(numeric, pos=6) ... done [17:27:41.278] length: 0 (resolved future 6) [17:27:41.278] Relaying remaining futures [17:27:41.278] signalConditionsASAP(NULL, pos=0) ... [17:27:41.278] - nx: 6 [17:27:41.279] - relay: TRUE [17:27:41.279] - stdout: TRUE [17:27:41.279] - signal: TRUE [17:27:41.279] - resignal: FALSE [17:27:41.280] - force: TRUE [17:27:41.280] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.280] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:41.281] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.281] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.281] signalConditionsASAP(NULL, pos=0) ... done [17:27:41.281] resolve() on list environment ... DONE [17:27:41.282] result() for ClusterFuture ... [17:27:41.282] - result already collected: FutureResult [17:27:41.282] result() for ClusterFuture ... done [17:27:41.283] result() for ClusterFuture ... [17:27:41.283] - result already collected: FutureResult [17:27:41.283] result() for ClusterFuture ... done [17:27:41.284] result() for ClusterFuture ... [17:27:41.284] - result already collected: FutureResult [17:27:41.284] result() for ClusterFuture ... done [17:27:41.284] result() for ClusterFuture ... [17:27:41.285] - result already collected: FutureResult [17:27:41.285] result() for ClusterFuture ... done [17:27:41.286] result() for ClusterFuture ... [17:27:41.286] - result already collected: FutureResult [17:27:41.286] result() for ClusterFuture ... done [17:27:41.286] result() for ClusterFuture ... [17:27:41.287] - result already collected: FutureResult [17:27:41.287] result() for ClusterFuture ... done Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 1 6 - attr(*, "dimnames.")=List of 2 ..$ : chr "a" ..$ : chr [1:6] "a" "b" "c" "d" ... Dimensions: c(2, 3) [17:27:41.291] getGlobalsAndPackages() ... [17:27:41.291] Searching for globals... [17:27:41.292] [17:27:41.292] Searching for globals ... DONE [17:27:41.292] - globals: [0] [17:27:41.292] getGlobalsAndPackages() ... DONE [17:27:41.293] run() for 'Future' ... [17:27:41.293] - state: 'created' [17:27:41.294] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.316] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.317] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.317] - Field: 'node' [17:27:41.317] - Field: 'label' [17:27:41.318] - Field: 'local' [17:27:41.318] - Field: 'owner' [17:27:41.318] - Field: 'envir' [17:27:41.319] - Field: 'workers' [17:27:41.319] - Field: 'packages' [17:27:41.319] - Field: 'gc' [17:27:41.320] - Field: 'conditions' [17:27:41.320] - Field: 'persistent' [17:27:41.320] - Field: 'expr' [17:27:41.321] - Field: 'uuid' [17:27:41.321] - Field: 'seed' [17:27:41.322] - Field: 'version' [17:27:41.322] - Field: 'result' [17:27:41.322] - Field: 'asynchronous' [17:27:41.323] - Field: 'calls' [17:27:41.323] - Field: 'globals' [17:27:41.323] - Field: 'stdout' [17:27:41.324] - Field: 'earlySignal' [17:27:41.324] - Field: 'lazy' [17:27:41.324] - Field: 'state' [17:27:41.325] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.325] - Launch lazy future ... [17:27:41.326] Packages needed by the future expression (n = 0): [17:27:41.326] Packages needed by future strategies (n = 0): [17:27:41.327] { [17:27:41.327] { [17:27:41.327] { [17:27:41.327] ...future.startTime <- base::Sys.time() [17:27:41.327] { [17:27:41.327] { [17:27:41.327] { [17:27:41.327] { [17:27:41.327] base::local({ [17:27:41.327] has_future <- base::requireNamespace("future", [17:27:41.327] quietly = TRUE) [17:27:41.327] if (has_future) { [17:27:41.327] ns <- base::getNamespace("future") [17:27:41.327] version <- ns[[".package"]][["version"]] [17:27:41.327] if (is.null(version)) [17:27:41.327] version <- utils::packageVersion("future") [17:27:41.327] } [17:27:41.327] else { [17:27:41.327] version <- NULL [17:27:41.327] } [17:27:41.327] if (!has_future || version < "1.8.0") { [17:27:41.327] info <- base::c(r_version = base::gsub("R version ", [17:27:41.327] "", base::R.version$version.string), [17:27:41.327] platform = base::sprintf("%s (%s-bit)", [17:27:41.327] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.327] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.327] "release", "version")], collapse = " "), [17:27:41.327] hostname = base::Sys.info()[["nodename"]]) [17:27:41.327] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.327] info) [17:27:41.327] info <- base::paste(info, collapse = "; ") [17:27:41.327] if (!has_future) { [17:27:41.327] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.327] info) [17:27:41.327] } [17:27:41.327] else { [17:27:41.327] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.327] info, version) [17:27:41.327] } [17:27:41.327] base::stop(msg) [17:27:41.327] } [17:27:41.327] }) [17:27:41.327] } [17:27:41.327] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.327] base::options(mc.cores = 1L) [17:27:41.327] } [17:27:41.327] ...future.strategy.old <- future::plan("list") [17:27:41.327] options(future.plan = NULL) [17:27:41.327] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.327] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.327] } [17:27:41.327] ...future.workdir <- getwd() [17:27:41.327] } [17:27:41.327] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.327] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.327] } [17:27:41.327] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.327] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.327] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.327] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.327] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.327] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.327] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.327] base::names(...future.oldOptions)) [17:27:41.327] } [17:27:41.327] if (FALSE) { [17:27:41.327] } [17:27:41.327] else { [17:27:41.327] if (TRUE) { [17:27:41.327] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.327] open = "w") [17:27:41.327] } [17:27:41.327] else { [17:27:41.327] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.327] windows = "NUL", "/dev/null"), open = "w") [17:27:41.327] } [17:27:41.327] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.327] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.327] base::sink(type = "output", split = FALSE) [17:27:41.327] base::close(...future.stdout) [17:27:41.327] }, add = TRUE) [17:27:41.327] } [17:27:41.327] ...future.frame <- base::sys.nframe() [17:27:41.327] ...future.conditions <- base::list() [17:27:41.327] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.327] if (FALSE) { [17:27:41.327] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.327] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.327] } [17:27:41.327] ...future.result <- base::tryCatch({ [17:27:41.327] base::withCallingHandlers({ [17:27:41.327] ...future.value <- base::withVisible(base::local({ [17:27:41.327] ...future.makeSendCondition <- base::local({ [17:27:41.327] sendCondition <- NULL [17:27:41.327] function(frame = 1L) { [17:27:41.327] if (is.function(sendCondition)) [17:27:41.327] return(sendCondition) [17:27:41.327] ns <- getNamespace("parallel") [17:27:41.327] if (exists("sendData", mode = "function", [17:27:41.327] envir = ns)) { [17:27:41.327] parallel_sendData <- get("sendData", mode = "function", [17:27:41.327] envir = ns) [17:27:41.327] envir <- sys.frame(frame) [17:27:41.327] master <- NULL [17:27:41.327] while (!identical(envir, .GlobalEnv) && [17:27:41.327] !identical(envir, emptyenv())) { [17:27:41.327] if (exists("master", mode = "list", envir = envir, [17:27:41.327] inherits = FALSE)) { [17:27:41.327] master <- get("master", mode = "list", [17:27:41.327] envir = envir, inherits = FALSE) [17:27:41.327] if (inherits(master, c("SOCKnode", [17:27:41.327] "SOCK0node"))) { [17:27:41.327] sendCondition <<- function(cond) { [17:27:41.327] data <- list(type = "VALUE", value = cond, [17:27:41.327] success = TRUE) [17:27:41.327] parallel_sendData(master, data) [17:27:41.327] } [17:27:41.327] return(sendCondition) [17:27:41.327] } [17:27:41.327] } [17:27:41.327] frame <- frame + 1L [17:27:41.327] envir <- sys.frame(frame) [17:27:41.327] } [17:27:41.327] } [17:27:41.327] sendCondition <<- function(cond) NULL [17:27:41.327] } [17:27:41.327] }) [17:27:41.327] withCallingHandlers({ [17:27:41.327] 2 [17:27:41.327] }, immediateCondition = function(cond) { [17:27:41.327] sendCondition <- ...future.makeSendCondition() [17:27:41.327] sendCondition(cond) [17:27:41.327] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.327] { [17:27:41.327] inherits <- base::inherits [17:27:41.327] invokeRestart <- base::invokeRestart [17:27:41.327] is.null <- base::is.null [17:27:41.327] muffled <- FALSE [17:27:41.327] if (inherits(cond, "message")) { [17:27:41.327] muffled <- grepl(pattern, "muffleMessage") [17:27:41.327] if (muffled) [17:27:41.327] invokeRestart("muffleMessage") [17:27:41.327] } [17:27:41.327] else if (inherits(cond, "warning")) { [17:27:41.327] muffled <- grepl(pattern, "muffleWarning") [17:27:41.327] if (muffled) [17:27:41.327] invokeRestart("muffleWarning") [17:27:41.327] } [17:27:41.327] else if (inherits(cond, "condition")) { [17:27:41.327] if (!is.null(pattern)) { [17:27:41.327] computeRestarts <- base::computeRestarts [17:27:41.327] grepl <- base::grepl [17:27:41.327] restarts <- computeRestarts(cond) [17:27:41.327] for (restart in restarts) { [17:27:41.327] name <- restart$name [17:27:41.327] if (is.null(name)) [17:27:41.327] next [17:27:41.327] if (!grepl(pattern, name)) [17:27:41.327] next [17:27:41.327] invokeRestart(restart) [17:27:41.327] muffled <- TRUE [17:27:41.327] break [17:27:41.327] } [17:27:41.327] } [17:27:41.327] } [17:27:41.327] invisible(muffled) [17:27:41.327] } [17:27:41.327] muffleCondition(cond) [17:27:41.327] }) [17:27:41.327] })) [17:27:41.327] future::FutureResult(value = ...future.value$value, [17:27:41.327] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.327] ...future.rng), globalenv = if (FALSE) [17:27:41.327] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.327] ...future.globalenv.names)) [17:27:41.327] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.327] }, condition = base::local({ [17:27:41.327] c <- base::c [17:27:41.327] inherits <- base::inherits [17:27:41.327] invokeRestart <- base::invokeRestart [17:27:41.327] length <- base::length [17:27:41.327] list <- base::list [17:27:41.327] seq.int <- base::seq.int [17:27:41.327] signalCondition <- base::signalCondition [17:27:41.327] sys.calls <- base::sys.calls [17:27:41.327] `[[` <- base::`[[` [17:27:41.327] `+` <- base::`+` [17:27:41.327] `<<-` <- base::`<<-` [17:27:41.327] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.327] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.327] 3L)] [17:27:41.327] } [17:27:41.327] function(cond) { [17:27:41.327] is_error <- inherits(cond, "error") [17:27:41.327] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.327] NULL) [17:27:41.327] if (is_error) { [17:27:41.327] sessionInformation <- function() { [17:27:41.327] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.327] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.327] search = base::search(), system = base::Sys.info()) [17:27:41.327] } [17:27:41.327] ...future.conditions[[length(...future.conditions) + [17:27:41.327] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.327] cond$call), session = sessionInformation(), [17:27:41.327] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.327] signalCondition(cond) [17:27:41.327] } [17:27:41.327] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.327] "immediateCondition"))) { [17:27:41.327] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.327] ...future.conditions[[length(...future.conditions) + [17:27:41.327] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.327] if (TRUE && !signal) { [17:27:41.327] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.327] { [17:27:41.327] inherits <- base::inherits [17:27:41.327] invokeRestart <- base::invokeRestart [17:27:41.327] is.null <- base::is.null [17:27:41.327] muffled <- FALSE [17:27:41.327] if (inherits(cond, "message")) { [17:27:41.327] muffled <- grepl(pattern, "muffleMessage") [17:27:41.327] if (muffled) [17:27:41.327] invokeRestart("muffleMessage") [17:27:41.327] } [17:27:41.327] else if (inherits(cond, "warning")) { [17:27:41.327] muffled <- grepl(pattern, "muffleWarning") [17:27:41.327] if (muffled) [17:27:41.327] invokeRestart("muffleWarning") [17:27:41.327] } [17:27:41.327] else if (inherits(cond, "condition")) { [17:27:41.327] if (!is.null(pattern)) { [17:27:41.327] computeRestarts <- base::computeRestarts [17:27:41.327] grepl <- base::grepl [17:27:41.327] restarts <- computeRestarts(cond) [17:27:41.327] for (restart in restarts) { [17:27:41.327] name <- restart$name [17:27:41.327] if (is.null(name)) [17:27:41.327] next [17:27:41.327] if (!grepl(pattern, name)) [17:27:41.327] next [17:27:41.327] invokeRestart(restart) [17:27:41.327] muffled <- TRUE [17:27:41.327] break [17:27:41.327] } [17:27:41.327] } [17:27:41.327] } [17:27:41.327] invisible(muffled) [17:27:41.327] } [17:27:41.327] muffleCondition(cond, pattern = "^muffle") [17:27:41.327] } [17:27:41.327] } [17:27:41.327] else { [17:27:41.327] if (TRUE) { [17:27:41.327] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.327] { [17:27:41.327] inherits <- base::inherits [17:27:41.327] invokeRestart <- base::invokeRestart [17:27:41.327] is.null <- base::is.null [17:27:41.327] muffled <- FALSE [17:27:41.327] if (inherits(cond, "message")) { [17:27:41.327] muffled <- grepl(pattern, "muffleMessage") [17:27:41.327] if (muffled) [17:27:41.327] invokeRestart("muffleMessage") [17:27:41.327] } [17:27:41.327] else if (inherits(cond, "warning")) { [17:27:41.327] muffled <- grepl(pattern, "muffleWarning") [17:27:41.327] if (muffled) [17:27:41.327] invokeRestart("muffleWarning") [17:27:41.327] } [17:27:41.327] else if (inherits(cond, "condition")) { [17:27:41.327] if (!is.null(pattern)) { [17:27:41.327] computeRestarts <- base::computeRestarts [17:27:41.327] grepl <- base::grepl [17:27:41.327] restarts <- computeRestarts(cond) [17:27:41.327] for (restart in restarts) { [17:27:41.327] name <- restart$name [17:27:41.327] if (is.null(name)) [17:27:41.327] next [17:27:41.327] if (!grepl(pattern, name)) [17:27:41.327] next [17:27:41.327] invokeRestart(restart) [17:27:41.327] muffled <- TRUE [17:27:41.327] break [17:27:41.327] } [17:27:41.327] } [17:27:41.327] } [17:27:41.327] invisible(muffled) [17:27:41.327] } [17:27:41.327] muffleCondition(cond, pattern = "^muffle") [17:27:41.327] } [17:27:41.327] } [17:27:41.327] } [17:27:41.327] })) [17:27:41.327] }, error = function(ex) { [17:27:41.327] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.327] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.327] ...future.rng), started = ...future.startTime, [17:27:41.327] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.327] version = "1.8"), class = "FutureResult") [17:27:41.327] }, finally = { [17:27:41.327] if (!identical(...future.workdir, getwd())) [17:27:41.327] setwd(...future.workdir) [17:27:41.327] { [17:27:41.327] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.327] ...future.oldOptions$nwarnings <- NULL [17:27:41.327] } [17:27:41.327] base::options(...future.oldOptions) [17:27:41.327] if (.Platform$OS.type == "windows") { [17:27:41.327] old_names <- names(...future.oldEnvVars) [17:27:41.327] envs <- base::Sys.getenv() [17:27:41.327] names <- names(envs) [17:27:41.327] common <- intersect(names, old_names) [17:27:41.327] added <- setdiff(names, old_names) [17:27:41.327] removed <- setdiff(old_names, names) [17:27:41.327] changed <- common[...future.oldEnvVars[common] != [17:27:41.327] envs[common]] [17:27:41.327] NAMES <- toupper(changed) [17:27:41.327] args <- list() [17:27:41.327] for (kk in seq_along(NAMES)) { [17:27:41.327] name <- changed[[kk]] [17:27:41.327] NAME <- NAMES[[kk]] [17:27:41.327] if (name != NAME && is.element(NAME, old_names)) [17:27:41.327] next [17:27:41.327] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.327] } [17:27:41.327] NAMES <- toupper(added) [17:27:41.327] for (kk in seq_along(NAMES)) { [17:27:41.327] name <- added[[kk]] [17:27:41.327] NAME <- NAMES[[kk]] [17:27:41.327] if (name != NAME && is.element(NAME, old_names)) [17:27:41.327] next [17:27:41.327] args[[name]] <- "" [17:27:41.327] } [17:27:41.327] NAMES <- toupper(removed) [17:27:41.327] for (kk in seq_along(NAMES)) { [17:27:41.327] name <- removed[[kk]] [17:27:41.327] NAME <- NAMES[[kk]] [17:27:41.327] if (name != NAME && is.element(NAME, old_names)) [17:27:41.327] next [17:27:41.327] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.327] } [17:27:41.327] if (length(args) > 0) [17:27:41.327] base::do.call(base::Sys.setenv, args = args) [17:27:41.327] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.327] } [17:27:41.327] else { [17:27:41.327] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.327] } [17:27:41.327] { [17:27:41.327] if (base::length(...future.futureOptionsAdded) > [17:27:41.327] 0L) { [17:27:41.327] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.327] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.327] base::options(opts) [17:27:41.327] } [17:27:41.327] { [17:27:41.327] { [17:27:41.327] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.327] NULL [17:27:41.327] } [17:27:41.327] options(future.plan = NULL) [17:27:41.327] if (is.na(NA_character_)) [17:27:41.327] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.327] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.327] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.327] .init = FALSE) [17:27:41.327] } [17:27:41.327] } [17:27:41.327] } [17:27:41.327] }) [17:27:41.327] if (TRUE) { [17:27:41.327] base::sink(type = "output", split = FALSE) [17:27:41.327] if (TRUE) { [17:27:41.327] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.327] } [17:27:41.327] else { [17:27:41.327] ...future.result["stdout"] <- base::list(NULL) [17:27:41.327] } [17:27:41.327] base::close(...future.stdout) [17:27:41.327] ...future.stdout <- NULL [17:27:41.327] } [17:27:41.327] ...future.result$conditions <- ...future.conditions [17:27:41.327] ...future.result$finished <- base::Sys.time() [17:27:41.327] ...future.result [17:27:41.327] } [17:27:41.336] MultisessionFuture started [17:27:41.336] - Launch lazy future ... done [17:27:41.337] run() for 'MultisessionFuture' ... done [17:27:41.337] getGlobalsAndPackages() ... [17:27:41.337] Searching for globals... [17:27:41.338] [17:27:41.339] Searching for globals ... DONE [17:27:41.339] - globals: [0] [17:27:41.339] getGlobalsAndPackages() ... DONE [17:27:41.340] run() for 'Future' ... [17:27:41.340] - state: 'created' [17:27:41.341] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.364] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.364] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.365] - Field: 'node' [17:27:41.365] - Field: 'label' [17:27:41.365] - Field: 'local' [17:27:41.365] - Field: 'owner' [17:27:41.366] - Field: 'envir' [17:27:41.366] - Field: 'workers' [17:27:41.366] - Field: 'packages' [17:27:41.366] - Field: 'gc' [17:27:41.366] - Field: 'conditions' [17:27:41.367] - Field: 'persistent' [17:27:41.367] - Field: 'expr' [17:27:41.367] - Field: 'uuid' [17:27:41.367] - Field: 'seed' [17:27:41.367] - Field: 'version' [17:27:41.368] - Field: 'result' [17:27:41.368] - Field: 'asynchronous' [17:27:41.368] - Field: 'calls' [17:27:41.368] - Field: 'globals' [17:27:41.368] - Field: 'stdout' [17:27:41.369] - Field: 'earlySignal' [17:27:41.369] - Field: 'lazy' [17:27:41.369] - Field: 'state' [17:27:41.369] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.369] - Launch lazy future ... [17:27:41.370] Packages needed by the future expression (n = 0): [17:27:41.370] Packages needed by future strategies (n = 0): [17:27:41.371] { [17:27:41.371] { [17:27:41.371] { [17:27:41.371] ...future.startTime <- base::Sys.time() [17:27:41.371] { [17:27:41.371] { [17:27:41.371] { [17:27:41.371] { [17:27:41.371] base::local({ [17:27:41.371] has_future <- base::requireNamespace("future", [17:27:41.371] quietly = TRUE) [17:27:41.371] if (has_future) { [17:27:41.371] ns <- base::getNamespace("future") [17:27:41.371] version <- ns[[".package"]][["version"]] [17:27:41.371] if (is.null(version)) [17:27:41.371] version <- utils::packageVersion("future") [17:27:41.371] } [17:27:41.371] else { [17:27:41.371] version <- NULL [17:27:41.371] } [17:27:41.371] if (!has_future || version < "1.8.0") { [17:27:41.371] info <- base::c(r_version = base::gsub("R version ", [17:27:41.371] "", base::R.version$version.string), [17:27:41.371] platform = base::sprintf("%s (%s-bit)", [17:27:41.371] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.371] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.371] "release", "version")], collapse = " "), [17:27:41.371] hostname = base::Sys.info()[["nodename"]]) [17:27:41.371] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.371] info) [17:27:41.371] info <- base::paste(info, collapse = "; ") [17:27:41.371] if (!has_future) { [17:27:41.371] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.371] info) [17:27:41.371] } [17:27:41.371] else { [17:27:41.371] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.371] info, version) [17:27:41.371] } [17:27:41.371] base::stop(msg) [17:27:41.371] } [17:27:41.371] }) [17:27:41.371] } [17:27:41.371] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.371] base::options(mc.cores = 1L) [17:27:41.371] } [17:27:41.371] ...future.strategy.old <- future::plan("list") [17:27:41.371] options(future.plan = NULL) [17:27:41.371] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.371] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.371] } [17:27:41.371] ...future.workdir <- getwd() [17:27:41.371] } [17:27:41.371] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.371] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.371] } [17:27:41.371] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.371] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.371] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.371] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.371] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.371] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.371] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.371] base::names(...future.oldOptions)) [17:27:41.371] } [17:27:41.371] if (FALSE) { [17:27:41.371] } [17:27:41.371] else { [17:27:41.371] if (TRUE) { [17:27:41.371] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.371] open = "w") [17:27:41.371] } [17:27:41.371] else { [17:27:41.371] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.371] windows = "NUL", "/dev/null"), open = "w") [17:27:41.371] } [17:27:41.371] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.371] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.371] base::sink(type = "output", split = FALSE) [17:27:41.371] base::close(...future.stdout) [17:27:41.371] }, add = TRUE) [17:27:41.371] } [17:27:41.371] ...future.frame <- base::sys.nframe() [17:27:41.371] ...future.conditions <- base::list() [17:27:41.371] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.371] if (FALSE) { [17:27:41.371] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.371] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.371] } [17:27:41.371] ...future.result <- base::tryCatch({ [17:27:41.371] base::withCallingHandlers({ [17:27:41.371] ...future.value <- base::withVisible(base::local({ [17:27:41.371] ...future.makeSendCondition <- base::local({ [17:27:41.371] sendCondition <- NULL [17:27:41.371] function(frame = 1L) { [17:27:41.371] if (is.function(sendCondition)) [17:27:41.371] return(sendCondition) [17:27:41.371] ns <- getNamespace("parallel") [17:27:41.371] if (exists("sendData", mode = "function", [17:27:41.371] envir = ns)) { [17:27:41.371] parallel_sendData <- get("sendData", mode = "function", [17:27:41.371] envir = ns) [17:27:41.371] envir <- sys.frame(frame) [17:27:41.371] master <- NULL [17:27:41.371] while (!identical(envir, .GlobalEnv) && [17:27:41.371] !identical(envir, emptyenv())) { [17:27:41.371] if (exists("master", mode = "list", envir = envir, [17:27:41.371] inherits = FALSE)) { [17:27:41.371] master <- get("master", mode = "list", [17:27:41.371] envir = envir, inherits = FALSE) [17:27:41.371] if (inherits(master, c("SOCKnode", [17:27:41.371] "SOCK0node"))) { [17:27:41.371] sendCondition <<- function(cond) { [17:27:41.371] data <- list(type = "VALUE", value = cond, [17:27:41.371] success = TRUE) [17:27:41.371] parallel_sendData(master, data) [17:27:41.371] } [17:27:41.371] return(sendCondition) [17:27:41.371] } [17:27:41.371] } [17:27:41.371] frame <- frame + 1L [17:27:41.371] envir <- sys.frame(frame) [17:27:41.371] } [17:27:41.371] } [17:27:41.371] sendCondition <<- function(cond) NULL [17:27:41.371] } [17:27:41.371] }) [17:27:41.371] withCallingHandlers({ [17:27:41.371] NULL [17:27:41.371] }, immediateCondition = function(cond) { [17:27:41.371] sendCondition <- ...future.makeSendCondition() [17:27:41.371] sendCondition(cond) [17:27:41.371] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.371] { [17:27:41.371] inherits <- base::inherits [17:27:41.371] invokeRestart <- base::invokeRestart [17:27:41.371] is.null <- base::is.null [17:27:41.371] muffled <- FALSE [17:27:41.371] if (inherits(cond, "message")) { [17:27:41.371] muffled <- grepl(pattern, "muffleMessage") [17:27:41.371] if (muffled) [17:27:41.371] invokeRestart("muffleMessage") [17:27:41.371] } [17:27:41.371] else if (inherits(cond, "warning")) { [17:27:41.371] muffled <- grepl(pattern, "muffleWarning") [17:27:41.371] if (muffled) [17:27:41.371] invokeRestart("muffleWarning") [17:27:41.371] } [17:27:41.371] else if (inherits(cond, "condition")) { [17:27:41.371] if (!is.null(pattern)) { [17:27:41.371] computeRestarts <- base::computeRestarts [17:27:41.371] grepl <- base::grepl [17:27:41.371] restarts <- computeRestarts(cond) [17:27:41.371] for (restart in restarts) { [17:27:41.371] name <- restart$name [17:27:41.371] if (is.null(name)) [17:27:41.371] next [17:27:41.371] if (!grepl(pattern, name)) [17:27:41.371] next [17:27:41.371] invokeRestart(restart) [17:27:41.371] muffled <- TRUE [17:27:41.371] break [17:27:41.371] } [17:27:41.371] } [17:27:41.371] } [17:27:41.371] invisible(muffled) [17:27:41.371] } [17:27:41.371] muffleCondition(cond) [17:27:41.371] }) [17:27:41.371] })) [17:27:41.371] future::FutureResult(value = ...future.value$value, [17:27:41.371] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.371] ...future.rng), globalenv = if (FALSE) [17:27:41.371] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.371] ...future.globalenv.names)) [17:27:41.371] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.371] }, condition = base::local({ [17:27:41.371] c <- base::c [17:27:41.371] inherits <- base::inherits [17:27:41.371] invokeRestart <- base::invokeRestart [17:27:41.371] length <- base::length [17:27:41.371] list <- base::list [17:27:41.371] seq.int <- base::seq.int [17:27:41.371] signalCondition <- base::signalCondition [17:27:41.371] sys.calls <- base::sys.calls [17:27:41.371] `[[` <- base::`[[` [17:27:41.371] `+` <- base::`+` [17:27:41.371] `<<-` <- base::`<<-` [17:27:41.371] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.371] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.371] 3L)] [17:27:41.371] } [17:27:41.371] function(cond) { [17:27:41.371] is_error <- inherits(cond, "error") [17:27:41.371] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.371] NULL) [17:27:41.371] if (is_error) { [17:27:41.371] sessionInformation <- function() { [17:27:41.371] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.371] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.371] search = base::search(), system = base::Sys.info()) [17:27:41.371] } [17:27:41.371] ...future.conditions[[length(...future.conditions) + [17:27:41.371] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.371] cond$call), session = sessionInformation(), [17:27:41.371] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.371] signalCondition(cond) [17:27:41.371] } [17:27:41.371] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.371] "immediateCondition"))) { [17:27:41.371] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.371] ...future.conditions[[length(...future.conditions) + [17:27:41.371] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.371] if (TRUE && !signal) { [17:27:41.371] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.371] { [17:27:41.371] inherits <- base::inherits [17:27:41.371] invokeRestart <- base::invokeRestart [17:27:41.371] is.null <- base::is.null [17:27:41.371] muffled <- FALSE [17:27:41.371] if (inherits(cond, "message")) { [17:27:41.371] muffled <- grepl(pattern, "muffleMessage") [17:27:41.371] if (muffled) [17:27:41.371] invokeRestart("muffleMessage") [17:27:41.371] } [17:27:41.371] else if (inherits(cond, "warning")) { [17:27:41.371] muffled <- grepl(pattern, "muffleWarning") [17:27:41.371] if (muffled) [17:27:41.371] invokeRestart("muffleWarning") [17:27:41.371] } [17:27:41.371] else if (inherits(cond, "condition")) { [17:27:41.371] if (!is.null(pattern)) { [17:27:41.371] computeRestarts <- base::computeRestarts [17:27:41.371] grepl <- base::grepl [17:27:41.371] restarts <- computeRestarts(cond) [17:27:41.371] for (restart in restarts) { [17:27:41.371] name <- restart$name [17:27:41.371] if (is.null(name)) [17:27:41.371] next [17:27:41.371] if (!grepl(pattern, name)) [17:27:41.371] next [17:27:41.371] invokeRestart(restart) [17:27:41.371] muffled <- TRUE [17:27:41.371] break [17:27:41.371] } [17:27:41.371] } [17:27:41.371] } [17:27:41.371] invisible(muffled) [17:27:41.371] } [17:27:41.371] muffleCondition(cond, pattern = "^muffle") [17:27:41.371] } [17:27:41.371] } [17:27:41.371] else { [17:27:41.371] if (TRUE) { [17:27:41.371] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.371] { [17:27:41.371] inherits <- base::inherits [17:27:41.371] invokeRestart <- base::invokeRestart [17:27:41.371] is.null <- base::is.null [17:27:41.371] muffled <- FALSE [17:27:41.371] if (inherits(cond, "message")) { [17:27:41.371] muffled <- grepl(pattern, "muffleMessage") [17:27:41.371] if (muffled) [17:27:41.371] invokeRestart("muffleMessage") [17:27:41.371] } [17:27:41.371] else if (inherits(cond, "warning")) { [17:27:41.371] muffled <- grepl(pattern, "muffleWarning") [17:27:41.371] if (muffled) [17:27:41.371] invokeRestart("muffleWarning") [17:27:41.371] } [17:27:41.371] else if (inherits(cond, "condition")) { [17:27:41.371] if (!is.null(pattern)) { [17:27:41.371] computeRestarts <- base::computeRestarts [17:27:41.371] grepl <- base::grepl [17:27:41.371] restarts <- computeRestarts(cond) [17:27:41.371] for (restart in restarts) { [17:27:41.371] name <- restart$name [17:27:41.371] if (is.null(name)) [17:27:41.371] next [17:27:41.371] if (!grepl(pattern, name)) [17:27:41.371] next [17:27:41.371] invokeRestart(restart) [17:27:41.371] muffled <- TRUE [17:27:41.371] break [17:27:41.371] } [17:27:41.371] } [17:27:41.371] } [17:27:41.371] invisible(muffled) [17:27:41.371] } [17:27:41.371] muffleCondition(cond, pattern = "^muffle") [17:27:41.371] } [17:27:41.371] } [17:27:41.371] } [17:27:41.371] })) [17:27:41.371] }, error = function(ex) { [17:27:41.371] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.371] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.371] ...future.rng), started = ...future.startTime, [17:27:41.371] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.371] version = "1.8"), class = "FutureResult") [17:27:41.371] }, finally = { [17:27:41.371] if (!identical(...future.workdir, getwd())) [17:27:41.371] setwd(...future.workdir) [17:27:41.371] { [17:27:41.371] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.371] ...future.oldOptions$nwarnings <- NULL [17:27:41.371] } [17:27:41.371] base::options(...future.oldOptions) [17:27:41.371] if (.Platform$OS.type == "windows") { [17:27:41.371] old_names <- names(...future.oldEnvVars) [17:27:41.371] envs <- base::Sys.getenv() [17:27:41.371] names <- names(envs) [17:27:41.371] common <- intersect(names, old_names) [17:27:41.371] added <- setdiff(names, old_names) [17:27:41.371] removed <- setdiff(old_names, names) [17:27:41.371] changed <- common[...future.oldEnvVars[common] != [17:27:41.371] envs[common]] [17:27:41.371] NAMES <- toupper(changed) [17:27:41.371] args <- list() [17:27:41.371] for (kk in seq_along(NAMES)) { [17:27:41.371] name <- changed[[kk]] [17:27:41.371] NAME <- NAMES[[kk]] [17:27:41.371] if (name != NAME && is.element(NAME, old_names)) [17:27:41.371] next [17:27:41.371] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.371] } [17:27:41.371] NAMES <- toupper(added) [17:27:41.371] for (kk in seq_along(NAMES)) { [17:27:41.371] name <- added[[kk]] [17:27:41.371] NAME <- NAMES[[kk]] [17:27:41.371] if (name != NAME && is.element(NAME, old_names)) [17:27:41.371] next [17:27:41.371] args[[name]] <- "" [17:27:41.371] } [17:27:41.371] NAMES <- toupper(removed) [17:27:41.371] for (kk in seq_along(NAMES)) { [17:27:41.371] name <- removed[[kk]] [17:27:41.371] NAME <- NAMES[[kk]] [17:27:41.371] if (name != NAME && is.element(NAME, old_names)) [17:27:41.371] next [17:27:41.371] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.371] } [17:27:41.371] if (length(args) > 0) [17:27:41.371] base::do.call(base::Sys.setenv, args = args) [17:27:41.371] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.371] } [17:27:41.371] else { [17:27:41.371] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.371] } [17:27:41.371] { [17:27:41.371] if (base::length(...future.futureOptionsAdded) > [17:27:41.371] 0L) { [17:27:41.371] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.371] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.371] base::options(opts) [17:27:41.371] } [17:27:41.371] { [17:27:41.371] { [17:27:41.371] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.371] NULL [17:27:41.371] } [17:27:41.371] options(future.plan = NULL) [17:27:41.371] if (is.na(NA_character_)) [17:27:41.371] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.371] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.371] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.371] .init = FALSE) [17:27:41.371] } [17:27:41.371] } [17:27:41.371] } [17:27:41.371] }) [17:27:41.371] if (TRUE) { [17:27:41.371] base::sink(type = "output", split = FALSE) [17:27:41.371] if (TRUE) { [17:27:41.371] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.371] } [17:27:41.371] else { [17:27:41.371] ...future.result["stdout"] <- base::list(NULL) [17:27:41.371] } [17:27:41.371] base::close(...future.stdout) [17:27:41.371] ...future.stdout <- NULL [17:27:41.371] } [17:27:41.371] ...future.result$conditions <- ...future.conditions [17:27:41.371] ...future.result$finished <- base::Sys.time() [17:27:41.371] ...future.result [17:27:41.371] } [17:27:41.379] MultisessionFuture started [17:27:41.380] - Launch lazy future ... done [17:27:41.380] run() for 'MultisessionFuture' ... done [17:27:41.381] getGlobalsAndPackages() ... [17:27:41.381] Searching for globals... [17:27:41.382] - globals found: [1] '{' [17:27:41.382] Searching for globals ... DONE [17:27:41.382] Resolving globals: FALSE [17:27:41.383] [17:27:41.383] [17:27:41.383] getGlobalsAndPackages() ... DONE [17:27:41.384] run() for 'Future' ... [17:27:41.384] - state: 'created' [17:27:41.384] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.401] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.402] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.402] - Field: 'node' [17:27:41.402] - Field: 'label' [17:27:41.402] - Field: 'local' [17:27:41.403] - Field: 'owner' [17:27:41.403] - Field: 'envir' [17:27:41.403] - Field: 'workers' [17:27:41.403] - Field: 'packages' [17:27:41.403] - Field: 'gc' [17:27:41.403] - Field: 'conditions' [17:27:41.404] - Field: 'persistent' [17:27:41.404] - Field: 'expr' [17:27:41.404] - Field: 'uuid' [17:27:41.404] - Field: 'seed' [17:27:41.405] - Field: 'version' [17:27:41.405] - Field: 'result' [17:27:41.405] - Field: 'asynchronous' [17:27:41.406] - Field: 'calls' [17:27:41.406] - Field: 'globals' [17:27:41.406] - Field: 'stdout' [17:27:41.406] - Field: 'earlySignal' [17:27:41.407] - Field: 'lazy' [17:27:41.407] - Field: 'state' [17:27:41.407] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.408] - Launch lazy future ... [17:27:41.408] Packages needed by the future expression (n = 0): [17:27:41.409] Packages needed by future strategies (n = 0): [17:27:41.410] { [17:27:41.410] { [17:27:41.410] { [17:27:41.410] ...future.startTime <- base::Sys.time() [17:27:41.410] { [17:27:41.410] { [17:27:41.410] { [17:27:41.410] { [17:27:41.410] base::local({ [17:27:41.410] has_future <- base::requireNamespace("future", [17:27:41.410] quietly = TRUE) [17:27:41.410] if (has_future) { [17:27:41.410] ns <- base::getNamespace("future") [17:27:41.410] version <- ns[[".package"]][["version"]] [17:27:41.410] if (is.null(version)) [17:27:41.410] version <- utils::packageVersion("future") [17:27:41.410] } [17:27:41.410] else { [17:27:41.410] version <- NULL [17:27:41.410] } [17:27:41.410] if (!has_future || version < "1.8.0") { [17:27:41.410] info <- base::c(r_version = base::gsub("R version ", [17:27:41.410] "", base::R.version$version.string), [17:27:41.410] platform = base::sprintf("%s (%s-bit)", [17:27:41.410] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.410] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.410] "release", "version")], collapse = " "), [17:27:41.410] hostname = base::Sys.info()[["nodename"]]) [17:27:41.410] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.410] info) [17:27:41.410] info <- base::paste(info, collapse = "; ") [17:27:41.410] if (!has_future) { [17:27:41.410] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.410] info) [17:27:41.410] } [17:27:41.410] else { [17:27:41.410] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.410] info, version) [17:27:41.410] } [17:27:41.410] base::stop(msg) [17:27:41.410] } [17:27:41.410] }) [17:27:41.410] } [17:27:41.410] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.410] base::options(mc.cores = 1L) [17:27:41.410] } [17:27:41.410] ...future.strategy.old <- future::plan("list") [17:27:41.410] options(future.plan = NULL) [17:27:41.410] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.410] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.410] } [17:27:41.410] ...future.workdir <- getwd() [17:27:41.410] } [17:27:41.410] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.410] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.410] } [17:27:41.410] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.410] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.410] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.410] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.410] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.410] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.410] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.410] base::names(...future.oldOptions)) [17:27:41.410] } [17:27:41.410] if (FALSE) { [17:27:41.410] } [17:27:41.410] else { [17:27:41.410] if (TRUE) { [17:27:41.410] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.410] open = "w") [17:27:41.410] } [17:27:41.410] else { [17:27:41.410] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.410] windows = "NUL", "/dev/null"), open = "w") [17:27:41.410] } [17:27:41.410] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.410] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.410] base::sink(type = "output", split = FALSE) [17:27:41.410] base::close(...future.stdout) [17:27:41.410] }, add = TRUE) [17:27:41.410] } [17:27:41.410] ...future.frame <- base::sys.nframe() [17:27:41.410] ...future.conditions <- base::list() [17:27:41.410] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.410] if (FALSE) { [17:27:41.410] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.410] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.410] } [17:27:41.410] ...future.result <- base::tryCatch({ [17:27:41.410] base::withCallingHandlers({ [17:27:41.410] ...future.value <- base::withVisible(base::local({ [17:27:41.410] ...future.makeSendCondition <- base::local({ [17:27:41.410] sendCondition <- NULL [17:27:41.410] function(frame = 1L) { [17:27:41.410] if (is.function(sendCondition)) [17:27:41.410] return(sendCondition) [17:27:41.410] ns <- getNamespace("parallel") [17:27:41.410] if (exists("sendData", mode = "function", [17:27:41.410] envir = ns)) { [17:27:41.410] parallel_sendData <- get("sendData", mode = "function", [17:27:41.410] envir = ns) [17:27:41.410] envir <- sys.frame(frame) [17:27:41.410] master <- NULL [17:27:41.410] while (!identical(envir, .GlobalEnv) && [17:27:41.410] !identical(envir, emptyenv())) { [17:27:41.410] if (exists("master", mode = "list", envir = envir, [17:27:41.410] inherits = FALSE)) { [17:27:41.410] master <- get("master", mode = "list", [17:27:41.410] envir = envir, inherits = FALSE) [17:27:41.410] if (inherits(master, c("SOCKnode", [17:27:41.410] "SOCK0node"))) { [17:27:41.410] sendCondition <<- function(cond) { [17:27:41.410] data <- list(type = "VALUE", value = cond, [17:27:41.410] success = TRUE) [17:27:41.410] parallel_sendData(master, data) [17:27:41.410] } [17:27:41.410] return(sendCondition) [17:27:41.410] } [17:27:41.410] } [17:27:41.410] frame <- frame + 1L [17:27:41.410] envir <- sys.frame(frame) [17:27:41.410] } [17:27:41.410] } [17:27:41.410] sendCondition <<- function(cond) NULL [17:27:41.410] } [17:27:41.410] }) [17:27:41.410] withCallingHandlers({ [17:27:41.410] { [17:27:41.410] 4 [17:27:41.410] } [17:27:41.410] }, immediateCondition = function(cond) { [17:27:41.410] sendCondition <- ...future.makeSendCondition() [17:27:41.410] sendCondition(cond) [17:27:41.410] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.410] { [17:27:41.410] inherits <- base::inherits [17:27:41.410] invokeRestart <- base::invokeRestart [17:27:41.410] is.null <- base::is.null [17:27:41.410] muffled <- FALSE [17:27:41.410] if (inherits(cond, "message")) { [17:27:41.410] muffled <- grepl(pattern, "muffleMessage") [17:27:41.410] if (muffled) [17:27:41.410] invokeRestart("muffleMessage") [17:27:41.410] } [17:27:41.410] else if (inherits(cond, "warning")) { [17:27:41.410] muffled <- grepl(pattern, "muffleWarning") [17:27:41.410] if (muffled) [17:27:41.410] invokeRestart("muffleWarning") [17:27:41.410] } [17:27:41.410] else if (inherits(cond, "condition")) { [17:27:41.410] if (!is.null(pattern)) { [17:27:41.410] computeRestarts <- base::computeRestarts [17:27:41.410] grepl <- base::grepl [17:27:41.410] restarts <- computeRestarts(cond) [17:27:41.410] for (restart in restarts) { [17:27:41.410] name <- restart$name [17:27:41.410] if (is.null(name)) [17:27:41.410] next [17:27:41.410] if (!grepl(pattern, name)) [17:27:41.410] next [17:27:41.410] invokeRestart(restart) [17:27:41.410] muffled <- TRUE [17:27:41.410] break [17:27:41.410] } [17:27:41.410] } [17:27:41.410] } [17:27:41.410] invisible(muffled) [17:27:41.410] } [17:27:41.410] muffleCondition(cond) [17:27:41.410] }) [17:27:41.410] })) [17:27:41.410] future::FutureResult(value = ...future.value$value, [17:27:41.410] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.410] ...future.rng), globalenv = if (FALSE) [17:27:41.410] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.410] ...future.globalenv.names)) [17:27:41.410] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.410] }, condition = base::local({ [17:27:41.410] c <- base::c [17:27:41.410] inherits <- base::inherits [17:27:41.410] invokeRestart <- base::invokeRestart [17:27:41.410] length <- base::length [17:27:41.410] list <- base::list [17:27:41.410] seq.int <- base::seq.int [17:27:41.410] signalCondition <- base::signalCondition [17:27:41.410] sys.calls <- base::sys.calls [17:27:41.410] `[[` <- base::`[[` [17:27:41.410] `+` <- base::`+` [17:27:41.410] `<<-` <- base::`<<-` [17:27:41.410] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.410] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.410] 3L)] [17:27:41.410] } [17:27:41.410] function(cond) { [17:27:41.410] is_error <- inherits(cond, "error") [17:27:41.410] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.410] NULL) [17:27:41.410] if (is_error) { [17:27:41.410] sessionInformation <- function() { [17:27:41.410] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.410] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.410] search = base::search(), system = base::Sys.info()) [17:27:41.410] } [17:27:41.410] ...future.conditions[[length(...future.conditions) + [17:27:41.410] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.410] cond$call), session = sessionInformation(), [17:27:41.410] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.410] signalCondition(cond) [17:27:41.410] } [17:27:41.410] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.410] "immediateCondition"))) { [17:27:41.410] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.410] ...future.conditions[[length(...future.conditions) + [17:27:41.410] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.410] if (TRUE && !signal) { [17:27:41.410] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.410] { [17:27:41.410] inherits <- base::inherits [17:27:41.410] invokeRestart <- base::invokeRestart [17:27:41.410] is.null <- base::is.null [17:27:41.410] muffled <- FALSE [17:27:41.410] if (inherits(cond, "message")) { [17:27:41.410] muffled <- grepl(pattern, "muffleMessage") [17:27:41.410] if (muffled) [17:27:41.410] invokeRestart("muffleMessage") [17:27:41.410] } [17:27:41.410] else if (inherits(cond, "warning")) { [17:27:41.410] muffled <- grepl(pattern, "muffleWarning") [17:27:41.410] if (muffled) [17:27:41.410] invokeRestart("muffleWarning") [17:27:41.410] } [17:27:41.410] else if (inherits(cond, "condition")) { [17:27:41.410] if (!is.null(pattern)) { [17:27:41.410] computeRestarts <- base::computeRestarts [17:27:41.410] grepl <- base::grepl [17:27:41.410] restarts <- computeRestarts(cond) [17:27:41.410] for (restart in restarts) { [17:27:41.410] name <- restart$name [17:27:41.410] if (is.null(name)) [17:27:41.410] next [17:27:41.410] if (!grepl(pattern, name)) [17:27:41.410] next [17:27:41.410] invokeRestart(restart) [17:27:41.410] muffled <- TRUE [17:27:41.410] break [17:27:41.410] } [17:27:41.410] } [17:27:41.410] } [17:27:41.410] invisible(muffled) [17:27:41.410] } [17:27:41.410] muffleCondition(cond, pattern = "^muffle") [17:27:41.410] } [17:27:41.410] } [17:27:41.410] else { [17:27:41.410] if (TRUE) { [17:27:41.410] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.410] { [17:27:41.410] inherits <- base::inherits [17:27:41.410] invokeRestart <- base::invokeRestart [17:27:41.410] is.null <- base::is.null [17:27:41.410] muffled <- FALSE [17:27:41.410] if (inherits(cond, "message")) { [17:27:41.410] muffled <- grepl(pattern, "muffleMessage") [17:27:41.410] if (muffled) [17:27:41.410] invokeRestart("muffleMessage") [17:27:41.410] } [17:27:41.410] else if (inherits(cond, "warning")) { [17:27:41.410] muffled <- grepl(pattern, "muffleWarning") [17:27:41.410] if (muffled) [17:27:41.410] invokeRestart("muffleWarning") [17:27:41.410] } [17:27:41.410] else if (inherits(cond, "condition")) { [17:27:41.410] if (!is.null(pattern)) { [17:27:41.410] computeRestarts <- base::computeRestarts [17:27:41.410] grepl <- base::grepl [17:27:41.410] restarts <- computeRestarts(cond) [17:27:41.410] for (restart in restarts) { [17:27:41.410] name <- restart$name [17:27:41.410] if (is.null(name)) [17:27:41.410] next [17:27:41.410] if (!grepl(pattern, name)) [17:27:41.410] next [17:27:41.410] invokeRestart(restart) [17:27:41.410] muffled <- TRUE [17:27:41.410] break [17:27:41.410] } [17:27:41.410] } [17:27:41.410] } [17:27:41.410] invisible(muffled) [17:27:41.410] } [17:27:41.410] muffleCondition(cond, pattern = "^muffle") [17:27:41.410] } [17:27:41.410] } [17:27:41.410] } [17:27:41.410] })) [17:27:41.410] }, error = function(ex) { [17:27:41.410] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.410] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.410] ...future.rng), started = ...future.startTime, [17:27:41.410] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.410] version = "1.8"), class = "FutureResult") [17:27:41.410] }, finally = { [17:27:41.410] if (!identical(...future.workdir, getwd())) [17:27:41.410] setwd(...future.workdir) [17:27:41.410] { [17:27:41.410] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.410] ...future.oldOptions$nwarnings <- NULL [17:27:41.410] } [17:27:41.410] base::options(...future.oldOptions) [17:27:41.410] if (.Platform$OS.type == "windows") { [17:27:41.410] old_names <- names(...future.oldEnvVars) [17:27:41.410] envs <- base::Sys.getenv() [17:27:41.410] names <- names(envs) [17:27:41.410] common <- intersect(names, old_names) [17:27:41.410] added <- setdiff(names, old_names) [17:27:41.410] removed <- setdiff(old_names, names) [17:27:41.410] changed <- common[...future.oldEnvVars[common] != [17:27:41.410] envs[common]] [17:27:41.410] NAMES <- toupper(changed) [17:27:41.410] args <- list() [17:27:41.410] for (kk in seq_along(NAMES)) { [17:27:41.410] name <- changed[[kk]] [17:27:41.410] NAME <- NAMES[[kk]] [17:27:41.410] if (name != NAME && is.element(NAME, old_names)) [17:27:41.410] next [17:27:41.410] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.410] } [17:27:41.410] NAMES <- toupper(added) [17:27:41.410] for (kk in seq_along(NAMES)) { [17:27:41.410] name <- added[[kk]] [17:27:41.410] NAME <- NAMES[[kk]] [17:27:41.410] if (name != NAME && is.element(NAME, old_names)) [17:27:41.410] next [17:27:41.410] args[[name]] <- "" [17:27:41.410] } [17:27:41.410] NAMES <- toupper(removed) [17:27:41.410] for (kk in seq_along(NAMES)) { [17:27:41.410] name <- removed[[kk]] [17:27:41.410] NAME <- NAMES[[kk]] [17:27:41.410] if (name != NAME && is.element(NAME, old_names)) [17:27:41.410] next [17:27:41.410] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.410] } [17:27:41.410] if (length(args) > 0) [17:27:41.410] base::do.call(base::Sys.setenv, args = args) [17:27:41.410] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.410] } [17:27:41.410] else { [17:27:41.410] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.410] } [17:27:41.410] { [17:27:41.410] if (base::length(...future.futureOptionsAdded) > [17:27:41.410] 0L) { [17:27:41.410] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.410] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.410] base::options(opts) [17:27:41.410] } [17:27:41.410] { [17:27:41.410] { [17:27:41.410] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.410] NULL [17:27:41.410] } [17:27:41.410] options(future.plan = NULL) [17:27:41.410] if (is.na(NA_character_)) [17:27:41.410] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.410] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.410] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.410] .init = FALSE) [17:27:41.410] } [17:27:41.410] } [17:27:41.410] } [17:27:41.410] }) [17:27:41.410] if (TRUE) { [17:27:41.410] base::sink(type = "output", split = FALSE) [17:27:41.410] if (TRUE) { [17:27:41.410] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.410] } [17:27:41.410] else { [17:27:41.410] ...future.result["stdout"] <- base::list(NULL) [17:27:41.410] } [17:27:41.410] base::close(...future.stdout) [17:27:41.410] ...future.stdout <- NULL [17:27:41.410] } [17:27:41.410] ...future.result$conditions <- ...future.conditions [17:27:41.410] ...future.result$finished <- base::Sys.time() [17:27:41.410] ...future.result [17:27:41.410] } [17:27:41.417] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:41.440] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.440] - Validating connection of MultisessionFuture [17:27:41.441] - received message: FutureResult [17:27:41.441] - Received FutureResult [17:27:41.441] - Erased future from FutureRegistry [17:27:41.442] result() for ClusterFuture ... [17:27:41.442] - result already collected: FutureResult [17:27:41.442] result() for ClusterFuture ... done [17:27:41.442] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.443] result() for ClusterFuture ... [17:27:41.443] - result already collected: FutureResult [17:27:41.443] result() for ClusterFuture ... done [17:27:41.443] result() for ClusterFuture ... [17:27:41.444] - result already collected: FutureResult [17:27:41.444] result() for ClusterFuture ... done [17:27:41.446] MultisessionFuture started [17:27:41.446] - Launch lazy future ... done [17:27:41.446] run() for 'MultisessionFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 2 3 - attr(*, "dimnames.")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" [17:27:41.454] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.454] - Validating connection of MultisessionFuture [17:27:41.455] - received message: FutureResult [17:27:41.455] - Received FutureResult [17:27:41.456] - Erased future from FutureRegistry [17:27:41.456] result() for ClusterFuture ... [17:27:41.457] - result already collected: FutureResult [17:27:41.457] result() for ClusterFuture ... done [17:27:41.457] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.471] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.471] - Validating connection of MultisessionFuture [17:27:41.472] - received message: FutureResult [17:27:41.472] - Received FutureResult [17:27:41.473] - Erased future from FutureRegistry [17:27:41.473] result() for ClusterFuture ... [17:27:41.473] - result already collected: FutureResult [17:27:41.473] result() for ClusterFuture ... done [17:27:41.474] receiveMessageFromWorker() for ClusterFuture ... done logi [1:2, 1:3] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:41.479] resolve() on list environment ... [17:27:41.480] recursive: 0 [17:27:41.481] length: 6 [17:27:41.482] elements: 'a', 'b', 'c', 'd', '', '' [17:27:41.482] signalConditionsASAP(numeric, pos=1) ... [17:27:41.482] - nx: 6 [17:27:41.483] - relay: TRUE [17:27:41.483] - stdout: TRUE [17:27:41.483] - signal: TRUE [17:27:41.483] - resignal: FALSE [17:27:41.484] - force: TRUE [17:27:41.484] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.484] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.484] - until=2 [17:27:41.485] - relaying element #2 [17:27:41.485] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.485] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.486] signalConditionsASAP(NULL, pos=1) ... done [17:27:41.486] length: 5 (resolved future 1) [17:27:41.486] Future #2 [17:27:41.487] result() for ClusterFuture ... [17:27:41.491] - result already collected: FutureResult [17:27:41.491] result() for ClusterFuture ... done [17:27:41.492] result() for ClusterFuture ... [17:27:41.492] - result already collected: FutureResult [17:27:41.492] result() for ClusterFuture ... done [17:27:41.492] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:41.493] - nx: 6 [17:27:41.493] - relay: TRUE [17:27:41.493] - stdout: TRUE [17:27:41.493] - signal: TRUE [17:27:41.493] - resignal: FALSE [17:27:41.493] - force: TRUE [17:27:41.494] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.494] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.494] - until=2 [17:27:41.494] - relaying element #2 [17:27:41.494] result() for ClusterFuture ... [17:27:41.495] - result already collected: FutureResult [17:27:41.495] result() for ClusterFuture ... done [17:27:41.495] result() for ClusterFuture ... [17:27:41.495] - result already collected: FutureResult [17:27:41.495] result() for ClusterFuture ... done [17:27:41.496] result() for ClusterFuture ... [17:27:41.496] - result already collected: FutureResult [17:27:41.496] result() for ClusterFuture ... done [17:27:41.496] result() for ClusterFuture ... [17:27:41.497] - result already collected: FutureResult [17:27:41.497] result() for ClusterFuture ... done [17:27:41.497] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.497] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.497] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:41.497] length: 4 (resolved future 2) [17:27:41.498] Future #3 [17:27:41.498] result() for ClusterFuture ... [17:27:41.498] - result already collected: FutureResult [17:27:41.498] result() for ClusterFuture ... done [17:27:41.498] result() for ClusterFuture ... [17:27:41.499] - result already collected: FutureResult [17:27:41.499] result() for ClusterFuture ... done [17:27:41.499] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:41.499] - nx: 6 [17:27:41.499] - relay: TRUE [17:27:41.499] - stdout: TRUE [17:27:41.500] - signal: TRUE [17:27:41.500] - resignal: FALSE [17:27:41.500] - force: TRUE [17:27:41.500] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.500] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.500] - until=3 [17:27:41.501] - relaying element #3 [17:27:41.501] result() for ClusterFuture ... [17:27:41.501] - result already collected: FutureResult [17:27:41.501] result() for ClusterFuture ... done [17:27:41.501] result() for ClusterFuture ... [17:27:41.501] - result already collected: FutureResult [17:27:41.502] result() for ClusterFuture ... done [17:27:41.502] result() for ClusterFuture ... [17:27:41.502] - result already collected: FutureResult [17:27:41.503] result() for ClusterFuture ... done [17:27:41.503] result() for ClusterFuture ... [17:27:41.503] - result already collected: FutureResult [17:27:41.503] result() for ClusterFuture ... done [17:27:41.503] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.503] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.504] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:41.504] length: 3 (resolved future 3) [17:27:41.504] Future #4 [17:27:41.504] result() for ClusterFuture ... [17:27:41.504] - result already collected: FutureResult [17:27:41.505] result() for ClusterFuture ... done [17:27:41.505] result() for ClusterFuture ... [17:27:41.505] - result already collected: FutureResult [17:27:41.505] result() for ClusterFuture ... done [17:27:41.505] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:41.505] - nx: 6 [17:27:41.506] - relay: TRUE [17:27:41.506] - stdout: TRUE [17:27:41.506] - signal: TRUE [17:27:41.506] - resignal: FALSE [17:27:41.506] - force: TRUE [17:27:41.507] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.507] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.507] - until=4 [17:27:41.507] - relaying element #4 [17:27:41.508] result() for ClusterFuture ... [17:27:41.508] - result already collected: FutureResult [17:27:41.508] result() for ClusterFuture ... done [17:27:41.508] result() for ClusterFuture ... [17:27:41.508] - result already collected: FutureResult [17:27:41.509] result() for ClusterFuture ... done [17:27:41.509] result() for ClusterFuture ... [17:27:41.509] - result already collected: FutureResult [17:27:41.509] result() for ClusterFuture ... done [17:27:41.509] result() for ClusterFuture ... [17:27:41.509] - result already collected: FutureResult [17:27:41.510] result() for ClusterFuture ... done [17:27:41.510] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.510] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.510] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:41.510] length: 2 (resolved future 4) [17:27:41.510] signalConditionsASAP(NULL, pos=5) ... [17:27:41.511] - nx: 6 [17:27:41.511] - relay: TRUE [17:27:41.511] - stdout: TRUE [17:27:41.511] - signal: TRUE [17:27:41.511] - resignal: FALSE [17:27:41.511] - force: TRUE [17:27:41.512] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.512] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.512] - until=6 [17:27:41.512] - relaying element #6 [17:27:41.512] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.512] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.512] signalConditionsASAP(NULL, pos=5) ... done [17:27:41.513] length: 1 (resolved future 5) [17:27:41.513] signalConditionsASAP(numeric, pos=6) ... [17:27:41.513] - nx: 6 [17:27:41.513] - relay: TRUE [17:27:41.513] - stdout: TRUE [17:27:41.513] - signal: TRUE [17:27:41.514] - resignal: FALSE [17:27:41.514] - force: TRUE [17:27:41.514] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.514] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.514] - until=6 [17:27:41.514] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.515] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.515] signalConditionsASAP(numeric, pos=6) ... done [17:27:41.515] length: 0 (resolved future 6) [17:27:41.515] Relaying remaining futures [17:27:41.515] signalConditionsASAP(NULL, pos=0) ... [17:27:41.515] - nx: 6 [17:27:41.515] - relay: TRUE [17:27:41.516] - stdout: TRUE [17:27:41.516] - signal: TRUE [17:27:41.516] - resignal: FALSE [17:27:41.516] - force: TRUE [17:27:41.516] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.516] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:41.517] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.517] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.517] signalConditionsASAP(NULL, pos=0) ... done [17:27:41.517] resolve() on list environment ... DONE [17:27:41.517] result() for ClusterFuture ... [17:27:41.518] - result already collected: FutureResult [17:27:41.518] result() for ClusterFuture ... done [17:27:41.518] result() for ClusterFuture ... [17:27:41.518] - result already collected: FutureResult [17:27:41.518] result() for ClusterFuture ... done [17:27:41.518] result() for ClusterFuture ... [17:27:41.519] - result already collected: FutureResult [17:27:41.519] result() for ClusterFuture ... done [17:27:41.519] result() for ClusterFuture ... [17:27:41.519] - result already collected: FutureResult [17:27:41.519] result() for ClusterFuture ... done [17:27:41.520] result() for ClusterFuture ... [17:27:41.520] - result already collected: FutureResult [17:27:41.520] result() for ClusterFuture ... done [17:27:41.520] result() for ClusterFuture ... [17:27:41.520] - result already collected: FutureResult [17:27:41.520] result() for ClusterFuture ... done Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:2] 2 3 - attr(*, "dimnames.")=List of 2 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" Dimensions: c(2, 3, 1) [17:27:41.523] getGlobalsAndPackages() ... [17:27:41.523] Searching for globals... [17:27:41.523] [17:27:41.524] Searching for globals ... DONE [17:27:41.524] - globals: [0] [17:27:41.524] getGlobalsAndPackages() ... DONE [17:27:41.524] run() for 'Future' ... [17:27:41.524] - state: 'created' [17:27:41.525] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.542] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.543] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.543] - Field: 'node' [17:27:41.543] - Field: 'label' [17:27:41.543] - Field: 'local' [17:27:41.544] - Field: 'owner' [17:27:41.544] - Field: 'envir' [17:27:41.544] - Field: 'workers' [17:27:41.544] - Field: 'packages' [17:27:41.544] - Field: 'gc' [17:27:41.545] - Field: 'conditions' [17:27:41.545] - Field: 'persistent' [17:27:41.545] - Field: 'expr' [17:27:41.545] - Field: 'uuid' [17:27:41.545] - Field: 'seed' [17:27:41.545] - Field: 'version' [17:27:41.546] - Field: 'result' [17:27:41.546] - Field: 'asynchronous' [17:27:41.546] - Field: 'calls' [17:27:41.546] - Field: 'globals' [17:27:41.546] - Field: 'stdout' [17:27:41.547] - Field: 'earlySignal' [17:27:41.547] - Field: 'lazy' [17:27:41.547] - Field: 'state' [17:27:41.547] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.547] - Launch lazy future ... [17:27:41.548] Packages needed by the future expression (n = 0): [17:27:41.548] Packages needed by future strategies (n = 0): [17:27:41.549] { [17:27:41.549] { [17:27:41.549] { [17:27:41.549] ...future.startTime <- base::Sys.time() [17:27:41.549] { [17:27:41.549] { [17:27:41.549] { [17:27:41.549] { [17:27:41.549] base::local({ [17:27:41.549] has_future <- base::requireNamespace("future", [17:27:41.549] quietly = TRUE) [17:27:41.549] if (has_future) { [17:27:41.549] ns <- base::getNamespace("future") [17:27:41.549] version <- ns[[".package"]][["version"]] [17:27:41.549] if (is.null(version)) [17:27:41.549] version <- utils::packageVersion("future") [17:27:41.549] } [17:27:41.549] else { [17:27:41.549] version <- NULL [17:27:41.549] } [17:27:41.549] if (!has_future || version < "1.8.0") { [17:27:41.549] info <- base::c(r_version = base::gsub("R version ", [17:27:41.549] "", base::R.version$version.string), [17:27:41.549] platform = base::sprintf("%s (%s-bit)", [17:27:41.549] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.549] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.549] "release", "version")], collapse = " "), [17:27:41.549] hostname = base::Sys.info()[["nodename"]]) [17:27:41.549] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.549] info) [17:27:41.549] info <- base::paste(info, collapse = "; ") [17:27:41.549] if (!has_future) { [17:27:41.549] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.549] info) [17:27:41.549] } [17:27:41.549] else { [17:27:41.549] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.549] info, version) [17:27:41.549] } [17:27:41.549] base::stop(msg) [17:27:41.549] } [17:27:41.549] }) [17:27:41.549] } [17:27:41.549] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.549] base::options(mc.cores = 1L) [17:27:41.549] } [17:27:41.549] ...future.strategy.old <- future::plan("list") [17:27:41.549] options(future.plan = NULL) [17:27:41.549] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.549] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.549] } [17:27:41.549] ...future.workdir <- getwd() [17:27:41.549] } [17:27:41.549] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.549] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.549] } [17:27:41.549] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.549] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.549] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.549] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.549] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.549] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.549] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.549] base::names(...future.oldOptions)) [17:27:41.549] } [17:27:41.549] if (FALSE) { [17:27:41.549] } [17:27:41.549] else { [17:27:41.549] if (TRUE) { [17:27:41.549] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.549] open = "w") [17:27:41.549] } [17:27:41.549] else { [17:27:41.549] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.549] windows = "NUL", "/dev/null"), open = "w") [17:27:41.549] } [17:27:41.549] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.549] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.549] base::sink(type = "output", split = FALSE) [17:27:41.549] base::close(...future.stdout) [17:27:41.549] }, add = TRUE) [17:27:41.549] } [17:27:41.549] ...future.frame <- base::sys.nframe() [17:27:41.549] ...future.conditions <- base::list() [17:27:41.549] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.549] if (FALSE) { [17:27:41.549] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.549] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.549] } [17:27:41.549] ...future.result <- base::tryCatch({ [17:27:41.549] base::withCallingHandlers({ [17:27:41.549] ...future.value <- base::withVisible(base::local({ [17:27:41.549] ...future.makeSendCondition <- base::local({ [17:27:41.549] sendCondition <- NULL [17:27:41.549] function(frame = 1L) { [17:27:41.549] if (is.function(sendCondition)) [17:27:41.549] return(sendCondition) [17:27:41.549] ns <- getNamespace("parallel") [17:27:41.549] if (exists("sendData", mode = "function", [17:27:41.549] envir = ns)) { [17:27:41.549] parallel_sendData <- get("sendData", mode = "function", [17:27:41.549] envir = ns) [17:27:41.549] envir <- sys.frame(frame) [17:27:41.549] master <- NULL [17:27:41.549] while (!identical(envir, .GlobalEnv) && [17:27:41.549] !identical(envir, emptyenv())) { [17:27:41.549] if (exists("master", mode = "list", envir = envir, [17:27:41.549] inherits = FALSE)) { [17:27:41.549] master <- get("master", mode = "list", [17:27:41.549] envir = envir, inherits = FALSE) [17:27:41.549] if (inherits(master, c("SOCKnode", [17:27:41.549] "SOCK0node"))) { [17:27:41.549] sendCondition <<- function(cond) { [17:27:41.549] data <- list(type = "VALUE", value = cond, [17:27:41.549] success = TRUE) [17:27:41.549] parallel_sendData(master, data) [17:27:41.549] } [17:27:41.549] return(sendCondition) [17:27:41.549] } [17:27:41.549] } [17:27:41.549] frame <- frame + 1L [17:27:41.549] envir <- sys.frame(frame) [17:27:41.549] } [17:27:41.549] } [17:27:41.549] sendCondition <<- function(cond) NULL [17:27:41.549] } [17:27:41.549] }) [17:27:41.549] withCallingHandlers({ [17:27:41.549] 2 [17:27:41.549] }, immediateCondition = function(cond) { [17:27:41.549] sendCondition <- ...future.makeSendCondition() [17:27:41.549] sendCondition(cond) [17:27:41.549] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.549] { [17:27:41.549] inherits <- base::inherits [17:27:41.549] invokeRestart <- base::invokeRestart [17:27:41.549] is.null <- base::is.null [17:27:41.549] muffled <- FALSE [17:27:41.549] if (inherits(cond, "message")) { [17:27:41.549] muffled <- grepl(pattern, "muffleMessage") [17:27:41.549] if (muffled) [17:27:41.549] invokeRestart("muffleMessage") [17:27:41.549] } [17:27:41.549] else if (inherits(cond, "warning")) { [17:27:41.549] muffled <- grepl(pattern, "muffleWarning") [17:27:41.549] if (muffled) [17:27:41.549] invokeRestart("muffleWarning") [17:27:41.549] } [17:27:41.549] else if (inherits(cond, "condition")) { [17:27:41.549] if (!is.null(pattern)) { [17:27:41.549] computeRestarts <- base::computeRestarts [17:27:41.549] grepl <- base::grepl [17:27:41.549] restarts <- computeRestarts(cond) [17:27:41.549] for (restart in restarts) { [17:27:41.549] name <- restart$name [17:27:41.549] if (is.null(name)) [17:27:41.549] next [17:27:41.549] if (!grepl(pattern, name)) [17:27:41.549] next [17:27:41.549] invokeRestart(restart) [17:27:41.549] muffled <- TRUE [17:27:41.549] break [17:27:41.549] } [17:27:41.549] } [17:27:41.549] } [17:27:41.549] invisible(muffled) [17:27:41.549] } [17:27:41.549] muffleCondition(cond) [17:27:41.549] }) [17:27:41.549] })) [17:27:41.549] future::FutureResult(value = ...future.value$value, [17:27:41.549] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.549] ...future.rng), globalenv = if (FALSE) [17:27:41.549] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.549] ...future.globalenv.names)) [17:27:41.549] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.549] }, condition = base::local({ [17:27:41.549] c <- base::c [17:27:41.549] inherits <- base::inherits [17:27:41.549] invokeRestart <- base::invokeRestart [17:27:41.549] length <- base::length [17:27:41.549] list <- base::list [17:27:41.549] seq.int <- base::seq.int [17:27:41.549] signalCondition <- base::signalCondition [17:27:41.549] sys.calls <- base::sys.calls [17:27:41.549] `[[` <- base::`[[` [17:27:41.549] `+` <- base::`+` [17:27:41.549] `<<-` <- base::`<<-` [17:27:41.549] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.549] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.549] 3L)] [17:27:41.549] } [17:27:41.549] function(cond) { [17:27:41.549] is_error <- inherits(cond, "error") [17:27:41.549] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.549] NULL) [17:27:41.549] if (is_error) { [17:27:41.549] sessionInformation <- function() { [17:27:41.549] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.549] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.549] search = base::search(), system = base::Sys.info()) [17:27:41.549] } [17:27:41.549] ...future.conditions[[length(...future.conditions) + [17:27:41.549] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.549] cond$call), session = sessionInformation(), [17:27:41.549] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.549] signalCondition(cond) [17:27:41.549] } [17:27:41.549] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.549] "immediateCondition"))) { [17:27:41.549] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.549] ...future.conditions[[length(...future.conditions) + [17:27:41.549] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.549] if (TRUE && !signal) { [17:27:41.549] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.549] { [17:27:41.549] inherits <- base::inherits [17:27:41.549] invokeRestart <- base::invokeRestart [17:27:41.549] is.null <- base::is.null [17:27:41.549] muffled <- FALSE [17:27:41.549] if (inherits(cond, "message")) { [17:27:41.549] muffled <- grepl(pattern, "muffleMessage") [17:27:41.549] if (muffled) [17:27:41.549] invokeRestart("muffleMessage") [17:27:41.549] } [17:27:41.549] else if (inherits(cond, "warning")) { [17:27:41.549] muffled <- grepl(pattern, "muffleWarning") [17:27:41.549] if (muffled) [17:27:41.549] invokeRestart("muffleWarning") [17:27:41.549] } [17:27:41.549] else if (inherits(cond, "condition")) { [17:27:41.549] if (!is.null(pattern)) { [17:27:41.549] computeRestarts <- base::computeRestarts [17:27:41.549] grepl <- base::grepl [17:27:41.549] restarts <- computeRestarts(cond) [17:27:41.549] for (restart in restarts) { [17:27:41.549] name <- restart$name [17:27:41.549] if (is.null(name)) [17:27:41.549] next [17:27:41.549] if (!grepl(pattern, name)) [17:27:41.549] next [17:27:41.549] invokeRestart(restart) [17:27:41.549] muffled <- TRUE [17:27:41.549] break [17:27:41.549] } [17:27:41.549] } [17:27:41.549] } [17:27:41.549] invisible(muffled) [17:27:41.549] } [17:27:41.549] muffleCondition(cond, pattern = "^muffle") [17:27:41.549] } [17:27:41.549] } [17:27:41.549] else { [17:27:41.549] if (TRUE) { [17:27:41.549] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.549] { [17:27:41.549] inherits <- base::inherits [17:27:41.549] invokeRestart <- base::invokeRestart [17:27:41.549] is.null <- base::is.null [17:27:41.549] muffled <- FALSE [17:27:41.549] if (inherits(cond, "message")) { [17:27:41.549] muffled <- grepl(pattern, "muffleMessage") [17:27:41.549] if (muffled) [17:27:41.549] invokeRestart("muffleMessage") [17:27:41.549] } [17:27:41.549] else if (inherits(cond, "warning")) { [17:27:41.549] muffled <- grepl(pattern, "muffleWarning") [17:27:41.549] if (muffled) [17:27:41.549] invokeRestart("muffleWarning") [17:27:41.549] } [17:27:41.549] else if (inherits(cond, "condition")) { [17:27:41.549] if (!is.null(pattern)) { [17:27:41.549] computeRestarts <- base::computeRestarts [17:27:41.549] grepl <- base::grepl [17:27:41.549] restarts <- computeRestarts(cond) [17:27:41.549] for (restart in restarts) { [17:27:41.549] name <- restart$name [17:27:41.549] if (is.null(name)) [17:27:41.549] next [17:27:41.549] if (!grepl(pattern, name)) [17:27:41.549] next [17:27:41.549] invokeRestart(restart) [17:27:41.549] muffled <- TRUE [17:27:41.549] break [17:27:41.549] } [17:27:41.549] } [17:27:41.549] } [17:27:41.549] invisible(muffled) [17:27:41.549] } [17:27:41.549] muffleCondition(cond, pattern = "^muffle") [17:27:41.549] } [17:27:41.549] } [17:27:41.549] } [17:27:41.549] })) [17:27:41.549] }, error = function(ex) { [17:27:41.549] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.549] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.549] ...future.rng), started = ...future.startTime, [17:27:41.549] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.549] version = "1.8"), class = "FutureResult") [17:27:41.549] }, finally = { [17:27:41.549] if (!identical(...future.workdir, getwd())) [17:27:41.549] setwd(...future.workdir) [17:27:41.549] { [17:27:41.549] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.549] ...future.oldOptions$nwarnings <- NULL [17:27:41.549] } [17:27:41.549] base::options(...future.oldOptions) [17:27:41.549] if (.Platform$OS.type == "windows") { [17:27:41.549] old_names <- names(...future.oldEnvVars) [17:27:41.549] envs <- base::Sys.getenv() [17:27:41.549] names <- names(envs) [17:27:41.549] common <- intersect(names, old_names) [17:27:41.549] added <- setdiff(names, old_names) [17:27:41.549] removed <- setdiff(old_names, names) [17:27:41.549] changed <- common[...future.oldEnvVars[common] != [17:27:41.549] envs[common]] [17:27:41.549] NAMES <- toupper(changed) [17:27:41.549] args <- list() [17:27:41.549] for (kk in seq_along(NAMES)) { [17:27:41.549] name <- changed[[kk]] [17:27:41.549] NAME <- NAMES[[kk]] [17:27:41.549] if (name != NAME && is.element(NAME, old_names)) [17:27:41.549] next [17:27:41.549] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.549] } [17:27:41.549] NAMES <- toupper(added) [17:27:41.549] for (kk in seq_along(NAMES)) { [17:27:41.549] name <- added[[kk]] [17:27:41.549] NAME <- NAMES[[kk]] [17:27:41.549] if (name != NAME && is.element(NAME, old_names)) [17:27:41.549] next [17:27:41.549] args[[name]] <- "" [17:27:41.549] } [17:27:41.549] NAMES <- toupper(removed) [17:27:41.549] for (kk in seq_along(NAMES)) { [17:27:41.549] name <- removed[[kk]] [17:27:41.549] NAME <- NAMES[[kk]] [17:27:41.549] if (name != NAME && is.element(NAME, old_names)) [17:27:41.549] next [17:27:41.549] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.549] } [17:27:41.549] if (length(args) > 0) [17:27:41.549] base::do.call(base::Sys.setenv, args = args) [17:27:41.549] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.549] } [17:27:41.549] else { [17:27:41.549] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.549] } [17:27:41.549] { [17:27:41.549] if (base::length(...future.futureOptionsAdded) > [17:27:41.549] 0L) { [17:27:41.549] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.549] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.549] base::options(opts) [17:27:41.549] } [17:27:41.549] { [17:27:41.549] { [17:27:41.549] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.549] NULL [17:27:41.549] } [17:27:41.549] options(future.plan = NULL) [17:27:41.549] if (is.na(NA_character_)) [17:27:41.549] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.549] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.549] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.549] .init = FALSE) [17:27:41.549] } [17:27:41.549] } [17:27:41.549] } [17:27:41.549] }) [17:27:41.549] if (TRUE) { [17:27:41.549] base::sink(type = "output", split = FALSE) [17:27:41.549] if (TRUE) { [17:27:41.549] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.549] } [17:27:41.549] else { [17:27:41.549] ...future.result["stdout"] <- base::list(NULL) [17:27:41.549] } [17:27:41.549] base::close(...future.stdout) [17:27:41.549] ...future.stdout <- NULL [17:27:41.549] } [17:27:41.549] ...future.result$conditions <- ...future.conditions [17:27:41.549] ...future.result$finished <- base::Sys.time() [17:27:41.549] ...future.result [17:27:41.549] } [17:27:41.554] MultisessionFuture started [17:27:41.555] - Launch lazy future ... done [17:27:41.555] run() for 'MultisessionFuture' ... done [17:27:41.555] getGlobalsAndPackages() ... [17:27:41.555] Searching for globals... [17:27:41.556] [17:27:41.556] Searching for globals ... DONE [17:27:41.556] - globals: [0] [17:27:41.556] getGlobalsAndPackages() ... DONE [17:27:41.557] run() for 'Future' ... [17:27:41.557] - state: 'created' [17:27:41.557] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.573] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.573] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.573] - Field: 'node' [17:27:41.573] - Field: 'label' [17:27:41.574] - Field: 'local' [17:27:41.574] - Field: 'owner' [17:27:41.574] - Field: 'envir' [17:27:41.574] - Field: 'workers' [17:27:41.574] - Field: 'packages' [17:27:41.574] - Field: 'gc' [17:27:41.575] - Field: 'conditions' [17:27:41.575] - Field: 'persistent' [17:27:41.575] - Field: 'expr' [17:27:41.575] - Field: 'uuid' [17:27:41.575] - Field: 'seed' [17:27:41.575] - Field: 'version' [17:27:41.576] - Field: 'result' [17:27:41.576] - Field: 'asynchronous' [17:27:41.576] - Field: 'calls' [17:27:41.576] - Field: 'globals' [17:27:41.576] - Field: 'stdout' [17:27:41.577] - Field: 'earlySignal' [17:27:41.577] - Field: 'lazy' [17:27:41.577] - Field: 'state' [17:27:41.577] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.577] - Launch lazy future ... [17:27:41.578] Packages needed by the future expression (n = 0): [17:27:41.578] Packages needed by future strategies (n = 0): [17:27:41.578] { [17:27:41.578] { [17:27:41.578] { [17:27:41.578] ...future.startTime <- base::Sys.time() [17:27:41.578] { [17:27:41.578] { [17:27:41.578] { [17:27:41.578] { [17:27:41.578] base::local({ [17:27:41.578] has_future <- base::requireNamespace("future", [17:27:41.578] quietly = TRUE) [17:27:41.578] if (has_future) { [17:27:41.578] ns <- base::getNamespace("future") [17:27:41.578] version <- ns[[".package"]][["version"]] [17:27:41.578] if (is.null(version)) [17:27:41.578] version <- utils::packageVersion("future") [17:27:41.578] } [17:27:41.578] else { [17:27:41.578] version <- NULL [17:27:41.578] } [17:27:41.578] if (!has_future || version < "1.8.0") { [17:27:41.578] info <- base::c(r_version = base::gsub("R version ", [17:27:41.578] "", base::R.version$version.string), [17:27:41.578] platform = base::sprintf("%s (%s-bit)", [17:27:41.578] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.578] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.578] "release", "version")], collapse = " "), [17:27:41.578] hostname = base::Sys.info()[["nodename"]]) [17:27:41.578] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.578] info) [17:27:41.578] info <- base::paste(info, collapse = "; ") [17:27:41.578] if (!has_future) { [17:27:41.578] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.578] info) [17:27:41.578] } [17:27:41.578] else { [17:27:41.578] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.578] info, version) [17:27:41.578] } [17:27:41.578] base::stop(msg) [17:27:41.578] } [17:27:41.578] }) [17:27:41.578] } [17:27:41.578] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.578] base::options(mc.cores = 1L) [17:27:41.578] } [17:27:41.578] ...future.strategy.old <- future::plan("list") [17:27:41.578] options(future.plan = NULL) [17:27:41.578] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.578] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.578] } [17:27:41.578] ...future.workdir <- getwd() [17:27:41.578] } [17:27:41.578] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.578] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.578] } [17:27:41.578] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.578] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.578] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.578] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.578] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.578] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.578] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.578] base::names(...future.oldOptions)) [17:27:41.578] } [17:27:41.578] if (FALSE) { [17:27:41.578] } [17:27:41.578] else { [17:27:41.578] if (TRUE) { [17:27:41.578] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.578] open = "w") [17:27:41.578] } [17:27:41.578] else { [17:27:41.578] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.578] windows = "NUL", "/dev/null"), open = "w") [17:27:41.578] } [17:27:41.578] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.578] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.578] base::sink(type = "output", split = FALSE) [17:27:41.578] base::close(...future.stdout) [17:27:41.578] }, add = TRUE) [17:27:41.578] } [17:27:41.578] ...future.frame <- base::sys.nframe() [17:27:41.578] ...future.conditions <- base::list() [17:27:41.578] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.578] if (FALSE) { [17:27:41.578] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.578] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.578] } [17:27:41.578] ...future.result <- base::tryCatch({ [17:27:41.578] base::withCallingHandlers({ [17:27:41.578] ...future.value <- base::withVisible(base::local({ [17:27:41.578] ...future.makeSendCondition <- base::local({ [17:27:41.578] sendCondition <- NULL [17:27:41.578] function(frame = 1L) { [17:27:41.578] if (is.function(sendCondition)) [17:27:41.578] return(sendCondition) [17:27:41.578] ns <- getNamespace("parallel") [17:27:41.578] if (exists("sendData", mode = "function", [17:27:41.578] envir = ns)) { [17:27:41.578] parallel_sendData <- get("sendData", mode = "function", [17:27:41.578] envir = ns) [17:27:41.578] envir <- sys.frame(frame) [17:27:41.578] master <- NULL [17:27:41.578] while (!identical(envir, .GlobalEnv) && [17:27:41.578] !identical(envir, emptyenv())) { [17:27:41.578] if (exists("master", mode = "list", envir = envir, [17:27:41.578] inherits = FALSE)) { [17:27:41.578] master <- get("master", mode = "list", [17:27:41.578] envir = envir, inherits = FALSE) [17:27:41.578] if (inherits(master, c("SOCKnode", [17:27:41.578] "SOCK0node"))) { [17:27:41.578] sendCondition <<- function(cond) { [17:27:41.578] data <- list(type = "VALUE", value = cond, [17:27:41.578] success = TRUE) [17:27:41.578] parallel_sendData(master, data) [17:27:41.578] } [17:27:41.578] return(sendCondition) [17:27:41.578] } [17:27:41.578] } [17:27:41.578] frame <- frame + 1L [17:27:41.578] envir <- sys.frame(frame) [17:27:41.578] } [17:27:41.578] } [17:27:41.578] sendCondition <<- function(cond) NULL [17:27:41.578] } [17:27:41.578] }) [17:27:41.578] withCallingHandlers({ [17:27:41.578] NULL [17:27:41.578] }, immediateCondition = function(cond) { [17:27:41.578] sendCondition <- ...future.makeSendCondition() [17:27:41.578] sendCondition(cond) [17:27:41.578] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.578] { [17:27:41.578] inherits <- base::inherits [17:27:41.578] invokeRestart <- base::invokeRestart [17:27:41.578] is.null <- base::is.null [17:27:41.578] muffled <- FALSE [17:27:41.578] if (inherits(cond, "message")) { [17:27:41.578] muffled <- grepl(pattern, "muffleMessage") [17:27:41.578] if (muffled) [17:27:41.578] invokeRestart("muffleMessage") [17:27:41.578] } [17:27:41.578] else if (inherits(cond, "warning")) { [17:27:41.578] muffled <- grepl(pattern, "muffleWarning") [17:27:41.578] if (muffled) [17:27:41.578] invokeRestart("muffleWarning") [17:27:41.578] } [17:27:41.578] else if (inherits(cond, "condition")) { [17:27:41.578] if (!is.null(pattern)) { [17:27:41.578] computeRestarts <- base::computeRestarts [17:27:41.578] grepl <- base::grepl [17:27:41.578] restarts <- computeRestarts(cond) [17:27:41.578] for (restart in restarts) { [17:27:41.578] name <- restart$name [17:27:41.578] if (is.null(name)) [17:27:41.578] next [17:27:41.578] if (!grepl(pattern, name)) [17:27:41.578] next [17:27:41.578] invokeRestart(restart) [17:27:41.578] muffled <- TRUE [17:27:41.578] break [17:27:41.578] } [17:27:41.578] } [17:27:41.578] } [17:27:41.578] invisible(muffled) [17:27:41.578] } [17:27:41.578] muffleCondition(cond) [17:27:41.578] }) [17:27:41.578] })) [17:27:41.578] future::FutureResult(value = ...future.value$value, [17:27:41.578] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.578] ...future.rng), globalenv = if (FALSE) [17:27:41.578] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.578] ...future.globalenv.names)) [17:27:41.578] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.578] }, condition = base::local({ [17:27:41.578] c <- base::c [17:27:41.578] inherits <- base::inherits [17:27:41.578] invokeRestart <- base::invokeRestart [17:27:41.578] length <- base::length [17:27:41.578] list <- base::list [17:27:41.578] seq.int <- base::seq.int [17:27:41.578] signalCondition <- base::signalCondition [17:27:41.578] sys.calls <- base::sys.calls [17:27:41.578] `[[` <- base::`[[` [17:27:41.578] `+` <- base::`+` [17:27:41.578] `<<-` <- base::`<<-` [17:27:41.578] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.578] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.578] 3L)] [17:27:41.578] } [17:27:41.578] function(cond) { [17:27:41.578] is_error <- inherits(cond, "error") [17:27:41.578] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.578] NULL) [17:27:41.578] if (is_error) { [17:27:41.578] sessionInformation <- function() { [17:27:41.578] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.578] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.578] search = base::search(), system = base::Sys.info()) [17:27:41.578] } [17:27:41.578] ...future.conditions[[length(...future.conditions) + [17:27:41.578] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.578] cond$call), session = sessionInformation(), [17:27:41.578] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.578] signalCondition(cond) [17:27:41.578] } [17:27:41.578] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.578] "immediateCondition"))) { [17:27:41.578] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.578] ...future.conditions[[length(...future.conditions) + [17:27:41.578] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.578] if (TRUE && !signal) { [17:27:41.578] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.578] { [17:27:41.578] inherits <- base::inherits [17:27:41.578] invokeRestart <- base::invokeRestart [17:27:41.578] is.null <- base::is.null [17:27:41.578] muffled <- FALSE [17:27:41.578] if (inherits(cond, "message")) { [17:27:41.578] muffled <- grepl(pattern, "muffleMessage") [17:27:41.578] if (muffled) [17:27:41.578] invokeRestart("muffleMessage") [17:27:41.578] } [17:27:41.578] else if (inherits(cond, "warning")) { [17:27:41.578] muffled <- grepl(pattern, "muffleWarning") [17:27:41.578] if (muffled) [17:27:41.578] invokeRestart("muffleWarning") [17:27:41.578] } [17:27:41.578] else if (inherits(cond, "condition")) { [17:27:41.578] if (!is.null(pattern)) { [17:27:41.578] computeRestarts <- base::computeRestarts [17:27:41.578] grepl <- base::grepl [17:27:41.578] restarts <- computeRestarts(cond) [17:27:41.578] for (restart in restarts) { [17:27:41.578] name <- restart$name [17:27:41.578] if (is.null(name)) [17:27:41.578] next [17:27:41.578] if (!grepl(pattern, name)) [17:27:41.578] next [17:27:41.578] invokeRestart(restart) [17:27:41.578] muffled <- TRUE [17:27:41.578] break [17:27:41.578] } [17:27:41.578] } [17:27:41.578] } [17:27:41.578] invisible(muffled) [17:27:41.578] } [17:27:41.578] muffleCondition(cond, pattern = "^muffle") [17:27:41.578] } [17:27:41.578] } [17:27:41.578] else { [17:27:41.578] if (TRUE) { [17:27:41.578] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.578] { [17:27:41.578] inherits <- base::inherits [17:27:41.578] invokeRestart <- base::invokeRestart [17:27:41.578] is.null <- base::is.null [17:27:41.578] muffled <- FALSE [17:27:41.578] if (inherits(cond, "message")) { [17:27:41.578] muffled <- grepl(pattern, "muffleMessage") [17:27:41.578] if (muffled) [17:27:41.578] invokeRestart("muffleMessage") [17:27:41.578] } [17:27:41.578] else if (inherits(cond, "warning")) { [17:27:41.578] muffled <- grepl(pattern, "muffleWarning") [17:27:41.578] if (muffled) [17:27:41.578] invokeRestart("muffleWarning") [17:27:41.578] } [17:27:41.578] else if (inherits(cond, "condition")) { [17:27:41.578] if (!is.null(pattern)) { [17:27:41.578] computeRestarts <- base::computeRestarts [17:27:41.578] grepl <- base::grepl [17:27:41.578] restarts <- computeRestarts(cond) [17:27:41.578] for (restart in restarts) { [17:27:41.578] name <- restart$name [17:27:41.578] if (is.null(name)) [17:27:41.578] next [17:27:41.578] if (!grepl(pattern, name)) [17:27:41.578] next [17:27:41.578] invokeRestart(restart) [17:27:41.578] muffled <- TRUE [17:27:41.578] break [17:27:41.578] } [17:27:41.578] } [17:27:41.578] } [17:27:41.578] invisible(muffled) [17:27:41.578] } [17:27:41.578] muffleCondition(cond, pattern = "^muffle") [17:27:41.578] } [17:27:41.578] } [17:27:41.578] } [17:27:41.578] })) [17:27:41.578] }, error = function(ex) { [17:27:41.578] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.578] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.578] ...future.rng), started = ...future.startTime, [17:27:41.578] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.578] version = "1.8"), class = "FutureResult") [17:27:41.578] }, finally = { [17:27:41.578] if (!identical(...future.workdir, getwd())) [17:27:41.578] setwd(...future.workdir) [17:27:41.578] { [17:27:41.578] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.578] ...future.oldOptions$nwarnings <- NULL [17:27:41.578] } [17:27:41.578] base::options(...future.oldOptions) [17:27:41.578] if (.Platform$OS.type == "windows") { [17:27:41.578] old_names <- names(...future.oldEnvVars) [17:27:41.578] envs <- base::Sys.getenv() [17:27:41.578] names <- names(envs) [17:27:41.578] common <- intersect(names, old_names) [17:27:41.578] added <- setdiff(names, old_names) [17:27:41.578] removed <- setdiff(old_names, names) [17:27:41.578] changed <- common[...future.oldEnvVars[common] != [17:27:41.578] envs[common]] [17:27:41.578] NAMES <- toupper(changed) [17:27:41.578] args <- list() [17:27:41.578] for (kk in seq_along(NAMES)) { [17:27:41.578] name <- changed[[kk]] [17:27:41.578] NAME <- NAMES[[kk]] [17:27:41.578] if (name != NAME && is.element(NAME, old_names)) [17:27:41.578] next [17:27:41.578] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.578] } [17:27:41.578] NAMES <- toupper(added) [17:27:41.578] for (kk in seq_along(NAMES)) { [17:27:41.578] name <- added[[kk]] [17:27:41.578] NAME <- NAMES[[kk]] [17:27:41.578] if (name != NAME && is.element(NAME, old_names)) [17:27:41.578] next [17:27:41.578] args[[name]] <- "" [17:27:41.578] } [17:27:41.578] NAMES <- toupper(removed) [17:27:41.578] for (kk in seq_along(NAMES)) { [17:27:41.578] name <- removed[[kk]] [17:27:41.578] NAME <- NAMES[[kk]] [17:27:41.578] if (name != NAME && is.element(NAME, old_names)) [17:27:41.578] next [17:27:41.578] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.578] } [17:27:41.578] if (length(args) > 0) [17:27:41.578] base::do.call(base::Sys.setenv, args = args) [17:27:41.578] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.578] } [17:27:41.578] else { [17:27:41.578] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.578] } [17:27:41.578] { [17:27:41.578] if (base::length(...future.futureOptionsAdded) > [17:27:41.578] 0L) { [17:27:41.578] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.578] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.578] base::options(opts) [17:27:41.578] } [17:27:41.578] { [17:27:41.578] { [17:27:41.578] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.578] NULL [17:27:41.578] } [17:27:41.578] options(future.plan = NULL) [17:27:41.578] if (is.na(NA_character_)) [17:27:41.578] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.578] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.578] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.578] .init = FALSE) [17:27:41.578] } [17:27:41.578] } [17:27:41.578] } [17:27:41.578] }) [17:27:41.578] if (TRUE) { [17:27:41.578] base::sink(type = "output", split = FALSE) [17:27:41.578] if (TRUE) { [17:27:41.578] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.578] } [17:27:41.578] else { [17:27:41.578] ...future.result["stdout"] <- base::list(NULL) [17:27:41.578] } [17:27:41.578] base::close(...future.stdout) [17:27:41.578] ...future.stdout <- NULL [17:27:41.578] } [17:27:41.578] ...future.result$conditions <- ...future.conditions [17:27:41.578] ...future.result$finished <- base::Sys.time() [17:27:41.578] ...future.result [17:27:41.578] } [17:27:41.584] MultisessionFuture started [17:27:41.585] - Launch lazy future ... done [17:27:41.585] run() for 'MultisessionFuture' ... done [17:27:41.585] getGlobalsAndPackages() ... [17:27:41.586] Searching for globals... [17:27:41.586] - globals found: [1] '{' [17:27:41.587] Searching for globals ... DONE [17:27:41.587] Resolving globals: FALSE [17:27:41.587] [17:27:41.587] [17:27:41.588] getGlobalsAndPackages() ... DONE [17:27:41.588] run() for 'Future' ... [17:27:41.588] - state: 'created' [17:27:41.588] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.606] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.606] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.607] - Field: 'node' [17:27:41.607] - Field: 'label' [17:27:41.608] - Field: 'local' [17:27:41.608] - Field: 'owner' [17:27:41.608] - Field: 'envir' [17:27:41.609] - Field: 'workers' [17:27:41.609] - Field: 'packages' [17:27:41.609] - Field: 'gc' [17:27:41.610] - Field: 'conditions' [17:27:41.610] - Field: 'persistent' [17:27:41.610] - Field: 'expr' [17:27:41.611] - Field: 'uuid' [17:27:41.611] - Field: 'seed' [17:27:41.611] - Field: 'version' [17:27:41.612] - Field: 'result' [17:27:41.612] - Field: 'asynchronous' [17:27:41.612] - Field: 'calls' [17:27:41.613] - Field: 'globals' [17:27:41.613] - Field: 'stdout' [17:27:41.613] - Field: 'earlySignal' [17:27:41.614] - Field: 'lazy' [17:27:41.614] - Field: 'state' [17:27:41.614] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.614] - Launch lazy future ... [17:27:41.615] Packages needed by the future expression (n = 0): [17:27:41.615] Packages needed by future strategies (n = 0): [17:27:41.616] { [17:27:41.616] { [17:27:41.616] { [17:27:41.616] ...future.startTime <- base::Sys.time() [17:27:41.616] { [17:27:41.616] { [17:27:41.616] { [17:27:41.616] { [17:27:41.616] base::local({ [17:27:41.616] has_future <- base::requireNamespace("future", [17:27:41.616] quietly = TRUE) [17:27:41.616] if (has_future) { [17:27:41.616] ns <- base::getNamespace("future") [17:27:41.616] version <- ns[[".package"]][["version"]] [17:27:41.616] if (is.null(version)) [17:27:41.616] version <- utils::packageVersion("future") [17:27:41.616] } [17:27:41.616] else { [17:27:41.616] version <- NULL [17:27:41.616] } [17:27:41.616] if (!has_future || version < "1.8.0") { [17:27:41.616] info <- base::c(r_version = base::gsub("R version ", [17:27:41.616] "", base::R.version$version.string), [17:27:41.616] platform = base::sprintf("%s (%s-bit)", [17:27:41.616] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.616] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.616] "release", "version")], collapse = " "), [17:27:41.616] hostname = base::Sys.info()[["nodename"]]) [17:27:41.616] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.616] info) [17:27:41.616] info <- base::paste(info, collapse = "; ") [17:27:41.616] if (!has_future) { [17:27:41.616] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.616] info) [17:27:41.616] } [17:27:41.616] else { [17:27:41.616] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.616] info, version) [17:27:41.616] } [17:27:41.616] base::stop(msg) [17:27:41.616] } [17:27:41.616] }) [17:27:41.616] } [17:27:41.616] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.616] base::options(mc.cores = 1L) [17:27:41.616] } [17:27:41.616] ...future.strategy.old <- future::plan("list") [17:27:41.616] options(future.plan = NULL) [17:27:41.616] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.616] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.616] } [17:27:41.616] ...future.workdir <- getwd() [17:27:41.616] } [17:27:41.616] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.616] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.616] } [17:27:41.616] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.616] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.616] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.616] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.616] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.616] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.616] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.616] base::names(...future.oldOptions)) [17:27:41.616] } [17:27:41.616] if (FALSE) { [17:27:41.616] } [17:27:41.616] else { [17:27:41.616] if (TRUE) { [17:27:41.616] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.616] open = "w") [17:27:41.616] } [17:27:41.616] else { [17:27:41.616] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.616] windows = "NUL", "/dev/null"), open = "w") [17:27:41.616] } [17:27:41.616] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.616] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.616] base::sink(type = "output", split = FALSE) [17:27:41.616] base::close(...future.stdout) [17:27:41.616] }, add = TRUE) [17:27:41.616] } [17:27:41.616] ...future.frame <- base::sys.nframe() [17:27:41.616] ...future.conditions <- base::list() [17:27:41.616] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.616] if (FALSE) { [17:27:41.616] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.616] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.616] } [17:27:41.616] ...future.result <- base::tryCatch({ [17:27:41.616] base::withCallingHandlers({ [17:27:41.616] ...future.value <- base::withVisible(base::local({ [17:27:41.616] ...future.makeSendCondition <- base::local({ [17:27:41.616] sendCondition <- NULL [17:27:41.616] function(frame = 1L) { [17:27:41.616] if (is.function(sendCondition)) [17:27:41.616] return(sendCondition) [17:27:41.616] ns <- getNamespace("parallel") [17:27:41.616] if (exists("sendData", mode = "function", [17:27:41.616] envir = ns)) { [17:27:41.616] parallel_sendData <- get("sendData", mode = "function", [17:27:41.616] envir = ns) [17:27:41.616] envir <- sys.frame(frame) [17:27:41.616] master <- NULL [17:27:41.616] while (!identical(envir, .GlobalEnv) && [17:27:41.616] !identical(envir, emptyenv())) { [17:27:41.616] if (exists("master", mode = "list", envir = envir, [17:27:41.616] inherits = FALSE)) { [17:27:41.616] master <- get("master", mode = "list", [17:27:41.616] envir = envir, inherits = FALSE) [17:27:41.616] if (inherits(master, c("SOCKnode", [17:27:41.616] "SOCK0node"))) { [17:27:41.616] sendCondition <<- function(cond) { [17:27:41.616] data <- list(type = "VALUE", value = cond, [17:27:41.616] success = TRUE) [17:27:41.616] parallel_sendData(master, data) [17:27:41.616] } [17:27:41.616] return(sendCondition) [17:27:41.616] } [17:27:41.616] } [17:27:41.616] frame <- frame + 1L [17:27:41.616] envir <- sys.frame(frame) [17:27:41.616] } [17:27:41.616] } [17:27:41.616] sendCondition <<- function(cond) NULL [17:27:41.616] } [17:27:41.616] }) [17:27:41.616] withCallingHandlers({ [17:27:41.616] { [17:27:41.616] 4 [17:27:41.616] } [17:27:41.616] }, immediateCondition = function(cond) { [17:27:41.616] sendCondition <- ...future.makeSendCondition() [17:27:41.616] sendCondition(cond) [17:27:41.616] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.616] { [17:27:41.616] inherits <- base::inherits [17:27:41.616] invokeRestart <- base::invokeRestart [17:27:41.616] is.null <- base::is.null [17:27:41.616] muffled <- FALSE [17:27:41.616] if (inherits(cond, "message")) { [17:27:41.616] muffled <- grepl(pattern, "muffleMessage") [17:27:41.616] if (muffled) [17:27:41.616] invokeRestart("muffleMessage") [17:27:41.616] } [17:27:41.616] else if (inherits(cond, "warning")) { [17:27:41.616] muffled <- grepl(pattern, "muffleWarning") [17:27:41.616] if (muffled) [17:27:41.616] invokeRestart("muffleWarning") [17:27:41.616] } [17:27:41.616] else if (inherits(cond, "condition")) { [17:27:41.616] if (!is.null(pattern)) { [17:27:41.616] computeRestarts <- base::computeRestarts [17:27:41.616] grepl <- base::grepl [17:27:41.616] restarts <- computeRestarts(cond) [17:27:41.616] for (restart in restarts) { [17:27:41.616] name <- restart$name [17:27:41.616] if (is.null(name)) [17:27:41.616] next [17:27:41.616] if (!grepl(pattern, name)) [17:27:41.616] next [17:27:41.616] invokeRestart(restart) [17:27:41.616] muffled <- TRUE [17:27:41.616] break [17:27:41.616] } [17:27:41.616] } [17:27:41.616] } [17:27:41.616] invisible(muffled) [17:27:41.616] } [17:27:41.616] muffleCondition(cond) [17:27:41.616] }) [17:27:41.616] })) [17:27:41.616] future::FutureResult(value = ...future.value$value, [17:27:41.616] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.616] ...future.rng), globalenv = if (FALSE) [17:27:41.616] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.616] ...future.globalenv.names)) [17:27:41.616] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.616] }, condition = base::local({ [17:27:41.616] c <- base::c [17:27:41.616] inherits <- base::inherits [17:27:41.616] invokeRestart <- base::invokeRestart [17:27:41.616] length <- base::length [17:27:41.616] list <- base::list [17:27:41.616] seq.int <- base::seq.int [17:27:41.616] signalCondition <- base::signalCondition [17:27:41.616] sys.calls <- base::sys.calls [17:27:41.616] `[[` <- base::`[[` [17:27:41.616] `+` <- base::`+` [17:27:41.616] `<<-` <- base::`<<-` [17:27:41.616] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.616] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.616] 3L)] [17:27:41.616] } [17:27:41.616] function(cond) { [17:27:41.616] is_error <- inherits(cond, "error") [17:27:41.616] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.616] NULL) [17:27:41.616] if (is_error) { [17:27:41.616] sessionInformation <- function() { [17:27:41.616] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.616] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.616] search = base::search(), system = base::Sys.info()) [17:27:41.616] } [17:27:41.616] ...future.conditions[[length(...future.conditions) + [17:27:41.616] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.616] cond$call), session = sessionInformation(), [17:27:41.616] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.616] signalCondition(cond) [17:27:41.616] } [17:27:41.616] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.616] "immediateCondition"))) { [17:27:41.616] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.616] ...future.conditions[[length(...future.conditions) + [17:27:41.616] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.616] if (TRUE && !signal) { [17:27:41.616] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.616] { [17:27:41.616] inherits <- base::inherits [17:27:41.616] invokeRestart <- base::invokeRestart [17:27:41.616] is.null <- base::is.null [17:27:41.616] muffled <- FALSE [17:27:41.616] if (inherits(cond, "message")) { [17:27:41.616] muffled <- grepl(pattern, "muffleMessage") [17:27:41.616] if (muffled) [17:27:41.616] invokeRestart("muffleMessage") [17:27:41.616] } [17:27:41.616] else if (inherits(cond, "warning")) { [17:27:41.616] muffled <- grepl(pattern, "muffleWarning") [17:27:41.616] if (muffled) [17:27:41.616] invokeRestart("muffleWarning") [17:27:41.616] } [17:27:41.616] else if (inherits(cond, "condition")) { [17:27:41.616] if (!is.null(pattern)) { [17:27:41.616] computeRestarts <- base::computeRestarts [17:27:41.616] grepl <- base::grepl [17:27:41.616] restarts <- computeRestarts(cond) [17:27:41.616] for (restart in restarts) { [17:27:41.616] name <- restart$name [17:27:41.616] if (is.null(name)) [17:27:41.616] next [17:27:41.616] if (!grepl(pattern, name)) [17:27:41.616] next [17:27:41.616] invokeRestart(restart) [17:27:41.616] muffled <- TRUE [17:27:41.616] break [17:27:41.616] } [17:27:41.616] } [17:27:41.616] } [17:27:41.616] invisible(muffled) [17:27:41.616] } [17:27:41.616] muffleCondition(cond, pattern = "^muffle") [17:27:41.616] } [17:27:41.616] } [17:27:41.616] else { [17:27:41.616] if (TRUE) { [17:27:41.616] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.616] { [17:27:41.616] inherits <- base::inherits [17:27:41.616] invokeRestart <- base::invokeRestart [17:27:41.616] is.null <- base::is.null [17:27:41.616] muffled <- FALSE [17:27:41.616] if (inherits(cond, "message")) { [17:27:41.616] muffled <- grepl(pattern, "muffleMessage") [17:27:41.616] if (muffled) [17:27:41.616] invokeRestart("muffleMessage") [17:27:41.616] } [17:27:41.616] else if (inherits(cond, "warning")) { [17:27:41.616] muffled <- grepl(pattern, "muffleWarning") [17:27:41.616] if (muffled) [17:27:41.616] invokeRestart("muffleWarning") [17:27:41.616] } [17:27:41.616] else if (inherits(cond, "condition")) { [17:27:41.616] if (!is.null(pattern)) { [17:27:41.616] computeRestarts <- base::computeRestarts [17:27:41.616] grepl <- base::grepl [17:27:41.616] restarts <- computeRestarts(cond) [17:27:41.616] for (restart in restarts) { [17:27:41.616] name <- restart$name [17:27:41.616] if (is.null(name)) [17:27:41.616] next [17:27:41.616] if (!grepl(pattern, name)) [17:27:41.616] next [17:27:41.616] invokeRestart(restart) [17:27:41.616] muffled <- TRUE [17:27:41.616] break [17:27:41.616] } [17:27:41.616] } [17:27:41.616] } [17:27:41.616] invisible(muffled) [17:27:41.616] } [17:27:41.616] muffleCondition(cond, pattern = "^muffle") [17:27:41.616] } [17:27:41.616] } [17:27:41.616] } [17:27:41.616] })) [17:27:41.616] }, error = function(ex) { [17:27:41.616] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.616] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.616] ...future.rng), started = ...future.startTime, [17:27:41.616] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.616] version = "1.8"), class = "FutureResult") [17:27:41.616] }, finally = { [17:27:41.616] if (!identical(...future.workdir, getwd())) [17:27:41.616] setwd(...future.workdir) [17:27:41.616] { [17:27:41.616] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.616] ...future.oldOptions$nwarnings <- NULL [17:27:41.616] } [17:27:41.616] base::options(...future.oldOptions) [17:27:41.616] if (.Platform$OS.type == "windows") { [17:27:41.616] old_names <- names(...future.oldEnvVars) [17:27:41.616] envs <- base::Sys.getenv() [17:27:41.616] names <- names(envs) [17:27:41.616] common <- intersect(names, old_names) [17:27:41.616] added <- setdiff(names, old_names) [17:27:41.616] removed <- setdiff(old_names, names) [17:27:41.616] changed <- common[...future.oldEnvVars[common] != [17:27:41.616] envs[common]] [17:27:41.616] NAMES <- toupper(changed) [17:27:41.616] args <- list() [17:27:41.616] for (kk in seq_along(NAMES)) { [17:27:41.616] name <- changed[[kk]] [17:27:41.616] NAME <- NAMES[[kk]] [17:27:41.616] if (name != NAME && is.element(NAME, old_names)) [17:27:41.616] next [17:27:41.616] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.616] } [17:27:41.616] NAMES <- toupper(added) [17:27:41.616] for (kk in seq_along(NAMES)) { [17:27:41.616] name <- added[[kk]] [17:27:41.616] NAME <- NAMES[[kk]] [17:27:41.616] if (name != NAME && is.element(NAME, old_names)) [17:27:41.616] next [17:27:41.616] args[[name]] <- "" [17:27:41.616] } [17:27:41.616] NAMES <- toupper(removed) [17:27:41.616] for (kk in seq_along(NAMES)) { [17:27:41.616] name <- removed[[kk]] [17:27:41.616] NAME <- NAMES[[kk]] [17:27:41.616] if (name != NAME && is.element(NAME, old_names)) [17:27:41.616] next [17:27:41.616] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.616] } [17:27:41.616] if (length(args) > 0) [17:27:41.616] base::do.call(base::Sys.setenv, args = args) [17:27:41.616] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.616] } [17:27:41.616] else { [17:27:41.616] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.616] } [17:27:41.616] { [17:27:41.616] if (base::length(...future.futureOptionsAdded) > [17:27:41.616] 0L) { [17:27:41.616] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.616] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.616] base::options(opts) [17:27:41.616] } [17:27:41.616] { [17:27:41.616] { [17:27:41.616] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.616] NULL [17:27:41.616] } [17:27:41.616] options(future.plan = NULL) [17:27:41.616] if (is.na(NA_character_)) [17:27:41.616] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.616] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.616] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.616] .init = FALSE) [17:27:41.616] } [17:27:41.616] } [17:27:41.616] } [17:27:41.616] }) [17:27:41.616] if (TRUE) { [17:27:41.616] base::sink(type = "output", split = FALSE) [17:27:41.616] if (TRUE) { [17:27:41.616] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.616] } [17:27:41.616] else { [17:27:41.616] ...future.result["stdout"] <- base::list(NULL) [17:27:41.616] } [17:27:41.616] base::close(...future.stdout) [17:27:41.616] ...future.stdout <- NULL [17:27:41.616] } [17:27:41.616] ...future.result$conditions <- ...future.conditions [17:27:41.616] ...future.result$finished <- base::Sys.time() [17:27:41.616] ...future.result [17:27:41.616] } [17:27:41.624] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:41.643] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.643] - Validating connection of MultisessionFuture [17:27:41.644] - received message: FutureResult [17:27:41.644] - Received FutureResult [17:27:41.645] - Erased future from FutureRegistry [17:27:41.645] result() for ClusterFuture ... [17:27:41.645] - result already collected: FutureResult [17:27:41.646] result() for ClusterFuture ... done [17:27:41.646] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.646] result() for ClusterFuture ... [17:27:41.647] - result already collected: FutureResult [17:27:41.647] result() for ClusterFuture ... done [17:27:41.647] result() for ClusterFuture ... [17:27:41.648] - result already collected: FutureResult [17:27:41.648] result() for ClusterFuture ... done [17:27:41.650] MultisessionFuture started [17:27:41.651] - Launch lazy future ... done [17:27:41.651] run() for 'MultisessionFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:3] 2 3 1 - attr(*, "dimnames.")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:41.659] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.660] - Validating connection of MultisessionFuture [17:27:41.660] - received message: FutureResult [17:27:41.661] - Received FutureResult [17:27:41.661] - Erased future from FutureRegistry [17:27:41.661] result() for ClusterFuture ... [17:27:41.662] - result already collected: FutureResult [17:27:41.662] result() for ClusterFuture ... done [17:27:41.662] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.679] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.680] - Validating connection of MultisessionFuture [17:27:41.680] - received message: FutureResult [17:27:41.681] - Received FutureResult [17:27:41.681] - Erased future from FutureRegistry [17:27:41.681] result() for ClusterFuture ... [17:27:41.682] - result already collected: FutureResult [17:27:41.682] result() for ClusterFuture ... done [17:27:41.682] receiveMessageFromWorker() for ClusterFuture ... done logi [1:2, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:41.688] resolve() on list environment ... [17:27:41.689] recursive: 0 [17:27:41.690] length: 6 [17:27:41.691] elements: 'a', 'b', 'c', 'd', '', '' [17:27:41.691] signalConditionsASAP(numeric, pos=1) ... [17:27:41.691] - nx: 6 [17:27:41.691] - relay: TRUE [17:27:41.692] - stdout: TRUE [17:27:41.692] - signal: TRUE [17:27:41.692] - resignal: FALSE [17:27:41.692] - force: TRUE [17:27:41.692] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.692] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.693] - until=2 [17:27:41.693] - relaying element #2 [17:27:41.693] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.693] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.693] signalConditionsASAP(NULL, pos=1) ... done [17:27:41.693] length: 5 (resolved future 1) [17:27:41.694] Future #2 [17:27:41.694] result() for ClusterFuture ... [17:27:41.694] - result already collected: FutureResult [17:27:41.694] result() for ClusterFuture ... done [17:27:41.694] result() for ClusterFuture ... [17:27:41.694] - result already collected: FutureResult [17:27:41.695] result() for ClusterFuture ... done [17:27:41.695] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:41.695] - nx: 6 [17:27:41.695] - relay: TRUE [17:27:41.695] - stdout: TRUE [17:27:41.695] - signal: TRUE [17:27:41.696] - resignal: FALSE [17:27:41.696] - force: TRUE [17:27:41.696] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.696] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.696] - until=2 [17:27:41.696] - relaying element #2 [17:27:41.697] result() for ClusterFuture ... [17:27:41.697] - result already collected: FutureResult [17:27:41.697] result() for ClusterFuture ... done [17:27:41.697] result() for ClusterFuture ... [17:27:41.698] - result already collected: FutureResult [17:27:41.698] result() for ClusterFuture ... done [17:27:41.698] result() for ClusterFuture ... [17:27:41.699] - result already collected: FutureResult [17:27:41.699] result() for ClusterFuture ... done [17:27:41.699] result() for ClusterFuture ... [17:27:41.699] - result already collected: FutureResult [17:27:41.700] result() for ClusterFuture ... done [17:27:41.700] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.700] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.700] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:41.701] length: 4 (resolved future 2) [17:27:41.701] Future #3 [17:27:41.701] result() for ClusterFuture ... [17:27:41.701] - result already collected: FutureResult [17:27:41.702] result() for ClusterFuture ... done [17:27:41.702] result() for ClusterFuture ... [17:27:41.702] - result already collected: FutureResult [17:27:41.702] result() for ClusterFuture ... done [17:27:41.703] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:41.703] - nx: 6 [17:27:41.703] - relay: TRUE [17:27:41.703] - stdout: TRUE [17:27:41.703] - signal: TRUE [17:27:41.703] - resignal: FALSE [17:27:41.703] - force: TRUE [17:27:41.704] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.704] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.704] - until=3 [17:27:41.704] - relaying element #3 [17:27:41.704] result() for ClusterFuture ... [17:27:41.705] - result already collected: FutureResult [17:27:41.705] result() for ClusterFuture ... done [17:27:41.706] result() for ClusterFuture ... [17:27:41.706] - result already collected: FutureResult [17:27:41.706] result() for ClusterFuture ... done [17:27:41.707] result() for ClusterFuture ... [17:27:41.707] - result already collected: FutureResult [17:27:41.707] result() for ClusterFuture ... done [17:27:41.708] result() for ClusterFuture ... [17:27:41.708] - result already collected: FutureResult [17:27:41.708] result() for ClusterFuture ... done [17:27:41.709] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.709] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.709] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:41.710] length: 3 (resolved future 3) [17:27:41.710] Future #4 [17:27:41.710] result() for ClusterFuture ... [17:27:41.711] - result already collected: FutureResult [17:27:41.711] result() for ClusterFuture ... done [17:27:41.711] result() for ClusterFuture ... [17:27:41.711] - result already collected: FutureResult [17:27:41.712] result() for ClusterFuture ... done [17:27:41.712] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:41.712] - nx: 6 [17:27:41.713] - relay: TRUE [17:27:41.713] - stdout: TRUE [17:27:41.713] - signal: TRUE [17:27:41.714] - resignal: FALSE [17:27:41.714] - force: TRUE [17:27:41.714] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.714] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.715] - until=4 [17:27:41.715] - relaying element #4 [17:27:41.715] result() for ClusterFuture ... [17:27:41.716] - result already collected: FutureResult [17:27:41.716] result() for ClusterFuture ... done [17:27:41.716] result() for ClusterFuture ... [17:27:41.717] - result already collected: FutureResult [17:27:41.717] result() for ClusterFuture ... done [17:27:41.717] result() for ClusterFuture ... [17:27:41.718] - result already collected: FutureResult [17:27:41.718] result() for ClusterFuture ... done [17:27:41.718] result() for ClusterFuture ... [17:27:41.719] - result already collected: FutureResult [17:27:41.719] result() for ClusterFuture ... done [17:27:41.719] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.719] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.720] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:41.720] length: 2 (resolved future 4) [17:27:41.720] signalConditionsASAP(NULL, pos=5) ... [17:27:41.721] - nx: 6 [17:27:41.721] - relay: TRUE [17:27:41.721] - stdout: TRUE [17:27:41.722] - signal: TRUE [17:27:41.722] - resignal: FALSE [17:27:41.722] - force: TRUE [17:27:41.722] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.722] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.723] - until=6 [17:27:41.723] - relaying element #6 [17:27:41.723] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.724] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.724] signalConditionsASAP(NULL, pos=5) ... done [17:27:41.724] length: 1 (resolved future 5) [17:27:41.725] signalConditionsASAP(numeric, pos=6) ... [17:27:41.725] - nx: 6 [17:27:41.725] - relay: TRUE [17:27:41.725] - stdout: TRUE [17:27:41.726] - signal: TRUE [17:27:41.726] - resignal: FALSE [17:27:41.726] - force: TRUE [17:27:41.727] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.727] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.731] - until=6 [17:27:41.731] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.732] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.732] signalConditionsASAP(numeric, pos=6) ... done [17:27:41.732] length: 0 (resolved future 6) [17:27:41.733] Relaying remaining futures [17:27:41.733] signalConditionsASAP(NULL, pos=0) ... [17:27:41.733] - nx: 6 [17:27:41.733] - relay: TRUE [17:27:41.734] - stdout: TRUE [17:27:41.734] - signal: TRUE [17:27:41.734] - resignal: FALSE [17:27:41.735] - force: TRUE [17:27:41.735] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.735] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:41.736] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.736] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.736] signalConditionsASAP(NULL, pos=0) ... done [17:27:41.737] resolve() on list environment ... DONE [17:27:41.737] result() for ClusterFuture ... [17:27:41.737] - result already collected: FutureResult [17:27:41.738] result() for ClusterFuture ... done [17:27:41.738] result() for ClusterFuture ... [17:27:41.738] - result already collected: FutureResult [17:27:41.738] result() for ClusterFuture ... done [17:27:41.739] result() for ClusterFuture ... [17:27:41.739] - result already collected: FutureResult [17:27:41.740] result() for ClusterFuture ... done [17:27:41.740] result() for ClusterFuture ... [17:27:41.740] - result already collected: FutureResult [17:27:41.740] result() for ClusterFuture ... done [17:27:41.741] result() for ClusterFuture ... [17:27:41.741] - result already collected: FutureResult [17:27:41.742] result() for ClusterFuture ... done [17:27:41.742] result() for ClusterFuture ... [17:27:41.742] - result already collected: FutureResult [17:27:41.742] result() for ClusterFuture ... done Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:3] 2 3 1 - attr(*, "dimnames.")=List of 3 ..$ : chr [1:2] "a" "b" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" Dimensions: c(2, 1, 3, 1) [17:27:41.747] getGlobalsAndPackages() ... [17:27:41.747] Searching for globals... [17:27:41.748] [17:27:41.748] Searching for globals ... DONE [17:27:41.748] - globals: [0] [17:27:41.749] getGlobalsAndPackages() ... DONE [17:27:41.749] run() for 'Future' ... [17:27:41.750] - state: 'created' [17:27:41.750] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.771] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.772] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.772] - Field: 'node' [17:27:41.772] - Field: 'label' [17:27:41.773] - Field: 'local' [17:27:41.773] - Field: 'owner' [17:27:41.773] - Field: 'envir' [17:27:41.774] - Field: 'workers' [17:27:41.774] - Field: 'packages' [17:27:41.774] - Field: 'gc' [17:27:41.774] - Field: 'conditions' [17:27:41.775] - Field: 'persistent' [17:27:41.775] - Field: 'expr' [17:27:41.775] - Field: 'uuid' [17:27:41.776] - Field: 'seed' [17:27:41.776] - Field: 'version' [17:27:41.776] - Field: 'result' [17:27:41.777] - Field: 'asynchronous' [17:27:41.777] - Field: 'calls' [17:27:41.777] - Field: 'globals' [17:27:41.777] - Field: 'stdout' [17:27:41.778] - Field: 'earlySignal' [17:27:41.778] - Field: 'lazy' [17:27:41.778] - Field: 'state' [17:27:41.779] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.779] - Launch lazy future ... [17:27:41.779] Packages needed by the future expression (n = 0): [17:27:41.779] Packages needed by future strategies (n = 0): [17:27:41.780] { [17:27:41.780] { [17:27:41.780] { [17:27:41.780] ...future.startTime <- base::Sys.time() [17:27:41.780] { [17:27:41.780] { [17:27:41.780] { [17:27:41.780] { [17:27:41.780] base::local({ [17:27:41.780] has_future <- base::requireNamespace("future", [17:27:41.780] quietly = TRUE) [17:27:41.780] if (has_future) { [17:27:41.780] ns <- base::getNamespace("future") [17:27:41.780] version <- ns[[".package"]][["version"]] [17:27:41.780] if (is.null(version)) [17:27:41.780] version <- utils::packageVersion("future") [17:27:41.780] } [17:27:41.780] else { [17:27:41.780] version <- NULL [17:27:41.780] } [17:27:41.780] if (!has_future || version < "1.8.0") { [17:27:41.780] info <- base::c(r_version = base::gsub("R version ", [17:27:41.780] "", base::R.version$version.string), [17:27:41.780] platform = base::sprintf("%s (%s-bit)", [17:27:41.780] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.780] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.780] "release", "version")], collapse = " "), [17:27:41.780] hostname = base::Sys.info()[["nodename"]]) [17:27:41.780] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.780] info) [17:27:41.780] info <- base::paste(info, collapse = "; ") [17:27:41.780] if (!has_future) { [17:27:41.780] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.780] info) [17:27:41.780] } [17:27:41.780] else { [17:27:41.780] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.780] info, version) [17:27:41.780] } [17:27:41.780] base::stop(msg) [17:27:41.780] } [17:27:41.780] }) [17:27:41.780] } [17:27:41.780] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.780] base::options(mc.cores = 1L) [17:27:41.780] } [17:27:41.780] ...future.strategy.old <- future::plan("list") [17:27:41.780] options(future.plan = NULL) [17:27:41.780] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.780] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.780] } [17:27:41.780] ...future.workdir <- getwd() [17:27:41.780] } [17:27:41.780] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.780] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.780] } [17:27:41.780] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.780] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.780] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.780] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.780] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.780] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.780] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.780] base::names(...future.oldOptions)) [17:27:41.780] } [17:27:41.780] if (FALSE) { [17:27:41.780] } [17:27:41.780] else { [17:27:41.780] if (TRUE) { [17:27:41.780] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.780] open = "w") [17:27:41.780] } [17:27:41.780] else { [17:27:41.780] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.780] windows = "NUL", "/dev/null"), open = "w") [17:27:41.780] } [17:27:41.780] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.780] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.780] base::sink(type = "output", split = FALSE) [17:27:41.780] base::close(...future.stdout) [17:27:41.780] }, add = TRUE) [17:27:41.780] } [17:27:41.780] ...future.frame <- base::sys.nframe() [17:27:41.780] ...future.conditions <- base::list() [17:27:41.780] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.780] if (FALSE) { [17:27:41.780] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.780] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.780] } [17:27:41.780] ...future.result <- base::tryCatch({ [17:27:41.780] base::withCallingHandlers({ [17:27:41.780] ...future.value <- base::withVisible(base::local({ [17:27:41.780] ...future.makeSendCondition <- base::local({ [17:27:41.780] sendCondition <- NULL [17:27:41.780] function(frame = 1L) { [17:27:41.780] if (is.function(sendCondition)) [17:27:41.780] return(sendCondition) [17:27:41.780] ns <- getNamespace("parallel") [17:27:41.780] if (exists("sendData", mode = "function", [17:27:41.780] envir = ns)) { [17:27:41.780] parallel_sendData <- get("sendData", mode = "function", [17:27:41.780] envir = ns) [17:27:41.780] envir <- sys.frame(frame) [17:27:41.780] master <- NULL [17:27:41.780] while (!identical(envir, .GlobalEnv) && [17:27:41.780] !identical(envir, emptyenv())) { [17:27:41.780] if (exists("master", mode = "list", envir = envir, [17:27:41.780] inherits = FALSE)) { [17:27:41.780] master <- get("master", mode = "list", [17:27:41.780] envir = envir, inherits = FALSE) [17:27:41.780] if (inherits(master, c("SOCKnode", [17:27:41.780] "SOCK0node"))) { [17:27:41.780] sendCondition <<- function(cond) { [17:27:41.780] data <- list(type = "VALUE", value = cond, [17:27:41.780] success = TRUE) [17:27:41.780] parallel_sendData(master, data) [17:27:41.780] } [17:27:41.780] return(sendCondition) [17:27:41.780] } [17:27:41.780] } [17:27:41.780] frame <- frame + 1L [17:27:41.780] envir <- sys.frame(frame) [17:27:41.780] } [17:27:41.780] } [17:27:41.780] sendCondition <<- function(cond) NULL [17:27:41.780] } [17:27:41.780] }) [17:27:41.780] withCallingHandlers({ [17:27:41.780] 2 [17:27:41.780] }, immediateCondition = function(cond) { [17:27:41.780] sendCondition <- ...future.makeSendCondition() [17:27:41.780] sendCondition(cond) [17:27:41.780] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.780] { [17:27:41.780] inherits <- base::inherits [17:27:41.780] invokeRestart <- base::invokeRestart [17:27:41.780] is.null <- base::is.null [17:27:41.780] muffled <- FALSE [17:27:41.780] if (inherits(cond, "message")) { [17:27:41.780] muffled <- grepl(pattern, "muffleMessage") [17:27:41.780] if (muffled) [17:27:41.780] invokeRestart("muffleMessage") [17:27:41.780] } [17:27:41.780] else if (inherits(cond, "warning")) { [17:27:41.780] muffled <- grepl(pattern, "muffleWarning") [17:27:41.780] if (muffled) [17:27:41.780] invokeRestart("muffleWarning") [17:27:41.780] } [17:27:41.780] else if (inherits(cond, "condition")) { [17:27:41.780] if (!is.null(pattern)) { [17:27:41.780] computeRestarts <- base::computeRestarts [17:27:41.780] grepl <- base::grepl [17:27:41.780] restarts <- computeRestarts(cond) [17:27:41.780] for (restart in restarts) { [17:27:41.780] name <- restart$name [17:27:41.780] if (is.null(name)) [17:27:41.780] next [17:27:41.780] if (!grepl(pattern, name)) [17:27:41.780] next [17:27:41.780] invokeRestart(restart) [17:27:41.780] muffled <- TRUE [17:27:41.780] break [17:27:41.780] } [17:27:41.780] } [17:27:41.780] } [17:27:41.780] invisible(muffled) [17:27:41.780] } [17:27:41.780] muffleCondition(cond) [17:27:41.780] }) [17:27:41.780] })) [17:27:41.780] future::FutureResult(value = ...future.value$value, [17:27:41.780] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.780] ...future.rng), globalenv = if (FALSE) [17:27:41.780] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.780] ...future.globalenv.names)) [17:27:41.780] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.780] }, condition = base::local({ [17:27:41.780] c <- base::c [17:27:41.780] inherits <- base::inherits [17:27:41.780] invokeRestart <- base::invokeRestart [17:27:41.780] length <- base::length [17:27:41.780] list <- base::list [17:27:41.780] seq.int <- base::seq.int [17:27:41.780] signalCondition <- base::signalCondition [17:27:41.780] sys.calls <- base::sys.calls [17:27:41.780] `[[` <- base::`[[` [17:27:41.780] `+` <- base::`+` [17:27:41.780] `<<-` <- base::`<<-` [17:27:41.780] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.780] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.780] 3L)] [17:27:41.780] } [17:27:41.780] function(cond) { [17:27:41.780] is_error <- inherits(cond, "error") [17:27:41.780] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.780] NULL) [17:27:41.780] if (is_error) { [17:27:41.780] sessionInformation <- function() { [17:27:41.780] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.780] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.780] search = base::search(), system = base::Sys.info()) [17:27:41.780] } [17:27:41.780] ...future.conditions[[length(...future.conditions) + [17:27:41.780] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.780] cond$call), session = sessionInformation(), [17:27:41.780] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.780] signalCondition(cond) [17:27:41.780] } [17:27:41.780] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.780] "immediateCondition"))) { [17:27:41.780] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.780] ...future.conditions[[length(...future.conditions) + [17:27:41.780] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.780] if (TRUE && !signal) { [17:27:41.780] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.780] { [17:27:41.780] inherits <- base::inherits [17:27:41.780] invokeRestart <- base::invokeRestart [17:27:41.780] is.null <- base::is.null [17:27:41.780] muffled <- FALSE [17:27:41.780] if (inherits(cond, "message")) { [17:27:41.780] muffled <- grepl(pattern, "muffleMessage") [17:27:41.780] if (muffled) [17:27:41.780] invokeRestart("muffleMessage") [17:27:41.780] } [17:27:41.780] else if (inherits(cond, "warning")) { [17:27:41.780] muffled <- grepl(pattern, "muffleWarning") [17:27:41.780] if (muffled) [17:27:41.780] invokeRestart("muffleWarning") [17:27:41.780] } [17:27:41.780] else if (inherits(cond, "condition")) { [17:27:41.780] if (!is.null(pattern)) { [17:27:41.780] computeRestarts <- base::computeRestarts [17:27:41.780] grepl <- base::grepl [17:27:41.780] restarts <- computeRestarts(cond) [17:27:41.780] for (restart in restarts) { [17:27:41.780] name <- restart$name [17:27:41.780] if (is.null(name)) [17:27:41.780] next [17:27:41.780] if (!grepl(pattern, name)) [17:27:41.780] next [17:27:41.780] invokeRestart(restart) [17:27:41.780] muffled <- TRUE [17:27:41.780] break [17:27:41.780] } [17:27:41.780] } [17:27:41.780] } [17:27:41.780] invisible(muffled) [17:27:41.780] } [17:27:41.780] muffleCondition(cond, pattern = "^muffle") [17:27:41.780] } [17:27:41.780] } [17:27:41.780] else { [17:27:41.780] if (TRUE) { [17:27:41.780] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.780] { [17:27:41.780] inherits <- base::inherits [17:27:41.780] invokeRestart <- base::invokeRestart [17:27:41.780] is.null <- base::is.null [17:27:41.780] muffled <- FALSE [17:27:41.780] if (inherits(cond, "message")) { [17:27:41.780] muffled <- grepl(pattern, "muffleMessage") [17:27:41.780] if (muffled) [17:27:41.780] invokeRestart("muffleMessage") [17:27:41.780] } [17:27:41.780] else if (inherits(cond, "warning")) { [17:27:41.780] muffled <- grepl(pattern, "muffleWarning") [17:27:41.780] if (muffled) [17:27:41.780] invokeRestart("muffleWarning") [17:27:41.780] } [17:27:41.780] else if (inherits(cond, "condition")) { [17:27:41.780] if (!is.null(pattern)) { [17:27:41.780] computeRestarts <- base::computeRestarts [17:27:41.780] grepl <- base::grepl [17:27:41.780] restarts <- computeRestarts(cond) [17:27:41.780] for (restart in restarts) { [17:27:41.780] name <- restart$name [17:27:41.780] if (is.null(name)) [17:27:41.780] next [17:27:41.780] if (!grepl(pattern, name)) [17:27:41.780] next [17:27:41.780] invokeRestart(restart) [17:27:41.780] muffled <- TRUE [17:27:41.780] break [17:27:41.780] } [17:27:41.780] } [17:27:41.780] } [17:27:41.780] invisible(muffled) [17:27:41.780] } [17:27:41.780] muffleCondition(cond, pattern = "^muffle") [17:27:41.780] } [17:27:41.780] } [17:27:41.780] } [17:27:41.780] })) [17:27:41.780] }, error = function(ex) { [17:27:41.780] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.780] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.780] ...future.rng), started = ...future.startTime, [17:27:41.780] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.780] version = "1.8"), class = "FutureResult") [17:27:41.780] }, finally = { [17:27:41.780] if (!identical(...future.workdir, getwd())) [17:27:41.780] setwd(...future.workdir) [17:27:41.780] { [17:27:41.780] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.780] ...future.oldOptions$nwarnings <- NULL [17:27:41.780] } [17:27:41.780] base::options(...future.oldOptions) [17:27:41.780] if (.Platform$OS.type == "windows") { [17:27:41.780] old_names <- names(...future.oldEnvVars) [17:27:41.780] envs <- base::Sys.getenv() [17:27:41.780] names <- names(envs) [17:27:41.780] common <- intersect(names, old_names) [17:27:41.780] added <- setdiff(names, old_names) [17:27:41.780] removed <- setdiff(old_names, names) [17:27:41.780] changed <- common[...future.oldEnvVars[common] != [17:27:41.780] envs[common]] [17:27:41.780] NAMES <- toupper(changed) [17:27:41.780] args <- list() [17:27:41.780] for (kk in seq_along(NAMES)) { [17:27:41.780] name <- changed[[kk]] [17:27:41.780] NAME <- NAMES[[kk]] [17:27:41.780] if (name != NAME && is.element(NAME, old_names)) [17:27:41.780] next [17:27:41.780] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.780] } [17:27:41.780] NAMES <- toupper(added) [17:27:41.780] for (kk in seq_along(NAMES)) { [17:27:41.780] name <- added[[kk]] [17:27:41.780] NAME <- NAMES[[kk]] [17:27:41.780] if (name != NAME && is.element(NAME, old_names)) [17:27:41.780] next [17:27:41.780] args[[name]] <- "" [17:27:41.780] } [17:27:41.780] NAMES <- toupper(removed) [17:27:41.780] for (kk in seq_along(NAMES)) { [17:27:41.780] name <- removed[[kk]] [17:27:41.780] NAME <- NAMES[[kk]] [17:27:41.780] if (name != NAME && is.element(NAME, old_names)) [17:27:41.780] next [17:27:41.780] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.780] } [17:27:41.780] if (length(args) > 0) [17:27:41.780] base::do.call(base::Sys.setenv, args = args) [17:27:41.780] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.780] } [17:27:41.780] else { [17:27:41.780] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.780] } [17:27:41.780] { [17:27:41.780] if (base::length(...future.futureOptionsAdded) > [17:27:41.780] 0L) { [17:27:41.780] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.780] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.780] base::options(opts) [17:27:41.780] } [17:27:41.780] { [17:27:41.780] { [17:27:41.780] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.780] NULL [17:27:41.780] } [17:27:41.780] options(future.plan = NULL) [17:27:41.780] if (is.na(NA_character_)) [17:27:41.780] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.780] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.780] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.780] .init = FALSE) [17:27:41.780] } [17:27:41.780] } [17:27:41.780] } [17:27:41.780] }) [17:27:41.780] if (TRUE) { [17:27:41.780] base::sink(type = "output", split = FALSE) [17:27:41.780] if (TRUE) { [17:27:41.780] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.780] } [17:27:41.780] else { [17:27:41.780] ...future.result["stdout"] <- base::list(NULL) [17:27:41.780] } [17:27:41.780] base::close(...future.stdout) [17:27:41.780] ...future.stdout <- NULL [17:27:41.780] } [17:27:41.780] ...future.result$conditions <- ...future.conditions [17:27:41.780] ...future.result$finished <- base::Sys.time() [17:27:41.780] ...future.result [17:27:41.780] } [17:27:41.788] MultisessionFuture started [17:27:41.788] - Launch lazy future ... done [17:27:41.788] run() for 'MultisessionFuture' ... done [17:27:41.789] getGlobalsAndPackages() ... [17:27:41.789] Searching for globals... [17:27:41.791] [17:27:41.791] Searching for globals ... DONE [17:27:41.791] - globals: [0] [17:27:41.791] getGlobalsAndPackages() ... DONE [17:27:41.792] run() for 'Future' ... [17:27:41.792] - state: 'created' [17:27:41.793] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.812] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.812] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.813] - Field: 'node' [17:27:41.813] - Field: 'label' [17:27:41.813] - Field: 'local' [17:27:41.814] - Field: 'owner' [17:27:41.814] - Field: 'envir' [17:27:41.814] - Field: 'workers' [17:27:41.815] - Field: 'packages' [17:27:41.815] - Field: 'gc' [17:27:41.815] - Field: 'conditions' [17:27:41.816] - Field: 'persistent' [17:27:41.816] - Field: 'expr' [17:27:41.816] - Field: 'uuid' [17:27:41.816] - Field: 'seed' [17:27:41.817] - Field: 'version' [17:27:41.817] - Field: 'result' [17:27:41.817] - Field: 'asynchronous' [17:27:41.818] - Field: 'calls' [17:27:41.818] - Field: 'globals' [17:27:41.818] - Field: 'stdout' [17:27:41.819] - Field: 'earlySignal' [17:27:41.819] - Field: 'lazy' [17:27:41.819] - Field: 'state' [17:27:41.820] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.820] - Launch lazy future ... [17:27:41.821] Packages needed by the future expression (n = 0): [17:27:41.821] Packages needed by future strategies (n = 0): [17:27:41.822] { [17:27:41.822] { [17:27:41.822] { [17:27:41.822] ...future.startTime <- base::Sys.time() [17:27:41.822] { [17:27:41.822] { [17:27:41.822] { [17:27:41.822] { [17:27:41.822] base::local({ [17:27:41.822] has_future <- base::requireNamespace("future", [17:27:41.822] quietly = TRUE) [17:27:41.822] if (has_future) { [17:27:41.822] ns <- base::getNamespace("future") [17:27:41.822] version <- ns[[".package"]][["version"]] [17:27:41.822] if (is.null(version)) [17:27:41.822] version <- utils::packageVersion("future") [17:27:41.822] } [17:27:41.822] else { [17:27:41.822] version <- NULL [17:27:41.822] } [17:27:41.822] if (!has_future || version < "1.8.0") { [17:27:41.822] info <- base::c(r_version = base::gsub("R version ", [17:27:41.822] "", base::R.version$version.string), [17:27:41.822] platform = base::sprintf("%s (%s-bit)", [17:27:41.822] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.822] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.822] "release", "version")], collapse = " "), [17:27:41.822] hostname = base::Sys.info()[["nodename"]]) [17:27:41.822] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.822] info) [17:27:41.822] info <- base::paste(info, collapse = "; ") [17:27:41.822] if (!has_future) { [17:27:41.822] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.822] info) [17:27:41.822] } [17:27:41.822] else { [17:27:41.822] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.822] info, version) [17:27:41.822] } [17:27:41.822] base::stop(msg) [17:27:41.822] } [17:27:41.822] }) [17:27:41.822] } [17:27:41.822] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.822] base::options(mc.cores = 1L) [17:27:41.822] } [17:27:41.822] ...future.strategy.old <- future::plan("list") [17:27:41.822] options(future.plan = NULL) [17:27:41.822] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.822] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.822] } [17:27:41.822] ...future.workdir <- getwd() [17:27:41.822] } [17:27:41.822] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.822] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.822] } [17:27:41.822] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.822] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.822] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.822] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.822] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.822] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.822] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.822] base::names(...future.oldOptions)) [17:27:41.822] } [17:27:41.822] if (FALSE) { [17:27:41.822] } [17:27:41.822] else { [17:27:41.822] if (TRUE) { [17:27:41.822] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.822] open = "w") [17:27:41.822] } [17:27:41.822] else { [17:27:41.822] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.822] windows = "NUL", "/dev/null"), open = "w") [17:27:41.822] } [17:27:41.822] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.822] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.822] base::sink(type = "output", split = FALSE) [17:27:41.822] base::close(...future.stdout) [17:27:41.822] }, add = TRUE) [17:27:41.822] } [17:27:41.822] ...future.frame <- base::sys.nframe() [17:27:41.822] ...future.conditions <- base::list() [17:27:41.822] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.822] if (FALSE) { [17:27:41.822] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.822] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.822] } [17:27:41.822] ...future.result <- base::tryCatch({ [17:27:41.822] base::withCallingHandlers({ [17:27:41.822] ...future.value <- base::withVisible(base::local({ [17:27:41.822] ...future.makeSendCondition <- base::local({ [17:27:41.822] sendCondition <- NULL [17:27:41.822] function(frame = 1L) { [17:27:41.822] if (is.function(sendCondition)) [17:27:41.822] return(sendCondition) [17:27:41.822] ns <- getNamespace("parallel") [17:27:41.822] if (exists("sendData", mode = "function", [17:27:41.822] envir = ns)) { [17:27:41.822] parallel_sendData <- get("sendData", mode = "function", [17:27:41.822] envir = ns) [17:27:41.822] envir <- sys.frame(frame) [17:27:41.822] master <- NULL [17:27:41.822] while (!identical(envir, .GlobalEnv) && [17:27:41.822] !identical(envir, emptyenv())) { [17:27:41.822] if (exists("master", mode = "list", envir = envir, [17:27:41.822] inherits = FALSE)) { [17:27:41.822] master <- get("master", mode = "list", [17:27:41.822] envir = envir, inherits = FALSE) [17:27:41.822] if (inherits(master, c("SOCKnode", [17:27:41.822] "SOCK0node"))) { [17:27:41.822] sendCondition <<- function(cond) { [17:27:41.822] data <- list(type = "VALUE", value = cond, [17:27:41.822] success = TRUE) [17:27:41.822] parallel_sendData(master, data) [17:27:41.822] } [17:27:41.822] return(sendCondition) [17:27:41.822] } [17:27:41.822] } [17:27:41.822] frame <- frame + 1L [17:27:41.822] envir <- sys.frame(frame) [17:27:41.822] } [17:27:41.822] } [17:27:41.822] sendCondition <<- function(cond) NULL [17:27:41.822] } [17:27:41.822] }) [17:27:41.822] withCallingHandlers({ [17:27:41.822] NULL [17:27:41.822] }, immediateCondition = function(cond) { [17:27:41.822] sendCondition <- ...future.makeSendCondition() [17:27:41.822] sendCondition(cond) [17:27:41.822] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.822] { [17:27:41.822] inherits <- base::inherits [17:27:41.822] invokeRestart <- base::invokeRestart [17:27:41.822] is.null <- base::is.null [17:27:41.822] muffled <- FALSE [17:27:41.822] if (inherits(cond, "message")) { [17:27:41.822] muffled <- grepl(pattern, "muffleMessage") [17:27:41.822] if (muffled) [17:27:41.822] invokeRestart("muffleMessage") [17:27:41.822] } [17:27:41.822] else if (inherits(cond, "warning")) { [17:27:41.822] muffled <- grepl(pattern, "muffleWarning") [17:27:41.822] if (muffled) [17:27:41.822] invokeRestart("muffleWarning") [17:27:41.822] } [17:27:41.822] else if (inherits(cond, "condition")) { [17:27:41.822] if (!is.null(pattern)) { [17:27:41.822] computeRestarts <- base::computeRestarts [17:27:41.822] grepl <- base::grepl [17:27:41.822] restarts <- computeRestarts(cond) [17:27:41.822] for (restart in restarts) { [17:27:41.822] name <- restart$name [17:27:41.822] if (is.null(name)) [17:27:41.822] next [17:27:41.822] if (!grepl(pattern, name)) [17:27:41.822] next [17:27:41.822] invokeRestart(restart) [17:27:41.822] muffled <- TRUE [17:27:41.822] break [17:27:41.822] } [17:27:41.822] } [17:27:41.822] } [17:27:41.822] invisible(muffled) [17:27:41.822] } [17:27:41.822] muffleCondition(cond) [17:27:41.822] }) [17:27:41.822] })) [17:27:41.822] future::FutureResult(value = ...future.value$value, [17:27:41.822] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.822] ...future.rng), globalenv = if (FALSE) [17:27:41.822] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.822] ...future.globalenv.names)) [17:27:41.822] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.822] }, condition = base::local({ [17:27:41.822] c <- base::c [17:27:41.822] inherits <- base::inherits [17:27:41.822] invokeRestart <- base::invokeRestart [17:27:41.822] length <- base::length [17:27:41.822] list <- base::list [17:27:41.822] seq.int <- base::seq.int [17:27:41.822] signalCondition <- base::signalCondition [17:27:41.822] sys.calls <- base::sys.calls [17:27:41.822] `[[` <- base::`[[` [17:27:41.822] `+` <- base::`+` [17:27:41.822] `<<-` <- base::`<<-` [17:27:41.822] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.822] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.822] 3L)] [17:27:41.822] } [17:27:41.822] function(cond) { [17:27:41.822] is_error <- inherits(cond, "error") [17:27:41.822] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.822] NULL) [17:27:41.822] if (is_error) { [17:27:41.822] sessionInformation <- function() { [17:27:41.822] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.822] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.822] search = base::search(), system = base::Sys.info()) [17:27:41.822] } [17:27:41.822] ...future.conditions[[length(...future.conditions) + [17:27:41.822] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.822] cond$call), session = sessionInformation(), [17:27:41.822] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.822] signalCondition(cond) [17:27:41.822] } [17:27:41.822] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.822] "immediateCondition"))) { [17:27:41.822] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.822] ...future.conditions[[length(...future.conditions) + [17:27:41.822] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.822] if (TRUE && !signal) { [17:27:41.822] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.822] { [17:27:41.822] inherits <- base::inherits [17:27:41.822] invokeRestart <- base::invokeRestart [17:27:41.822] is.null <- base::is.null [17:27:41.822] muffled <- FALSE [17:27:41.822] if (inherits(cond, "message")) { [17:27:41.822] muffled <- grepl(pattern, "muffleMessage") [17:27:41.822] if (muffled) [17:27:41.822] invokeRestart("muffleMessage") [17:27:41.822] } [17:27:41.822] else if (inherits(cond, "warning")) { [17:27:41.822] muffled <- grepl(pattern, "muffleWarning") [17:27:41.822] if (muffled) [17:27:41.822] invokeRestart("muffleWarning") [17:27:41.822] } [17:27:41.822] else if (inherits(cond, "condition")) { [17:27:41.822] if (!is.null(pattern)) { [17:27:41.822] computeRestarts <- base::computeRestarts [17:27:41.822] grepl <- base::grepl [17:27:41.822] restarts <- computeRestarts(cond) [17:27:41.822] for (restart in restarts) { [17:27:41.822] name <- restart$name [17:27:41.822] if (is.null(name)) [17:27:41.822] next [17:27:41.822] if (!grepl(pattern, name)) [17:27:41.822] next [17:27:41.822] invokeRestart(restart) [17:27:41.822] muffled <- TRUE [17:27:41.822] break [17:27:41.822] } [17:27:41.822] } [17:27:41.822] } [17:27:41.822] invisible(muffled) [17:27:41.822] } [17:27:41.822] muffleCondition(cond, pattern = "^muffle") [17:27:41.822] } [17:27:41.822] } [17:27:41.822] else { [17:27:41.822] if (TRUE) { [17:27:41.822] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.822] { [17:27:41.822] inherits <- base::inherits [17:27:41.822] invokeRestart <- base::invokeRestart [17:27:41.822] is.null <- base::is.null [17:27:41.822] muffled <- FALSE [17:27:41.822] if (inherits(cond, "message")) { [17:27:41.822] muffled <- grepl(pattern, "muffleMessage") [17:27:41.822] if (muffled) [17:27:41.822] invokeRestart("muffleMessage") [17:27:41.822] } [17:27:41.822] else if (inherits(cond, "warning")) { [17:27:41.822] muffled <- grepl(pattern, "muffleWarning") [17:27:41.822] if (muffled) [17:27:41.822] invokeRestart("muffleWarning") [17:27:41.822] } [17:27:41.822] else if (inherits(cond, "condition")) { [17:27:41.822] if (!is.null(pattern)) { [17:27:41.822] computeRestarts <- base::computeRestarts [17:27:41.822] grepl <- base::grepl [17:27:41.822] restarts <- computeRestarts(cond) [17:27:41.822] for (restart in restarts) { [17:27:41.822] name <- restart$name [17:27:41.822] if (is.null(name)) [17:27:41.822] next [17:27:41.822] if (!grepl(pattern, name)) [17:27:41.822] next [17:27:41.822] invokeRestart(restart) [17:27:41.822] muffled <- TRUE [17:27:41.822] break [17:27:41.822] } [17:27:41.822] } [17:27:41.822] } [17:27:41.822] invisible(muffled) [17:27:41.822] } [17:27:41.822] muffleCondition(cond, pattern = "^muffle") [17:27:41.822] } [17:27:41.822] } [17:27:41.822] } [17:27:41.822] })) [17:27:41.822] }, error = function(ex) { [17:27:41.822] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.822] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.822] ...future.rng), started = ...future.startTime, [17:27:41.822] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.822] version = "1.8"), class = "FutureResult") [17:27:41.822] }, finally = { [17:27:41.822] if (!identical(...future.workdir, getwd())) [17:27:41.822] setwd(...future.workdir) [17:27:41.822] { [17:27:41.822] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.822] ...future.oldOptions$nwarnings <- NULL [17:27:41.822] } [17:27:41.822] base::options(...future.oldOptions) [17:27:41.822] if (.Platform$OS.type == "windows") { [17:27:41.822] old_names <- names(...future.oldEnvVars) [17:27:41.822] envs <- base::Sys.getenv() [17:27:41.822] names <- names(envs) [17:27:41.822] common <- intersect(names, old_names) [17:27:41.822] added <- setdiff(names, old_names) [17:27:41.822] removed <- setdiff(old_names, names) [17:27:41.822] changed <- common[...future.oldEnvVars[common] != [17:27:41.822] envs[common]] [17:27:41.822] NAMES <- toupper(changed) [17:27:41.822] args <- list() [17:27:41.822] for (kk in seq_along(NAMES)) { [17:27:41.822] name <- changed[[kk]] [17:27:41.822] NAME <- NAMES[[kk]] [17:27:41.822] if (name != NAME && is.element(NAME, old_names)) [17:27:41.822] next [17:27:41.822] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.822] } [17:27:41.822] NAMES <- toupper(added) [17:27:41.822] for (kk in seq_along(NAMES)) { [17:27:41.822] name <- added[[kk]] [17:27:41.822] NAME <- NAMES[[kk]] [17:27:41.822] if (name != NAME && is.element(NAME, old_names)) [17:27:41.822] next [17:27:41.822] args[[name]] <- "" [17:27:41.822] } [17:27:41.822] NAMES <- toupper(removed) [17:27:41.822] for (kk in seq_along(NAMES)) { [17:27:41.822] name <- removed[[kk]] [17:27:41.822] NAME <- NAMES[[kk]] [17:27:41.822] if (name != NAME && is.element(NAME, old_names)) [17:27:41.822] next [17:27:41.822] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.822] } [17:27:41.822] if (length(args) > 0) [17:27:41.822] base::do.call(base::Sys.setenv, args = args) [17:27:41.822] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.822] } [17:27:41.822] else { [17:27:41.822] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.822] } [17:27:41.822] { [17:27:41.822] if (base::length(...future.futureOptionsAdded) > [17:27:41.822] 0L) { [17:27:41.822] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.822] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.822] base::options(opts) [17:27:41.822] } [17:27:41.822] { [17:27:41.822] { [17:27:41.822] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.822] NULL [17:27:41.822] } [17:27:41.822] options(future.plan = NULL) [17:27:41.822] if (is.na(NA_character_)) [17:27:41.822] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.822] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.822] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.822] .init = FALSE) [17:27:41.822] } [17:27:41.822] } [17:27:41.822] } [17:27:41.822] }) [17:27:41.822] if (TRUE) { [17:27:41.822] base::sink(type = "output", split = FALSE) [17:27:41.822] if (TRUE) { [17:27:41.822] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.822] } [17:27:41.822] else { [17:27:41.822] ...future.result["stdout"] <- base::list(NULL) [17:27:41.822] } [17:27:41.822] base::close(...future.stdout) [17:27:41.822] ...future.stdout <- NULL [17:27:41.822] } [17:27:41.822] ...future.result$conditions <- ...future.conditions [17:27:41.822] ...future.result$finished <- base::Sys.time() [17:27:41.822] ...future.result [17:27:41.822] } [17:27:41.829] MultisessionFuture started [17:27:41.830] - Launch lazy future ... done [17:27:41.830] run() for 'MultisessionFuture' ... done [17:27:41.831] getGlobalsAndPackages() ... [17:27:41.831] Searching for globals... [17:27:41.833] - globals found: [1] '{' [17:27:41.833] Searching for globals ... DONE [17:27:41.833] Resolving globals: FALSE [17:27:41.834] [17:27:41.834] [17:27:41.835] getGlobalsAndPackages() ... DONE [17:27:41.835] run() for 'Future' ... [17:27:41.836] - state: 'created' [17:27:41.836] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:41.856] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:41.856] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:41.857] - Field: 'node' [17:27:41.857] - Field: 'label' [17:27:41.857] - Field: 'local' [17:27:41.858] - Field: 'owner' [17:27:41.858] - Field: 'envir' [17:27:41.859] - Field: 'workers' [17:27:41.859] - Field: 'packages' [17:27:41.859] - Field: 'gc' [17:27:41.860] - Field: 'conditions' [17:27:41.860] - Field: 'persistent' [17:27:41.860] - Field: 'expr' [17:27:41.861] - Field: 'uuid' [17:27:41.861] - Field: 'seed' [17:27:41.861] - Field: 'version' [17:27:41.862] - Field: 'result' [17:27:41.862] - Field: 'asynchronous' [17:27:41.862] - Field: 'calls' [17:27:41.862] - Field: 'globals' [17:27:41.863] - Field: 'stdout' [17:27:41.863] - Field: 'earlySignal' [17:27:41.863] - Field: 'lazy' [17:27:41.864] - Field: 'state' [17:27:41.864] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:41.864] - Launch lazy future ... [17:27:41.865] Packages needed by the future expression (n = 0): [17:27:41.866] Packages needed by future strategies (n = 0): [17:27:41.867] { [17:27:41.867] { [17:27:41.867] { [17:27:41.867] ...future.startTime <- base::Sys.time() [17:27:41.867] { [17:27:41.867] { [17:27:41.867] { [17:27:41.867] { [17:27:41.867] base::local({ [17:27:41.867] has_future <- base::requireNamespace("future", [17:27:41.867] quietly = TRUE) [17:27:41.867] if (has_future) { [17:27:41.867] ns <- base::getNamespace("future") [17:27:41.867] version <- ns[[".package"]][["version"]] [17:27:41.867] if (is.null(version)) [17:27:41.867] version <- utils::packageVersion("future") [17:27:41.867] } [17:27:41.867] else { [17:27:41.867] version <- NULL [17:27:41.867] } [17:27:41.867] if (!has_future || version < "1.8.0") { [17:27:41.867] info <- base::c(r_version = base::gsub("R version ", [17:27:41.867] "", base::R.version$version.string), [17:27:41.867] platform = base::sprintf("%s (%s-bit)", [17:27:41.867] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:41.867] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:41.867] "release", "version")], collapse = " "), [17:27:41.867] hostname = base::Sys.info()[["nodename"]]) [17:27:41.867] info <- base::sprintf("%s: %s", base::names(info), [17:27:41.867] info) [17:27:41.867] info <- base::paste(info, collapse = "; ") [17:27:41.867] if (!has_future) { [17:27:41.867] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:41.867] info) [17:27:41.867] } [17:27:41.867] else { [17:27:41.867] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:41.867] info, version) [17:27:41.867] } [17:27:41.867] base::stop(msg) [17:27:41.867] } [17:27:41.867] }) [17:27:41.867] } [17:27:41.867] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:41.867] base::options(mc.cores = 1L) [17:27:41.867] } [17:27:41.867] ...future.strategy.old <- future::plan("list") [17:27:41.867] options(future.plan = NULL) [17:27:41.867] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.867] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:41.867] } [17:27:41.867] ...future.workdir <- getwd() [17:27:41.867] } [17:27:41.867] ...future.oldOptions <- base::as.list(base::.Options) [17:27:41.867] ...future.oldEnvVars <- base::Sys.getenv() [17:27:41.867] } [17:27:41.867] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:41.867] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:41.867] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:41.867] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:41.867] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:41.867] future.stdout.windows.reencode = NULL, width = 80L) [17:27:41.867] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:41.867] base::names(...future.oldOptions)) [17:27:41.867] } [17:27:41.867] if (FALSE) { [17:27:41.867] } [17:27:41.867] else { [17:27:41.867] if (TRUE) { [17:27:41.867] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:41.867] open = "w") [17:27:41.867] } [17:27:41.867] else { [17:27:41.867] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:41.867] windows = "NUL", "/dev/null"), open = "w") [17:27:41.867] } [17:27:41.867] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:41.867] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:41.867] base::sink(type = "output", split = FALSE) [17:27:41.867] base::close(...future.stdout) [17:27:41.867] }, add = TRUE) [17:27:41.867] } [17:27:41.867] ...future.frame <- base::sys.nframe() [17:27:41.867] ...future.conditions <- base::list() [17:27:41.867] ...future.rng <- base::globalenv()$.Random.seed [17:27:41.867] if (FALSE) { [17:27:41.867] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:41.867] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:41.867] } [17:27:41.867] ...future.result <- base::tryCatch({ [17:27:41.867] base::withCallingHandlers({ [17:27:41.867] ...future.value <- base::withVisible(base::local({ [17:27:41.867] ...future.makeSendCondition <- base::local({ [17:27:41.867] sendCondition <- NULL [17:27:41.867] function(frame = 1L) { [17:27:41.867] if (is.function(sendCondition)) [17:27:41.867] return(sendCondition) [17:27:41.867] ns <- getNamespace("parallel") [17:27:41.867] if (exists("sendData", mode = "function", [17:27:41.867] envir = ns)) { [17:27:41.867] parallel_sendData <- get("sendData", mode = "function", [17:27:41.867] envir = ns) [17:27:41.867] envir <- sys.frame(frame) [17:27:41.867] master <- NULL [17:27:41.867] while (!identical(envir, .GlobalEnv) && [17:27:41.867] !identical(envir, emptyenv())) { [17:27:41.867] if (exists("master", mode = "list", envir = envir, [17:27:41.867] inherits = FALSE)) { [17:27:41.867] master <- get("master", mode = "list", [17:27:41.867] envir = envir, inherits = FALSE) [17:27:41.867] if (inherits(master, c("SOCKnode", [17:27:41.867] "SOCK0node"))) { [17:27:41.867] sendCondition <<- function(cond) { [17:27:41.867] data <- list(type = "VALUE", value = cond, [17:27:41.867] success = TRUE) [17:27:41.867] parallel_sendData(master, data) [17:27:41.867] } [17:27:41.867] return(sendCondition) [17:27:41.867] } [17:27:41.867] } [17:27:41.867] frame <- frame + 1L [17:27:41.867] envir <- sys.frame(frame) [17:27:41.867] } [17:27:41.867] } [17:27:41.867] sendCondition <<- function(cond) NULL [17:27:41.867] } [17:27:41.867] }) [17:27:41.867] withCallingHandlers({ [17:27:41.867] { [17:27:41.867] 4 [17:27:41.867] } [17:27:41.867] }, immediateCondition = function(cond) { [17:27:41.867] sendCondition <- ...future.makeSendCondition() [17:27:41.867] sendCondition(cond) [17:27:41.867] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.867] { [17:27:41.867] inherits <- base::inherits [17:27:41.867] invokeRestart <- base::invokeRestart [17:27:41.867] is.null <- base::is.null [17:27:41.867] muffled <- FALSE [17:27:41.867] if (inherits(cond, "message")) { [17:27:41.867] muffled <- grepl(pattern, "muffleMessage") [17:27:41.867] if (muffled) [17:27:41.867] invokeRestart("muffleMessage") [17:27:41.867] } [17:27:41.867] else if (inherits(cond, "warning")) { [17:27:41.867] muffled <- grepl(pattern, "muffleWarning") [17:27:41.867] if (muffled) [17:27:41.867] invokeRestart("muffleWarning") [17:27:41.867] } [17:27:41.867] else if (inherits(cond, "condition")) { [17:27:41.867] if (!is.null(pattern)) { [17:27:41.867] computeRestarts <- base::computeRestarts [17:27:41.867] grepl <- base::grepl [17:27:41.867] restarts <- computeRestarts(cond) [17:27:41.867] for (restart in restarts) { [17:27:41.867] name <- restart$name [17:27:41.867] if (is.null(name)) [17:27:41.867] next [17:27:41.867] if (!grepl(pattern, name)) [17:27:41.867] next [17:27:41.867] invokeRestart(restart) [17:27:41.867] muffled <- TRUE [17:27:41.867] break [17:27:41.867] } [17:27:41.867] } [17:27:41.867] } [17:27:41.867] invisible(muffled) [17:27:41.867] } [17:27:41.867] muffleCondition(cond) [17:27:41.867] }) [17:27:41.867] })) [17:27:41.867] future::FutureResult(value = ...future.value$value, [17:27:41.867] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.867] ...future.rng), globalenv = if (FALSE) [17:27:41.867] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:41.867] ...future.globalenv.names)) [17:27:41.867] else NULL, started = ...future.startTime, version = "1.8") [17:27:41.867] }, condition = base::local({ [17:27:41.867] c <- base::c [17:27:41.867] inherits <- base::inherits [17:27:41.867] invokeRestart <- base::invokeRestart [17:27:41.867] length <- base::length [17:27:41.867] list <- base::list [17:27:41.867] seq.int <- base::seq.int [17:27:41.867] signalCondition <- base::signalCondition [17:27:41.867] sys.calls <- base::sys.calls [17:27:41.867] `[[` <- base::`[[` [17:27:41.867] `+` <- base::`+` [17:27:41.867] `<<-` <- base::`<<-` [17:27:41.867] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:41.867] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:41.867] 3L)] [17:27:41.867] } [17:27:41.867] function(cond) { [17:27:41.867] is_error <- inherits(cond, "error") [17:27:41.867] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:41.867] NULL) [17:27:41.867] if (is_error) { [17:27:41.867] sessionInformation <- function() { [17:27:41.867] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:41.867] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:41.867] search = base::search(), system = base::Sys.info()) [17:27:41.867] } [17:27:41.867] ...future.conditions[[length(...future.conditions) + [17:27:41.867] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:41.867] cond$call), session = sessionInformation(), [17:27:41.867] timestamp = base::Sys.time(), signaled = 0L) [17:27:41.867] signalCondition(cond) [17:27:41.867] } [17:27:41.867] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:41.867] "immediateCondition"))) { [17:27:41.867] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:41.867] ...future.conditions[[length(...future.conditions) + [17:27:41.867] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:41.867] if (TRUE && !signal) { [17:27:41.867] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.867] { [17:27:41.867] inherits <- base::inherits [17:27:41.867] invokeRestart <- base::invokeRestart [17:27:41.867] is.null <- base::is.null [17:27:41.867] muffled <- FALSE [17:27:41.867] if (inherits(cond, "message")) { [17:27:41.867] muffled <- grepl(pattern, "muffleMessage") [17:27:41.867] if (muffled) [17:27:41.867] invokeRestart("muffleMessage") [17:27:41.867] } [17:27:41.867] else if (inherits(cond, "warning")) { [17:27:41.867] muffled <- grepl(pattern, "muffleWarning") [17:27:41.867] if (muffled) [17:27:41.867] invokeRestart("muffleWarning") [17:27:41.867] } [17:27:41.867] else if (inherits(cond, "condition")) { [17:27:41.867] if (!is.null(pattern)) { [17:27:41.867] computeRestarts <- base::computeRestarts [17:27:41.867] grepl <- base::grepl [17:27:41.867] restarts <- computeRestarts(cond) [17:27:41.867] for (restart in restarts) { [17:27:41.867] name <- restart$name [17:27:41.867] if (is.null(name)) [17:27:41.867] next [17:27:41.867] if (!grepl(pattern, name)) [17:27:41.867] next [17:27:41.867] invokeRestart(restart) [17:27:41.867] muffled <- TRUE [17:27:41.867] break [17:27:41.867] } [17:27:41.867] } [17:27:41.867] } [17:27:41.867] invisible(muffled) [17:27:41.867] } [17:27:41.867] muffleCondition(cond, pattern = "^muffle") [17:27:41.867] } [17:27:41.867] } [17:27:41.867] else { [17:27:41.867] if (TRUE) { [17:27:41.867] muffleCondition <- function (cond, pattern = "^muffle") [17:27:41.867] { [17:27:41.867] inherits <- base::inherits [17:27:41.867] invokeRestart <- base::invokeRestart [17:27:41.867] is.null <- base::is.null [17:27:41.867] muffled <- FALSE [17:27:41.867] if (inherits(cond, "message")) { [17:27:41.867] muffled <- grepl(pattern, "muffleMessage") [17:27:41.867] if (muffled) [17:27:41.867] invokeRestart("muffleMessage") [17:27:41.867] } [17:27:41.867] else if (inherits(cond, "warning")) { [17:27:41.867] muffled <- grepl(pattern, "muffleWarning") [17:27:41.867] if (muffled) [17:27:41.867] invokeRestart("muffleWarning") [17:27:41.867] } [17:27:41.867] else if (inherits(cond, "condition")) { [17:27:41.867] if (!is.null(pattern)) { [17:27:41.867] computeRestarts <- base::computeRestarts [17:27:41.867] grepl <- base::grepl [17:27:41.867] restarts <- computeRestarts(cond) [17:27:41.867] for (restart in restarts) { [17:27:41.867] name <- restart$name [17:27:41.867] if (is.null(name)) [17:27:41.867] next [17:27:41.867] if (!grepl(pattern, name)) [17:27:41.867] next [17:27:41.867] invokeRestart(restart) [17:27:41.867] muffled <- TRUE [17:27:41.867] break [17:27:41.867] } [17:27:41.867] } [17:27:41.867] } [17:27:41.867] invisible(muffled) [17:27:41.867] } [17:27:41.867] muffleCondition(cond, pattern = "^muffle") [17:27:41.867] } [17:27:41.867] } [17:27:41.867] } [17:27:41.867] })) [17:27:41.867] }, error = function(ex) { [17:27:41.867] base::structure(base::list(value = NULL, visible = NULL, [17:27:41.867] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:41.867] ...future.rng), started = ...future.startTime, [17:27:41.867] finished = Sys.time(), session_uuid = NA_character_, [17:27:41.867] version = "1.8"), class = "FutureResult") [17:27:41.867] }, finally = { [17:27:41.867] if (!identical(...future.workdir, getwd())) [17:27:41.867] setwd(...future.workdir) [17:27:41.867] { [17:27:41.867] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:41.867] ...future.oldOptions$nwarnings <- NULL [17:27:41.867] } [17:27:41.867] base::options(...future.oldOptions) [17:27:41.867] if (.Platform$OS.type == "windows") { [17:27:41.867] old_names <- names(...future.oldEnvVars) [17:27:41.867] envs <- base::Sys.getenv() [17:27:41.867] names <- names(envs) [17:27:41.867] common <- intersect(names, old_names) [17:27:41.867] added <- setdiff(names, old_names) [17:27:41.867] removed <- setdiff(old_names, names) [17:27:41.867] changed <- common[...future.oldEnvVars[common] != [17:27:41.867] envs[common]] [17:27:41.867] NAMES <- toupper(changed) [17:27:41.867] args <- list() [17:27:41.867] for (kk in seq_along(NAMES)) { [17:27:41.867] name <- changed[[kk]] [17:27:41.867] NAME <- NAMES[[kk]] [17:27:41.867] if (name != NAME && is.element(NAME, old_names)) [17:27:41.867] next [17:27:41.867] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.867] } [17:27:41.867] NAMES <- toupper(added) [17:27:41.867] for (kk in seq_along(NAMES)) { [17:27:41.867] name <- added[[kk]] [17:27:41.867] NAME <- NAMES[[kk]] [17:27:41.867] if (name != NAME && is.element(NAME, old_names)) [17:27:41.867] next [17:27:41.867] args[[name]] <- "" [17:27:41.867] } [17:27:41.867] NAMES <- toupper(removed) [17:27:41.867] for (kk in seq_along(NAMES)) { [17:27:41.867] name <- removed[[kk]] [17:27:41.867] NAME <- NAMES[[kk]] [17:27:41.867] if (name != NAME && is.element(NAME, old_names)) [17:27:41.867] next [17:27:41.867] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:41.867] } [17:27:41.867] if (length(args) > 0) [17:27:41.867] base::do.call(base::Sys.setenv, args = args) [17:27:41.867] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:41.867] } [17:27:41.867] else { [17:27:41.867] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:41.867] } [17:27:41.867] { [17:27:41.867] if (base::length(...future.futureOptionsAdded) > [17:27:41.867] 0L) { [17:27:41.867] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:41.867] base::names(opts) <- ...future.futureOptionsAdded [17:27:41.867] base::options(opts) [17:27:41.867] } [17:27:41.867] { [17:27:41.867] { [17:27:41.867] base::options(mc.cores = ...future.mc.cores.old) [17:27:41.867] NULL [17:27:41.867] } [17:27:41.867] options(future.plan = NULL) [17:27:41.867] if (is.na(NA_character_)) [17:27:41.867] Sys.unsetenv("R_FUTURE_PLAN") [17:27:41.867] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:41.867] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:41.867] .init = FALSE) [17:27:41.867] } [17:27:41.867] } [17:27:41.867] } [17:27:41.867] }) [17:27:41.867] if (TRUE) { [17:27:41.867] base::sink(type = "output", split = FALSE) [17:27:41.867] if (TRUE) { [17:27:41.867] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:41.867] } [17:27:41.867] else { [17:27:41.867] ...future.result["stdout"] <- base::list(NULL) [17:27:41.867] } [17:27:41.867] base::close(...future.stdout) [17:27:41.867] ...future.stdout <- NULL [17:27:41.867] } [17:27:41.867] ...future.result$conditions <- ...future.conditions [17:27:41.867] ...future.result$finished <- base::Sys.time() [17:27:41.867] ...future.result [17:27:41.867] } [17:27:41.875] Poll #1 (0): usedNodes() = 2, workers = 2 [17:27:41.892] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.893] - Validating connection of MultisessionFuture [17:27:41.893] - received message: FutureResult [17:27:41.894] - Received FutureResult [17:27:41.894] - Erased future from FutureRegistry [17:27:41.894] result() for ClusterFuture ... [17:27:41.895] - result already collected: FutureResult [17:27:41.895] result() for ClusterFuture ... done [17:27:41.895] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.896] result() for ClusterFuture ... [17:27:41.896] - result already collected: FutureResult [17:27:41.896] result() for ClusterFuture ... done [17:27:41.896] result() for ClusterFuture ... [17:27:41.897] - result already collected: FutureResult [17:27:41.897] result() for ClusterFuture ... done [17:27:41.899] MultisessionFuture started [17:27:41.899] - Launch lazy future ... done [17:27:41.900] run() for 'MultisessionFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:4] 2 1 3 1 - attr(*, "dimnames.")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" [17:27:41.909] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.909] - Validating connection of MultisessionFuture [17:27:41.909] - received message: FutureResult [17:27:41.910] - Received FutureResult [17:27:41.910] - Erased future from FutureRegistry [17:27:41.910] result() for ClusterFuture ... [17:27:41.911] - result already collected: FutureResult [17:27:41.911] result() for ClusterFuture ... done [17:27:41.911] receiveMessageFromWorker() for ClusterFuture ... done [17:27:41.929] receiveMessageFromWorker() for ClusterFuture ... [17:27:41.929] - Validating connection of MultisessionFuture [17:27:41.930] - received message: FutureResult [17:27:41.930] - Received FutureResult [17:27:41.930] - Erased future from FutureRegistry [17:27:41.931] result() for ClusterFuture ... [17:27:41.931] - result already collected: FutureResult [17:27:41.931] result() for ClusterFuture ... done [17:27:41.931] receiveMessageFromWorker() for ClusterFuture ... done logi [1:2, 1, 1:3, 1] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "dimnames")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [17:27:41.938] resolve() on list environment ... [17:27:41.938] recursive: 0 [17:27:41.940] length: 6 [17:27:41.940] elements: 'a', 'b', 'c', 'd', '', '' [17:27:41.940] signalConditionsASAP(numeric, pos=1) ... [17:27:41.941] - nx: 6 [17:27:41.941] - relay: TRUE [17:27:41.941] - stdout: TRUE [17:27:41.941] - signal: TRUE [17:27:41.942] - resignal: FALSE [17:27:41.942] - force: TRUE [17:27:41.942] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.942] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.943] - until=2 [17:27:41.943] - relaying element #2 [17:27:41.943] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.943] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.944] signalConditionsASAP(NULL, pos=1) ... done [17:27:41.944] length: 5 (resolved future 1) [17:27:41.944] Future #2 [17:27:41.944] result() for ClusterFuture ... [17:27:41.945] - result already collected: FutureResult [17:27:41.945] result() for ClusterFuture ... done [17:27:41.945] result() for ClusterFuture ... [17:27:41.946] - result already collected: FutureResult [17:27:41.946] result() for ClusterFuture ... done [17:27:41.946] signalConditionsASAP(MultisessionFuture, pos=2) ... [17:27:41.946] - nx: 6 [17:27:41.947] - relay: TRUE [17:27:41.947] - stdout: TRUE [17:27:41.947] - signal: TRUE [17:27:41.947] - resignal: FALSE [17:27:41.948] - force: TRUE [17:27:41.948] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.948] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [17:27:41.948] - until=2 [17:27:41.949] - relaying element #2 [17:27:41.949] result() for ClusterFuture ... [17:27:41.949] - result already collected: FutureResult [17:27:41.950] result() for ClusterFuture ... done [17:27:41.950] result() for ClusterFuture ... [17:27:41.950] - result already collected: FutureResult [17:27:41.950] result() for ClusterFuture ... done [17:27:41.951] result() for ClusterFuture ... [17:27:41.951] - result already collected: FutureResult [17:27:41.951] result() for ClusterFuture ... done [17:27:41.951] result() for ClusterFuture ... [17:27:41.952] - result already collected: FutureResult [17:27:41.952] result() for ClusterFuture ... done [17:27:41.952] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.952] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.953] signalConditionsASAP(MultisessionFuture, pos=2) ... done [17:27:41.953] length: 4 (resolved future 2) [17:27:41.953] Future #3 [17:27:41.954] result() for ClusterFuture ... [17:27:41.954] - result already collected: FutureResult [17:27:41.954] result() for ClusterFuture ... done [17:27:41.954] result() for ClusterFuture ... [17:27:41.955] - result already collected: FutureResult [17:27:41.955] result() for ClusterFuture ... done [17:27:41.955] signalConditionsASAP(MultisessionFuture, pos=3) ... [17:27:41.956] - nx: 6 [17:27:41.956] - relay: TRUE [17:27:41.956] - stdout: TRUE [17:27:41.956] - signal: TRUE [17:27:41.956] - resignal: FALSE [17:27:41.957] - force: TRUE [17:27:41.957] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.957] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [17:27:41.957] - until=3 [17:27:41.958] - relaying element #3 [17:27:41.958] result() for ClusterFuture ... [17:27:41.958] - result already collected: FutureResult [17:27:41.959] result() for ClusterFuture ... done [17:27:41.959] result() for ClusterFuture ... [17:27:41.959] - result already collected: FutureResult [17:27:41.959] result() for ClusterFuture ... done [17:27:41.960] result() for ClusterFuture ... [17:27:41.960] - result already collected: FutureResult [17:27:41.960] result() for ClusterFuture ... done [17:27:41.960] result() for ClusterFuture ... [17:27:41.961] - result already collected: FutureResult [17:27:41.961] result() for ClusterFuture ... done [17:27:41.961] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.961] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.962] signalConditionsASAP(MultisessionFuture, pos=3) ... done [17:27:41.962] length: 3 (resolved future 3) [17:27:41.962] Future #4 [17:27:41.962] result() for ClusterFuture ... [17:27:41.962] - result already collected: FutureResult [17:27:41.963] result() for ClusterFuture ... done [17:27:41.963] result() for ClusterFuture ... [17:27:41.963] - result already collected: FutureResult [17:27:41.963] result() for ClusterFuture ... done [17:27:41.963] signalConditionsASAP(MultisessionFuture, pos=4) ... [17:27:41.963] - nx: 6 [17:27:41.964] - relay: TRUE [17:27:41.964] - stdout: TRUE [17:27:41.964] - signal: TRUE [17:27:41.965] - resignal: FALSE [17:27:41.965] - force: TRUE [17:27:41.965] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.965] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [17:27:41.966] - until=4 [17:27:41.966] - relaying element #4 [17:27:41.966] result() for ClusterFuture ... [17:27:41.966] - result already collected: FutureResult [17:27:41.966] result() for ClusterFuture ... done [17:27:41.967] result() for ClusterFuture ... [17:27:41.967] - result already collected: FutureResult [17:27:41.967] result() for ClusterFuture ... done [17:27:41.968] result() for ClusterFuture ... [17:27:41.968] - result already collected: FutureResult [17:27:41.968] result() for ClusterFuture ... done [17:27:41.968] result() for ClusterFuture ... [17:27:41.969] - result already collected: FutureResult [17:27:41.969] result() for ClusterFuture ... done [17:27:41.969] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.969] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.970] signalConditionsASAP(MultisessionFuture, pos=4) ... done [17:27:41.970] length: 2 (resolved future 4) [17:27:41.970] signalConditionsASAP(NULL, pos=5) ... [17:27:41.970] - nx: 6 [17:27:41.971] - relay: TRUE [17:27:41.971] - stdout: TRUE [17:27:41.971] - signal: TRUE [17:27:41.971] - resignal: FALSE [17:27:41.971] - force: TRUE [17:27:41.972] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.972] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.972] - until=6 [17:27:41.972] - relaying element #6 [17:27:41.973] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.973] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.973] signalConditionsASAP(NULL, pos=5) ... done [17:27:41.973] length: 1 (resolved future 5) [17:27:41.974] signalConditionsASAP(numeric, pos=6) ... [17:27:41.974] - nx: 6 [17:27:41.974] - relay: TRUE [17:27:41.974] - stdout: TRUE [17:27:41.975] - signal: TRUE [17:27:41.975] - resignal: FALSE [17:27:41.975] - force: TRUE [17:27:41.975] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [17:27:41.976] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.976] - until=6 [17:27:41.976] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.976] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.976] signalConditionsASAP(numeric, pos=6) ... done [17:27:41.977] length: 0 (resolved future 6) [17:27:41.977] Relaying remaining futures [17:27:41.977] signalConditionsASAP(NULL, pos=0) ... [17:27:41.977] - nx: 6 [17:27:41.977] - relay: TRUE [17:27:41.977] - stdout: TRUE [17:27:41.978] - signal: TRUE [17:27:41.978] - resignal: FALSE [17:27:41.978] - force: TRUE [17:27:41.978] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.978] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [17:27:41.979] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [17:27:41.979] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [17:27:41.979] signalConditionsASAP(NULL, pos=0) ... done [17:27:41.979] resolve() on list environment ... DONE [17:27:41.979] result() for ClusterFuture ... [17:27:41.980] - result already collected: FutureResult [17:27:41.980] result() for ClusterFuture ... done [17:27:41.980] result() for ClusterFuture ... [17:27:41.980] - result already collected: FutureResult [17:27:41.980] result() for ClusterFuture ... done [17:27:41.980] result() for ClusterFuture ... [17:27:41.981] - result already collected: FutureResult [17:27:41.981] result() for ClusterFuture ... done [17:27:41.981] result() for ClusterFuture ... [17:27:41.981] - result already collected: FutureResult [17:27:41.981] result() for ClusterFuture ... done [17:27:41.982] result() for ClusterFuture ... [17:27:41.982] - result already collected: FutureResult [17:27:41.982] result() for ClusterFuture ... done [17:27:41.983] result() for ClusterFuture ... [17:27:41.983] - result already collected: FutureResult [17:27:41.983] result() for ClusterFuture ... done Classes 'listenv', 'environment' - attr(*, "dim.")= int [1:4] 2 1 3 1 - attr(*, "dimnames.")=List of 4 ..$ : chr [1:2] "a" "b" ..$ : chr "a" ..$ : chr [1:3] "a" "b" "c" ..$ : chr "a" *** futures() - listenv ... DONE Testing with 2 cores ... DONE > > message("*** futures() / resolved() / value() ... DONE") *** futures() / resolved() / value() ... DONE > > source("incl/end.R") [17:27:41.988] plan(): Setting new future strategy stack: [17:27:41.988] List of future strategies: [17:27:41.988] 1. FutureStrategy: [17:27:41.988] - args: function (..., envir = parent.frame(), workers = "") [17:27:41.988] - tweaked: FALSE [17:27:41.988] - call: future::plan(oplan) [17:27:41.997] plan(): nbrOfWorkers() = 1 Failed to undo environment variables: - Expected environment variables: [n=205] '!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', 'OCL', 'OMP_THREAD_LIMIT', 'OS', 'PATH', 'PATHEXT', 'PROCESSOR_ARCHITECTURE', 'PROCESSOR_IDENTIFIER', 'PROCESSOR_LEVEL', 'PROCESSOR_REVISION', 'PROGRAMFILES', 'PROMPT', 'PSModulePath', 'PUBLIC', 'PWD', 'ProgramData', 'ProgramFiles(x86)', 'ProgramW6432', 'RTOOLS43_HOME', 'RTOOLS44_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_RTOOLS44_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_MBCS_CONVERSION_FAILURE_', '_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_NOTE_LOST_BRACES_', '_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_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_NOTE_MISSING_PACKAGE_ANCHORS_', '_R_CHECK_XREFS_USE_ALIASES_FROM_CRAN_', '_R_CLASS_MATRIX_ARRAY_', '_R_DEPRECATED_IS_R_', '_R_S3_METHOD_LOOKUP_BASEENV_AFTER_GLOBALENV_', '_R_SHLIB_BUILD_OBJECTS_SYMBOL_TABLES_', '__R_CHECK_DOC_FILES_NOTE_IF_ALL_SPECIAL__', '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 5.21 0.21 8.34