R Under development (unstable) (2023-06-30 r84625 ucrt) -- "Unsuffered Consequences" Copyright (C) 2023 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") [18:01:38.286] plan(): Setting new future strategy stack: [18:01:38.287] List of future strategies: [18:01:38.287] 1. sequential: [18:01:38.287] - args: function (..., envir = parent.frame()) [18:01:38.287] - tweaked: FALSE [18:01:38.287] - call: future::plan("sequential") [18:01:38.303] 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 [18:01:38.365] plan(): Setting new future strategy stack: [18:01:38.365] List of future strategies: [18:01:38.365] 1. sequential: [18:01:38.365] - args: function (..., envir = parent.frame()) [18:01:38.365] - tweaked: FALSE [18:01:38.365] - call: plan(strategy) [18:01:38.379] plan(): nbrOfWorkers() = 1 Dimensions: NULL [18:01:38.380] getGlobalsAndPackages() ... [18:01:38.380] Searching for globals... [18:01:38.382] [18:01:38.383] Searching for globals ... DONE [18:01:38.383] - globals: [0] [18:01:38.383] getGlobalsAndPackages() ... DONE [18:01:38.384] run() for 'Future' ... [18:01:38.384] - state: 'created' [18:01:38.384] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.385] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.385] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.385] - Field: 'label' [18:01:38.385] - Field: 'local' [18:01:38.386] - Field: 'owner' [18:01:38.386] - Field: 'envir' [18:01:38.386] - Field: 'packages' [18:01:38.386] - Field: 'gc' [18:01:38.386] - Field: 'conditions' [18:01:38.386] - Field: 'expr' [18:01:38.387] - Field: 'uuid' [18:01:38.387] - Field: 'seed' [18:01:38.387] - Field: 'version' [18:01:38.387] - Field: 'result' [18:01:38.387] - Field: 'asynchronous' [18:01:38.388] - Field: 'calls' [18:01:38.388] - Field: 'globals' [18:01:38.388] - Field: 'stdout' [18:01:38.388] - Field: 'earlySignal' [18:01:38.388] - Field: 'lazy' [18:01:38.388] - Field: 'state' [18:01:38.389] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.389] - Launch lazy future ... [18:01:38.390] Packages needed by the future expression (n = 0): [18:01:38.390] Packages needed by future strategies (n = 0): [18:01:38.391] { [18:01:38.391] { [18:01:38.391] { [18:01:38.391] ...future.startTime <- base::Sys.time() [18:01:38.391] { [18:01:38.391] { [18:01:38.391] { [18:01:38.391] base::local({ [18:01:38.391] has_future <- base::requireNamespace("future", [18:01:38.391] quietly = TRUE) [18:01:38.391] if (has_future) { [18:01:38.391] ns <- base::getNamespace("future") [18:01:38.391] version <- ns[[".package"]][["version"]] [18:01:38.391] if (is.null(version)) [18:01:38.391] version <- utils::packageVersion("future") [18:01:38.391] } [18:01:38.391] else { [18:01:38.391] version <- NULL [18:01:38.391] } [18:01:38.391] if (!has_future || version < "1.8.0") { [18:01:38.391] info <- base::c(r_version = base::gsub("R version ", [18:01:38.391] "", base::R.version$version.string), [18:01:38.391] platform = base::sprintf("%s (%s-bit)", [18:01:38.391] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.391] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.391] "release", "version")], collapse = " "), [18:01:38.391] hostname = base::Sys.info()[["nodename"]]) [18:01:38.391] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.391] info) [18:01:38.391] info <- base::paste(info, collapse = "; ") [18:01:38.391] if (!has_future) { [18:01:38.391] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.391] info) [18:01:38.391] } [18:01:38.391] else { [18:01:38.391] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.391] info, version) [18:01:38.391] } [18:01:38.391] base::stop(msg) [18:01:38.391] } [18:01:38.391] }) [18:01:38.391] } [18:01:38.391] options(future.plan = NULL) [18:01:38.391] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.391] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.391] } [18:01:38.391] ...future.workdir <- getwd() [18:01:38.391] } [18:01:38.391] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.391] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.391] } [18:01:38.391] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.391] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.391] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.391] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.391] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.391] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.391] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.391] base::names(...future.oldOptions)) [18:01:38.391] } [18:01:38.391] if (FALSE) { [18:01:38.391] } [18:01:38.391] else { [18:01:38.391] if (TRUE) { [18:01:38.391] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.391] open = "w") [18:01:38.391] } [18:01:38.391] else { [18:01:38.391] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.391] windows = "NUL", "/dev/null"), open = "w") [18:01:38.391] } [18:01:38.391] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.391] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.391] base::sink(type = "output", split = FALSE) [18:01:38.391] base::close(...future.stdout) [18:01:38.391] }, add = TRUE) [18:01:38.391] } [18:01:38.391] ...future.frame <- base::sys.nframe() [18:01:38.391] ...future.conditions <- base::list() [18:01:38.391] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.391] if (FALSE) { [18:01:38.391] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.391] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.391] } [18:01:38.391] ...future.result <- base::tryCatch({ [18:01:38.391] base::withCallingHandlers({ [18:01:38.391] ...future.value <- base::withVisible(base::local(2)) [18:01:38.391] future::FutureResult(value = ...future.value$value, [18:01:38.391] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.391] ...future.rng), globalenv = if (FALSE) [18:01:38.391] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.391] ...future.globalenv.names)) [18:01:38.391] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.391] }, condition = base::local({ [18:01:38.391] c <- base::c [18:01:38.391] inherits <- base::inherits [18:01:38.391] invokeRestart <- base::invokeRestart [18:01:38.391] length <- base::length [18:01:38.391] list <- base::list [18:01:38.391] seq.int <- base::seq.int [18:01:38.391] signalCondition <- base::signalCondition [18:01:38.391] sys.calls <- base::sys.calls [18:01:38.391] `[[` <- base::`[[` [18:01:38.391] `+` <- base::`+` [18:01:38.391] `<<-` <- base::`<<-` [18:01:38.391] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.391] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.391] 3L)] [18:01:38.391] } [18:01:38.391] function(cond) { [18:01:38.391] is_error <- inherits(cond, "error") [18:01:38.391] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.391] NULL) [18:01:38.391] if (is_error) { [18:01:38.391] sessionInformation <- function() { [18:01:38.391] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.391] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.391] search = base::search(), system = base::Sys.info()) [18:01:38.391] } [18:01:38.391] ...future.conditions[[length(...future.conditions) + [18:01:38.391] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.391] cond$call), session = sessionInformation(), [18:01:38.391] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.391] signalCondition(cond) [18:01:38.391] } [18:01:38.391] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.391] "immediateCondition"))) { [18:01:38.391] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.391] ...future.conditions[[length(...future.conditions) + [18:01:38.391] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.391] if (TRUE && !signal) { [18:01:38.391] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.391] { [18:01:38.391] inherits <- base::inherits [18:01:38.391] invokeRestart <- base::invokeRestart [18:01:38.391] is.null <- base::is.null [18:01:38.391] muffled <- FALSE [18:01:38.391] if (inherits(cond, "message")) { [18:01:38.391] muffled <- grepl(pattern, "muffleMessage") [18:01:38.391] if (muffled) [18:01:38.391] invokeRestart("muffleMessage") [18:01:38.391] } [18:01:38.391] else if (inherits(cond, "warning")) { [18:01:38.391] muffled <- grepl(pattern, "muffleWarning") [18:01:38.391] if (muffled) [18:01:38.391] invokeRestart("muffleWarning") [18:01:38.391] } [18:01:38.391] else if (inherits(cond, "condition")) { [18:01:38.391] if (!is.null(pattern)) { [18:01:38.391] computeRestarts <- base::computeRestarts [18:01:38.391] grepl <- base::grepl [18:01:38.391] restarts <- computeRestarts(cond) [18:01:38.391] for (restart in restarts) { [18:01:38.391] name <- restart$name [18:01:38.391] if (is.null(name)) [18:01:38.391] next [18:01:38.391] if (!grepl(pattern, name)) [18:01:38.391] next [18:01:38.391] invokeRestart(restart) [18:01:38.391] muffled <- TRUE [18:01:38.391] break [18:01:38.391] } [18:01:38.391] } [18:01:38.391] } [18:01:38.391] invisible(muffled) [18:01:38.391] } [18:01:38.391] muffleCondition(cond, pattern = "^muffle") [18:01:38.391] } [18:01:38.391] } [18:01:38.391] else { [18:01:38.391] if (TRUE) { [18:01:38.391] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.391] { [18:01:38.391] inherits <- base::inherits [18:01:38.391] invokeRestart <- base::invokeRestart [18:01:38.391] is.null <- base::is.null [18:01:38.391] muffled <- FALSE [18:01:38.391] if (inherits(cond, "message")) { [18:01:38.391] muffled <- grepl(pattern, "muffleMessage") [18:01:38.391] if (muffled) [18:01:38.391] invokeRestart("muffleMessage") [18:01:38.391] } [18:01:38.391] else if (inherits(cond, "warning")) { [18:01:38.391] muffled <- grepl(pattern, "muffleWarning") [18:01:38.391] if (muffled) [18:01:38.391] invokeRestart("muffleWarning") [18:01:38.391] } [18:01:38.391] else if (inherits(cond, "condition")) { [18:01:38.391] if (!is.null(pattern)) { [18:01:38.391] computeRestarts <- base::computeRestarts [18:01:38.391] grepl <- base::grepl [18:01:38.391] restarts <- computeRestarts(cond) [18:01:38.391] for (restart in restarts) { [18:01:38.391] name <- restart$name [18:01:38.391] if (is.null(name)) [18:01:38.391] next [18:01:38.391] if (!grepl(pattern, name)) [18:01:38.391] next [18:01:38.391] invokeRestart(restart) [18:01:38.391] muffled <- TRUE [18:01:38.391] break [18:01:38.391] } [18:01:38.391] } [18:01:38.391] } [18:01:38.391] invisible(muffled) [18:01:38.391] } [18:01:38.391] muffleCondition(cond, pattern = "^muffle") [18:01:38.391] } [18:01:38.391] } [18:01:38.391] } [18:01:38.391] })) [18:01:38.391] }, error = function(ex) { [18:01:38.391] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.391] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.391] ...future.rng), started = ...future.startTime, [18:01:38.391] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.391] version = "1.8"), class = "FutureResult") [18:01:38.391] }, finally = { [18:01:38.391] if (!identical(...future.workdir, getwd())) [18:01:38.391] setwd(...future.workdir) [18:01:38.391] { [18:01:38.391] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.391] ...future.oldOptions$nwarnings <- NULL [18:01:38.391] } [18:01:38.391] base::options(...future.oldOptions) [18:01:38.391] if (.Platform$OS.type == "windows") { [18:01:38.391] old_names <- names(...future.oldEnvVars) [18:01:38.391] envs <- base::Sys.getenv() [18:01:38.391] names <- names(envs) [18:01:38.391] common <- intersect(names, old_names) [18:01:38.391] added <- setdiff(names, old_names) [18:01:38.391] removed <- setdiff(old_names, names) [18:01:38.391] changed <- common[...future.oldEnvVars[common] != [18:01:38.391] envs[common]] [18:01:38.391] NAMES <- toupper(changed) [18:01:38.391] args <- list() [18:01:38.391] for (kk in seq_along(NAMES)) { [18:01:38.391] name <- changed[[kk]] [18:01:38.391] NAME <- NAMES[[kk]] [18:01:38.391] if (name != NAME && is.element(NAME, old_names)) [18:01:38.391] next [18:01:38.391] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.391] } [18:01:38.391] NAMES <- toupper(added) [18:01:38.391] for (kk in seq_along(NAMES)) { [18:01:38.391] name <- added[[kk]] [18:01:38.391] NAME <- NAMES[[kk]] [18:01:38.391] if (name != NAME && is.element(NAME, old_names)) [18:01:38.391] next [18:01:38.391] args[[name]] <- "" [18:01:38.391] } [18:01:38.391] NAMES <- toupper(removed) [18:01:38.391] for (kk in seq_along(NAMES)) { [18:01:38.391] name <- removed[[kk]] [18:01:38.391] NAME <- NAMES[[kk]] [18:01:38.391] if (name != NAME && is.element(NAME, old_names)) [18:01:38.391] next [18:01:38.391] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.391] } [18:01:38.391] if (length(args) > 0) [18:01:38.391] base::do.call(base::Sys.setenv, args = args) [18:01:38.391] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.391] } [18:01:38.391] else { [18:01:38.391] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.391] } [18:01:38.391] { [18:01:38.391] if (base::length(...future.futureOptionsAdded) > [18:01:38.391] 0L) { [18:01:38.391] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.391] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.391] base::options(opts) [18:01:38.391] } [18:01:38.391] { [18:01:38.391] { [18:01:38.391] NULL [18:01:38.391] RNGkind("Mersenne-Twister") [18:01:38.391] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.391] inherits = FALSE) [18:01:38.391] } [18:01:38.391] options(future.plan = NULL) [18:01:38.391] if (is.na(NA_character_)) [18:01:38.391] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.391] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.391] future::plan(list(function (..., envir = parent.frame()) [18:01:38.391] { [18:01:38.391] future <- SequentialFuture(..., envir = envir) [18:01:38.391] if (!future$lazy) [18:01:38.391] future <- run(future) [18:01:38.391] invisible(future) [18:01:38.391] }), .cleanup = FALSE, .init = FALSE) [18:01:38.391] } [18:01:38.391] } [18:01:38.391] } [18:01:38.391] }) [18:01:38.391] if (TRUE) { [18:01:38.391] base::sink(type = "output", split = FALSE) [18:01:38.391] if (TRUE) { [18:01:38.391] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.391] } [18:01:38.391] else { [18:01:38.391] ...future.result["stdout"] <- base::list(NULL) [18:01:38.391] } [18:01:38.391] base::close(...future.stdout) [18:01:38.391] ...future.stdout <- NULL [18:01:38.391] } [18:01:38.391] ...future.result$conditions <- ...future.conditions [18:01:38.391] ...future.result$finished <- base::Sys.time() [18:01:38.391] ...future.result [18:01:38.391] } [18:01:38.395] plan(): Setting new future strategy stack: [18:01:38.395] List of future strategies: [18:01:38.395] 1. sequential: [18:01:38.395] - args: function (..., envir = parent.frame()) [18:01:38.395] - tweaked: FALSE [18:01:38.395] - call: NULL [18:01:38.396] plan(): nbrOfWorkers() = 1 [18:01:38.398] plan(): Setting new future strategy stack: [18:01:38.398] List of future strategies: [18:01:38.398] 1. sequential: [18:01:38.398] - args: function (..., envir = parent.frame()) [18:01:38.398] - tweaked: FALSE [18:01:38.398] - call: plan(strategy) [18:01:38.399] plan(): nbrOfWorkers() = 1 [18:01:38.399] SequentialFuture started (and completed) [18:01:38.399] - Launch lazy future ... done [18:01:38.400] run() for 'SequentialFuture' ... done [18:01:38.400] getGlobalsAndPackages() ... [18:01:38.400] Searching for globals... [18:01:38.400] [18:01:38.401] Searching for globals ... DONE [18:01:38.401] - globals: [0] [18:01:38.401] getGlobalsAndPackages() ... DONE [18:01:38.401] run() for 'Future' ... [18:01:38.401] - state: 'created' [18:01:38.402] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.402] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.402] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.402] - Field: 'label' [18:01:38.402] - Field: 'local' [18:01:38.403] - Field: 'owner' [18:01:38.403] - Field: 'envir' [18:01:38.403] - Field: 'packages' [18:01:38.403] - Field: 'gc' [18:01:38.403] - Field: 'conditions' [18:01:38.404] - Field: 'expr' [18:01:38.404] - Field: 'uuid' [18:01:38.404] - Field: 'seed' [18:01:38.404] - Field: 'version' [18:01:38.404] - Field: 'result' [18:01:38.404] - Field: 'asynchronous' [18:01:38.405] - Field: 'calls' [18:01:38.405] - Field: 'globals' [18:01:38.405] - Field: 'stdout' [18:01:38.405] - Field: 'earlySignal' [18:01:38.405] - Field: 'lazy' [18:01:38.405] - Field: 'state' [18:01:38.406] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.406] - Launch lazy future ... [18:01:38.406] Packages needed by the future expression (n = 0): [18:01:38.406] Packages needed by future strategies (n = 0): [18:01:38.407] { [18:01:38.407] { [18:01:38.407] { [18:01:38.407] ...future.startTime <- base::Sys.time() [18:01:38.407] { [18:01:38.407] { [18:01:38.407] { [18:01:38.407] base::local({ [18:01:38.407] has_future <- base::requireNamespace("future", [18:01:38.407] quietly = TRUE) [18:01:38.407] if (has_future) { [18:01:38.407] ns <- base::getNamespace("future") [18:01:38.407] version <- ns[[".package"]][["version"]] [18:01:38.407] if (is.null(version)) [18:01:38.407] version <- utils::packageVersion("future") [18:01:38.407] } [18:01:38.407] else { [18:01:38.407] version <- NULL [18:01:38.407] } [18:01:38.407] if (!has_future || version < "1.8.0") { [18:01:38.407] info <- base::c(r_version = base::gsub("R version ", [18:01:38.407] "", base::R.version$version.string), [18:01:38.407] platform = base::sprintf("%s (%s-bit)", [18:01:38.407] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.407] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.407] "release", "version")], collapse = " "), [18:01:38.407] hostname = base::Sys.info()[["nodename"]]) [18:01:38.407] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.407] info) [18:01:38.407] info <- base::paste(info, collapse = "; ") [18:01:38.407] if (!has_future) { [18:01:38.407] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.407] info) [18:01:38.407] } [18:01:38.407] else { [18:01:38.407] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.407] info, version) [18:01:38.407] } [18:01:38.407] base::stop(msg) [18:01:38.407] } [18:01:38.407] }) [18:01:38.407] } [18:01:38.407] options(future.plan = NULL) [18:01:38.407] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.407] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.407] } [18:01:38.407] ...future.workdir <- getwd() [18:01:38.407] } [18:01:38.407] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.407] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.407] } [18:01:38.407] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.407] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.407] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.407] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.407] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.407] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.407] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.407] base::names(...future.oldOptions)) [18:01:38.407] } [18:01:38.407] if (FALSE) { [18:01:38.407] } [18:01:38.407] else { [18:01:38.407] if (TRUE) { [18:01:38.407] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.407] open = "w") [18:01:38.407] } [18:01:38.407] else { [18:01:38.407] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.407] windows = "NUL", "/dev/null"), open = "w") [18:01:38.407] } [18:01:38.407] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.407] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.407] base::sink(type = "output", split = FALSE) [18:01:38.407] base::close(...future.stdout) [18:01:38.407] }, add = TRUE) [18:01:38.407] } [18:01:38.407] ...future.frame <- base::sys.nframe() [18:01:38.407] ...future.conditions <- base::list() [18:01:38.407] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.407] if (FALSE) { [18:01:38.407] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.407] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.407] } [18:01:38.407] ...future.result <- base::tryCatch({ [18:01:38.407] base::withCallingHandlers({ [18:01:38.407] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.407] future::FutureResult(value = ...future.value$value, [18:01:38.407] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.407] ...future.rng), globalenv = if (FALSE) [18:01:38.407] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.407] ...future.globalenv.names)) [18:01:38.407] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.407] }, condition = base::local({ [18:01:38.407] c <- base::c [18:01:38.407] inherits <- base::inherits [18:01:38.407] invokeRestart <- base::invokeRestart [18:01:38.407] length <- base::length [18:01:38.407] list <- base::list [18:01:38.407] seq.int <- base::seq.int [18:01:38.407] signalCondition <- base::signalCondition [18:01:38.407] sys.calls <- base::sys.calls [18:01:38.407] `[[` <- base::`[[` [18:01:38.407] `+` <- base::`+` [18:01:38.407] `<<-` <- base::`<<-` [18:01:38.407] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.407] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.407] 3L)] [18:01:38.407] } [18:01:38.407] function(cond) { [18:01:38.407] is_error <- inherits(cond, "error") [18:01:38.407] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.407] NULL) [18:01:38.407] if (is_error) { [18:01:38.407] sessionInformation <- function() { [18:01:38.407] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.407] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.407] search = base::search(), system = base::Sys.info()) [18:01:38.407] } [18:01:38.407] ...future.conditions[[length(...future.conditions) + [18:01:38.407] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.407] cond$call), session = sessionInformation(), [18:01:38.407] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.407] signalCondition(cond) [18:01:38.407] } [18:01:38.407] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.407] "immediateCondition"))) { [18:01:38.407] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.407] ...future.conditions[[length(...future.conditions) + [18:01:38.407] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.407] if (TRUE && !signal) { [18:01:38.407] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.407] { [18:01:38.407] inherits <- base::inherits [18:01:38.407] invokeRestart <- base::invokeRestart [18:01:38.407] is.null <- base::is.null [18:01:38.407] muffled <- FALSE [18:01:38.407] if (inherits(cond, "message")) { [18:01:38.407] muffled <- grepl(pattern, "muffleMessage") [18:01:38.407] if (muffled) [18:01:38.407] invokeRestart("muffleMessage") [18:01:38.407] } [18:01:38.407] else if (inherits(cond, "warning")) { [18:01:38.407] muffled <- grepl(pattern, "muffleWarning") [18:01:38.407] if (muffled) [18:01:38.407] invokeRestart("muffleWarning") [18:01:38.407] } [18:01:38.407] else if (inherits(cond, "condition")) { [18:01:38.407] if (!is.null(pattern)) { [18:01:38.407] computeRestarts <- base::computeRestarts [18:01:38.407] grepl <- base::grepl [18:01:38.407] restarts <- computeRestarts(cond) [18:01:38.407] for (restart in restarts) { [18:01:38.407] name <- restart$name [18:01:38.407] if (is.null(name)) [18:01:38.407] next [18:01:38.407] if (!grepl(pattern, name)) [18:01:38.407] next [18:01:38.407] invokeRestart(restart) [18:01:38.407] muffled <- TRUE [18:01:38.407] break [18:01:38.407] } [18:01:38.407] } [18:01:38.407] } [18:01:38.407] invisible(muffled) [18:01:38.407] } [18:01:38.407] muffleCondition(cond, pattern = "^muffle") [18:01:38.407] } [18:01:38.407] } [18:01:38.407] else { [18:01:38.407] if (TRUE) { [18:01:38.407] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.407] { [18:01:38.407] inherits <- base::inherits [18:01:38.407] invokeRestart <- base::invokeRestart [18:01:38.407] is.null <- base::is.null [18:01:38.407] muffled <- FALSE [18:01:38.407] if (inherits(cond, "message")) { [18:01:38.407] muffled <- grepl(pattern, "muffleMessage") [18:01:38.407] if (muffled) [18:01:38.407] invokeRestart("muffleMessage") [18:01:38.407] } [18:01:38.407] else if (inherits(cond, "warning")) { [18:01:38.407] muffled <- grepl(pattern, "muffleWarning") [18:01:38.407] if (muffled) [18:01:38.407] invokeRestart("muffleWarning") [18:01:38.407] } [18:01:38.407] else if (inherits(cond, "condition")) { [18:01:38.407] if (!is.null(pattern)) { [18:01:38.407] computeRestarts <- base::computeRestarts [18:01:38.407] grepl <- base::grepl [18:01:38.407] restarts <- computeRestarts(cond) [18:01:38.407] for (restart in restarts) { [18:01:38.407] name <- restart$name [18:01:38.407] if (is.null(name)) [18:01:38.407] next [18:01:38.407] if (!grepl(pattern, name)) [18:01:38.407] next [18:01:38.407] invokeRestart(restart) [18:01:38.407] muffled <- TRUE [18:01:38.407] break [18:01:38.407] } [18:01:38.407] } [18:01:38.407] } [18:01:38.407] invisible(muffled) [18:01:38.407] } [18:01:38.407] muffleCondition(cond, pattern = "^muffle") [18:01:38.407] } [18:01:38.407] } [18:01:38.407] } [18:01:38.407] })) [18:01:38.407] }, error = function(ex) { [18:01:38.407] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.407] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.407] ...future.rng), started = ...future.startTime, [18:01:38.407] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.407] version = "1.8"), class = "FutureResult") [18:01:38.407] }, finally = { [18:01:38.407] if (!identical(...future.workdir, getwd())) [18:01:38.407] setwd(...future.workdir) [18:01:38.407] { [18:01:38.407] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.407] ...future.oldOptions$nwarnings <- NULL [18:01:38.407] } [18:01:38.407] base::options(...future.oldOptions) [18:01:38.407] if (.Platform$OS.type == "windows") { [18:01:38.407] old_names <- names(...future.oldEnvVars) [18:01:38.407] envs <- base::Sys.getenv() [18:01:38.407] names <- names(envs) [18:01:38.407] common <- intersect(names, old_names) [18:01:38.407] added <- setdiff(names, old_names) [18:01:38.407] removed <- setdiff(old_names, names) [18:01:38.407] changed <- common[...future.oldEnvVars[common] != [18:01:38.407] envs[common]] [18:01:38.407] NAMES <- toupper(changed) [18:01:38.407] args <- list() [18:01:38.407] for (kk in seq_along(NAMES)) { [18:01:38.407] name <- changed[[kk]] [18:01:38.407] NAME <- NAMES[[kk]] [18:01:38.407] if (name != NAME && is.element(NAME, old_names)) [18:01:38.407] next [18:01:38.407] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.407] } [18:01:38.407] NAMES <- toupper(added) [18:01:38.407] for (kk in seq_along(NAMES)) { [18:01:38.407] name <- added[[kk]] [18:01:38.407] NAME <- NAMES[[kk]] [18:01:38.407] if (name != NAME && is.element(NAME, old_names)) [18:01:38.407] next [18:01:38.407] args[[name]] <- "" [18:01:38.407] } [18:01:38.407] NAMES <- toupper(removed) [18:01:38.407] for (kk in seq_along(NAMES)) { [18:01:38.407] name <- removed[[kk]] [18:01:38.407] NAME <- NAMES[[kk]] [18:01:38.407] if (name != NAME && is.element(NAME, old_names)) [18:01:38.407] next [18:01:38.407] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.407] } [18:01:38.407] if (length(args) > 0) [18:01:38.407] base::do.call(base::Sys.setenv, args = args) [18:01:38.407] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.407] } [18:01:38.407] else { [18:01:38.407] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.407] } [18:01:38.407] { [18:01:38.407] if (base::length(...future.futureOptionsAdded) > [18:01:38.407] 0L) { [18:01:38.407] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.407] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.407] base::options(opts) [18:01:38.407] } [18:01:38.407] { [18:01:38.407] { [18:01:38.407] NULL [18:01:38.407] RNGkind("Mersenne-Twister") [18:01:38.407] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.407] inherits = FALSE) [18:01:38.407] } [18:01:38.407] options(future.plan = NULL) [18:01:38.407] if (is.na(NA_character_)) [18:01:38.407] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.407] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.407] future::plan(list(function (..., envir = parent.frame()) [18:01:38.407] { [18:01:38.407] future <- SequentialFuture(..., envir = envir) [18:01:38.407] if (!future$lazy) [18:01:38.407] future <- run(future) [18:01:38.407] invisible(future) [18:01:38.407] }), .cleanup = FALSE, .init = FALSE) [18:01:38.407] } [18:01:38.407] } [18:01:38.407] } [18:01:38.407] }) [18:01:38.407] if (TRUE) { [18:01:38.407] base::sink(type = "output", split = FALSE) [18:01:38.407] if (TRUE) { [18:01:38.407] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.407] } [18:01:38.407] else { [18:01:38.407] ...future.result["stdout"] <- base::list(NULL) [18:01:38.407] } [18:01:38.407] base::close(...future.stdout) [18:01:38.407] ...future.stdout <- NULL [18:01:38.407] } [18:01:38.407] ...future.result$conditions <- ...future.conditions [18:01:38.407] ...future.result$finished <- base::Sys.time() [18:01:38.407] ...future.result [18:01:38.407] } [18:01:38.411] plan(): Setting new future strategy stack: [18:01:38.411] List of future strategies: [18:01:38.411] 1. sequential: [18:01:38.411] - args: function (..., envir = parent.frame()) [18:01:38.411] - tweaked: FALSE [18:01:38.411] - call: NULL [18:01:38.412] plan(): nbrOfWorkers() = 1 [18:01:38.413] plan(): Setting new future strategy stack: [18:01:38.413] List of future strategies: [18:01:38.413] 1. sequential: [18:01:38.413] - args: function (..., envir = parent.frame()) [18:01:38.413] - tweaked: FALSE [18:01:38.413] - call: plan(strategy) [18:01:38.413] plan(): nbrOfWorkers() = 1 [18:01:38.414] SequentialFuture started (and completed) [18:01:38.414] - Launch lazy future ... done [18:01:38.414] 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 [18:01:38.423] resolved() for 'SequentialFuture' ... [18:01:38.423] - state: 'finished' [18:01:38.423] - run: TRUE [18:01:38.424] - result: 'FutureResult' [18:01:38.424] resolved() for 'SequentialFuture' ... done [18:01:38.424] resolved() for 'SequentialFuture' ... [18:01:38.424] - state: 'finished' [18:01:38.424] - run: TRUE [18:01:38.425] - result: 'FutureResult' [18:01:38.425] resolved() for 'SequentialFuture' ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [18:01:38.426] resolve() on list ... [18:01:38.426] recursive: 0 [18:01:38.427] length: 6 [18:01:38.427] elements: 'a', 'b', 'c', '', '', '' [18:01:38.427] signalConditionsASAP(numeric, pos=1) ... [18:01:38.427] - nx: 6 [18:01:38.427] - relay: TRUE [18:01:38.427] - stdout: TRUE [18:01:38.428] - signal: TRUE [18:01:38.428] - resignal: FALSE [18:01:38.428] - force: TRUE [18:01:38.428] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.428] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.428] - until=2 [18:01:38.429] - relaying element #2 [18:01:38.429] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.429] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.429] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.429] length: 5 (resolved future 1) [18:01:38.429] resolved() for 'SequentialFuture' ... [18:01:38.430] - state: 'finished' [18:01:38.430] - run: TRUE [18:01:38.430] - result: 'FutureResult' [18:01:38.430] resolved() for 'SequentialFuture' ... done [18:01:38.430] Future #2 [18:01:38.431] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.431] - nx: 6 [18:01:38.431] - relay: TRUE [18:01:38.431] - stdout: TRUE [18:01:38.431] - signal: TRUE [18:01:38.432] - resignal: FALSE [18:01:38.432] - force: TRUE [18:01:38.432] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.432] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.432] - until=2 [18:01:38.432] - relaying element #2 [18:01:38.433] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.433] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.433] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.433] length: 4 (resolved future 2) [18:01:38.433] resolved() for 'SequentialFuture' ... [18:01:38.434] - state: 'finished' [18:01:38.434] - run: TRUE [18:01:38.434] - result: 'FutureResult' [18:01:38.434] resolved() for 'SequentialFuture' ... done [18:01:38.434] Future #3 [18:01:38.435] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.435] - nx: 6 [18:01:38.435] - relay: TRUE [18:01:38.435] - stdout: TRUE [18:01:38.435] - signal: TRUE [18:01:38.435] - resignal: FALSE [18:01:38.435] - force: TRUE [18:01:38.436] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.436] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.436] - until=3 [18:01:38.436] - relaying element #3 [18:01:38.436] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.437] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.437] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.437] length: 3 (resolved future 3) [18:01:38.437] signalConditionsASAP(NULL, pos=4) ... [18:01:38.437] - nx: 6 [18:01:38.437] - relay: TRUE [18:01:38.438] - stdout: TRUE [18:01:38.438] - signal: TRUE [18:01:38.438] - resignal: FALSE [18:01:38.438] - force: TRUE [18:01:38.438] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.438] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.438] - until=5 [18:01:38.439] - relaying element #5 [18:01:38.439] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.439] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.439] signalConditionsASAP(NULL, pos=4) ... done [18:01:38.439] length: 2 (resolved future 4) [18:01:38.439] signalConditionsASAP(NULL, pos=5) ... [18:01:38.440] - nx: 6 [18:01:38.440] - relay: TRUE [18:01:38.440] - stdout: TRUE [18:01:38.440] - signal: TRUE [18:01:38.440] - resignal: FALSE [18:01:38.440] - force: TRUE [18:01:38.440] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.441] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.441] - until=6 [18:01:38.441] - relaying element #6 [18:01:38.441] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.441] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.441] signalConditionsASAP(NULL, pos=5) ... done [18:01:38.442] length: 1 (resolved future 5) [18:01:38.442] signalConditionsASAP(numeric, pos=6) ... [18:01:38.442] - nx: 6 [18:01:38.442] - relay: TRUE [18:01:38.442] - stdout: TRUE [18:01:38.442] - signal: TRUE [18:01:38.442] - resignal: FALSE [18:01:38.443] - force: TRUE [18:01:38.443] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.443] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.443] - until=6 [18:01:38.443] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.443] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.444] signalConditionsASAP(numeric, pos=6) ... done [18:01:38.444] length: 0 (resolved future 6) [18:01:38.444] Relaying remaining futures [18:01:38.444] signalConditionsASAP(NULL, pos=0) ... [18:01:38.444] - nx: 6 [18:01:38.444] - relay: TRUE [18:01:38.444] - stdout: TRUE [18:01:38.445] - signal: TRUE [18:01:38.445] - resignal: FALSE [18:01:38.445] - force: TRUE [18:01:38.445] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.445] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:38.445] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.446] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.446] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.446] resolve() on list ... DONE List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 Dimensions: c(1, 6) [18:01:38.449] getGlobalsAndPackages() ... [18:01:38.449] Searching for globals... [18:01:38.449] [18:01:38.449] Searching for globals ... DONE [18:01:38.449] - globals: [0] [18:01:38.450] getGlobalsAndPackages() ... DONE [18:01:38.450] run() for 'Future' ... [18:01:38.450] - state: 'created' [18:01:38.450] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.451] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.451] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.451] - Field: 'label' [18:01:38.451] - Field: 'local' [18:01:38.451] - Field: 'owner' [18:01:38.452] - Field: 'envir' [18:01:38.452] - Field: 'packages' [18:01:38.452] - Field: 'gc' [18:01:38.452] - Field: 'conditions' [18:01:38.452] - Field: 'expr' [18:01:38.452] - Field: 'uuid' [18:01:38.453] - Field: 'seed' [18:01:38.453] - Field: 'version' [18:01:38.453] - Field: 'result' [18:01:38.453] - Field: 'asynchronous' [18:01:38.453] - Field: 'calls' [18:01:38.454] - Field: 'globals' [18:01:38.454] - Field: 'stdout' [18:01:38.454] - Field: 'earlySignal' [18:01:38.454] - Field: 'lazy' [18:01:38.454] - Field: 'state' [18:01:38.454] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.455] - Launch lazy future ... [18:01:38.455] Packages needed by the future expression (n = 0): [18:01:38.455] Packages needed by future strategies (n = 0): [18:01:38.456] { [18:01:38.456] { [18:01:38.456] { [18:01:38.456] ...future.startTime <- base::Sys.time() [18:01:38.456] { [18:01:38.456] { [18:01:38.456] { [18:01:38.456] base::local({ [18:01:38.456] has_future <- base::requireNamespace("future", [18:01:38.456] quietly = TRUE) [18:01:38.456] if (has_future) { [18:01:38.456] ns <- base::getNamespace("future") [18:01:38.456] version <- ns[[".package"]][["version"]] [18:01:38.456] if (is.null(version)) [18:01:38.456] version <- utils::packageVersion("future") [18:01:38.456] } [18:01:38.456] else { [18:01:38.456] version <- NULL [18:01:38.456] } [18:01:38.456] if (!has_future || version < "1.8.0") { [18:01:38.456] info <- base::c(r_version = base::gsub("R version ", [18:01:38.456] "", base::R.version$version.string), [18:01:38.456] platform = base::sprintf("%s (%s-bit)", [18:01:38.456] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.456] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.456] "release", "version")], collapse = " "), [18:01:38.456] hostname = base::Sys.info()[["nodename"]]) [18:01:38.456] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.456] info) [18:01:38.456] info <- base::paste(info, collapse = "; ") [18:01:38.456] if (!has_future) { [18:01:38.456] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.456] info) [18:01:38.456] } [18:01:38.456] else { [18:01:38.456] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.456] info, version) [18:01:38.456] } [18:01:38.456] base::stop(msg) [18:01:38.456] } [18:01:38.456] }) [18:01:38.456] } [18:01:38.456] options(future.plan = NULL) [18:01:38.456] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.456] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.456] } [18:01:38.456] ...future.workdir <- getwd() [18:01:38.456] } [18:01:38.456] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.456] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.456] } [18:01:38.456] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.456] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.456] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.456] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.456] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.456] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.456] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.456] base::names(...future.oldOptions)) [18:01:38.456] } [18:01:38.456] if (FALSE) { [18:01:38.456] } [18:01:38.456] else { [18:01:38.456] if (TRUE) { [18:01:38.456] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.456] open = "w") [18:01:38.456] } [18:01:38.456] else { [18:01:38.456] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.456] windows = "NUL", "/dev/null"), open = "w") [18:01:38.456] } [18:01:38.456] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.456] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.456] base::sink(type = "output", split = FALSE) [18:01:38.456] base::close(...future.stdout) [18:01:38.456] }, add = TRUE) [18:01:38.456] } [18:01:38.456] ...future.frame <- base::sys.nframe() [18:01:38.456] ...future.conditions <- base::list() [18:01:38.456] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.456] if (FALSE) { [18:01:38.456] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.456] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.456] } [18:01:38.456] ...future.result <- base::tryCatch({ [18:01:38.456] base::withCallingHandlers({ [18:01:38.456] ...future.value <- base::withVisible(base::local(2)) [18:01:38.456] future::FutureResult(value = ...future.value$value, [18:01:38.456] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.456] ...future.rng), globalenv = if (FALSE) [18:01:38.456] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.456] ...future.globalenv.names)) [18:01:38.456] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.456] }, condition = base::local({ [18:01:38.456] c <- base::c [18:01:38.456] inherits <- base::inherits [18:01:38.456] invokeRestart <- base::invokeRestart [18:01:38.456] length <- base::length [18:01:38.456] list <- base::list [18:01:38.456] seq.int <- base::seq.int [18:01:38.456] signalCondition <- base::signalCondition [18:01:38.456] sys.calls <- base::sys.calls [18:01:38.456] `[[` <- base::`[[` [18:01:38.456] `+` <- base::`+` [18:01:38.456] `<<-` <- base::`<<-` [18:01:38.456] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.456] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.456] 3L)] [18:01:38.456] } [18:01:38.456] function(cond) { [18:01:38.456] is_error <- inherits(cond, "error") [18:01:38.456] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.456] NULL) [18:01:38.456] if (is_error) { [18:01:38.456] sessionInformation <- function() { [18:01:38.456] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.456] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.456] search = base::search(), system = base::Sys.info()) [18:01:38.456] } [18:01:38.456] ...future.conditions[[length(...future.conditions) + [18:01:38.456] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.456] cond$call), session = sessionInformation(), [18:01:38.456] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.456] signalCondition(cond) [18:01:38.456] } [18:01:38.456] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.456] "immediateCondition"))) { [18:01:38.456] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.456] ...future.conditions[[length(...future.conditions) + [18:01:38.456] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.456] if (TRUE && !signal) { [18:01:38.456] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.456] { [18:01:38.456] inherits <- base::inherits [18:01:38.456] invokeRestart <- base::invokeRestart [18:01:38.456] is.null <- base::is.null [18:01:38.456] muffled <- FALSE [18:01:38.456] if (inherits(cond, "message")) { [18:01:38.456] muffled <- grepl(pattern, "muffleMessage") [18:01:38.456] if (muffled) [18:01:38.456] invokeRestart("muffleMessage") [18:01:38.456] } [18:01:38.456] else if (inherits(cond, "warning")) { [18:01:38.456] muffled <- grepl(pattern, "muffleWarning") [18:01:38.456] if (muffled) [18:01:38.456] invokeRestart("muffleWarning") [18:01:38.456] } [18:01:38.456] else if (inherits(cond, "condition")) { [18:01:38.456] if (!is.null(pattern)) { [18:01:38.456] computeRestarts <- base::computeRestarts [18:01:38.456] grepl <- base::grepl [18:01:38.456] restarts <- computeRestarts(cond) [18:01:38.456] for (restart in restarts) { [18:01:38.456] name <- restart$name [18:01:38.456] if (is.null(name)) [18:01:38.456] next [18:01:38.456] if (!grepl(pattern, name)) [18:01:38.456] next [18:01:38.456] invokeRestart(restart) [18:01:38.456] muffled <- TRUE [18:01:38.456] break [18:01:38.456] } [18:01:38.456] } [18:01:38.456] } [18:01:38.456] invisible(muffled) [18:01:38.456] } [18:01:38.456] muffleCondition(cond, pattern = "^muffle") [18:01:38.456] } [18:01:38.456] } [18:01:38.456] else { [18:01:38.456] if (TRUE) { [18:01:38.456] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.456] { [18:01:38.456] inherits <- base::inherits [18:01:38.456] invokeRestart <- base::invokeRestart [18:01:38.456] is.null <- base::is.null [18:01:38.456] muffled <- FALSE [18:01:38.456] if (inherits(cond, "message")) { [18:01:38.456] muffled <- grepl(pattern, "muffleMessage") [18:01:38.456] if (muffled) [18:01:38.456] invokeRestart("muffleMessage") [18:01:38.456] } [18:01:38.456] else if (inherits(cond, "warning")) { [18:01:38.456] muffled <- grepl(pattern, "muffleWarning") [18:01:38.456] if (muffled) [18:01:38.456] invokeRestart("muffleWarning") [18:01:38.456] } [18:01:38.456] else if (inherits(cond, "condition")) { [18:01:38.456] if (!is.null(pattern)) { [18:01:38.456] computeRestarts <- base::computeRestarts [18:01:38.456] grepl <- base::grepl [18:01:38.456] restarts <- computeRestarts(cond) [18:01:38.456] for (restart in restarts) { [18:01:38.456] name <- restart$name [18:01:38.456] if (is.null(name)) [18:01:38.456] next [18:01:38.456] if (!grepl(pattern, name)) [18:01:38.456] next [18:01:38.456] invokeRestart(restart) [18:01:38.456] muffled <- TRUE [18:01:38.456] break [18:01:38.456] } [18:01:38.456] } [18:01:38.456] } [18:01:38.456] invisible(muffled) [18:01:38.456] } [18:01:38.456] muffleCondition(cond, pattern = "^muffle") [18:01:38.456] } [18:01:38.456] } [18:01:38.456] } [18:01:38.456] })) [18:01:38.456] }, error = function(ex) { [18:01:38.456] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.456] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.456] ...future.rng), started = ...future.startTime, [18:01:38.456] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.456] version = "1.8"), class = "FutureResult") [18:01:38.456] }, finally = { [18:01:38.456] if (!identical(...future.workdir, getwd())) [18:01:38.456] setwd(...future.workdir) [18:01:38.456] { [18:01:38.456] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.456] ...future.oldOptions$nwarnings <- NULL [18:01:38.456] } [18:01:38.456] base::options(...future.oldOptions) [18:01:38.456] if (.Platform$OS.type == "windows") { [18:01:38.456] old_names <- names(...future.oldEnvVars) [18:01:38.456] envs <- base::Sys.getenv() [18:01:38.456] names <- names(envs) [18:01:38.456] common <- intersect(names, old_names) [18:01:38.456] added <- setdiff(names, old_names) [18:01:38.456] removed <- setdiff(old_names, names) [18:01:38.456] changed <- common[...future.oldEnvVars[common] != [18:01:38.456] envs[common]] [18:01:38.456] NAMES <- toupper(changed) [18:01:38.456] args <- list() [18:01:38.456] for (kk in seq_along(NAMES)) { [18:01:38.456] name <- changed[[kk]] [18:01:38.456] NAME <- NAMES[[kk]] [18:01:38.456] if (name != NAME && is.element(NAME, old_names)) [18:01:38.456] next [18:01:38.456] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.456] } [18:01:38.456] NAMES <- toupper(added) [18:01:38.456] for (kk in seq_along(NAMES)) { [18:01:38.456] name <- added[[kk]] [18:01:38.456] NAME <- NAMES[[kk]] [18:01:38.456] if (name != NAME && is.element(NAME, old_names)) [18:01:38.456] next [18:01:38.456] args[[name]] <- "" [18:01:38.456] } [18:01:38.456] NAMES <- toupper(removed) [18:01:38.456] for (kk in seq_along(NAMES)) { [18:01:38.456] name <- removed[[kk]] [18:01:38.456] NAME <- NAMES[[kk]] [18:01:38.456] if (name != NAME && is.element(NAME, old_names)) [18:01:38.456] next [18:01:38.456] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.456] } [18:01:38.456] if (length(args) > 0) [18:01:38.456] base::do.call(base::Sys.setenv, args = args) [18:01:38.456] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.456] } [18:01:38.456] else { [18:01:38.456] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.456] } [18:01:38.456] { [18:01:38.456] if (base::length(...future.futureOptionsAdded) > [18:01:38.456] 0L) { [18:01:38.456] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.456] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.456] base::options(opts) [18:01:38.456] } [18:01:38.456] { [18:01:38.456] { [18:01:38.456] NULL [18:01:38.456] RNGkind("Mersenne-Twister") [18:01:38.456] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.456] inherits = FALSE) [18:01:38.456] } [18:01:38.456] options(future.plan = NULL) [18:01:38.456] if (is.na(NA_character_)) [18:01:38.456] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.456] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.456] future::plan(list(function (..., envir = parent.frame()) [18:01:38.456] { [18:01:38.456] future <- SequentialFuture(..., envir = envir) [18:01:38.456] if (!future$lazy) [18:01:38.456] future <- run(future) [18:01:38.456] invisible(future) [18:01:38.456] }), .cleanup = FALSE, .init = FALSE) [18:01:38.456] } [18:01:38.456] } [18:01:38.456] } [18:01:38.456] }) [18:01:38.456] if (TRUE) { [18:01:38.456] base::sink(type = "output", split = FALSE) [18:01:38.456] if (TRUE) { [18:01:38.456] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.456] } [18:01:38.456] else { [18:01:38.456] ...future.result["stdout"] <- base::list(NULL) [18:01:38.456] } [18:01:38.456] base::close(...future.stdout) [18:01:38.456] ...future.stdout <- NULL [18:01:38.456] } [18:01:38.456] ...future.result$conditions <- ...future.conditions [18:01:38.456] ...future.result$finished <- base::Sys.time() [18:01:38.456] ...future.result [18:01:38.456] } [18:01:38.460] plan(): Setting new future strategy stack: [18:01:38.460] List of future strategies: [18:01:38.460] 1. sequential: [18:01:38.460] - args: function (..., envir = parent.frame()) [18:01:38.460] - tweaked: FALSE [18:01:38.460] - call: NULL [18:01:38.460] plan(): nbrOfWorkers() = 1 [18:01:38.462] plan(): Setting new future strategy stack: [18:01:38.463] List of future strategies: [18:01:38.463] 1. sequential: [18:01:38.463] - args: function (..., envir = parent.frame()) [18:01:38.463] - tweaked: FALSE [18:01:38.463] - call: plan(strategy) [18:01:38.463] plan(): nbrOfWorkers() = 1 [18:01:38.463] SequentialFuture started (and completed) [18:01:38.463] - Launch lazy future ... done [18:01:38.464] run() for 'SequentialFuture' ... done [18:01:38.464] getGlobalsAndPackages() ... [18:01:38.464] Searching for globals... [18:01:38.464] [18:01:38.465] Searching for globals ... DONE [18:01:38.465] - globals: [0] [18:01:38.465] getGlobalsAndPackages() ... DONE [18:01:38.465] run() for 'Future' ... [18:01:38.465] - state: 'created' [18:01:38.466] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.466] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.466] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.466] - Field: 'label' [18:01:38.466] - Field: 'local' [18:01:38.467] - Field: 'owner' [18:01:38.467] - Field: 'envir' [18:01:38.467] - Field: 'packages' [18:01:38.467] - Field: 'gc' [18:01:38.467] - Field: 'conditions' [18:01:38.468] - Field: 'expr' [18:01:38.468] - Field: 'uuid' [18:01:38.468] - Field: 'seed' [18:01:38.468] - Field: 'version' [18:01:38.468] - Field: 'result' [18:01:38.468] - Field: 'asynchronous' [18:01:38.469] - Field: 'calls' [18:01:38.469] - Field: 'globals' [18:01:38.469] - Field: 'stdout' [18:01:38.469] - Field: 'earlySignal' [18:01:38.469] - Field: 'lazy' [18:01:38.469] - Field: 'state' [18:01:38.470] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.470] - Launch lazy future ... [18:01:38.470] Packages needed by the future expression (n = 0): [18:01:38.470] Packages needed by future strategies (n = 0): [18:01:38.471] { [18:01:38.471] { [18:01:38.471] { [18:01:38.471] ...future.startTime <- base::Sys.time() [18:01:38.471] { [18:01:38.471] { [18:01:38.471] { [18:01:38.471] base::local({ [18:01:38.471] has_future <- base::requireNamespace("future", [18:01:38.471] quietly = TRUE) [18:01:38.471] if (has_future) { [18:01:38.471] ns <- base::getNamespace("future") [18:01:38.471] version <- ns[[".package"]][["version"]] [18:01:38.471] if (is.null(version)) [18:01:38.471] version <- utils::packageVersion("future") [18:01:38.471] } [18:01:38.471] else { [18:01:38.471] version <- NULL [18:01:38.471] } [18:01:38.471] if (!has_future || version < "1.8.0") { [18:01:38.471] info <- base::c(r_version = base::gsub("R version ", [18:01:38.471] "", base::R.version$version.string), [18:01:38.471] platform = base::sprintf("%s (%s-bit)", [18:01:38.471] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.471] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.471] "release", "version")], collapse = " "), [18:01:38.471] hostname = base::Sys.info()[["nodename"]]) [18:01:38.471] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.471] info) [18:01:38.471] info <- base::paste(info, collapse = "; ") [18:01:38.471] if (!has_future) { [18:01:38.471] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.471] info) [18:01:38.471] } [18:01:38.471] else { [18:01:38.471] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.471] info, version) [18:01:38.471] } [18:01:38.471] base::stop(msg) [18:01:38.471] } [18:01:38.471] }) [18:01:38.471] } [18:01:38.471] options(future.plan = NULL) [18:01:38.471] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.471] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.471] } [18:01:38.471] ...future.workdir <- getwd() [18:01:38.471] } [18:01:38.471] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.471] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.471] } [18:01:38.471] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.471] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.471] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.471] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.471] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.471] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.471] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.471] base::names(...future.oldOptions)) [18:01:38.471] } [18:01:38.471] if (FALSE) { [18:01:38.471] } [18:01:38.471] else { [18:01:38.471] if (TRUE) { [18:01:38.471] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.471] open = "w") [18:01:38.471] } [18:01:38.471] else { [18:01:38.471] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.471] windows = "NUL", "/dev/null"), open = "w") [18:01:38.471] } [18:01:38.471] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.471] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.471] base::sink(type = "output", split = FALSE) [18:01:38.471] base::close(...future.stdout) [18:01:38.471] }, add = TRUE) [18:01:38.471] } [18:01:38.471] ...future.frame <- base::sys.nframe() [18:01:38.471] ...future.conditions <- base::list() [18:01:38.471] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.471] if (FALSE) { [18:01:38.471] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.471] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.471] } [18:01:38.471] ...future.result <- base::tryCatch({ [18:01:38.471] base::withCallingHandlers({ [18:01:38.471] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.471] future::FutureResult(value = ...future.value$value, [18:01:38.471] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.471] ...future.rng), globalenv = if (FALSE) [18:01:38.471] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.471] ...future.globalenv.names)) [18:01:38.471] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.471] }, condition = base::local({ [18:01:38.471] c <- base::c [18:01:38.471] inherits <- base::inherits [18:01:38.471] invokeRestart <- base::invokeRestart [18:01:38.471] length <- base::length [18:01:38.471] list <- base::list [18:01:38.471] seq.int <- base::seq.int [18:01:38.471] signalCondition <- base::signalCondition [18:01:38.471] sys.calls <- base::sys.calls [18:01:38.471] `[[` <- base::`[[` [18:01:38.471] `+` <- base::`+` [18:01:38.471] `<<-` <- base::`<<-` [18:01:38.471] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.471] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.471] 3L)] [18:01:38.471] } [18:01:38.471] function(cond) { [18:01:38.471] is_error <- inherits(cond, "error") [18:01:38.471] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.471] NULL) [18:01:38.471] if (is_error) { [18:01:38.471] sessionInformation <- function() { [18:01:38.471] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.471] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.471] search = base::search(), system = base::Sys.info()) [18:01:38.471] } [18:01:38.471] ...future.conditions[[length(...future.conditions) + [18:01:38.471] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.471] cond$call), session = sessionInformation(), [18:01:38.471] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.471] signalCondition(cond) [18:01:38.471] } [18:01:38.471] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.471] "immediateCondition"))) { [18:01:38.471] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.471] ...future.conditions[[length(...future.conditions) + [18:01:38.471] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.471] if (TRUE && !signal) { [18:01:38.471] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.471] { [18:01:38.471] inherits <- base::inherits [18:01:38.471] invokeRestart <- base::invokeRestart [18:01:38.471] is.null <- base::is.null [18:01:38.471] muffled <- FALSE [18:01:38.471] if (inherits(cond, "message")) { [18:01:38.471] muffled <- grepl(pattern, "muffleMessage") [18:01:38.471] if (muffled) [18:01:38.471] invokeRestart("muffleMessage") [18:01:38.471] } [18:01:38.471] else if (inherits(cond, "warning")) { [18:01:38.471] muffled <- grepl(pattern, "muffleWarning") [18:01:38.471] if (muffled) [18:01:38.471] invokeRestart("muffleWarning") [18:01:38.471] } [18:01:38.471] else if (inherits(cond, "condition")) { [18:01:38.471] if (!is.null(pattern)) { [18:01:38.471] computeRestarts <- base::computeRestarts [18:01:38.471] grepl <- base::grepl [18:01:38.471] restarts <- computeRestarts(cond) [18:01:38.471] for (restart in restarts) { [18:01:38.471] name <- restart$name [18:01:38.471] if (is.null(name)) [18:01:38.471] next [18:01:38.471] if (!grepl(pattern, name)) [18:01:38.471] next [18:01:38.471] invokeRestart(restart) [18:01:38.471] muffled <- TRUE [18:01:38.471] break [18:01:38.471] } [18:01:38.471] } [18:01:38.471] } [18:01:38.471] invisible(muffled) [18:01:38.471] } [18:01:38.471] muffleCondition(cond, pattern = "^muffle") [18:01:38.471] } [18:01:38.471] } [18:01:38.471] else { [18:01:38.471] if (TRUE) { [18:01:38.471] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.471] { [18:01:38.471] inherits <- base::inherits [18:01:38.471] invokeRestart <- base::invokeRestart [18:01:38.471] is.null <- base::is.null [18:01:38.471] muffled <- FALSE [18:01:38.471] if (inherits(cond, "message")) { [18:01:38.471] muffled <- grepl(pattern, "muffleMessage") [18:01:38.471] if (muffled) [18:01:38.471] invokeRestart("muffleMessage") [18:01:38.471] } [18:01:38.471] else if (inherits(cond, "warning")) { [18:01:38.471] muffled <- grepl(pattern, "muffleWarning") [18:01:38.471] if (muffled) [18:01:38.471] invokeRestart("muffleWarning") [18:01:38.471] } [18:01:38.471] else if (inherits(cond, "condition")) { [18:01:38.471] if (!is.null(pattern)) { [18:01:38.471] computeRestarts <- base::computeRestarts [18:01:38.471] grepl <- base::grepl [18:01:38.471] restarts <- computeRestarts(cond) [18:01:38.471] for (restart in restarts) { [18:01:38.471] name <- restart$name [18:01:38.471] if (is.null(name)) [18:01:38.471] next [18:01:38.471] if (!grepl(pattern, name)) [18:01:38.471] next [18:01:38.471] invokeRestart(restart) [18:01:38.471] muffled <- TRUE [18:01:38.471] break [18:01:38.471] } [18:01:38.471] } [18:01:38.471] } [18:01:38.471] invisible(muffled) [18:01:38.471] } [18:01:38.471] muffleCondition(cond, pattern = "^muffle") [18:01:38.471] } [18:01:38.471] } [18:01:38.471] } [18:01:38.471] })) [18:01:38.471] }, error = function(ex) { [18:01:38.471] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.471] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.471] ...future.rng), started = ...future.startTime, [18:01:38.471] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.471] version = "1.8"), class = "FutureResult") [18:01:38.471] }, finally = { [18:01:38.471] if (!identical(...future.workdir, getwd())) [18:01:38.471] setwd(...future.workdir) [18:01:38.471] { [18:01:38.471] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.471] ...future.oldOptions$nwarnings <- NULL [18:01:38.471] } [18:01:38.471] base::options(...future.oldOptions) [18:01:38.471] if (.Platform$OS.type == "windows") { [18:01:38.471] old_names <- names(...future.oldEnvVars) [18:01:38.471] envs <- base::Sys.getenv() [18:01:38.471] names <- names(envs) [18:01:38.471] common <- intersect(names, old_names) [18:01:38.471] added <- setdiff(names, old_names) [18:01:38.471] removed <- setdiff(old_names, names) [18:01:38.471] changed <- common[...future.oldEnvVars[common] != [18:01:38.471] envs[common]] [18:01:38.471] NAMES <- toupper(changed) [18:01:38.471] args <- list() [18:01:38.471] for (kk in seq_along(NAMES)) { [18:01:38.471] name <- changed[[kk]] [18:01:38.471] NAME <- NAMES[[kk]] [18:01:38.471] if (name != NAME && is.element(NAME, old_names)) [18:01:38.471] next [18:01:38.471] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.471] } [18:01:38.471] NAMES <- toupper(added) [18:01:38.471] for (kk in seq_along(NAMES)) { [18:01:38.471] name <- added[[kk]] [18:01:38.471] NAME <- NAMES[[kk]] [18:01:38.471] if (name != NAME && is.element(NAME, old_names)) [18:01:38.471] next [18:01:38.471] args[[name]] <- "" [18:01:38.471] } [18:01:38.471] NAMES <- toupper(removed) [18:01:38.471] for (kk in seq_along(NAMES)) { [18:01:38.471] name <- removed[[kk]] [18:01:38.471] NAME <- NAMES[[kk]] [18:01:38.471] if (name != NAME && is.element(NAME, old_names)) [18:01:38.471] next [18:01:38.471] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.471] } [18:01:38.471] if (length(args) > 0) [18:01:38.471] base::do.call(base::Sys.setenv, args = args) [18:01:38.471] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.471] } [18:01:38.471] else { [18:01:38.471] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.471] } [18:01:38.471] { [18:01:38.471] if (base::length(...future.futureOptionsAdded) > [18:01:38.471] 0L) { [18:01:38.471] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.471] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.471] base::options(opts) [18:01:38.471] } [18:01:38.471] { [18:01:38.471] { [18:01:38.471] NULL [18:01:38.471] RNGkind("Mersenne-Twister") [18:01:38.471] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.471] inherits = FALSE) [18:01:38.471] } [18:01:38.471] options(future.plan = NULL) [18:01:38.471] if (is.na(NA_character_)) [18:01:38.471] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.471] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.471] future::plan(list(function (..., envir = parent.frame()) [18:01:38.471] { [18:01:38.471] future <- SequentialFuture(..., envir = envir) [18:01:38.471] if (!future$lazy) [18:01:38.471] future <- run(future) [18:01:38.471] invisible(future) [18:01:38.471] }), .cleanup = FALSE, .init = FALSE) [18:01:38.471] } [18:01:38.471] } [18:01:38.471] } [18:01:38.471] }) [18:01:38.471] if (TRUE) { [18:01:38.471] base::sink(type = "output", split = FALSE) [18:01:38.471] if (TRUE) { [18:01:38.471] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.471] } [18:01:38.471] else { [18:01:38.471] ...future.result["stdout"] <- base::list(NULL) [18:01:38.471] } [18:01:38.471] base::close(...future.stdout) [18:01:38.471] ...future.stdout <- NULL [18:01:38.471] } [18:01:38.471] ...future.result$conditions <- ...future.conditions [18:01:38.471] ...future.result$finished <- base::Sys.time() [18:01:38.471] ...future.result [18:01:38.471] } [18:01:38.475] plan(): Setting new future strategy stack: [18:01:38.475] List of future strategies: [18:01:38.475] 1. sequential: [18:01:38.475] - args: function (..., envir = parent.frame()) [18:01:38.475] - tweaked: FALSE [18:01:38.475] - call: NULL [18:01:38.475] plan(): nbrOfWorkers() = 1 [18:01:38.477] plan(): Setting new future strategy stack: [18:01:38.477] List of future strategies: [18:01:38.477] 1. sequential: [18:01:38.477] - args: function (..., envir = parent.frame()) [18:01:38.477] - tweaked: FALSE [18:01:38.477] - call: plan(strategy) [18:01:38.477] plan(): nbrOfWorkers() = 1 [18:01:38.477] SequentialFuture started (and completed) [18:01:38.478] - Launch lazy future ... done [18:01:38.478] 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" ... [18:01:38.484] resolved() for 'SequentialFuture' ... [18:01:38.484] - state: 'finished' [18:01:38.484] - run: TRUE [18:01:38.484] - result: 'FutureResult' [18:01:38.484] resolved() for 'SequentialFuture' ... done [18:01:38.485] resolved() for 'SequentialFuture' ... [18:01:38.485] - state: 'finished' [18:01:38.485] - run: TRUE [18:01:38.485] - result: 'FutureResult' [18:01:38.485] 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" "" ... [18:01:38.488] resolve() on list ... [18:01:38.488] recursive: 0 [18:01:38.488] length: 6 [18:01:38.488] elements: 'a', 'b', 'c', '', '', '' [18:01:38.488] signalConditionsASAP(numeric, pos=1) ... [18:01:38.489] - nx: 6 [18:01:38.489] - relay: TRUE [18:01:38.489] - stdout: TRUE [18:01:38.489] - signal: TRUE [18:01:38.489] - resignal: FALSE [18:01:38.489] - force: TRUE [18:01:38.489] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.490] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.490] - until=2 [18:01:38.490] - relaying element #2 [18:01:38.490] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.490] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.490] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.491] length: 5 (resolved future 1) [18:01:38.491] resolved() for 'SequentialFuture' ... [18:01:38.491] - state: 'finished' [18:01:38.491] - run: TRUE [18:01:38.491] - result: 'FutureResult' [18:01:38.491] resolved() for 'SequentialFuture' ... done [18:01:38.492] Future #2 [18:01:38.492] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.492] - nx: 6 [18:01:38.492] - relay: TRUE [18:01:38.492] - stdout: TRUE [18:01:38.492] - signal: TRUE [18:01:38.493] - resignal: FALSE [18:01:38.493] - force: TRUE [18:01:38.493] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.493] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.493] - until=2 [18:01:38.493] - relaying element #2 [18:01:38.494] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.494] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.494] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.494] length: 4 (resolved future 2) [18:01:38.494] resolved() for 'SequentialFuture' ... [18:01:38.495] - state: 'finished' [18:01:38.495] - run: TRUE [18:01:38.495] - result: 'FutureResult' [18:01:38.495] resolved() for 'SequentialFuture' ... done [18:01:38.495] Future #3 [18:01:38.496] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.496] - nx: 6 [18:01:38.496] - relay: TRUE [18:01:38.496] - stdout: TRUE [18:01:38.496] - signal: TRUE [18:01:38.496] - resignal: FALSE [18:01:38.496] - force: TRUE [18:01:38.497] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.497] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.497] - until=3 [18:01:38.497] - relaying element #3 [18:01:38.497] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.497] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.498] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.498] length: 3 (resolved future 3) [18:01:38.498] signalConditionsASAP(NULL, pos=4) ... [18:01:38.498] - nx: 6 [18:01:38.498] - relay: TRUE [18:01:38.498] - stdout: TRUE [18:01:38.499] - signal: TRUE [18:01:38.499] - resignal: FALSE [18:01:38.499] - force: TRUE [18:01:38.499] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.499] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.499] - until=5 [18:01:38.500] - relaying element #5 [18:01:38.500] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.500] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.500] signalConditionsASAP(NULL, pos=4) ... done [18:01:38.500] length: 2 (resolved future 4) [18:01:38.500] signalConditionsASAP(NULL, pos=5) ... [18:01:38.501] - nx: 6 [18:01:38.501] - relay: TRUE [18:01:38.501] - stdout: TRUE [18:01:38.501] - signal: TRUE [18:01:38.501] - resignal: FALSE [18:01:38.501] - force: TRUE [18:01:38.501] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.502] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.502] - until=6 [18:01:38.502] - relaying element #6 [18:01:38.503] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.503] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.503] signalConditionsASAP(NULL, pos=5) ... done [18:01:38.503] length: 1 (resolved future 5) [18:01:38.504] signalConditionsASAP(numeric, pos=6) ... [18:01:38.504] - nx: 6 [18:01:38.504] - relay: TRUE [18:01:38.504] - stdout: TRUE [18:01:38.504] - signal: TRUE [18:01:38.504] - resignal: FALSE [18:01:38.505] - force: TRUE [18:01:38.505] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.505] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.505] - until=6 [18:01:38.505] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.505] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.505] signalConditionsASAP(numeric, pos=6) ... done [18:01:38.506] length: 0 (resolved future 6) [18:01:38.506] Relaying remaining futures [18:01:38.506] signalConditionsASAP(NULL, pos=0) ... [18:01:38.506] - nx: 6 [18:01:38.506] - relay: TRUE [18:01:38.506] - stdout: TRUE [18:01:38.507] - signal: TRUE [18:01:38.507] - resignal: FALSE [18:01:38.507] - force: TRUE [18:01:38.507] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.507] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:38.507] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.508] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.508] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.508] 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) [18:01:38.512] getGlobalsAndPackages() ... [18:01:38.512] Searching for globals... [18:01:38.512] [18:01:38.512] Searching for globals ... DONE [18:01:38.513] - globals: [0] [18:01:38.513] getGlobalsAndPackages() ... DONE [18:01:38.513] run() for 'Future' ... [18:01:38.513] - state: 'created' [18:01:38.513] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.514] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.514] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.514] - Field: 'label' [18:01:38.514] - Field: 'local' [18:01:38.514] - Field: 'owner' [18:01:38.515] - Field: 'envir' [18:01:38.515] - Field: 'packages' [18:01:38.515] - Field: 'gc' [18:01:38.515] - Field: 'conditions' [18:01:38.515] - Field: 'expr' [18:01:38.516] - Field: 'uuid' [18:01:38.516] - Field: 'seed' [18:01:38.516] - Field: 'version' [18:01:38.516] - Field: 'result' [18:01:38.516] - Field: 'asynchronous' [18:01:38.516] - Field: 'calls' [18:01:38.517] - Field: 'globals' [18:01:38.517] - Field: 'stdout' [18:01:38.517] - Field: 'earlySignal' [18:01:38.517] - Field: 'lazy' [18:01:38.517] - Field: 'state' [18:01:38.517] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.518] - Launch lazy future ... [18:01:38.518] Packages needed by the future expression (n = 0): [18:01:38.518] Packages needed by future strategies (n = 0): [18:01:38.519] { [18:01:38.519] { [18:01:38.519] { [18:01:38.519] ...future.startTime <- base::Sys.time() [18:01:38.519] { [18:01:38.519] { [18:01:38.519] { [18:01:38.519] base::local({ [18:01:38.519] has_future <- base::requireNamespace("future", [18:01:38.519] quietly = TRUE) [18:01:38.519] if (has_future) { [18:01:38.519] ns <- base::getNamespace("future") [18:01:38.519] version <- ns[[".package"]][["version"]] [18:01:38.519] if (is.null(version)) [18:01:38.519] version <- utils::packageVersion("future") [18:01:38.519] } [18:01:38.519] else { [18:01:38.519] version <- NULL [18:01:38.519] } [18:01:38.519] if (!has_future || version < "1.8.0") { [18:01:38.519] info <- base::c(r_version = base::gsub("R version ", [18:01:38.519] "", base::R.version$version.string), [18:01:38.519] platform = base::sprintf("%s (%s-bit)", [18:01:38.519] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.519] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.519] "release", "version")], collapse = " "), [18:01:38.519] hostname = base::Sys.info()[["nodename"]]) [18:01:38.519] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.519] info) [18:01:38.519] info <- base::paste(info, collapse = "; ") [18:01:38.519] if (!has_future) { [18:01:38.519] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.519] info) [18:01:38.519] } [18:01:38.519] else { [18:01:38.519] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.519] info, version) [18:01:38.519] } [18:01:38.519] base::stop(msg) [18:01:38.519] } [18:01:38.519] }) [18:01:38.519] } [18:01:38.519] options(future.plan = NULL) [18:01:38.519] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.519] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.519] } [18:01:38.519] ...future.workdir <- getwd() [18:01:38.519] } [18:01:38.519] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.519] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.519] } [18:01:38.519] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.519] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.519] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.519] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.519] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.519] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.519] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.519] base::names(...future.oldOptions)) [18:01:38.519] } [18:01:38.519] if (FALSE) { [18:01:38.519] } [18:01:38.519] else { [18:01:38.519] if (TRUE) { [18:01:38.519] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.519] open = "w") [18:01:38.519] } [18:01:38.519] else { [18:01:38.519] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.519] windows = "NUL", "/dev/null"), open = "w") [18:01:38.519] } [18:01:38.519] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.519] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.519] base::sink(type = "output", split = FALSE) [18:01:38.519] base::close(...future.stdout) [18:01:38.519] }, add = TRUE) [18:01:38.519] } [18:01:38.519] ...future.frame <- base::sys.nframe() [18:01:38.519] ...future.conditions <- base::list() [18:01:38.519] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.519] if (FALSE) { [18:01:38.519] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.519] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.519] } [18:01:38.519] ...future.result <- base::tryCatch({ [18:01:38.519] base::withCallingHandlers({ [18:01:38.519] ...future.value <- base::withVisible(base::local(2)) [18:01:38.519] future::FutureResult(value = ...future.value$value, [18:01:38.519] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.519] ...future.rng), globalenv = if (FALSE) [18:01:38.519] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.519] ...future.globalenv.names)) [18:01:38.519] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.519] }, condition = base::local({ [18:01:38.519] c <- base::c [18:01:38.519] inherits <- base::inherits [18:01:38.519] invokeRestart <- base::invokeRestart [18:01:38.519] length <- base::length [18:01:38.519] list <- base::list [18:01:38.519] seq.int <- base::seq.int [18:01:38.519] signalCondition <- base::signalCondition [18:01:38.519] sys.calls <- base::sys.calls [18:01:38.519] `[[` <- base::`[[` [18:01:38.519] `+` <- base::`+` [18:01:38.519] `<<-` <- base::`<<-` [18:01:38.519] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.519] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.519] 3L)] [18:01:38.519] } [18:01:38.519] function(cond) { [18:01:38.519] is_error <- inherits(cond, "error") [18:01:38.519] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.519] NULL) [18:01:38.519] if (is_error) { [18:01:38.519] sessionInformation <- function() { [18:01:38.519] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.519] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.519] search = base::search(), system = base::Sys.info()) [18:01:38.519] } [18:01:38.519] ...future.conditions[[length(...future.conditions) + [18:01:38.519] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.519] cond$call), session = sessionInformation(), [18:01:38.519] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.519] signalCondition(cond) [18:01:38.519] } [18:01:38.519] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.519] "immediateCondition"))) { [18:01:38.519] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.519] ...future.conditions[[length(...future.conditions) + [18:01:38.519] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.519] if (TRUE && !signal) { [18:01:38.519] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.519] { [18:01:38.519] inherits <- base::inherits [18:01:38.519] invokeRestart <- base::invokeRestart [18:01:38.519] is.null <- base::is.null [18:01:38.519] muffled <- FALSE [18:01:38.519] if (inherits(cond, "message")) { [18:01:38.519] muffled <- grepl(pattern, "muffleMessage") [18:01:38.519] if (muffled) [18:01:38.519] invokeRestart("muffleMessage") [18:01:38.519] } [18:01:38.519] else if (inherits(cond, "warning")) { [18:01:38.519] muffled <- grepl(pattern, "muffleWarning") [18:01:38.519] if (muffled) [18:01:38.519] invokeRestart("muffleWarning") [18:01:38.519] } [18:01:38.519] else if (inherits(cond, "condition")) { [18:01:38.519] if (!is.null(pattern)) { [18:01:38.519] computeRestarts <- base::computeRestarts [18:01:38.519] grepl <- base::grepl [18:01:38.519] restarts <- computeRestarts(cond) [18:01:38.519] for (restart in restarts) { [18:01:38.519] name <- restart$name [18:01:38.519] if (is.null(name)) [18:01:38.519] next [18:01:38.519] if (!grepl(pattern, name)) [18:01:38.519] next [18:01:38.519] invokeRestart(restart) [18:01:38.519] muffled <- TRUE [18:01:38.519] break [18:01:38.519] } [18:01:38.519] } [18:01:38.519] } [18:01:38.519] invisible(muffled) [18:01:38.519] } [18:01:38.519] muffleCondition(cond, pattern = "^muffle") [18:01:38.519] } [18:01:38.519] } [18:01:38.519] else { [18:01:38.519] if (TRUE) { [18:01:38.519] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.519] { [18:01:38.519] inherits <- base::inherits [18:01:38.519] invokeRestart <- base::invokeRestart [18:01:38.519] is.null <- base::is.null [18:01:38.519] muffled <- FALSE [18:01:38.519] if (inherits(cond, "message")) { [18:01:38.519] muffled <- grepl(pattern, "muffleMessage") [18:01:38.519] if (muffled) [18:01:38.519] invokeRestart("muffleMessage") [18:01:38.519] } [18:01:38.519] else if (inherits(cond, "warning")) { [18:01:38.519] muffled <- grepl(pattern, "muffleWarning") [18:01:38.519] if (muffled) [18:01:38.519] invokeRestart("muffleWarning") [18:01:38.519] } [18:01:38.519] else if (inherits(cond, "condition")) { [18:01:38.519] if (!is.null(pattern)) { [18:01:38.519] computeRestarts <- base::computeRestarts [18:01:38.519] grepl <- base::grepl [18:01:38.519] restarts <- computeRestarts(cond) [18:01:38.519] for (restart in restarts) { [18:01:38.519] name <- restart$name [18:01:38.519] if (is.null(name)) [18:01:38.519] next [18:01:38.519] if (!grepl(pattern, name)) [18:01:38.519] next [18:01:38.519] invokeRestart(restart) [18:01:38.519] muffled <- TRUE [18:01:38.519] break [18:01:38.519] } [18:01:38.519] } [18:01:38.519] } [18:01:38.519] invisible(muffled) [18:01:38.519] } [18:01:38.519] muffleCondition(cond, pattern = "^muffle") [18:01:38.519] } [18:01:38.519] } [18:01:38.519] } [18:01:38.519] })) [18:01:38.519] }, error = function(ex) { [18:01:38.519] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.519] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.519] ...future.rng), started = ...future.startTime, [18:01:38.519] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.519] version = "1.8"), class = "FutureResult") [18:01:38.519] }, finally = { [18:01:38.519] if (!identical(...future.workdir, getwd())) [18:01:38.519] setwd(...future.workdir) [18:01:38.519] { [18:01:38.519] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.519] ...future.oldOptions$nwarnings <- NULL [18:01:38.519] } [18:01:38.519] base::options(...future.oldOptions) [18:01:38.519] if (.Platform$OS.type == "windows") { [18:01:38.519] old_names <- names(...future.oldEnvVars) [18:01:38.519] envs <- base::Sys.getenv() [18:01:38.519] names <- names(envs) [18:01:38.519] common <- intersect(names, old_names) [18:01:38.519] added <- setdiff(names, old_names) [18:01:38.519] removed <- setdiff(old_names, names) [18:01:38.519] changed <- common[...future.oldEnvVars[common] != [18:01:38.519] envs[common]] [18:01:38.519] NAMES <- toupper(changed) [18:01:38.519] args <- list() [18:01:38.519] for (kk in seq_along(NAMES)) { [18:01:38.519] name <- changed[[kk]] [18:01:38.519] NAME <- NAMES[[kk]] [18:01:38.519] if (name != NAME && is.element(NAME, old_names)) [18:01:38.519] next [18:01:38.519] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.519] } [18:01:38.519] NAMES <- toupper(added) [18:01:38.519] for (kk in seq_along(NAMES)) { [18:01:38.519] name <- added[[kk]] [18:01:38.519] NAME <- NAMES[[kk]] [18:01:38.519] if (name != NAME && is.element(NAME, old_names)) [18:01:38.519] next [18:01:38.519] args[[name]] <- "" [18:01:38.519] } [18:01:38.519] NAMES <- toupper(removed) [18:01:38.519] for (kk in seq_along(NAMES)) { [18:01:38.519] name <- removed[[kk]] [18:01:38.519] NAME <- NAMES[[kk]] [18:01:38.519] if (name != NAME && is.element(NAME, old_names)) [18:01:38.519] next [18:01:38.519] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.519] } [18:01:38.519] if (length(args) > 0) [18:01:38.519] base::do.call(base::Sys.setenv, args = args) [18:01:38.519] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.519] } [18:01:38.519] else { [18:01:38.519] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.519] } [18:01:38.519] { [18:01:38.519] if (base::length(...future.futureOptionsAdded) > [18:01:38.519] 0L) { [18:01:38.519] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.519] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.519] base::options(opts) [18:01:38.519] } [18:01:38.519] { [18:01:38.519] { [18:01:38.519] NULL [18:01:38.519] RNGkind("Mersenne-Twister") [18:01:38.519] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.519] inherits = FALSE) [18:01:38.519] } [18:01:38.519] options(future.plan = NULL) [18:01:38.519] if (is.na(NA_character_)) [18:01:38.519] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.519] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.519] future::plan(list(function (..., envir = parent.frame()) [18:01:38.519] { [18:01:38.519] future <- SequentialFuture(..., envir = envir) [18:01:38.519] if (!future$lazy) [18:01:38.519] future <- run(future) [18:01:38.519] invisible(future) [18:01:38.519] }), .cleanup = FALSE, .init = FALSE) [18:01:38.519] } [18:01:38.519] } [18:01:38.519] } [18:01:38.519] }) [18:01:38.519] if (TRUE) { [18:01:38.519] base::sink(type = "output", split = FALSE) [18:01:38.519] if (TRUE) { [18:01:38.519] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.519] } [18:01:38.519] else { [18:01:38.519] ...future.result["stdout"] <- base::list(NULL) [18:01:38.519] } [18:01:38.519] base::close(...future.stdout) [18:01:38.519] ...future.stdout <- NULL [18:01:38.519] } [18:01:38.519] ...future.result$conditions <- ...future.conditions [18:01:38.519] ...future.result$finished <- base::Sys.time() [18:01:38.519] ...future.result [18:01:38.519] } [18:01:38.522] plan(): Setting new future strategy stack: [18:01:38.523] List of future strategies: [18:01:38.523] 1. sequential: [18:01:38.523] - args: function (..., envir = parent.frame()) [18:01:38.523] - tweaked: FALSE [18:01:38.523] - call: NULL [18:01:38.523] plan(): nbrOfWorkers() = 1 [18:01:38.524] plan(): Setting new future strategy stack: [18:01:38.524] List of future strategies: [18:01:38.524] 1. sequential: [18:01:38.524] - args: function (..., envir = parent.frame()) [18:01:38.524] - tweaked: FALSE [18:01:38.524] - call: plan(strategy) [18:01:38.525] plan(): nbrOfWorkers() = 1 [18:01:38.525] SequentialFuture started (and completed) [18:01:38.525] - Launch lazy future ... done [18:01:38.525] run() for 'SequentialFuture' ... done [18:01:38.526] getGlobalsAndPackages() ... [18:01:38.526] Searching for globals... [18:01:38.526] [18:01:38.526] Searching for globals ... DONE [18:01:38.527] - globals: [0] [18:01:38.527] getGlobalsAndPackages() ... DONE [18:01:38.527] run() for 'Future' ... [18:01:38.527] - state: 'created' [18:01:38.527] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.528] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.528] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.528] - Field: 'label' [18:01:38.528] - Field: 'local' [18:01:38.528] - Field: 'owner' [18:01:38.529] - Field: 'envir' [18:01:38.529] - Field: 'packages' [18:01:38.529] - Field: 'gc' [18:01:38.529] - Field: 'conditions' [18:01:38.529] - Field: 'expr' [18:01:38.529] - Field: 'uuid' [18:01:38.530] - Field: 'seed' [18:01:38.530] - Field: 'version' [18:01:38.530] - Field: 'result' [18:01:38.530] - Field: 'asynchronous' [18:01:38.530] - Field: 'calls' [18:01:38.531] - Field: 'globals' [18:01:38.531] - Field: 'stdout' [18:01:38.531] - Field: 'earlySignal' [18:01:38.531] - Field: 'lazy' [18:01:38.531] - Field: 'state' [18:01:38.531] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.532] - Launch lazy future ... [18:01:38.532] Packages needed by the future expression (n = 0): [18:01:38.532] Packages needed by future strategies (n = 0): [18:01:38.533] { [18:01:38.533] { [18:01:38.533] { [18:01:38.533] ...future.startTime <- base::Sys.time() [18:01:38.533] { [18:01:38.533] { [18:01:38.533] { [18:01:38.533] base::local({ [18:01:38.533] has_future <- base::requireNamespace("future", [18:01:38.533] quietly = TRUE) [18:01:38.533] if (has_future) { [18:01:38.533] ns <- base::getNamespace("future") [18:01:38.533] version <- ns[[".package"]][["version"]] [18:01:38.533] if (is.null(version)) [18:01:38.533] version <- utils::packageVersion("future") [18:01:38.533] } [18:01:38.533] else { [18:01:38.533] version <- NULL [18:01:38.533] } [18:01:38.533] if (!has_future || version < "1.8.0") { [18:01:38.533] info <- base::c(r_version = base::gsub("R version ", [18:01:38.533] "", base::R.version$version.string), [18:01:38.533] platform = base::sprintf("%s (%s-bit)", [18:01:38.533] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.533] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.533] "release", "version")], collapse = " "), [18:01:38.533] hostname = base::Sys.info()[["nodename"]]) [18:01:38.533] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.533] info) [18:01:38.533] info <- base::paste(info, collapse = "; ") [18:01:38.533] if (!has_future) { [18:01:38.533] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.533] info) [18:01:38.533] } [18:01:38.533] else { [18:01:38.533] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.533] info, version) [18:01:38.533] } [18:01:38.533] base::stop(msg) [18:01:38.533] } [18:01:38.533] }) [18:01:38.533] } [18:01:38.533] options(future.plan = NULL) [18:01:38.533] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.533] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.533] } [18:01:38.533] ...future.workdir <- getwd() [18:01:38.533] } [18:01:38.533] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.533] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.533] } [18:01:38.533] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.533] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.533] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.533] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.533] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.533] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.533] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.533] base::names(...future.oldOptions)) [18:01:38.533] } [18:01:38.533] if (FALSE) { [18:01:38.533] } [18:01:38.533] else { [18:01:38.533] if (TRUE) { [18:01:38.533] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.533] open = "w") [18:01:38.533] } [18:01:38.533] else { [18:01:38.533] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.533] windows = "NUL", "/dev/null"), open = "w") [18:01:38.533] } [18:01:38.533] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.533] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.533] base::sink(type = "output", split = FALSE) [18:01:38.533] base::close(...future.stdout) [18:01:38.533] }, add = TRUE) [18:01:38.533] } [18:01:38.533] ...future.frame <- base::sys.nframe() [18:01:38.533] ...future.conditions <- base::list() [18:01:38.533] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.533] if (FALSE) { [18:01:38.533] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.533] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.533] } [18:01:38.533] ...future.result <- base::tryCatch({ [18:01:38.533] base::withCallingHandlers({ [18:01:38.533] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.533] future::FutureResult(value = ...future.value$value, [18:01:38.533] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.533] ...future.rng), globalenv = if (FALSE) [18:01:38.533] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.533] ...future.globalenv.names)) [18:01:38.533] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.533] }, condition = base::local({ [18:01:38.533] c <- base::c [18:01:38.533] inherits <- base::inherits [18:01:38.533] invokeRestart <- base::invokeRestart [18:01:38.533] length <- base::length [18:01:38.533] list <- base::list [18:01:38.533] seq.int <- base::seq.int [18:01:38.533] signalCondition <- base::signalCondition [18:01:38.533] sys.calls <- base::sys.calls [18:01:38.533] `[[` <- base::`[[` [18:01:38.533] `+` <- base::`+` [18:01:38.533] `<<-` <- base::`<<-` [18:01:38.533] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.533] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.533] 3L)] [18:01:38.533] } [18:01:38.533] function(cond) { [18:01:38.533] is_error <- inherits(cond, "error") [18:01:38.533] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.533] NULL) [18:01:38.533] if (is_error) { [18:01:38.533] sessionInformation <- function() { [18:01:38.533] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.533] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.533] search = base::search(), system = base::Sys.info()) [18:01:38.533] } [18:01:38.533] ...future.conditions[[length(...future.conditions) + [18:01:38.533] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.533] cond$call), session = sessionInformation(), [18:01:38.533] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.533] signalCondition(cond) [18:01:38.533] } [18:01:38.533] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.533] "immediateCondition"))) { [18:01:38.533] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.533] ...future.conditions[[length(...future.conditions) + [18:01:38.533] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.533] if (TRUE && !signal) { [18:01:38.533] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.533] { [18:01:38.533] inherits <- base::inherits [18:01:38.533] invokeRestart <- base::invokeRestart [18:01:38.533] is.null <- base::is.null [18:01:38.533] muffled <- FALSE [18:01:38.533] if (inherits(cond, "message")) { [18:01:38.533] muffled <- grepl(pattern, "muffleMessage") [18:01:38.533] if (muffled) [18:01:38.533] invokeRestart("muffleMessage") [18:01:38.533] } [18:01:38.533] else if (inherits(cond, "warning")) { [18:01:38.533] muffled <- grepl(pattern, "muffleWarning") [18:01:38.533] if (muffled) [18:01:38.533] invokeRestart("muffleWarning") [18:01:38.533] } [18:01:38.533] else if (inherits(cond, "condition")) { [18:01:38.533] if (!is.null(pattern)) { [18:01:38.533] computeRestarts <- base::computeRestarts [18:01:38.533] grepl <- base::grepl [18:01:38.533] restarts <- computeRestarts(cond) [18:01:38.533] for (restart in restarts) { [18:01:38.533] name <- restart$name [18:01:38.533] if (is.null(name)) [18:01:38.533] next [18:01:38.533] if (!grepl(pattern, name)) [18:01:38.533] next [18:01:38.533] invokeRestart(restart) [18:01:38.533] muffled <- TRUE [18:01:38.533] break [18:01:38.533] } [18:01:38.533] } [18:01:38.533] } [18:01:38.533] invisible(muffled) [18:01:38.533] } [18:01:38.533] muffleCondition(cond, pattern = "^muffle") [18:01:38.533] } [18:01:38.533] } [18:01:38.533] else { [18:01:38.533] if (TRUE) { [18:01:38.533] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.533] { [18:01:38.533] inherits <- base::inherits [18:01:38.533] invokeRestart <- base::invokeRestart [18:01:38.533] is.null <- base::is.null [18:01:38.533] muffled <- FALSE [18:01:38.533] if (inherits(cond, "message")) { [18:01:38.533] muffled <- grepl(pattern, "muffleMessage") [18:01:38.533] if (muffled) [18:01:38.533] invokeRestart("muffleMessage") [18:01:38.533] } [18:01:38.533] else if (inherits(cond, "warning")) { [18:01:38.533] muffled <- grepl(pattern, "muffleWarning") [18:01:38.533] if (muffled) [18:01:38.533] invokeRestart("muffleWarning") [18:01:38.533] } [18:01:38.533] else if (inherits(cond, "condition")) { [18:01:38.533] if (!is.null(pattern)) { [18:01:38.533] computeRestarts <- base::computeRestarts [18:01:38.533] grepl <- base::grepl [18:01:38.533] restarts <- computeRestarts(cond) [18:01:38.533] for (restart in restarts) { [18:01:38.533] name <- restart$name [18:01:38.533] if (is.null(name)) [18:01:38.533] next [18:01:38.533] if (!grepl(pattern, name)) [18:01:38.533] next [18:01:38.533] invokeRestart(restart) [18:01:38.533] muffled <- TRUE [18:01:38.533] break [18:01:38.533] } [18:01:38.533] } [18:01:38.533] } [18:01:38.533] invisible(muffled) [18:01:38.533] } [18:01:38.533] muffleCondition(cond, pattern = "^muffle") [18:01:38.533] } [18:01:38.533] } [18:01:38.533] } [18:01:38.533] })) [18:01:38.533] }, error = function(ex) { [18:01:38.533] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.533] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.533] ...future.rng), started = ...future.startTime, [18:01:38.533] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.533] version = "1.8"), class = "FutureResult") [18:01:38.533] }, finally = { [18:01:38.533] if (!identical(...future.workdir, getwd())) [18:01:38.533] setwd(...future.workdir) [18:01:38.533] { [18:01:38.533] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.533] ...future.oldOptions$nwarnings <- NULL [18:01:38.533] } [18:01:38.533] base::options(...future.oldOptions) [18:01:38.533] if (.Platform$OS.type == "windows") { [18:01:38.533] old_names <- names(...future.oldEnvVars) [18:01:38.533] envs <- base::Sys.getenv() [18:01:38.533] names <- names(envs) [18:01:38.533] common <- intersect(names, old_names) [18:01:38.533] added <- setdiff(names, old_names) [18:01:38.533] removed <- setdiff(old_names, names) [18:01:38.533] changed <- common[...future.oldEnvVars[common] != [18:01:38.533] envs[common]] [18:01:38.533] NAMES <- toupper(changed) [18:01:38.533] args <- list() [18:01:38.533] for (kk in seq_along(NAMES)) { [18:01:38.533] name <- changed[[kk]] [18:01:38.533] NAME <- NAMES[[kk]] [18:01:38.533] if (name != NAME && is.element(NAME, old_names)) [18:01:38.533] next [18:01:38.533] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.533] } [18:01:38.533] NAMES <- toupper(added) [18:01:38.533] for (kk in seq_along(NAMES)) { [18:01:38.533] name <- added[[kk]] [18:01:38.533] NAME <- NAMES[[kk]] [18:01:38.533] if (name != NAME && is.element(NAME, old_names)) [18:01:38.533] next [18:01:38.533] args[[name]] <- "" [18:01:38.533] } [18:01:38.533] NAMES <- toupper(removed) [18:01:38.533] for (kk in seq_along(NAMES)) { [18:01:38.533] name <- removed[[kk]] [18:01:38.533] NAME <- NAMES[[kk]] [18:01:38.533] if (name != NAME && is.element(NAME, old_names)) [18:01:38.533] next [18:01:38.533] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.533] } [18:01:38.533] if (length(args) > 0) [18:01:38.533] base::do.call(base::Sys.setenv, args = args) [18:01:38.533] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.533] } [18:01:38.533] else { [18:01:38.533] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.533] } [18:01:38.533] { [18:01:38.533] if (base::length(...future.futureOptionsAdded) > [18:01:38.533] 0L) { [18:01:38.533] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.533] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.533] base::options(opts) [18:01:38.533] } [18:01:38.533] { [18:01:38.533] { [18:01:38.533] NULL [18:01:38.533] RNGkind("Mersenne-Twister") [18:01:38.533] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.533] inherits = FALSE) [18:01:38.533] } [18:01:38.533] options(future.plan = NULL) [18:01:38.533] if (is.na(NA_character_)) [18:01:38.533] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.533] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.533] future::plan(list(function (..., envir = parent.frame()) [18:01:38.533] { [18:01:38.533] future <- SequentialFuture(..., envir = envir) [18:01:38.533] if (!future$lazy) [18:01:38.533] future <- run(future) [18:01:38.533] invisible(future) [18:01:38.533] }), .cleanup = FALSE, .init = FALSE) [18:01:38.533] } [18:01:38.533] } [18:01:38.533] } [18:01:38.533] }) [18:01:38.533] if (TRUE) { [18:01:38.533] base::sink(type = "output", split = FALSE) [18:01:38.533] if (TRUE) { [18:01:38.533] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.533] } [18:01:38.533] else { [18:01:38.533] ...future.result["stdout"] <- base::list(NULL) [18:01:38.533] } [18:01:38.533] base::close(...future.stdout) [18:01:38.533] ...future.stdout <- NULL [18:01:38.533] } [18:01:38.533] ...future.result$conditions <- ...future.conditions [18:01:38.533] ...future.result$finished <- base::Sys.time() [18:01:38.533] ...future.result [18:01:38.533] } [18:01:38.536] plan(): Setting new future strategy stack: [18:01:38.537] List of future strategies: [18:01:38.537] 1. sequential: [18:01:38.537] - args: function (..., envir = parent.frame()) [18:01:38.537] - tweaked: FALSE [18:01:38.537] - call: NULL [18:01:38.537] plan(): nbrOfWorkers() = 1 [18:01:38.538] plan(): Setting new future strategy stack: [18:01:38.538] List of future strategies: [18:01:38.538] 1. sequential: [18:01:38.538] - args: function (..., envir = parent.frame()) [18:01:38.538] - tweaked: FALSE [18:01:38.538] - call: plan(strategy) [18:01:38.539] plan(): nbrOfWorkers() = 1 [18:01:38.539] SequentialFuture started (and completed) [18:01:38.539] - Launch lazy future ... done [18:01:38.539] 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" [18:01:38.546] resolved() for 'SequentialFuture' ... [18:01:38.546] - state: 'finished' [18:01:38.547] - run: TRUE [18:01:38.547] - result: 'FutureResult' [18:01:38.547] resolved() for 'SequentialFuture' ... done [18:01:38.547] resolved() for 'SequentialFuture' ... [18:01:38.547] - state: 'finished' [18:01:38.548] - run: TRUE [18:01:38.548] - result: 'FutureResult' [18:01:38.548] 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" "" ... [18:01:38.550] resolve() on list ... [18:01:38.550] recursive: 0 [18:01:38.550] length: 6 [18:01:38.550] elements: 'a', 'b', 'c', '', '', '' [18:01:38.550] signalConditionsASAP(numeric, pos=1) ... [18:01:38.551] - nx: 6 [18:01:38.551] - relay: TRUE [18:01:38.551] - stdout: TRUE [18:01:38.551] - signal: TRUE [18:01:38.551] - resignal: FALSE [18:01:38.551] - force: TRUE [18:01:38.551] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.552] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.552] - until=2 [18:01:38.552] - relaying element #2 [18:01:38.552] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.552] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.552] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.553] length: 5 (resolved future 1) [18:01:38.553] resolved() for 'SequentialFuture' ... [18:01:38.553] - state: 'finished' [18:01:38.553] - run: TRUE [18:01:38.553] - result: 'FutureResult' [18:01:38.554] resolved() for 'SequentialFuture' ... done [18:01:38.554] Future #2 [18:01:38.554] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.554] - nx: 6 [18:01:38.554] - relay: TRUE [18:01:38.554] - stdout: TRUE [18:01:38.555] - signal: TRUE [18:01:38.555] - resignal: FALSE [18:01:38.555] - force: TRUE [18:01:38.555] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.555] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.555] - until=2 [18:01:38.555] - relaying element #2 [18:01:38.556] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.556] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.556] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.556] length: 4 (resolved future 2) [18:01:38.556] resolved() for 'SequentialFuture' ... [18:01:38.557] - state: 'finished' [18:01:38.557] - run: TRUE [18:01:38.557] - result: 'FutureResult' [18:01:38.557] resolved() for 'SequentialFuture' ... done [18:01:38.557] Future #3 [18:01:38.558] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.558] - nx: 6 [18:01:38.558] - relay: TRUE [18:01:38.558] - stdout: TRUE [18:01:38.558] - signal: TRUE [18:01:38.558] - resignal: FALSE [18:01:38.558] - force: TRUE [18:01:38.559] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.559] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.559] - until=3 [18:01:38.559] - relaying element #3 [18:01:38.559] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.559] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.560] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.560] length: 3 (resolved future 3) [18:01:38.560] signalConditionsASAP(NULL, pos=4) ... [18:01:38.560] - nx: 6 [18:01:38.560] - relay: TRUE [18:01:38.560] - stdout: TRUE [18:01:38.561] - signal: TRUE [18:01:38.561] - resignal: FALSE [18:01:38.561] - force: TRUE [18:01:38.561] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.561] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.561] - until=5 [18:01:38.562] - relaying element #5 [18:01:38.562] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.562] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.562] signalConditionsASAP(NULL, pos=4) ... done [18:01:38.562] length: 2 (resolved future 4) [18:01:38.562] signalConditionsASAP(NULL, pos=5) ... [18:01:38.562] - nx: 6 [18:01:38.563] - relay: TRUE [18:01:38.563] - stdout: TRUE [18:01:38.563] - signal: TRUE [18:01:38.563] - resignal: FALSE [18:01:38.563] - force: TRUE [18:01:38.563] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.563] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.564] - until=6 [18:01:38.564] - relaying element #6 [18:01:38.564] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.564] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.564] signalConditionsASAP(NULL, pos=5) ... done [18:01:38.564] length: 1 (resolved future 5) [18:01:38.565] signalConditionsASAP(numeric, pos=6) ... [18:01:38.565] - nx: 6 [18:01:38.565] - relay: TRUE [18:01:38.565] - stdout: TRUE [18:01:38.565] - signal: TRUE [18:01:38.565] - resignal: FALSE [18:01:38.566] - force: TRUE [18:01:38.566] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.566] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.566] - until=6 [18:01:38.566] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.566] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.566] signalConditionsASAP(numeric, pos=6) ... done [18:01:38.567] length: 0 (resolved future 6) [18:01:38.567] Relaying remaining futures [18:01:38.567] signalConditionsASAP(NULL, pos=0) ... [18:01:38.567] - nx: 6 [18:01:38.567] - relay: TRUE [18:01:38.567] - stdout: TRUE [18:01:38.568] - signal: TRUE [18:01:38.568] - resignal: FALSE [18:01:38.568] - force: TRUE [18:01:38.568] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.568] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:38.568] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.569] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.569] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.569] 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) [18:01:38.573] getGlobalsAndPackages() ... [18:01:38.573] Searching for globals... [18:01:38.573] [18:01:38.573] Searching for globals ... DONE [18:01:38.573] - globals: [0] [18:01:38.574] getGlobalsAndPackages() ... DONE [18:01:38.574] run() for 'Future' ... [18:01:38.574] - state: 'created' [18:01:38.574] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.575] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.575] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.575] - Field: 'label' [18:01:38.575] - Field: 'local' [18:01:38.575] - Field: 'owner' [18:01:38.576] - Field: 'envir' [18:01:38.576] - Field: 'packages' [18:01:38.576] - Field: 'gc' [18:01:38.576] - Field: 'conditions' [18:01:38.576] - Field: 'expr' [18:01:38.576] - Field: 'uuid' [18:01:38.577] - Field: 'seed' [18:01:38.577] - Field: 'version' [18:01:38.577] - Field: 'result' [18:01:38.577] - Field: 'asynchronous' [18:01:38.577] - Field: 'calls' [18:01:38.577] - Field: 'globals' [18:01:38.578] - Field: 'stdout' [18:01:38.578] - Field: 'earlySignal' [18:01:38.578] - Field: 'lazy' [18:01:38.578] - Field: 'state' [18:01:38.578] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.579] - Launch lazy future ... [18:01:38.579] Packages needed by the future expression (n = 0): [18:01:38.579] Packages needed by future strategies (n = 0): [18:01:38.579] { [18:01:38.579] { [18:01:38.579] { [18:01:38.579] ...future.startTime <- base::Sys.time() [18:01:38.579] { [18:01:38.579] { [18:01:38.579] { [18:01:38.579] base::local({ [18:01:38.579] has_future <- base::requireNamespace("future", [18:01:38.579] quietly = TRUE) [18:01:38.579] if (has_future) { [18:01:38.579] ns <- base::getNamespace("future") [18:01:38.579] version <- ns[[".package"]][["version"]] [18:01:38.579] if (is.null(version)) [18:01:38.579] version <- utils::packageVersion("future") [18:01:38.579] } [18:01:38.579] else { [18:01:38.579] version <- NULL [18:01:38.579] } [18:01:38.579] if (!has_future || version < "1.8.0") { [18:01:38.579] info <- base::c(r_version = base::gsub("R version ", [18:01:38.579] "", base::R.version$version.string), [18:01:38.579] platform = base::sprintf("%s (%s-bit)", [18:01:38.579] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.579] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.579] "release", "version")], collapse = " "), [18:01:38.579] hostname = base::Sys.info()[["nodename"]]) [18:01:38.579] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.579] info) [18:01:38.579] info <- base::paste(info, collapse = "; ") [18:01:38.579] if (!has_future) { [18:01:38.579] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.579] info) [18:01:38.579] } [18:01:38.579] else { [18:01:38.579] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.579] info, version) [18:01:38.579] } [18:01:38.579] base::stop(msg) [18:01:38.579] } [18:01:38.579] }) [18:01:38.579] } [18:01:38.579] options(future.plan = NULL) [18:01:38.579] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.579] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.579] } [18:01:38.579] ...future.workdir <- getwd() [18:01:38.579] } [18:01:38.579] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.579] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.579] } [18:01:38.579] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.579] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.579] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.579] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.579] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.579] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.579] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.579] base::names(...future.oldOptions)) [18:01:38.579] } [18:01:38.579] if (FALSE) { [18:01:38.579] } [18:01:38.579] else { [18:01:38.579] if (TRUE) { [18:01:38.579] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.579] open = "w") [18:01:38.579] } [18:01:38.579] else { [18:01:38.579] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.579] windows = "NUL", "/dev/null"), open = "w") [18:01:38.579] } [18:01:38.579] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.579] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.579] base::sink(type = "output", split = FALSE) [18:01:38.579] base::close(...future.stdout) [18:01:38.579] }, add = TRUE) [18:01:38.579] } [18:01:38.579] ...future.frame <- base::sys.nframe() [18:01:38.579] ...future.conditions <- base::list() [18:01:38.579] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.579] if (FALSE) { [18:01:38.579] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.579] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.579] } [18:01:38.579] ...future.result <- base::tryCatch({ [18:01:38.579] base::withCallingHandlers({ [18:01:38.579] ...future.value <- base::withVisible(base::local(2)) [18:01:38.579] future::FutureResult(value = ...future.value$value, [18:01:38.579] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.579] ...future.rng), globalenv = if (FALSE) [18:01:38.579] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.579] ...future.globalenv.names)) [18:01:38.579] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.579] }, condition = base::local({ [18:01:38.579] c <- base::c [18:01:38.579] inherits <- base::inherits [18:01:38.579] invokeRestart <- base::invokeRestart [18:01:38.579] length <- base::length [18:01:38.579] list <- base::list [18:01:38.579] seq.int <- base::seq.int [18:01:38.579] signalCondition <- base::signalCondition [18:01:38.579] sys.calls <- base::sys.calls [18:01:38.579] `[[` <- base::`[[` [18:01:38.579] `+` <- base::`+` [18:01:38.579] `<<-` <- base::`<<-` [18:01:38.579] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.579] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.579] 3L)] [18:01:38.579] } [18:01:38.579] function(cond) { [18:01:38.579] is_error <- inherits(cond, "error") [18:01:38.579] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.579] NULL) [18:01:38.579] if (is_error) { [18:01:38.579] sessionInformation <- function() { [18:01:38.579] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.579] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.579] search = base::search(), system = base::Sys.info()) [18:01:38.579] } [18:01:38.579] ...future.conditions[[length(...future.conditions) + [18:01:38.579] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.579] cond$call), session = sessionInformation(), [18:01:38.579] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.579] signalCondition(cond) [18:01:38.579] } [18:01:38.579] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.579] "immediateCondition"))) { [18:01:38.579] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.579] ...future.conditions[[length(...future.conditions) + [18:01:38.579] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.579] if (TRUE && !signal) { [18:01:38.579] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.579] { [18:01:38.579] inherits <- base::inherits [18:01:38.579] invokeRestart <- base::invokeRestart [18:01:38.579] is.null <- base::is.null [18:01:38.579] muffled <- FALSE [18:01:38.579] if (inherits(cond, "message")) { [18:01:38.579] muffled <- grepl(pattern, "muffleMessage") [18:01:38.579] if (muffled) [18:01:38.579] invokeRestart("muffleMessage") [18:01:38.579] } [18:01:38.579] else if (inherits(cond, "warning")) { [18:01:38.579] muffled <- grepl(pattern, "muffleWarning") [18:01:38.579] if (muffled) [18:01:38.579] invokeRestart("muffleWarning") [18:01:38.579] } [18:01:38.579] else if (inherits(cond, "condition")) { [18:01:38.579] if (!is.null(pattern)) { [18:01:38.579] computeRestarts <- base::computeRestarts [18:01:38.579] grepl <- base::grepl [18:01:38.579] restarts <- computeRestarts(cond) [18:01:38.579] for (restart in restarts) { [18:01:38.579] name <- restart$name [18:01:38.579] if (is.null(name)) [18:01:38.579] next [18:01:38.579] if (!grepl(pattern, name)) [18:01:38.579] next [18:01:38.579] invokeRestart(restart) [18:01:38.579] muffled <- TRUE [18:01:38.579] break [18:01:38.579] } [18:01:38.579] } [18:01:38.579] } [18:01:38.579] invisible(muffled) [18:01:38.579] } [18:01:38.579] muffleCondition(cond, pattern = "^muffle") [18:01:38.579] } [18:01:38.579] } [18:01:38.579] else { [18:01:38.579] if (TRUE) { [18:01:38.579] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.579] { [18:01:38.579] inherits <- base::inherits [18:01:38.579] invokeRestart <- base::invokeRestart [18:01:38.579] is.null <- base::is.null [18:01:38.579] muffled <- FALSE [18:01:38.579] if (inherits(cond, "message")) { [18:01:38.579] muffled <- grepl(pattern, "muffleMessage") [18:01:38.579] if (muffled) [18:01:38.579] invokeRestart("muffleMessage") [18:01:38.579] } [18:01:38.579] else if (inherits(cond, "warning")) { [18:01:38.579] muffled <- grepl(pattern, "muffleWarning") [18:01:38.579] if (muffled) [18:01:38.579] invokeRestart("muffleWarning") [18:01:38.579] } [18:01:38.579] else if (inherits(cond, "condition")) { [18:01:38.579] if (!is.null(pattern)) { [18:01:38.579] computeRestarts <- base::computeRestarts [18:01:38.579] grepl <- base::grepl [18:01:38.579] restarts <- computeRestarts(cond) [18:01:38.579] for (restart in restarts) { [18:01:38.579] name <- restart$name [18:01:38.579] if (is.null(name)) [18:01:38.579] next [18:01:38.579] if (!grepl(pattern, name)) [18:01:38.579] next [18:01:38.579] invokeRestart(restart) [18:01:38.579] muffled <- TRUE [18:01:38.579] break [18:01:38.579] } [18:01:38.579] } [18:01:38.579] } [18:01:38.579] invisible(muffled) [18:01:38.579] } [18:01:38.579] muffleCondition(cond, pattern = "^muffle") [18:01:38.579] } [18:01:38.579] } [18:01:38.579] } [18:01:38.579] })) [18:01:38.579] }, error = function(ex) { [18:01:38.579] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.579] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.579] ...future.rng), started = ...future.startTime, [18:01:38.579] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.579] version = "1.8"), class = "FutureResult") [18:01:38.579] }, finally = { [18:01:38.579] if (!identical(...future.workdir, getwd())) [18:01:38.579] setwd(...future.workdir) [18:01:38.579] { [18:01:38.579] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.579] ...future.oldOptions$nwarnings <- NULL [18:01:38.579] } [18:01:38.579] base::options(...future.oldOptions) [18:01:38.579] if (.Platform$OS.type == "windows") { [18:01:38.579] old_names <- names(...future.oldEnvVars) [18:01:38.579] envs <- base::Sys.getenv() [18:01:38.579] names <- names(envs) [18:01:38.579] common <- intersect(names, old_names) [18:01:38.579] added <- setdiff(names, old_names) [18:01:38.579] removed <- setdiff(old_names, names) [18:01:38.579] changed <- common[...future.oldEnvVars[common] != [18:01:38.579] envs[common]] [18:01:38.579] NAMES <- toupper(changed) [18:01:38.579] args <- list() [18:01:38.579] for (kk in seq_along(NAMES)) { [18:01:38.579] name <- changed[[kk]] [18:01:38.579] NAME <- NAMES[[kk]] [18:01:38.579] if (name != NAME && is.element(NAME, old_names)) [18:01:38.579] next [18:01:38.579] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.579] } [18:01:38.579] NAMES <- toupper(added) [18:01:38.579] for (kk in seq_along(NAMES)) { [18:01:38.579] name <- added[[kk]] [18:01:38.579] NAME <- NAMES[[kk]] [18:01:38.579] if (name != NAME && is.element(NAME, old_names)) [18:01:38.579] next [18:01:38.579] args[[name]] <- "" [18:01:38.579] } [18:01:38.579] NAMES <- toupper(removed) [18:01:38.579] for (kk in seq_along(NAMES)) { [18:01:38.579] name <- removed[[kk]] [18:01:38.579] NAME <- NAMES[[kk]] [18:01:38.579] if (name != NAME && is.element(NAME, old_names)) [18:01:38.579] next [18:01:38.579] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.579] } [18:01:38.579] if (length(args) > 0) [18:01:38.579] base::do.call(base::Sys.setenv, args = args) [18:01:38.579] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.579] } [18:01:38.579] else { [18:01:38.579] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.579] } [18:01:38.579] { [18:01:38.579] if (base::length(...future.futureOptionsAdded) > [18:01:38.579] 0L) { [18:01:38.579] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.579] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.579] base::options(opts) [18:01:38.579] } [18:01:38.579] { [18:01:38.579] { [18:01:38.579] NULL [18:01:38.579] RNGkind("Mersenne-Twister") [18:01:38.579] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.579] inherits = FALSE) [18:01:38.579] } [18:01:38.579] options(future.plan = NULL) [18:01:38.579] if (is.na(NA_character_)) [18:01:38.579] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.579] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.579] future::plan(list(function (..., envir = parent.frame()) [18:01:38.579] { [18:01:38.579] future <- SequentialFuture(..., envir = envir) [18:01:38.579] if (!future$lazy) [18:01:38.579] future <- run(future) [18:01:38.579] invisible(future) [18:01:38.579] }), .cleanup = FALSE, .init = FALSE) [18:01:38.579] } [18:01:38.579] } [18:01:38.579] } [18:01:38.579] }) [18:01:38.579] if (TRUE) { [18:01:38.579] base::sink(type = "output", split = FALSE) [18:01:38.579] if (TRUE) { [18:01:38.579] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.579] } [18:01:38.579] else { [18:01:38.579] ...future.result["stdout"] <- base::list(NULL) [18:01:38.579] } [18:01:38.579] base::close(...future.stdout) [18:01:38.579] ...future.stdout <- NULL [18:01:38.579] } [18:01:38.579] ...future.result$conditions <- ...future.conditions [18:01:38.579] ...future.result$finished <- base::Sys.time() [18:01:38.579] ...future.result [18:01:38.579] } [18:01:38.583] plan(): Setting new future strategy stack: [18:01:38.584] List of future strategies: [18:01:38.584] 1. sequential: [18:01:38.584] - args: function (..., envir = parent.frame()) [18:01:38.584] - tweaked: FALSE [18:01:38.584] - call: NULL [18:01:38.584] plan(): nbrOfWorkers() = 1 [18:01:38.586] plan(): Setting new future strategy stack: [18:01:38.586] List of future strategies: [18:01:38.586] 1. sequential: [18:01:38.586] - args: function (..., envir = parent.frame()) [18:01:38.586] - tweaked: FALSE [18:01:38.586] - call: plan(strategy) [18:01:38.587] plan(): nbrOfWorkers() = 1 [18:01:38.587] SequentialFuture started (and completed) [18:01:38.587] - Launch lazy future ... done [18:01:38.587] run() for 'SequentialFuture' ... done [18:01:38.587] getGlobalsAndPackages() ... [18:01:38.588] Searching for globals... [18:01:38.588] [18:01:38.588] Searching for globals ... DONE [18:01:38.588] - globals: [0] [18:01:38.588] getGlobalsAndPackages() ... DONE [18:01:38.589] run() for 'Future' ... [18:01:38.589] - state: 'created' [18:01:38.589] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.589] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.590] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.590] - Field: 'label' [18:01:38.590] - Field: 'local' [18:01:38.590] - Field: 'owner' [18:01:38.590] - Field: 'envir' [18:01:38.591] - Field: 'packages' [18:01:38.591] - Field: 'gc' [18:01:38.591] - Field: 'conditions' [18:01:38.591] - Field: 'expr' [18:01:38.591] - Field: 'uuid' [18:01:38.591] - Field: 'seed' [18:01:38.592] - Field: 'version' [18:01:38.592] - Field: 'result' [18:01:38.592] - Field: 'asynchronous' [18:01:38.592] - Field: 'calls' [18:01:38.592] - Field: 'globals' [18:01:38.592] - Field: 'stdout' [18:01:38.593] - Field: 'earlySignal' [18:01:38.593] - Field: 'lazy' [18:01:38.593] - Field: 'state' [18:01:38.593] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.593] - Launch lazy future ... [18:01:38.594] Packages needed by the future expression (n = 0): [18:01:38.594] Packages needed by future strategies (n = 0): [18:01:38.594] { [18:01:38.594] { [18:01:38.594] { [18:01:38.594] ...future.startTime <- base::Sys.time() [18:01:38.594] { [18:01:38.594] { [18:01:38.594] { [18:01:38.594] base::local({ [18:01:38.594] has_future <- base::requireNamespace("future", [18:01:38.594] quietly = TRUE) [18:01:38.594] if (has_future) { [18:01:38.594] ns <- base::getNamespace("future") [18:01:38.594] version <- ns[[".package"]][["version"]] [18:01:38.594] if (is.null(version)) [18:01:38.594] version <- utils::packageVersion("future") [18:01:38.594] } [18:01:38.594] else { [18:01:38.594] version <- NULL [18:01:38.594] } [18:01:38.594] if (!has_future || version < "1.8.0") { [18:01:38.594] info <- base::c(r_version = base::gsub("R version ", [18:01:38.594] "", base::R.version$version.string), [18:01:38.594] platform = base::sprintf("%s (%s-bit)", [18:01:38.594] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.594] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.594] "release", "version")], collapse = " "), [18:01:38.594] hostname = base::Sys.info()[["nodename"]]) [18:01:38.594] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.594] info) [18:01:38.594] info <- base::paste(info, collapse = "; ") [18:01:38.594] if (!has_future) { [18:01:38.594] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.594] info) [18:01:38.594] } [18:01:38.594] else { [18:01:38.594] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.594] info, version) [18:01:38.594] } [18:01:38.594] base::stop(msg) [18:01:38.594] } [18:01:38.594] }) [18:01:38.594] } [18:01:38.594] options(future.plan = NULL) [18:01:38.594] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.594] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.594] } [18:01:38.594] ...future.workdir <- getwd() [18:01:38.594] } [18:01:38.594] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.594] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.594] } [18:01:38.594] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.594] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.594] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.594] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.594] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.594] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.594] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.594] base::names(...future.oldOptions)) [18:01:38.594] } [18:01:38.594] if (FALSE) { [18:01:38.594] } [18:01:38.594] else { [18:01:38.594] if (TRUE) { [18:01:38.594] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.594] open = "w") [18:01:38.594] } [18:01:38.594] else { [18:01:38.594] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.594] windows = "NUL", "/dev/null"), open = "w") [18:01:38.594] } [18:01:38.594] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.594] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.594] base::sink(type = "output", split = FALSE) [18:01:38.594] base::close(...future.stdout) [18:01:38.594] }, add = TRUE) [18:01:38.594] } [18:01:38.594] ...future.frame <- base::sys.nframe() [18:01:38.594] ...future.conditions <- base::list() [18:01:38.594] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.594] if (FALSE) { [18:01:38.594] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.594] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.594] } [18:01:38.594] ...future.result <- base::tryCatch({ [18:01:38.594] base::withCallingHandlers({ [18:01:38.594] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.594] future::FutureResult(value = ...future.value$value, [18:01:38.594] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.594] ...future.rng), globalenv = if (FALSE) [18:01:38.594] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.594] ...future.globalenv.names)) [18:01:38.594] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.594] }, condition = base::local({ [18:01:38.594] c <- base::c [18:01:38.594] inherits <- base::inherits [18:01:38.594] invokeRestart <- base::invokeRestart [18:01:38.594] length <- base::length [18:01:38.594] list <- base::list [18:01:38.594] seq.int <- base::seq.int [18:01:38.594] signalCondition <- base::signalCondition [18:01:38.594] sys.calls <- base::sys.calls [18:01:38.594] `[[` <- base::`[[` [18:01:38.594] `+` <- base::`+` [18:01:38.594] `<<-` <- base::`<<-` [18:01:38.594] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.594] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.594] 3L)] [18:01:38.594] } [18:01:38.594] function(cond) { [18:01:38.594] is_error <- inherits(cond, "error") [18:01:38.594] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.594] NULL) [18:01:38.594] if (is_error) { [18:01:38.594] sessionInformation <- function() { [18:01:38.594] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.594] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.594] search = base::search(), system = base::Sys.info()) [18:01:38.594] } [18:01:38.594] ...future.conditions[[length(...future.conditions) + [18:01:38.594] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.594] cond$call), session = sessionInformation(), [18:01:38.594] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.594] signalCondition(cond) [18:01:38.594] } [18:01:38.594] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.594] "immediateCondition"))) { [18:01:38.594] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.594] ...future.conditions[[length(...future.conditions) + [18:01:38.594] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.594] if (TRUE && !signal) { [18:01:38.594] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.594] { [18:01:38.594] inherits <- base::inherits [18:01:38.594] invokeRestart <- base::invokeRestart [18:01:38.594] is.null <- base::is.null [18:01:38.594] muffled <- FALSE [18:01:38.594] if (inherits(cond, "message")) { [18:01:38.594] muffled <- grepl(pattern, "muffleMessage") [18:01:38.594] if (muffled) [18:01:38.594] invokeRestart("muffleMessage") [18:01:38.594] } [18:01:38.594] else if (inherits(cond, "warning")) { [18:01:38.594] muffled <- grepl(pattern, "muffleWarning") [18:01:38.594] if (muffled) [18:01:38.594] invokeRestart("muffleWarning") [18:01:38.594] } [18:01:38.594] else if (inherits(cond, "condition")) { [18:01:38.594] if (!is.null(pattern)) { [18:01:38.594] computeRestarts <- base::computeRestarts [18:01:38.594] grepl <- base::grepl [18:01:38.594] restarts <- computeRestarts(cond) [18:01:38.594] for (restart in restarts) { [18:01:38.594] name <- restart$name [18:01:38.594] if (is.null(name)) [18:01:38.594] next [18:01:38.594] if (!grepl(pattern, name)) [18:01:38.594] next [18:01:38.594] invokeRestart(restart) [18:01:38.594] muffled <- TRUE [18:01:38.594] break [18:01:38.594] } [18:01:38.594] } [18:01:38.594] } [18:01:38.594] invisible(muffled) [18:01:38.594] } [18:01:38.594] muffleCondition(cond, pattern = "^muffle") [18:01:38.594] } [18:01:38.594] } [18:01:38.594] else { [18:01:38.594] if (TRUE) { [18:01:38.594] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.594] { [18:01:38.594] inherits <- base::inherits [18:01:38.594] invokeRestart <- base::invokeRestart [18:01:38.594] is.null <- base::is.null [18:01:38.594] muffled <- FALSE [18:01:38.594] if (inherits(cond, "message")) { [18:01:38.594] muffled <- grepl(pattern, "muffleMessage") [18:01:38.594] if (muffled) [18:01:38.594] invokeRestart("muffleMessage") [18:01:38.594] } [18:01:38.594] else if (inherits(cond, "warning")) { [18:01:38.594] muffled <- grepl(pattern, "muffleWarning") [18:01:38.594] if (muffled) [18:01:38.594] invokeRestart("muffleWarning") [18:01:38.594] } [18:01:38.594] else if (inherits(cond, "condition")) { [18:01:38.594] if (!is.null(pattern)) { [18:01:38.594] computeRestarts <- base::computeRestarts [18:01:38.594] grepl <- base::grepl [18:01:38.594] restarts <- computeRestarts(cond) [18:01:38.594] for (restart in restarts) { [18:01:38.594] name <- restart$name [18:01:38.594] if (is.null(name)) [18:01:38.594] next [18:01:38.594] if (!grepl(pattern, name)) [18:01:38.594] next [18:01:38.594] invokeRestart(restart) [18:01:38.594] muffled <- TRUE [18:01:38.594] break [18:01:38.594] } [18:01:38.594] } [18:01:38.594] } [18:01:38.594] invisible(muffled) [18:01:38.594] } [18:01:38.594] muffleCondition(cond, pattern = "^muffle") [18:01:38.594] } [18:01:38.594] } [18:01:38.594] } [18:01:38.594] })) [18:01:38.594] }, error = function(ex) { [18:01:38.594] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.594] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.594] ...future.rng), started = ...future.startTime, [18:01:38.594] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.594] version = "1.8"), class = "FutureResult") [18:01:38.594] }, finally = { [18:01:38.594] if (!identical(...future.workdir, getwd())) [18:01:38.594] setwd(...future.workdir) [18:01:38.594] { [18:01:38.594] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.594] ...future.oldOptions$nwarnings <- NULL [18:01:38.594] } [18:01:38.594] base::options(...future.oldOptions) [18:01:38.594] if (.Platform$OS.type == "windows") { [18:01:38.594] old_names <- names(...future.oldEnvVars) [18:01:38.594] envs <- base::Sys.getenv() [18:01:38.594] names <- names(envs) [18:01:38.594] common <- intersect(names, old_names) [18:01:38.594] added <- setdiff(names, old_names) [18:01:38.594] removed <- setdiff(old_names, names) [18:01:38.594] changed <- common[...future.oldEnvVars[common] != [18:01:38.594] envs[common]] [18:01:38.594] NAMES <- toupper(changed) [18:01:38.594] args <- list() [18:01:38.594] for (kk in seq_along(NAMES)) { [18:01:38.594] name <- changed[[kk]] [18:01:38.594] NAME <- NAMES[[kk]] [18:01:38.594] if (name != NAME && is.element(NAME, old_names)) [18:01:38.594] next [18:01:38.594] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.594] } [18:01:38.594] NAMES <- toupper(added) [18:01:38.594] for (kk in seq_along(NAMES)) { [18:01:38.594] name <- added[[kk]] [18:01:38.594] NAME <- NAMES[[kk]] [18:01:38.594] if (name != NAME && is.element(NAME, old_names)) [18:01:38.594] next [18:01:38.594] args[[name]] <- "" [18:01:38.594] } [18:01:38.594] NAMES <- toupper(removed) [18:01:38.594] for (kk in seq_along(NAMES)) { [18:01:38.594] name <- removed[[kk]] [18:01:38.594] NAME <- NAMES[[kk]] [18:01:38.594] if (name != NAME && is.element(NAME, old_names)) [18:01:38.594] next [18:01:38.594] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.594] } [18:01:38.594] if (length(args) > 0) [18:01:38.594] base::do.call(base::Sys.setenv, args = args) [18:01:38.594] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.594] } [18:01:38.594] else { [18:01:38.594] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.594] } [18:01:38.594] { [18:01:38.594] if (base::length(...future.futureOptionsAdded) > [18:01:38.594] 0L) { [18:01:38.594] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.594] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.594] base::options(opts) [18:01:38.594] } [18:01:38.594] { [18:01:38.594] { [18:01:38.594] NULL [18:01:38.594] RNGkind("Mersenne-Twister") [18:01:38.594] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.594] inherits = FALSE) [18:01:38.594] } [18:01:38.594] options(future.plan = NULL) [18:01:38.594] if (is.na(NA_character_)) [18:01:38.594] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.594] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.594] future::plan(list(function (..., envir = parent.frame()) [18:01:38.594] { [18:01:38.594] future <- SequentialFuture(..., envir = envir) [18:01:38.594] if (!future$lazy) [18:01:38.594] future <- run(future) [18:01:38.594] invisible(future) [18:01:38.594] }), .cleanup = FALSE, .init = FALSE) [18:01:38.594] } [18:01:38.594] } [18:01:38.594] } [18:01:38.594] }) [18:01:38.594] if (TRUE) { [18:01:38.594] base::sink(type = "output", split = FALSE) [18:01:38.594] if (TRUE) { [18:01:38.594] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.594] } [18:01:38.594] else { [18:01:38.594] ...future.result["stdout"] <- base::list(NULL) [18:01:38.594] } [18:01:38.594] base::close(...future.stdout) [18:01:38.594] ...future.stdout <- NULL [18:01:38.594] } [18:01:38.594] ...future.result$conditions <- ...future.conditions [18:01:38.594] ...future.result$finished <- base::Sys.time() [18:01:38.594] ...future.result [18:01:38.594] } [18:01:38.598] plan(): Setting new future strategy stack: [18:01:38.598] List of future strategies: [18:01:38.598] 1. sequential: [18:01:38.598] - args: function (..., envir = parent.frame()) [18:01:38.598] - tweaked: FALSE [18:01:38.598] - call: NULL [18:01:38.599] plan(): nbrOfWorkers() = 1 [18:01:38.600] plan(): Setting new future strategy stack: [18:01:38.600] List of future strategies: [18:01:38.600] 1. sequential: [18:01:38.600] - args: function (..., envir = parent.frame()) [18:01:38.600] - tweaked: FALSE [18:01:38.600] - call: plan(strategy) [18:01:38.601] plan(): nbrOfWorkers() = 1 [18:01:38.601] SequentialFuture started (and completed) [18:01:38.601] - Launch lazy future ... done [18:01:38.601] 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" [18:01:38.607] resolved() for 'SequentialFuture' ... [18:01:38.607] - state: 'finished' [18:01:38.608] - run: TRUE [18:01:38.608] - result: 'FutureResult' [18:01:38.608] resolved() for 'SequentialFuture' ... done [18:01:38.608] resolved() for 'SequentialFuture' ... [18:01:38.608] - state: 'finished' [18:01:38.609] - run: TRUE [18:01:38.609] - result: 'FutureResult' [18:01:38.609] 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" "" ... [18:01:38.611] resolve() on list ... [18:01:38.611] recursive: 0 [18:01:38.612] length: 6 [18:01:38.612] elements: 'a', 'b', 'c', '', '', '' [18:01:38.612] signalConditionsASAP(numeric, pos=1) ... [18:01:38.612] - nx: 6 [18:01:38.612] - relay: TRUE [18:01:38.612] - stdout: TRUE [18:01:38.612] - signal: TRUE [18:01:38.613] - resignal: FALSE [18:01:38.613] - force: TRUE [18:01:38.613] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.613] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.613] - until=2 [18:01:38.613] - relaying element #2 [18:01:38.614] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.614] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.614] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.614] length: 5 (resolved future 1) [18:01:38.614] resolved() for 'SequentialFuture' ... [18:01:38.614] - state: 'finished' [18:01:38.615] - run: TRUE [18:01:38.615] - result: 'FutureResult' [18:01:38.615] resolved() for 'SequentialFuture' ... done [18:01:38.615] Future #2 [18:01:38.615] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.615] - nx: 6 [18:01:38.616] - relay: TRUE [18:01:38.616] - stdout: TRUE [18:01:38.616] - signal: TRUE [18:01:38.616] - resignal: FALSE [18:01:38.616] - force: TRUE [18:01:38.616] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.617] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.617] - until=2 [18:01:38.617] - relaying element #2 [18:01:38.617] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.617] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.617] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.618] length: 4 (resolved future 2) [18:01:38.618] resolved() for 'SequentialFuture' ... [18:01:38.618] - state: 'finished' [18:01:38.618] - run: TRUE [18:01:38.618] - result: 'FutureResult' [18:01:38.619] resolved() for 'SequentialFuture' ... done [18:01:38.619] Future #3 [18:01:38.619] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.619] - nx: 6 [18:01:38.619] - relay: TRUE [18:01:38.619] - stdout: TRUE [18:01:38.620] - signal: TRUE [18:01:38.620] - resignal: FALSE [18:01:38.620] - force: TRUE [18:01:38.620] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.620] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.620] - until=3 [18:01:38.620] - relaying element #3 [18:01:38.621] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.621] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.621] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.621] length: 3 (resolved future 3) [18:01:38.621] signalConditionsASAP(NULL, pos=4) ... [18:01:38.622] - nx: 6 [18:01:38.622] - relay: TRUE [18:01:38.622] - stdout: TRUE [18:01:38.622] - signal: TRUE [18:01:38.622] - resignal: FALSE [18:01:38.622] - force: TRUE [18:01:38.622] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.623] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.623] - until=5 [18:01:38.623] - relaying element #5 [18:01:38.623] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.623] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.623] signalConditionsASAP(NULL, pos=4) ... done [18:01:38.624] length: 2 (resolved future 4) [18:01:38.624] signalConditionsASAP(NULL, pos=5) ... [18:01:38.624] - nx: 6 [18:01:38.625] - relay: TRUE [18:01:38.625] - stdout: TRUE [18:01:38.625] - signal: TRUE [18:01:38.625] - resignal: FALSE [18:01:38.625] - force: TRUE [18:01:38.626] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.626] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.626] - until=6 [18:01:38.626] - relaying element #6 [18:01:38.626] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.626] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.627] signalConditionsASAP(NULL, pos=5) ... done [18:01:38.627] length: 1 (resolved future 5) [18:01:38.627] signalConditionsASAP(numeric, pos=6) ... [18:01:38.627] - nx: 6 [18:01:38.627] - relay: TRUE [18:01:38.627] - stdout: TRUE [18:01:38.628] - signal: TRUE [18:01:38.628] - resignal: FALSE [18:01:38.628] - force: TRUE [18:01:38.628] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.628] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.628] - until=6 [18:01:38.629] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.629] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.629] signalConditionsASAP(numeric, pos=6) ... done [18:01:38.629] length: 0 (resolved future 6) [18:01:38.629] Relaying remaining futures [18:01:38.629] signalConditionsASAP(NULL, pos=0) ... [18:01:38.629] - nx: 6 [18:01:38.630] - relay: TRUE [18:01:38.630] - stdout: TRUE [18:01:38.630] - signal: TRUE [18:01:38.630] - resignal: FALSE [18:01:38.630] - force: TRUE [18:01:38.630] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.630] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:38.631] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.631] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.631] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.631] 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) [18:01:38.635] getGlobalsAndPackages() ... [18:01:38.636] Searching for globals... [18:01:38.636] [18:01:38.636] Searching for globals ... DONE [18:01:38.636] - globals: [0] [18:01:38.636] getGlobalsAndPackages() ... DONE [18:01:38.637] run() for 'Future' ... [18:01:38.637] - state: 'created' [18:01:38.637] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.637] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.638] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.638] - Field: 'label' [18:01:38.638] - Field: 'local' [18:01:38.638] - Field: 'owner' [18:01:38.638] - Field: 'envir' [18:01:38.638] - Field: 'packages' [18:01:38.639] - Field: 'gc' [18:01:38.639] - Field: 'conditions' [18:01:38.639] - Field: 'expr' [18:01:38.639] - Field: 'uuid' [18:01:38.639] - Field: 'seed' [18:01:38.640] - Field: 'version' [18:01:38.640] - Field: 'result' [18:01:38.640] - Field: 'asynchronous' [18:01:38.640] - Field: 'calls' [18:01:38.640] - Field: 'globals' [18:01:38.640] - Field: 'stdout' [18:01:38.641] - Field: 'earlySignal' [18:01:38.641] - Field: 'lazy' [18:01:38.641] - Field: 'state' [18:01:38.641] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.641] - Launch lazy future ... [18:01:38.642] Packages needed by the future expression (n = 0): [18:01:38.642] Packages needed by future strategies (n = 0): [18:01:38.642] { [18:01:38.642] { [18:01:38.642] { [18:01:38.642] ...future.startTime <- base::Sys.time() [18:01:38.642] { [18:01:38.642] { [18:01:38.642] { [18:01:38.642] base::local({ [18:01:38.642] has_future <- base::requireNamespace("future", [18:01:38.642] quietly = TRUE) [18:01:38.642] if (has_future) { [18:01:38.642] ns <- base::getNamespace("future") [18:01:38.642] version <- ns[[".package"]][["version"]] [18:01:38.642] if (is.null(version)) [18:01:38.642] version <- utils::packageVersion("future") [18:01:38.642] } [18:01:38.642] else { [18:01:38.642] version <- NULL [18:01:38.642] } [18:01:38.642] if (!has_future || version < "1.8.0") { [18:01:38.642] info <- base::c(r_version = base::gsub("R version ", [18:01:38.642] "", base::R.version$version.string), [18:01:38.642] platform = base::sprintf("%s (%s-bit)", [18:01:38.642] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.642] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.642] "release", "version")], collapse = " "), [18:01:38.642] hostname = base::Sys.info()[["nodename"]]) [18:01:38.642] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.642] info) [18:01:38.642] info <- base::paste(info, collapse = "; ") [18:01:38.642] if (!has_future) { [18:01:38.642] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.642] info) [18:01:38.642] } [18:01:38.642] else { [18:01:38.642] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.642] info, version) [18:01:38.642] } [18:01:38.642] base::stop(msg) [18:01:38.642] } [18:01:38.642] }) [18:01:38.642] } [18:01:38.642] options(future.plan = NULL) [18:01:38.642] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.642] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.642] } [18:01:38.642] ...future.workdir <- getwd() [18:01:38.642] } [18:01:38.642] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.642] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.642] } [18:01:38.642] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.642] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.642] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.642] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.642] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.642] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.642] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.642] base::names(...future.oldOptions)) [18:01:38.642] } [18:01:38.642] if (FALSE) { [18:01:38.642] } [18:01:38.642] else { [18:01:38.642] if (TRUE) { [18:01:38.642] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.642] open = "w") [18:01:38.642] } [18:01:38.642] else { [18:01:38.642] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.642] windows = "NUL", "/dev/null"), open = "w") [18:01:38.642] } [18:01:38.642] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.642] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.642] base::sink(type = "output", split = FALSE) [18:01:38.642] base::close(...future.stdout) [18:01:38.642] }, add = TRUE) [18:01:38.642] } [18:01:38.642] ...future.frame <- base::sys.nframe() [18:01:38.642] ...future.conditions <- base::list() [18:01:38.642] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.642] if (FALSE) { [18:01:38.642] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.642] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.642] } [18:01:38.642] ...future.result <- base::tryCatch({ [18:01:38.642] base::withCallingHandlers({ [18:01:38.642] ...future.value <- base::withVisible(base::local(2)) [18:01:38.642] future::FutureResult(value = ...future.value$value, [18:01:38.642] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.642] ...future.rng), globalenv = if (FALSE) [18:01:38.642] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.642] ...future.globalenv.names)) [18:01:38.642] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.642] }, condition = base::local({ [18:01:38.642] c <- base::c [18:01:38.642] inherits <- base::inherits [18:01:38.642] invokeRestart <- base::invokeRestart [18:01:38.642] length <- base::length [18:01:38.642] list <- base::list [18:01:38.642] seq.int <- base::seq.int [18:01:38.642] signalCondition <- base::signalCondition [18:01:38.642] sys.calls <- base::sys.calls [18:01:38.642] `[[` <- base::`[[` [18:01:38.642] `+` <- base::`+` [18:01:38.642] `<<-` <- base::`<<-` [18:01:38.642] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.642] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.642] 3L)] [18:01:38.642] } [18:01:38.642] function(cond) { [18:01:38.642] is_error <- inherits(cond, "error") [18:01:38.642] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.642] NULL) [18:01:38.642] if (is_error) { [18:01:38.642] sessionInformation <- function() { [18:01:38.642] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.642] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.642] search = base::search(), system = base::Sys.info()) [18:01:38.642] } [18:01:38.642] ...future.conditions[[length(...future.conditions) + [18:01:38.642] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.642] cond$call), session = sessionInformation(), [18:01:38.642] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.642] signalCondition(cond) [18:01:38.642] } [18:01:38.642] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.642] "immediateCondition"))) { [18:01:38.642] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.642] ...future.conditions[[length(...future.conditions) + [18:01:38.642] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.642] if (TRUE && !signal) { [18:01:38.642] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.642] { [18:01:38.642] inherits <- base::inherits [18:01:38.642] invokeRestart <- base::invokeRestart [18:01:38.642] is.null <- base::is.null [18:01:38.642] muffled <- FALSE [18:01:38.642] if (inherits(cond, "message")) { [18:01:38.642] muffled <- grepl(pattern, "muffleMessage") [18:01:38.642] if (muffled) [18:01:38.642] invokeRestart("muffleMessage") [18:01:38.642] } [18:01:38.642] else if (inherits(cond, "warning")) { [18:01:38.642] muffled <- grepl(pattern, "muffleWarning") [18:01:38.642] if (muffled) [18:01:38.642] invokeRestart("muffleWarning") [18:01:38.642] } [18:01:38.642] else if (inherits(cond, "condition")) { [18:01:38.642] if (!is.null(pattern)) { [18:01:38.642] computeRestarts <- base::computeRestarts [18:01:38.642] grepl <- base::grepl [18:01:38.642] restarts <- computeRestarts(cond) [18:01:38.642] for (restart in restarts) { [18:01:38.642] name <- restart$name [18:01:38.642] if (is.null(name)) [18:01:38.642] next [18:01:38.642] if (!grepl(pattern, name)) [18:01:38.642] next [18:01:38.642] invokeRestart(restart) [18:01:38.642] muffled <- TRUE [18:01:38.642] break [18:01:38.642] } [18:01:38.642] } [18:01:38.642] } [18:01:38.642] invisible(muffled) [18:01:38.642] } [18:01:38.642] muffleCondition(cond, pattern = "^muffle") [18:01:38.642] } [18:01:38.642] } [18:01:38.642] else { [18:01:38.642] if (TRUE) { [18:01:38.642] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.642] { [18:01:38.642] inherits <- base::inherits [18:01:38.642] invokeRestart <- base::invokeRestart [18:01:38.642] is.null <- base::is.null [18:01:38.642] muffled <- FALSE [18:01:38.642] if (inherits(cond, "message")) { [18:01:38.642] muffled <- grepl(pattern, "muffleMessage") [18:01:38.642] if (muffled) [18:01:38.642] invokeRestart("muffleMessage") [18:01:38.642] } [18:01:38.642] else if (inherits(cond, "warning")) { [18:01:38.642] muffled <- grepl(pattern, "muffleWarning") [18:01:38.642] if (muffled) [18:01:38.642] invokeRestart("muffleWarning") [18:01:38.642] } [18:01:38.642] else if (inherits(cond, "condition")) { [18:01:38.642] if (!is.null(pattern)) { [18:01:38.642] computeRestarts <- base::computeRestarts [18:01:38.642] grepl <- base::grepl [18:01:38.642] restarts <- computeRestarts(cond) [18:01:38.642] for (restart in restarts) { [18:01:38.642] name <- restart$name [18:01:38.642] if (is.null(name)) [18:01:38.642] next [18:01:38.642] if (!grepl(pattern, name)) [18:01:38.642] next [18:01:38.642] invokeRestart(restart) [18:01:38.642] muffled <- TRUE [18:01:38.642] break [18:01:38.642] } [18:01:38.642] } [18:01:38.642] } [18:01:38.642] invisible(muffled) [18:01:38.642] } [18:01:38.642] muffleCondition(cond, pattern = "^muffle") [18:01:38.642] } [18:01:38.642] } [18:01:38.642] } [18:01:38.642] })) [18:01:38.642] }, error = function(ex) { [18:01:38.642] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.642] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.642] ...future.rng), started = ...future.startTime, [18:01:38.642] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.642] version = "1.8"), class = "FutureResult") [18:01:38.642] }, finally = { [18:01:38.642] if (!identical(...future.workdir, getwd())) [18:01:38.642] setwd(...future.workdir) [18:01:38.642] { [18:01:38.642] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.642] ...future.oldOptions$nwarnings <- NULL [18:01:38.642] } [18:01:38.642] base::options(...future.oldOptions) [18:01:38.642] if (.Platform$OS.type == "windows") { [18:01:38.642] old_names <- names(...future.oldEnvVars) [18:01:38.642] envs <- base::Sys.getenv() [18:01:38.642] names <- names(envs) [18:01:38.642] common <- intersect(names, old_names) [18:01:38.642] added <- setdiff(names, old_names) [18:01:38.642] removed <- setdiff(old_names, names) [18:01:38.642] changed <- common[...future.oldEnvVars[common] != [18:01:38.642] envs[common]] [18:01:38.642] NAMES <- toupper(changed) [18:01:38.642] args <- list() [18:01:38.642] for (kk in seq_along(NAMES)) { [18:01:38.642] name <- changed[[kk]] [18:01:38.642] NAME <- NAMES[[kk]] [18:01:38.642] if (name != NAME && is.element(NAME, old_names)) [18:01:38.642] next [18:01:38.642] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.642] } [18:01:38.642] NAMES <- toupper(added) [18:01:38.642] for (kk in seq_along(NAMES)) { [18:01:38.642] name <- added[[kk]] [18:01:38.642] NAME <- NAMES[[kk]] [18:01:38.642] if (name != NAME && is.element(NAME, old_names)) [18:01:38.642] next [18:01:38.642] args[[name]] <- "" [18:01:38.642] } [18:01:38.642] NAMES <- toupper(removed) [18:01:38.642] for (kk in seq_along(NAMES)) { [18:01:38.642] name <- removed[[kk]] [18:01:38.642] NAME <- NAMES[[kk]] [18:01:38.642] if (name != NAME && is.element(NAME, old_names)) [18:01:38.642] next [18:01:38.642] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.642] } [18:01:38.642] if (length(args) > 0) [18:01:38.642] base::do.call(base::Sys.setenv, args = args) [18:01:38.642] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.642] } [18:01:38.642] else { [18:01:38.642] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.642] } [18:01:38.642] { [18:01:38.642] if (base::length(...future.futureOptionsAdded) > [18:01:38.642] 0L) { [18:01:38.642] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.642] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.642] base::options(opts) [18:01:38.642] } [18:01:38.642] { [18:01:38.642] { [18:01:38.642] NULL [18:01:38.642] RNGkind("Mersenne-Twister") [18:01:38.642] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.642] inherits = FALSE) [18:01:38.642] } [18:01:38.642] options(future.plan = NULL) [18:01:38.642] if (is.na(NA_character_)) [18:01:38.642] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.642] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.642] future::plan(list(function (..., envir = parent.frame()) [18:01:38.642] { [18:01:38.642] future <- SequentialFuture(..., envir = envir) [18:01:38.642] if (!future$lazy) [18:01:38.642] future <- run(future) [18:01:38.642] invisible(future) [18:01:38.642] }), .cleanup = FALSE, .init = FALSE) [18:01:38.642] } [18:01:38.642] } [18:01:38.642] } [18:01:38.642] }) [18:01:38.642] if (TRUE) { [18:01:38.642] base::sink(type = "output", split = FALSE) [18:01:38.642] if (TRUE) { [18:01:38.642] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.642] } [18:01:38.642] else { [18:01:38.642] ...future.result["stdout"] <- base::list(NULL) [18:01:38.642] } [18:01:38.642] base::close(...future.stdout) [18:01:38.642] ...future.stdout <- NULL [18:01:38.642] } [18:01:38.642] ...future.result$conditions <- ...future.conditions [18:01:38.642] ...future.result$finished <- base::Sys.time() [18:01:38.642] ...future.result [18:01:38.642] } [18:01:38.646] plan(): Setting new future strategy stack: [18:01:38.646] List of future strategies: [18:01:38.646] 1. sequential: [18:01:38.646] - args: function (..., envir = parent.frame()) [18:01:38.646] - tweaked: FALSE [18:01:38.646] - call: NULL [18:01:38.647] plan(): nbrOfWorkers() = 1 [18:01:38.648] plan(): Setting new future strategy stack: [18:01:38.648] List of future strategies: [18:01:38.648] 1. sequential: [18:01:38.648] - args: function (..., envir = parent.frame()) [18:01:38.648] - tweaked: FALSE [18:01:38.648] - call: plan(strategy) [18:01:38.649] plan(): nbrOfWorkers() = 1 [18:01:38.649] SequentialFuture started (and completed) [18:01:38.649] - Launch lazy future ... done [18:01:38.649] run() for 'SequentialFuture' ... done [18:01:38.649] getGlobalsAndPackages() ... [18:01:38.650] Searching for globals... [18:01:38.650] [18:01:38.650] Searching for globals ... DONE [18:01:38.650] - globals: [0] [18:01:38.650] getGlobalsAndPackages() ... DONE [18:01:38.651] run() for 'Future' ... [18:01:38.651] - state: 'created' [18:01:38.651] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.651] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.652] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.652] - Field: 'label' [18:01:38.652] - Field: 'local' [18:01:38.652] - Field: 'owner' [18:01:38.652] - Field: 'envir' [18:01:38.653] - Field: 'packages' [18:01:38.653] - Field: 'gc' [18:01:38.653] - Field: 'conditions' [18:01:38.653] - Field: 'expr' [18:01:38.653] - Field: 'uuid' [18:01:38.653] - Field: 'seed' [18:01:38.654] - Field: 'version' [18:01:38.654] - Field: 'result' [18:01:38.654] - Field: 'asynchronous' [18:01:38.654] - Field: 'calls' [18:01:38.654] - Field: 'globals' [18:01:38.654] - Field: 'stdout' [18:01:38.655] - Field: 'earlySignal' [18:01:38.655] - Field: 'lazy' [18:01:38.655] - Field: 'state' [18:01:38.655] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.655] - Launch lazy future ... [18:01:38.656] Packages needed by the future expression (n = 0): [18:01:38.656] Packages needed by future strategies (n = 0): [18:01:38.656] { [18:01:38.656] { [18:01:38.656] { [18:01:38.656] ...future.startTime <- base::Sys.time() [18:01:38.656] { [18:01:38.656] { [18:01:38.656] { [18:01:38.656] base::local({ [18:01:38.656] has_future <- base::requireNamespace("future", [18:01:38.656] quietly = TRUE) [18:01:38.656] if (has_future) { [18:01:38.656] ns <- base::getNamespace("future") [18:01:38.656] version <- ns[[".package"]][["version"]] [18:01:38.656] if (is.null(version)) [18:01:38.656] version <- utils::packageVersion("future") [18:01:38.656] } [18:01:38.656] else { [18:01:38.656] version <- NULL [18:01:38.656] } [18:01:38.656] if (!has_future || version < "1.8.0") { [18:01:38.656] info <- base::c(r_version = base::gsub("R version ", [18:01:38.656] "", base::R.version$version.string), [18:01:38.656] platform = base::sprintf("%s (%s-bit)", [18:01:38.656] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.656] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.656] "release", "version")], collapse = " "), [18:01:38.656] hostname = base::Sys.info()[["nodename"]]) [18:01:38.656] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.656] info) [18:01:38.656] info <- base::paste(info, collapse = "; ") [18:01:38.656] if (!has_future) { [18:01:38.656] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.656] info) [18:01:38.656] } [18:01:38.656] else { [18:01:38.656] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.656] info, version) [18:01:38.656] } [18:01:38.656] base::stop(msg) [18:01:38.656] } [18:01:38.656] }) [18:01:38.656] } [18:01:38.656] options(future.plan = NULL) [18:01:38.656] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.656] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.656] } [18:01:38.656] ...future.workdir <- getwd() [18:01:38.656] } [18:01:38.656] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.656] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.656] } [18:01:38.656] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.656] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.656] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.656] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.656] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.656] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.656] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.656] base::names(...future.oldOptions)) [18:01:38.656] } [18:01:38.656] if (FALSE) { [18:01:38.656] } [18:01:38.656] else { [18:01:38.656] if (TRUE) { [18:01:38.656] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.656] open = "w") [18:01:38.656] } [18:01:38.656] else { [18:01:38.656] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.656] windows = "NUL", "/dev/null"), open = "w") [18:01:38.656] } [18:01:38.656] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.656] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.656] base::sink(type = "output", split = FALSE) [18:01:38.656] base::close(...future.stdout) [18:01:38.656] }, add = TRUE) [18:01:38.656] } [18:01:38.656] ...future.frame <- base::sys.nframe() [18:01:38.656] ...future.conditions <- base::list() [18:01:38.656] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.656] if (FALSE) { [18:01:38.656] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.656] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.656] } [18:01:38.656] ...future.result <- base::tryCatch({ [18:01:38.656] base::withCallingHandlers({ [18:01:38.656] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.656] future::FutureResult(value = ...future.value$value, [18:01:38.656] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.656] ...future.rng), globalenv = if (FALSE) [18:01:38.656] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.656] ...future.globalenv.names)) [18:01:38.656] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.656] }, condition = base::local({ [18:01:38.656] c <- base::c [18:01:38.656] inherits <- base::inherits [18:01:38.656] invokeRestart <- base::invokeRestart [18:01:38.656] length <- base::length [18:01:38.656] list <- base::list [18:01:38.656] seq.int <- base::seq.int [18:01:38.656] signalCondition <- base::signalCondition [18:01:38.656] sys.calls <- base::sys.calls [18:01:38.656] `[[` <- base::`[[` [18:01:38.656] `+` <- base::`+` [18:01:38.656] `<<-` <- base::`<<-` [18:01:38.656] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.656] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.656] 3L)] [18:01:38.656] } [18:01:38.656] function(cond) { [18:01:38.656] is_error <- inherits(cond, "error") [18:01:38.656] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.656] NULL) [18:01:38.656] if (is_error) { [18:01:38.656] sessionInformation <- function() { [18:01:38.656] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.656] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.656] search = base::search(), system = base::Sys.info()) [18:01:38.656] } [18:01:38.656] ...future.conditions[[length(...future.conditions) + [18:01:38.656] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.656] cond$call), session = sessionInformation(), [18:01:38.656] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.656] signalCondition(cond) [18:01:38.656] } [18:01:38.656] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.656] "immediateCondition"))) { [18:01:38.656] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.656] ...future.conditions[[length(...future.conditions) + [18:01:38.656] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.656] if (TRUE && !signal) { [18:01:38.656] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.656] { [18:01:38.656] inherits <- base::inherits [18:01:38.656] invokeRestart <- base::invokeRestart [18:01:38.656] is.null <- base::is.null [18:01:38.656] muffled <- FALSE [18:01:38.656] if (inherits(cond, "message")) { [18:01:38.656] muffled <- grepl(pattern, "muffleMessage") [18:01:38.656] if (muffled) [18:01:38.656] invokeRestart("muffleMessage") [18:01:38.656] } [18:01:38.656] else if (inherits(cond, "warning")) { [18:01:38.656] muffled <- grepl(pattern, "muffleWarning") [18:01:38.656] if (muffled) [18:01:38.656] invokeRestart("muffleWarning") [18:01:38.656] } [18:01:38.656] else if (inherits(cond, "condition")) { [18:01:38.656] if (!is.null(pattern)) { [18:01:38.656] computeRestarts <- base::computeRestarts [18:01:38.656] grepl <- base::grepl [18:01:38.656] restarts <- computeRestarts(cond) [18:01:38.656] for (restart in restarts) { [18:01:38.656] name <- restart$name [18:01:38.656] if (is.null(name)) [18:01:38.656] next [18:01:38.656] if (!grepl(pattern, name)) [18:01:38.656] next [18:01:38.656] invokeRestart(restart) [18:01:38.656] muffled <- TRUE [18:01:38.656] break [18:01:38.656] } [18:01:38.656] } [18:01:38.656] } [18:01:38.656] invisible(muffled) [18:01:38.656] } [18:01:38.656] muffleCondition(cond, pattern = "^muffle") [18:01:38.656] } [18:01:38.656] } [18:01:38.656] else { [18:01:38.656] if (TRUE) { [18:01:38.656] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.656] { [18:01:38.656] inherits <- base::inherits [18:01:38.656] invokeRestart <- base::invokeRestart [18:01:38.656] is.null <- base::is.null [18:01:38.656] muffled <- FALSE [18:01:38.656] if (inherits(cond, "message")) { [18:01:38.656] muffled <- grepl(pattern, "muffleMessage") [18:01:38.656] if (muffled) [18:01:38.656] invokeRestart("muffleMessage") [18:01:38.656] } [18:01:38.656] else if (inherits(cond, "warning")) { [18:01:38.656] muffled <- grepl(pattern, "muffleWarning") [18:01:38.656] if (muffled) [18:01:38.656] invokeRestart("muffleWarning") [18:01:38.656] } [18:01:38.656] else if (inherits(cond, "condition")) { [18:01:38.656] if (!is.null(pattern)) { [18:01:38.656] computeRestarts <- base::computeRestarts [18:01:38.656] grepl <- base::grepl [18:01:38.656] restarts <- computeRestarts(cond) [18:01:38.656] for (restart in restarts) { [18:01:38.656] name <- restart$name [18:01:38.656] if (is.null(name)) [18:01:38.656] next [18:01:38.656] if (!grepl(pattern, name)) [18:01:38.656] next [18:01:38.656] invokeRestart(restart) [18:01:38.656] muffled <- TRUE [18:01:38.656] break [18:01:38.656] } [18:01:38.656] } [18:01:38.656] } [18:01:38.656] invisible(muffled) [18:01:38.656] } [18:01:38.656] muffleCondition(cond, pattern = "^muffle") [18:01:38.656] } [18:01:38.656] } [18:01:38.656] } [18:01:38.656] })) [18:01:38.656] }, error = function(ex) { [18:01:38.656] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.656] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.656] ...future.rng), started = ...future.startTime, [18:01:38.656] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.656] version = "1.8"), class = "FutureResult") [18:01:38.656] }, finally = { [18:01:38.656] if (!identical(...future.workdir, getwd())) [18:01:38.656] setwd(...future.workdir) [18:01:38.656] { [18:01:38.656] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.656] ...future.oldOptions$nwarnings <- NULL [18:01:38.656] } [18:01:38.656] base::options(...future.oldOptions) [18:01:38.656] if (.Platform$OS.type == "windows") { [18:01:38.656] old_names <- names(...future.oldEnvVars) [18:01:38.656] envs <- base::Sys.getenv() [18:01:38.656] names <- names(envs) [18:01:38.656] common <- intersect(names, old_names) [18:01:38.656] added <- setdiff(names, old_names) [18:01:38.656] removed <- setdiff(old_names, names) [18:01:38.656] changed <- common[...future.oldEnvVars[common] != [18:01:38.656] envs[common]] [18:01:38.656] NAMES <- toupper(changed) [18:01:38.656] args <- list() [18:01:38.656] for (kk in seq_along(NAMES)) { [18:01:38.656] name <- changed[[kk]] [18:01:38.656] NAME <- NAMES[[kk]] [18:01:38.656] if (name != NAME && is.element(NAME, old_names)) [18:01:38.656] next [18:01:38.656] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.656] } [18:01:38.656] NAMES <- toupper(added) [18:01:38.656] for (kk in seq_along(NAMES)) { [18:01:38.656] name <- added[[kk]] [18:01:38.656] NAME <- NAMES[[kk]] [18:01:38.656] if (name != NAME && is.element(NAME, old_names)) [18:01:38.656] next [18:01:38.656] args[[name]] <- "" [18:01:38.656] } [18:01:38.656] NAMES <- toupper(removed) [18:01:38.656] for (kk in seq_along(NAMES)) { [18:01:38.656] name <- removed[[kk]] [18:01:38.656] NAME <- NAMES[[kk]] [18:01:38.656] if (name != NAME && is.element(NAME, old_names)) [18:01:38.656] next [18:01:38.656] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.656] } [18:01:38.656] if (length(args) > 0) [18:01:38.656] base::do.call(base::Sys.setenv, args = args) [18:01:38.656] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.656] } [18:01:38.656] else { [18:01:38.656] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.656] } [18:01:38.656] { [18:01:38.656] if (base::length(...future.futureOptionsAdded) > [18:01:38.656] 0L) { [18:01:38.656] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.656] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.656] base::options(opts) [18:01:38.656] } [18:01:38.656] { [18:01:38.656] { [18:01:38.656] NULL [18:01:38.656] RNGkind("Mersenne-Twister") [18:01:38.656] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.656] inherits = FALSE) [18:01:38.656] } [18:01:38.656] options(future.plan = NULL) [18:01:38.656] if (is.na(NA_character_)) [18:01:38.656] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.656] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.656] future::plan(list(function (..., envir = parent.frame()) [18:01:38.656] { [18:01:38.656] future <- SequentialFuture(..., envir = envir) [18:01:38.656] if (!future$lazy) [18:01:38.656] future <- run(future) [18:01:38.656] invisible(future) [18:01:38.656] }), .cleanup = FALSE, .init = FALSE) [18:01:38.656] } [18:01:38.656] } [18:01:38.656] } [18:01:38.656] }) [18:01:38.656] if (TRUE) { [18:01:38.656] base::sink(type = "output", split = FALSE) [18:01:38.656] if (TRUE) { [18:01:38.656] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.656] } [18:01:38.656] else { [18:01:38.656] ...future.result["stdout"] <- base::list(NULL) [18:01:38.656] } [18:01:38.656] base::close(...future.stdout) [18:01:38.656] ...future.stdout <- NULL [18:01:38.656] } [18:01:38.656] ...future.result$conditions <- ...future.conditions [18:01:38.656] ...future.result$finished <- base::Sys.time() [18:01:38.656] ...future.result [18:01:38.656] } [18:01:38.660] plan(): Setting new future strategy stack: [18:01:38.661] List of future strategies: [18:01:38.661] 1. sequential: [18:01:38.661] - args: function (..., envir = parent.frame()) [18:01:38.661] - tweaked: FALSE [18:01:38.661] - call: NULL [18:01:38.661] plan(): nbrOfWorkers() = 1 [18:01:38.662] plan(): Setting new future strategy stack: [18:01:38.662] List of future strategies: [18:01:38.662] 1. sequential: [18:01:38.662] - args: function (..., envir = parent.frame()) [18:01:38.662] - tweaked: FALSE [18:01:38.662] - call: plan(strategy) [18:01:38.663] plan(): nbrOfWorkers() = 1 [18:01:38.663] SequentialFuture started (and completed) [18:01:38.663] - Launch lazy future ... done [18:01:38.663] 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" [18:01:38.671] resolved() for 'SequentialFuture' ... [18:01:38.671] - state: 'finished' [18:01:38.671] - run: TRUE [18:01:38.671] - result: 'FutureResult' [18:01:38.672] resolved() for 'SequentialFuture' ... done [18:01:38.672] resolved() for 'SequentialFuture' ... [18:01:38.672] - state: 'finished' [18:01:38.672] - run: TRUE [18:01:38.672] - result: 'FutureResult' [18:01:38.673] 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" "" ... [18:01:38.675] resolve() on list ... [18:01:38.675] recursive: 0 [18:01:38.675] length: 6 [18:01:38.676] elements: 'a', 'b', 'c', '', '', '' [18:01:38.676] signalConditionsASAP(numeric, pos=1) ... [18:01:38.676] - nx: 6 [18:01:38.676] - relay: TRUE [18:01:38.676] - stdout: TRUE [18:01:38.676] - signal: TRUE [18:01:38.676] - resignal: FALSE [18:01:38.677] - force: TRUE [18:01:38.677] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.677] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.677] - until=2 [18:01:38.677] - relaying element #2 [18:01:38.677] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.678] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.678] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.678] length: 5 (resolved future 1) [18:01:38.678] resolved() for 'SequentialFuture' ... [18:01:38.678] - state: 'finished' [18:01:38.678] - run: TRUE [18:01:38.679] - result: 'FutureResult' [18:01:38.679] resolved() for 'SequentialFuture' ... done [18:01:38.679] Future #2 [18:01:38.679] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.679] - nx: 6 [18:01:38.680] - relay: TRUE [18:01:38.680] - stdout: TRUE [18:01:38.680] - signal: TRUE [18:01:38.680] - resignal: FALSE [18:01:38.680] - force: TRUE [18:01:38.680] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.680] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:38.681] - until=2 [18:01:38.681] - relaying element #2 [18:01:38.681] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.681] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.681] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.682] length: 4 (resolved future 2) [18:01:38.682] resolved() for 'SequentialFuture' ... [18:01:38.682] - state: 'finished' [18:01:38.682] - run: TRUE [18:01:38.682] - result: 'FutureResult' [18:01:38.682] resolved() for 'SequentialFuture' ... done [18:01:38.683] Future #3 [18:01:38.683] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.683] - nx: 6 [18:01:38.683] - relay: TRUE [18:01:38.683] - stdout: TRUE [18:01:38.683] - signal: TRUE [18:01:38.684] - resignal: FALSE [18:01:38.684] - force: TRUE [18:01:38.684] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.684] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:38.684] - until=3 [18:01:38.684] - relaying element #3 [18:01:38.685] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.685] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.685] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.685] length: 3 (resolved future 3) [18:01:38.685] signalConditionsASAP(NULL, pos=4) ... [18:01:38.685] - nx: 6 [18:01:38.686] - relay: TRUE [18:01:38.686] - stdout: TRUE [18:01:38.686] - signal: TRUE [18:01:38.686] - resignal: FALSE [18:01:38.686] - force: TRUE [18:01:38.686] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.686] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.687] - until=5 [18:01:38.687] - relaying element #5 [18:01:38.687] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.687] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.687] signalConditionsASAP(NULL, pos=4) ... done [18:01:38.687] length: 2 (resolved future 4) [18:01:38.688] signalConditionsASAP(NULL, pos=5) ... [18:01:38.688] - nx: 6 [18:01:38.688] - relay: TRUE [18:01:38.688] - stdout: TRUE [18:01:38.688] - signal: TRUE [18:01:38.688] - resignal: FALSE [18:01:38.689] - force: TRUE [18:01:38.689] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:38.689] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.689] - until=6 [18:01:38.689] - relaying element #6 [18:01:38.689] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.689] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.690] signalConditionsASAP(NULL, pos=5) ... done [18:01:38.690] length: 1 (resolved future 5) [18:01:38.690] signalConditionsASAP(numeric, pos=6) ... [18:01:38.690] - nx: 6 [18:01:38.690] - relay: TRUE [18:01:38.690] - stdout: TRUE [18:01:38.691] - signal: TRUE [18:01:38.691] - resignal: FALSE [18:01:38.691] - force: TRUE [18:01:38.691] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:38.691] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.691] - until=6 [18:01:38.691] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.692] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.692] signalConditionsASAP(numeric, pos=6) ... done [18:01:38.692] length: 0 (resolved future 6) [18:01:38.692] Relaying remaining futures [18:01:38.692] signalConditionsASAP(NULL, pos=0) ... [18:01:38.692] - nx: 6 [18:01:38.693] - relay: TRUE [18:01:38.693] - stdout: TRUE [18:01:38.693] - signal: TRUE [18:01:38.693] - resignal: FALSE [18:01:38.693] - force: TRUE [18:01:38.693] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.693] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:38.694] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:38.694] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:38.694] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.694] 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 [18:01:38.705] plan(): Setting new future strategy stack: [18:01:38.705] List of future strategies: [18:01:38.705] 1. sequential: [18:01:38.705] - args: function (..., envir = parent.frame()) [18:01:38.705] - tweaked: FALSE [18:01:38.705] - call: plan(strategy) [18:01:38.706] plan(): nbrOfWorkers() = 1 Dimensions: NULL [18:01:38.706] getGlobalsAndPackages() ... [18:01:38.706] Searching for globals... [18:01:38.707] [18:01:38.707] Searching for globals ... DONE [18:01:38.707] - globals: [0] [18:01:38.707] getGlobalsAndPackages() ... DONE [18:01:38.707] run() for 'Future' ... [18:01:38.707] - state: 'created' [18:01:38.708] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.708] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.708] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.708] - Field: 'label' [18:01:38.709] - Field: 'local' [18:01:38.709] - Field: 'owner' [18:01:38.709] - Field: 'envir' [18:01:38.709] - Field: 'packages' [18:01:38.709] - Field: 'gc' [18:01:38.709] - Field: 'conditions' [18:01:38.710] - Field: 'expr' [18:01:38.710] - Field: 'uuid' [18:01:38.710] - Field: 'seed' [18:01:38.710] - Field: 'version' [18:01:38.710] - Field: 'result' [18:01:38.711] - Field: 'asynchronous' [18:01:38.711] - Field: 'calls' [18:01:38.711] - Field: 'globals' [18:01:38.711] - Field: 'stdout' [18:01:38.711] - Field: 'earlySignal' [18:01:38.711] - Field: 'lazy' [18:01:38.712] - Field: 'state' [18:01:38.712] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.712] - Launch lazy future ... [18:01:38.712] Packages needed by the future expression (n = 0): [18:01:38.712] Packages needed by future strategies (n = 0): [18:01:38.713] { [18:01:38.713] { [18:01:38.713] { [18:01:38.713] ...future.startTime <- base::Sys.time() [18:01:38.713] { [18:01:38.713] { [18:01:38.713] { [18:01:38.713] base::local({ [18:01:38.713] has_future <- base::requireNamespace("future", [18:01:38.713] quietly = TRUE) [18:01:38.713] if (has_future) { [18:01:38.713] ns <- base::getNamespace("future") [18:01:38.713] version <- ns[[".package"]][["version"]] [18:01:38.713] if (is.null(version)) [18:01:38.713] version <- utils::packageVersion("future") [18:01:38.713] } [18:01:38.713] else { [18:01:38.713] version <- NULL [18:01:38.713] } [18:01:38.713] if (!has_future || version < "1.8.0") { [18:01:38.713] info <- base::c(r_version = base::gsub("R version ", [18:01:38.713] "", base::R.version$version.string), [18:01:38.713] platform = base::sprintf("%s (%s-bit)", [18:01:38.713] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.713] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.713] "release", "version")], collapse = " "), [18:01:38.713] hostname = base::Sys.info()[["nodename"]]) [18:01:38.713] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.713] info) [18:01:38.713] info <- base::paste(info, collapse = "; ") [18:01:38.713] if (!has_future) { [18:01:38.713] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.713] info) [18:01:38.713] } [18:01:38.713] else { [18:01:38.713] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.713] info, version) [18:01:38.713] } [18:01:38.713] base::stop(msg) [18:01:38.713] } [18:01:38.713] }) [18:01:38.713] } [18:01:38.713] options(future.plan = NULL) [18:01:38.713] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.713] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.713] } [18:01:38.713] ...future.workdir <- getwd() [18:01:38.713] } [18:01:38.713] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.713] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.713] } [18:01:38.713] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.713] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.713] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.713] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.713] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.713] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.713] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.713] base::names(...future.oldOptions)) [18:01:38.713] } [18:01:38.713] if (FALSE) { [18:01:38.713] } [18:01:38.713] else { [18:01:38.713] if (TRUE) { [18:01:38.713] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.713] open = "w") [18:01:38.713] } [18:01:38.713] else { [18:01:38.713] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.713] windows = "NUL", "/dev/null"), open = "w") [18:01:38.713] } [18:01:38.713] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.713] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.713] base::sink(type = "output", split = FALSE) [18:01:38.713] base::close(...future.stdout) [18:01:38.713] }, add = TRUE) [18:01:38.713] } [18:01:38.713] ...future.frame <- base::sys.nframe() [18:01:38.713] ...future.conditions <- base::list() [18:01:38.713] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.713] if (FALSE) { [18:01:38.713] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.713] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.713] } [18:01:38.713] ...future.result <- base::tryCatch({ [18:01:38.713] base::withCallingHandlers({ [18:01:38.713] ...future.value <- base::withVisible(base::local(2)) [18:01:38.713] future::FutureResult(value = ...future.value$value, [18:01:38.713] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.713] ...future.rng), globalenv = if (FALSE) [18:01:38.713] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.713] ...future.globalenv.names)) [18:01:38.713] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.713] }, condition = base::local({ [18:01:38.713] c <- base::c [18:01:38.713] inherits <- base::inherits [18:01:38.713] invokeRestart <- base::invokeRestart [18:01:38.713] length <- base::length [18:01:38.713] list <- base::list [18:01:38.713] seq.int <- base::seq.int [18:01:38.713] signalCondition <- base::signalCondition [18:01:38.713] sys.calls <- base::sys.calls [18:01:38.713] `[[` <- base::`[[` [18:01:38.713] `+` <- base::`+` [18:01:38.713] `<<-` <- base::`<<-` [18:01:38.713] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.713] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.713] 3L)] [18:01:38.713] } [18:01:38.713] function(cond) { [18:01:38.713] is_error <- inherits(cond, "error") [18:01:38.713] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.713] NULL) [18:01:38.713] if (is_error) { [18:01:38.713] sessionInformation <- function() { [18:01:38.713] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.713] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.713] search = base::search(), system = base::Sys.info()) [18:01:38.713] } [18:01:38.713] ...future.conditions[[length(...future.conditions) + [18:01:38.713] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.713] cond$call), session = sessionInformation(), [18:01:38.713] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.713] signalCondition(cond) [18:01:38.713] } [18:01:38.713] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.713] "immediateCondition"))) { [18:01:38.713] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.713] ...future.conditions[[length(...future.conditions) + [18:01:38.713] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.713] if (TRUE && !signal) { [18:01:38.713] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.713] { [18:01:38.713] inherits <- base::inherits [18:01:38.713] invokeRestart <- base::invokeRestart [18:01:38.713] is.null <- base::is.null [18:01:38.713] muffled <- FALSE [18:01:38.713] if (inherits(cond, "message")) { [18:01:38.713] muffled <- grepl(pattern, "muffleMessage") [18:01:38.713] if (muffled) [18:01:38.713] invokeRestart("muffleMessage") [18:01:38.713] } [18:01:38.713] else if (inherits(cond, "warning")) { [18:01:38.713] muffled <- grepl(pattern, "muffleWarning") [18:01:38.713] if (muffled) [18:01:38.713] invokeRestart("muffleWarning") [18:01:38.713] } [18:01:38.713] else if (inherits(cond, "condition")) { [18:01:38.713] if (!is.null(pattern)) { [18:01:38.713] computeRestarts <- base::computeRestarts [18:01:38.713] grepl <- base::grepl [18:01:38.713] restarts <- computeRestarts(cond) [18:01:38.713] for (restart in restarts) { [18:01:38.713] name <- restart$name [18:01:38.713] if (is.null(name)) [18:01:38.713] next [18:01:38.713] if (!grepl(pattern, name)) [18:01:38.713] next [18:01:38.713] invokeRestart(restart) [18:01:38.713] muffled <- TRUE [18:01:38.713] break [18:01:38.713] } [18:01:38.713] } [18:01:38.713] } [18:01:38.713] invisible(muffled) [18:01:38.713] } [18:01:38.713] muffleCondition(cond, pattern = "^muffle") [18:01:38.713] } [18:01:38.713] } [18:01:38.713] else { [18:01:38.713] if (TRUE) { [18:01:38.713] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.713] { [18:01:38.713] inherits <- base::inherits [18:01:38.713] invokeRestart <- base::invokeRestart [18:01:38.713] is.null <- base::is.null [18:01:38.713] muffled <- FALSE [18:01:38.713] if (inherits(cond, "message")) { [18:01:38.713] muffled <- grepl(pattern, "muffleMessage") [18:01:38.713] if (muffled) [18:01:38.713] invokeRestart("muffleMessage") [18:01:38.713] } [18:01:38.713] else if (inherits(cond, "warning")) { [18:01:38.713] muffled <- grepl(pattern, "muffleWarning") [18:01:38.713] if (muffled) [18:01:38.713] invokeRestart("muffleWarning") [18:01:38.713] } [18:01:38.713] else if (inherits(cond, "condition")) { [18:01:38.713] if (!is.null(pattern)) { [18:01:38.713] computeRestarts <- base::computeRestarts [18:01:38.713] grepl <- base::grepl [18:01:38.713] restarts <- computeRestarts(cond) [18:01:38.713] for (restart in restarts) { [18:01:38.713] name <- restart$name [18:01:38.713] if (is.null(name)) [18:01:38.713] next [18:01:38.713] if (!grepl(pattern, name)) [18:01:38.713] next [18:01:38.713] invokeRestart(restart) [18:01:38.713] muffled <- TRUE [18:01:38.713] break [18:01:38.713] } [18:01:38.713] } [18:01:38.713] } [18:01:38.713] invisible(muffled) [18:01:38.713] } [18:01:38.713] muffleCondition(cond, pattern = "^muffle") [18:01:38.713] } [18:01:38.713] } [18:01:38.713] } [18:01:38.713] })) [18:01:38.713] }, error = function(ex) { [18:01:38.713] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.713] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.713] ...future.rng), started = ...future.startTime, [18:01:38.713] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.713] version = "1.8"), class = "FutureResult") [18:01:38.713] }, finally = { [18:01:38.713] if (!identical(...future.workdir, getwd())) [18:01:38.713] setwd(...future.workdir) [18:01:38.713] { [18:01:38.713] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.713] ...future.oldOptions$nwarnings <- NULL [18:01:38.713] } [18:01:38.713] base::options(...future.oldOptions) [18:01:38.713] if (.Platform$OS.type == "windows") { [18:01:38.713] old_names <- names(...future.oldEnvVars) [18:01:38.713] envs <- base::Sys.getenv() [18:01:38.713] names <- names(envs) [18:01:38.713] common <- intersect(names, old_names) [18:01:38.713] added <- setdiff(names, old_names) [18:01:38.713] removed <- setdiff(old_names, names) [18:01:38.713] changed <- common[...future.oldEnvVars[common] != [18:01:38.713] envs[common]] [18:01:38.713] NAMES <- toupper(changed) [18:01:38.713] args <- list() [18:01:38.713] for (kk in seq_along(NAMES)) { [18:01:38.713] name <- changed[[kk]] [18:01:38.713] NAME <- NAMES[[kk]] [18:01:38.713] if (name != NAME && is.element(NAME, old_names)) [18:01:38.713] next [18:01:38.713] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.713] } [18:01:38.713] NAMES <- toupper(added) [18:01:38.713] for (kk in seq_along(NAMES)) { [18:01:38.713] name <- added[[kk]] [18:01:38.713] NAME <- NAMES[[kk]] [18:01:38.713] if (name != NAME && is.element(NAME, old_names)) [18:01:38.713] next [18:01:38.713] args[[name]] <- "" [18:01:38.713] } [18:01:38.713] NAMES <- toupper(removed) [18:01:38.713] for (kk in seq_along(NAMES)) { [18:01:38.713] name <- removed[[kk]] [18:01:38.713] NAME <- NAMES[[kk]] [18:01:38.713] if (name != NAME && is.element(NAME, old_names)) [18:01:38.713] next [18:01:38.713] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.713] } [18:01:38.713] if (length(args) > 0) [18:01:38.713] base::do.call(base::Sys.setenv, args = args) [18:01:38.713] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.713] } [18:01:38.713] else { [18:01:38.713] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.713] } [18:01:38.713] { [18:01:38.713] if (base::length(...future.futureOptionsAdded) > [18:01:38.713] 0L) { [18:01:38.713] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.713] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.713] base::options(opts) [18:01:38.713] } [18:01:38.713] { [18:01:38.713] { [18:01:38.713] NULL [18:01:38.713] RNGkind("Mersenne-Twister") [18:01:38.713] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.713] inherits = FALSE) [18:01:38.713] } [18:01:38.713] options(future.plan = NULL) [18:01:38.713] if (is.na(NA_character_)) [18:01:38.713] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.713] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.713] future::plan(list(function (..., envir = parent.frame()) [18:01:38.713] { [18:01:38.713] future <- SequentialFuture(..., envir = envir) [18:01:38.713] if (!future$lazy) [18:01:38.713] future <- run(future) [18:01:38.713] invisible(future) [18:01:38.713] }), .cleanup = FALSE, .init = FALSE) [18:01:38.713] } [18:01:38.713] } [18:01:38.713] } [18:01:38.713] }) [18:01:38.713] if (TRUE) { [18:01:38.713] base::sink(type = "output", split = FALSE) [18:01:38.713] if (TRUE) { [18:01:38.713] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.713] } [18:01:38.713] else { [18:01:38.713] ...future.result["stdout"] <- base::list(NULL) [18:01:38.713] } [18:01:38.713] base::close(...future.stdout) [18:01:38.713] ...future.stdout <- NULL [18:01:38.713] } [18:01:38.713] ...future.result$conditions <- ...future.conditions [18:01:38.713] ...future.result$finished <- base::Sys.time() [18:01:38.713] ...future.result [18:01:38.713] } [18:01:38.717] plan(): Setting new future strategy stack: [18:01:38.717] List of future strategies: [18:01:38.717] 1. sequential: [18:01:38.717] - args: function (..., envir = parent.frame()) [18:01:38.717] - tweaked: FALSE [18:01:38.717] - call: NULL [18:01:38.718] plan(): nbrOfWorkers() = 1 [18:01:38.719] plan(): Setting new future strategy stack: [18:01:38.719] List of future strategies: [18:01:38.719] 1. sequential: [18:01:38.719] - args: function (..., envir = parent.frame()) [18:01:38.719] - tweaked: FALSE [18:01:38.719] - call: plan(strategy) [18:01:38.719] plan(): nbrOfWorkers() = 1 [18:01:38.720] SequentialFuture started (and completed) [18:01:38.720] - Launch lazy future ... done [18:01:38.720] run() for 'SequentialFuture' ... done [18:01:38.720] getGlobalsAndPackages() ... [18:01:38.720] Searching for globals... [18:01:38.721] [18:01:38.721] Searching for globals ... DONE [18:01:38.721] - globals: [0] [18:01:38.721] getGlobalsAndPackages() ... DONE [18:01:38.721] run() for 'Future' ... [18:01:38.722] - state: 'created' [18:01:38.722] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.722] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.722] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.723] - Field: 'label' [18:01:38.723] - Field: 'local' [18:01:38.723] - Field: 'owner' [18:01:38.723] - Field: 'envir' [18:01:38.723] - Field: 'packages' [18:01:38.723] - Field: 'gc' [18:01:38.724] - Field: 'conditions' [18:01:38.724] - Field: 'expr' [18:01:38.724] - Field: 'uuid' [18:01:38.724] - Field: 'seed' [18:01:38.724] - Field: 'version' [18:01:38.724] - Field: 'result' [18:01:38.725] - Field: 'asynchronous' [18:01:38.725] - Field: 'calls' [18:01:38.725] - Field: 'globals' [18:01:38.725] - Field: 'stdout' [18:01:38.725] - Field: 'earlySignal' [18:01:38.725] - Field: 'lazy' [18:01:38.726] - Field: 'state' [18:01:38.726] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.726] - Launch lazy future ... [18:01:38.726] Packages needed by the future expression (n = 0): [18:01:38.726] Packages needed by future strategies (n = 0): [18:01:38.727] { [18:01:38.727] { [18:01:38.727] { [18:01:38.727] ...future.startTime <- base::Sys.time() [18:01:38.727] { [18:01:38.727] { [18:01:38.727] { [18:01:38.727] base::local({ [18:01:38.727] has_future <- base::requireNamespace("future", [18:01:38.727] quietly = TRUE) [18:01:38.727] if (has_future) { [18:01:38.727] ns <- base::getNamespace("future") [18:01:38.727] version <- ns[[".package"]][["version"]] [18:01:38.727] if (is.null(version)) [18:01:38.727] version <- utils::packageVersion("future") [18:01:38.727] } [18:01:38.727] else { [18:01:38.727] version <- NULL [18:01:38.727] } [18:01:38.727] if (!has_future || version < "1.8.0") { [18:01:38.727] info <- base::c(r_version = base::gsub("R version ", [18:01:38.727] "", base::R.version$version.string), [18:01:38.727] platform = base::sprintf("%s (%s-bit)", [18:01:38.727] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.727] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.727] "release", "version")], collapse = " "), [18:01:38.727] hostname = base::Sys.info()[["nodename"]]) [18:01:38.727] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.727] info) [18:01:38.727] info <- base::paste(info, collapse = "; ") [18:01:38.727] if (!has_future) { [18:01:38.727] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.727] info) [18:01:38.727] } [18:01:38.727] else { [18:01:38.727] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.727] info, version) [18:01:38.727] } [18:01:38.727] base::stop(msg) [18:01:38.727] } [18:01:38.727] }) [18:01:38.727] } [18:01:38.727] options(future.plan = NULL) [18:01:38.727] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.727] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.727] } [18:01:38.727] ...future.workdir <- getwd() [18:01:38.727] } [18:01:38.727] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.727] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.727] } [18:01:38.727] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.727] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.727] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.727] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.727] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.727] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.727] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.727] base::names(...future.oldOptions)) [18:01:38.727] } [18:01:38.727] if (FALSE) { [18:01:38.727] } [18:01:38.727] else { [18:01:38.727] if (TRUE) { [18:01:38.727] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.727] open = "w") [18:01:38.727] } [18:01:38.727] else { [18:01:38.727] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.727] windows = "NUL", "/dev/null"), open = "w") [18:01:38.727] } [18:01:38.727] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.727] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.727] base::sink(type = "output", split = FALSE) [18:01:38.727] base::close(...future.stdout) [18:01:38.727] }, add = TRUE) [18:01:38.727] } [18:01:38.727] ...future.frame <- base::sys.nframe() [18:01:38.727] ...future.conditions <- base::list() [18:01:38.727] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.727] if (FALSE) { [18:01:38.727] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.727] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.727] } [18:01:38.727] ...future.result <- base::tryCatch({ [18:01:38.727] base::withCallingHandlers({ [18:01:38.727] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.727] future::FutureResult(value = ...future.value$value, [18:01:38.727] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.727] ...future.rng), globalenv = if (FALSE) [18:01:38.727] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.727] ...future.globalenv.names)) [18:01:38.727] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.727] }, condition = base::local({ [18:01:38.727] c <- base::c [18:01:38.727] inherits <- base::inherits [18:01:38.727] invokeRestart <- base::invokeRestart [18:01:38.727] length <- base::length [18:01:38.727] list <- base::list [18:01:38.727] seq.int <- base::seq.int [18:01:38.727] signalCondition <- base::signalCondition [18:01:38.727] sys.calls <- base::sys.calls [18:01:38.727] `[[` <- base::`[[` [18:01:38.727] `+` <- base::`+` [18:01:38.727] `<<-` <- base::`<<-` [18:01:38.727] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.727] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.727] 3L)] [18:01:38.727] } [18:01:38.727] function(cond) { [18:01:38.727] is_error <- inherits(cond, "error") [18:01:38.727] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.727] NULL) [18:01:38.727] if (is_error) { [18:01:38.727] sessionInformation <- function() { [18:01:38.727] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.727] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.727] search = base::search(), system = base::Sys.info()) [18:01:38.727] } [18:01:38.727] ...future.conditions[[length(...future.conditions) + [18:01:38.727] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.727] cond$call), session = sessionInformation(), [18:01:38.727] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.727] signalCondition(cond) [18:01:38.727] } [18:01:38.727] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.727] "immediateCondition"))) { [18:01:38.727] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.727] ...future.conditions[[length(...future.conditions) + [18:01:38.727] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.727] if (TRUE && !signal) { [18:01:38.727] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.727] { [18:01:38.727] inherits <- base::inherits [18:01:38.727] invokeRestart <- base::invokeRestart [18:01:38.727] is.null <- base::is.null [18:01:38.727] muffled <- FALSE [18:01:38.727] if (inherits(cond, "message")) { [18:01:38.727] muffled <- grepl(pattern, "muffleMessage") [18:01:38.727] if (muffled) [18:01:38.727] invokeRestart("muffleMessage") [18:01:38.727] } [18:01:38.727] else if (inherits(cond, "warning")) { [18:01:38.727] muffled <- grepl(pattern, "muffleWarning") [18:01:38.727] if (muffled) [18:01:38.727] invokeRestart("muffleWarning") [18:01:38.727] } [18:01:38.727] else if (inherits(cond, "condition")) { [18:01:38.727] if (!is.null(pattern)) { [18:01:38.727] computeRestarts <- base::computeRestarts [18:01:38.727] grepl <- base::grepl [18:01:38.727] restarts <- computeRestarts(cond) [18:01:38.727] for (restart in restarts) { [18:01:38.727] name <- restart$name [18:01:38.727] if (is.null(name)) [18:01:38.727] next [18:01:38.727] if (!grepl(pattern, name)) [18:01:38.727] next [18:01:38.727] invokeRestart(restart) [18:01:38.727] muffled <- TRUE [18:01:38.727] break [18:01:38.727] } [18:01:38.727] } [18:01:38.727] } [18:01:38.727] invisible(muffled) [18:01:38.727] } [18:01:38.727] muffleCondition(cond, pattern = "^muffle") [18:01:38.727] } [18:01:38.727] } [18:01:38.727] else { [18:01:38.727] if (TRUE) { [18:01:38.727] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.727] { [18:01:38.727] inherits <- base::inherits [18:01:38.727] invokeRestart <- base::invokeRestart [18:01:38.727] is.null <- base::is.null [18:01:38.727] muffled <- FALSE [18:01:38.727] if (inherits(cond, "message")) { [18:01:38.727] muffled <- grepl(pattern, "muffleMessage") [18:01:38.727] if (muffled) [18:01:38.727] invokeRestart("muffleMessage") [18:01:38.727] } [18:01:38.727] else if (inherits(cond, "warning")) { [18:01:38.727] muffled <- grepl(pattern, "muffleWarning") [18:01:38.727] if (muffled) [18:01:38.727] invokeRestart("muffleWarning") [18:01:38.727] } [18:01:38.727] else if (inherits(cond, "condition")) { [18:01:38.727] if (!is.null(pattern)) { [18:01:38.727] computeRestarts <- base::computeRestarts [18:01:38.727] grepl <- base::grepl [18:01:38.727] restarts <- computeRestarts(cond) [18:01:38.727] for (restart in restarts) { [18:01:38.727] name <- restart$name [18:01:38.727] if (is.null(name)) [18:01:38.727] next [18:01:38.727] if (!grepl(pattern, name)) [18:01:38.727] next [18:01:38.727] invokeRestart(restart) [18:01:38.727] muffled <- TRUE [18:01:38.727] break [18:01:38.727] } [18:01:38.727] } [18:01:38.727] } [18:01:38.727] invisible(muffled) [18:01:38.727] } [18:01:38.727] muffleCondition(cond, pattern = "^muffle") [18:01:38.727] } [18:01:38.727] } [18:01:38.727] } [18:01:38.727] })) [18:01:38.727] }, error = function(ex) { [18:01:38.727] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.727] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.727] ...future.rng), started = ...future.startTime, [18:01:38.727] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.727] version = "1.8"), class = "FutureResult") [18:01:38.727] }, finally = { [18:01:38.727] if (!identical(...future.workdir, getwd())) [18:01:38.727] setwd(...future.workdir) [18:01:38.727] { [18:01:38.727] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.727] ...future.oldOptions$nwarnings <- NULL [18:01:38.727] } [18:01:38.727] base::options(...future.oldOptions) [18:01:38.727] if (.Platform$OS.type == "windows") { [18:01:38.727] old_names <- names(...future.oldEnvVars) [18:01:38.727] envs <- base::Sys.getenv() [18:01:38.727] names <- names(envs) [18:01:38.727] common <- intersect(names, old_names) [18:01:38.727] added <- setdiff(names, old_names) [18:01:38.727] removed <- setdiff(old_names, names) [18:01:38.727] changed <- common[...future.oldEnvVars[common] != [18:01:38.727] envs[common]] [18:01:38.727] NAMES <- toupper(changed) [18:01:38.727] args <- list() [18:01:38.727] for (kk in seq_along(NAMES)) { [18:01:38.727] name <- changed[[kk]] [18:01:38.727] NAME <- NAMES[[kk]] [18:01:38.727] if (name != NAME && is.element(NAME, old_names)) [18:01:38.727] next [18:01:38.727] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.727] } [18:01:38.727] NAMES <- toupper(added) [18:01:38.727] for (kk in seq_along(NAMES)) { [18:01:38.727] name <- added[[kk]] [18:01:38.727] NAME <- NAMES[[kk]] [18:01:38.727] if (name != NAME && is.element(NAME, old_names)) [18:01:38.727] next [18:01:38.727] args[[name]] <- "" [18:01:38.727] } [18:01:38.727] NAMES <- toupper(removed) [18:01:38.727] for (kk in seq_along(NAMES)) { [18:01:38.727] name <- removed[[kk]] [18:01:38.727] NAME <- NAMES[[kk]] [18:01:38.727] if (name != NAME && is.element(NAME, old_names)) [18:01:38.727] next [18:01:38.727] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.727] } [18:01:38.727] if (length(args) > 0) [18:01:38.727] base::do.call(base::Sys.setenv, args = args) [18:01:38.727] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.727] } [18:01:38.727] else { [18:01:38.727] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.727] } [18:01:38.727] { [18:01:38.727] if (base::length(...future.futureOptionsAdded) > [18:01:38.727] 0L) { [18:01:38.727] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.727] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.727] base::options(opts) [18:01:38.727] } [18:01:38.727] { [18:01:38.727] { [18:01:38.727] NULL [18:01:38.727] RNGkind("Mersenne-Twister") [18:01:38.727] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.727] inherits = FALSE) [18:01:38.727] } [18:01:38.727] options(future.plan = NULL) [18:01:38.727] if (is.na(NA_character_)) [18:01:38.727] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.727] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.727] future::plan(list(function (..., envir = parent.frame()) [18:01:38.727] { [18:01:38.727] future <- SequentialFuture(..., envir = envir) [18:01:38.727] if (!future$lazy) [18:01:38.727] future <- run(future) [18:01:38.727] invisible(future) [18:01:38.727] }), .cleanup = FALSE, .init = FALSE) [18:01:38.727] } [18:01:38.727] } [18:01:38.727] } [18:01:38.727] }) [18:01:38.727] if (TRUE) { [18:01:38.727] base::sink(type = "output", split = FALSE) [18:01:38.727] if (TRUE) { [18:01:38.727] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.727] } [18:01:38.727] else { [18:01:38.727] ...future.result["stdout"] <- base::list(NULL) [18:01:38.727] } [18:01:38.727] base::close(...future.stdout) [18:01:38.727] ...future.stdout <- NULL [18:01:38.727] } [18:01:38.727] ...future.result$conditions <- ...future.conditions [18:01:38.727] ...future.result$finished <- base::Sys.time() [18:01:38.727] ...future.result [18:01:38.727] } [18:01:38.731] plan(): Setting new future strategy stack: [18:01:38.731] List of future strategies: [18:01:38.731] 1. sequential: [18:01:38.731] - args: function (..., envir = parent.frame()) [18:01:38.731] - tweaked: FALSE [18:01:38.731] - call: NULL [18:01:38.731] plan(): nbrOfWorkers() = 1 [18:01:38.733] plan(): Setting new future strategy stack: [18:01:38.733] List of future strategies: [18:01:38.733] 1. sequential: [18:01:38.733] - args: function (..., envir = parent.frame()) [18:01:38.733] - tweaked: FALSE [18:01:38.733] - call: plan(strategy) [18:01:38.733] plan(): nbrOfWorkers() = 1 [18:01:38.733] SequentialFuture started (and completed) [18:01:38.734] - Launch lazy future ... done [18:01:38.734] run() for 'SequentialFuture' ... done [18:01:38.735] getGlobalsAndPackages() ... [18:01:38.735] Searching for globals... [18:01:38.737] - globals found: [1] '{' [18:01:38.737] Searching for globals ... DONE [18:01:38.737] Resolving globals: FALSE [18:01:38.738] [18:01:38.738] [18:01:38.738] getGlobalsAndPackages() ... DONE [18:01:38.739] run() for 'Future' ... [18:01:38.739] - state: 'created' [18:01:38.739] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.739] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.740] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.740] - Field: 'label' [18:01:38.740] - Field: 'local' [18:01:38.740] - Field: 'owner' [18:01:38.740] - Field: 'envir' [18:01:38.740] - Field: 'packages' [18:01:38.741] - Field: 'gc' [18:01:38.741] - Field: 'conditions' [18:01:38.741] - Field: 'expr' [18:01:38.741] - Field: 'uuid' [18:01:38.741] - Field: 'seed' [18:01:38.743] - Field: 'version' [18:01:38.743] - Field: 'result' [18:01:38.743] - Field: 'asynchronous' [18:01:38.743] - Field: 'calls' [18:01:38.743] - Field: 'globals' [18:01:38.743] - Field: 'stdout' [18:01:38.744] - Field: 'earlySignal' [18:01:38.744] - Field: 'lazy' [18:01:38.744] - Field: 'state' [18:01:38.744] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.744] - Launch lazy future ... [18:01:38.745] Packages needed by the future expression (n = 0): [18:01:38.745] Packages needed by future strategies (n = 0): [18:01:38.745] { [18:01:38.745] { [18:01:38.745] { [18:01:38.745] ...future.startTime <- base::Sys.time() [18:01:38.745] { [18:01:38.745] { [18:01:38.745] { [18:01:38.745] base::local({ [18:01:38.745] has_future <- base::requireNamespace("future", [18:01:38.745] quietly = TRUE) [18:01:38.745] if (has_future) { [18:01:38.745] ns <- base::getNamespace("future") [18:01:38.745] version <- ns[[".package"]][["version"]] [18:01:38.745] if (is.null(version)) [18:01:38.745] version <- utils::packageVersion("future") [18:01:38.745] } [18:01:38.745] else { [18:01:38.745] version <- NULL [18:01:38.745] } [18:01:38.745] if (!has_future || version < "1.8.0") { [18:01:38.745] info <- base::c(r_version = base::gsub("R version ", [18:01:38.745] "", base::R.version$version.string), [18:01:38.745] platform = base::sprintf("%s (%s-bit)", [18:01:38.745] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.745] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.745] "release", "version")], collapse = " "), [18:01:38.745] hostname = base::Sys.info()[["nodename"]]) [18:01:38.745] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.745] info) [18:01:38.745] info <- base::paste(info, collapse = "; ") [18:01:38.745] if (!has_future) { [18:01:38.745] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.745] info) [18:01:38.745] } [18:01:38.745] else { [18:01:38.745] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.745] info, version) [18:01:38.745] } [18:01:38.745] base::stop(msg) [18:01:38.745] } [18:01:38.745] }) [18:01:38.745] } [18:01:38.745] options(future.plan = NULL) [18:01:38.745] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.745] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.745] } [18:01:38.745] ...future.workdir <- getwd() [18:01:38.745] } [18:01:38.745] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.745] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.745] } [18:01:38.745] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.745] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.745] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.745] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.745] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.745] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.745] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.745] base::names(...future.oldOptions)) [18:01:38.745] } [18:01:38.745] if (FALSE) { [18:01:38.745] } [18:01:38.745] else { [18:01:38.745] if (TRUE) { [18:01:38.745] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.745] open = "w") [18:01:38.745] } [18:01:38.745] else { [18:01:38.745] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.745] windows = "NUL", "/dev/null"), open = "w") [18:01:38.745] } [18:01:38.745] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.745] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.745] base::sink(type = "output", split = FALSE) [18:01:38.745] base::close(...future.stdout) [18:01:38.745] }, add = TRUE) [18:01:38.745] } [18:01:38.745] ...future.frame <- base::sys.nframe() [18:01:38.745] ...future.conditions <- base::list() [18:01:38.745] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.745] if (FALSE) { [18:01:38.745] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.745] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.745] } [18:01:38.745] ...future.result <- base::tryCatch({ [18:01:38.745] base::withCallingHandlers({ [18:01:38.745] ...future.value <- base::withVisible(base::local({ [18:01:38.745] 4 [18:01:38.745] })) [18:01:38.745] future::FutureResult(value = ...future.value$value, [18:01:38.745] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.745] ...future.rng), globalenv = if (FALSE) [18:01:38.745] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.745] ...future.globalenv.names)) [18:01:38.745] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.745] }, condition = base::local({ [18:01:38.745] c <- base::c [18:01:38.745] inherits <- base::inherits [18:01:38.745] invokeRestart <- base::invokeRestart [18:01:38.745] length <- base::length [18:01:38.745] list <- base::list [18:01:38.745] seq.int <- base::seq.int [18:01:38.745] signalCondition <- base::signalCondition [18:01:38.745] sys.calls <- base::sys.calls [18:01:38.745] `[[` <- base::`[[` [18:01:38.745] `+` <- base::`+` [18:01:38.745] `<<-` <- base::`<<-` [18:01:38.745] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.745] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.745] 3L)] [18:01:38.745] } [18:01:38.745] function(cond) { [18:01:38.745] is_error <- inherits(cond, "error") [18:01:38.745] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.745] NULL) [18:01:38.745] if (is_error) { [18:01:38.745] sessionInformation <- function() { [18:01:38.745] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.745] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.745] search = base::search(), system = base::Sys.info()) [18:01:38.745] } [18:01:38.745] ...future.conditions[[length(...future.conditions) + [18:01:38.745] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.745] cond$call), session = sessionInformation(), [18:01:38.745] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.745] signalCondition(cond) [18:01:38.745] } [18:01:38.745] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.745] "immediateCondition"))) { [18:01:38.745] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.745] ...future.conditions[[length(...future.conditions) + [18:01:38.745] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.745] if (TRUE && !signal) { [18:01:38.745] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.745] { [18:01:38.745] inherits <- base::inherits [18:01:38.745] invokeRestart <- base::invokeRestart [18:01:38.745] is.null <- base::is.null [18:01:38.745] muffled <- FALSE [18:01:38.745] if (inherits(cond, "message")) { [18:01:38.745] muffled <- grepl(pattern, "muffleMessage") [18:01:38.745] if (muffled) [18:01:38.745] invokeRestart("muffleMessage") [18:01:38.745] } [18:01:38.745] else if (inherits(cond, "warning")) { [18:01:38.745] muffled <- grepl(pattern, "muffleWarning") [18:01:38.745] if (muffled) [18:01:38.745] invokeRestart("muffleWarning") [18:01:38.745] } [18:01:38.745] else if (inherits(cond, "condition")) { [18:01:38.745] if (!is.null(pattern)) { [18:01:38.745] computeRestarts <- base::computeRestarts [18:01:38.745] grepl <- base::grepl [18:01:38.745] restarts <- computeRestarts(cond) [18:01:38.745] for (restart in restarts) { [18:01:38.745] name <- restart$name [18:01:38.745] if (is.null(name)) [18:01:38.745] next [18:01:38.745] if (!grepl(pattern, name)) [18:01:38.745] next [18:01:38.745] invokeRestart(restart) [18:01:38.745] muffled <- TRUE [18:01:38.745] break [18:01:38.745] } [18:01:38.745] } [18:01:38.745] } [18:01:38.745] invisible(muffled) [18:01:38.745] } [18:01:38.745] muffleCondition(cond, pattern = "^muffle") [18:01:38.745] } [18:01:38.745] } [18:01:38.745] else { [18:01:38.745] if (TRUE) { [18:01:38.745] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.745] { [18:01:38.745] inherits <- base::inherits [18:01:38.745] invokeRestart <- base::invokeRestart [18:01:38.745] is.null <- base::is.null [18:01:38.745] muffled <- FALSE [18:01:38.745] if (inherits(cond, "message")) { [18:01:38.745] muffled <- grepl(pattern, "muffleMessage") [18:01:38.745] if (muffled) [18:01:38.745] invokeRestart("muffleMessage") [18:01:38.745] } [18:01:38.745] else if (inherits(cond, "warning")) { [18:01:38.745] muffled <- grepl(pattern, "muffleWarning") [18:01:38.745] if (muffled) [18:01:38.745] invokeRestart("muffleWarning") [18:01:38.745] } [18:01:38.745] else if (inherits(cond, "condition")) { [18:01:38.745] if (!is.null(pattern)) { [18:01:38.745] computeRestarts <- base::computeRestarts [18:01:38.745] grepl <- base::grepl [18:01:38.745] restarts <- computeRestarts(cond) [18:01:38.745] for (restart in restarts) { [18:01:38.745] name <- restart$name [18:01:38.745] if (is.null(name)) [18:01:38.745] next [18:01:38.745] if (!grepl(pattern, name)) [18:01:38.745] next [18:01:38.745] invokeRestart(restart) [18:01:38.745] muffled <- TRUE [18:01:38.745] break [18:01:38.745] } [18:01:38.745] } [18:01:38.745] } [18:01:38.745] invisible(muffled) [18:01:38.745] } [18:01:38.745] muffleCondition(cond, pattern = "^muffle") [18:01:38.745] } [18:01:38.745] } [18:01:38.745] } [18:01:38.745] })) [18:01:38.745] }, error = function(ex) { [18:01:38.745] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.745] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.745] ...future.rng), started = ...future.startTime, [18:01:38.745] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.745] version = "1.8"), class = "FutureResult") [18:01:38.745] }, finally = { [18:01:38.745] if (!identical(...future.workdir, getwd())) [18:01:38.745] setwd(...future.workdir) [18:01:38.745] { [18:01:38.745] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.745] ...future.oldOptions$nwarnings <- NULL [18:01:38.745] } [18:01:38.745] base::options(...future.oldOptions) [18:01:38.745] if (.Platform$OS.type == "windows") { [18:01:38.745] old_names <- names(...future.oldEnvVars) [18:01:38.745] envs <- base::Sys.getenv() [18:01:38.745] names <- names(envs) [18:01:38.745] common <- intersect(names, old_names) [18:01:38.745] added <- setdiff(names, old_names) [18:01:38.745] removed <- setdiff(old_names, names) [18:01:38.745] changed <- common[...future.oldEnvVars[common] != [18:01:38.745] envs[common]] [18:01:38.745] NAMES <- toupper(changed) [18:01:38.745] args <- list() [18:01:38.745] for (kk in seq_along(NAMES)) { [18:01:38.745] name <- changed[[kk]] [18:01:38.745] NAME <- NAMES[[kk]] [18:01:38.745] if (name != NAME && is.element(NAME, old_names)) [18:01:38.745] next [18:01:38.745] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.745] } [18:01:38.745] NAMES <- toupper(added) [18:01:38.745] for (kk in seq_along(NAMES)) { [18:01:38.745] name <- added[[kk]] [18:01:38.745] NAME <- NAMES[[kk]] [18:01:38.745] if (name != NAME && is.element(NAME, old_names)) [18:01:38.745] next [18:01:38.745] args[[name]] <- "" [18:01:38.745] } [18:01:38.745] NAMES <- toupper(removed) [18:01:38.745] for (kk in seq_along(NAMES)) { [18:01:38.745] name <- removed[[kk]] [18:01:38.745] NAME <- NAMES[[kk]] [18:01:38.745] if (name != NAME && is.element(NAME, old_names)) [18:01:38.745] next [18:01:38.745] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.745] } [18:01:38.745] if (length(args) > 0) [18:01:38.745] base::do.call(base::Sys.setenv, args = args) [18:01:38.745] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.745] } [18:01:38.745] else { [18:01:38.745] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.745] } [18:01:38.745] { [18:01:38.745] if (base::length(...future.futureOptionsAdded) > [18:01:38.745] 0L) { [18:01:38.745] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.745] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.745] base::options(opts) [18:01:38.745] } [18:01:38.745] { [18:01:38.745] { [18:01:38.745] NULL [18:01:38.745] RNGkind("Mersenne-Twister") [18:01:38.745] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.745] inherits = FALSE) [18:01:38.745] } [18:01:38.745] options(future.plan = NULL) [18:01:38.745] if (is.na(NA_character_)) [18:01:38.745] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.745] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.745] future::plan(list(function (..., envir = parent.frame()) [18:01:38.745] { [18:01:38.745] future <- SequentialFuture(..., envir = envir) [18:01:38.745] if (!future$lazy) [18:01:38.745] future <- run(future) [18:01:38.745] invisible(future) [18:01:38.745] }), .cleanup = FALSE, .init = FALSE) [18:01:38.745] } [18:01:38.745] } [18:01:38.745] } [18:01:38.745] }) [18:01:38.745] if (TRUE) { [18:01:38.745] base::sink(type = "output", split = FALSE) [18:01:38.745] if (TRUE) { [18:01:38.745] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.745] } [18:01:38.745] else { [18:01:38.745] ...future.result["stdout"] <- base::list(NULL) [18:01:38.745] } [18:01:38.745] base::close(...future.stdout) [18:01:38.745] ...future.stdout <- NULL [18:01:38.745] } [18:01:38.745] ...future.result$conditions <- ...future.conditions [18:01:38.745] ...future.result$finished <- base::Sys.time() [18:01:38.745] ...future.result [18:01:38.745] } [18:01:38.749] plan(): Setting new future strategy stack: [18:01:38.749] List of future strategies: [18:01:38.749] 1. sequential: [18:01:38.749] - args: function (..., envir = parent.frame()) [18:01:38.749] - tweaked: FALSE [18:01:38.749] - call: NULL [18:01:38.750] plan(): nbrOfWorkers() = 1 [18:01:38.751] plan(): Setting new future strategy stack: [18:01:38.751] List of future strategies: [18:01:38.751] 1. sequential: [18:01:38.751] - args: function (..., envir = parent.frame()) [18:01:38.751] - tweaked: FALSE [18:01:38.751] - call: plan(strategy) [18:01:38.752] plan(): nbrOfWorkers() = 1 [18:01:38.752] SequentialFuture started (and completed) [18:01:38.752] - Launch lazy future ... done [18:01:38.752] run() for 'SequentialFuture' ... done [18:01:38.754] resolved() for 'SequentialFuture' ... [18:01:38.754] - state: 'finished' [18:01:38.754] - run: TRUE [18:01:38.755] - result: 'FutureResult' [18:01:38.755] resolved() for 'SequentialFuture' ... done [18:01:38.755] resolved() for 'SequentialFuture' ... [18:01:38.755] - state: 'finished' [18:01:38.755] - run: TRUE [18:01:38.755] - result: 'FutureResult' [18:01:38.756] resolved() for 'SequentialFuture' ... done [18:01:38.756] resolved() for 'SequentialFuture' ... [18:01:38.756] - state: 'finished' [18:01:38.756] - run: TRUE [18:01:38.756] - result: 'FutureResult' [18:01:38.757] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:38.758] resolve() on environment ... [18:01:38.758] recursive: 0 [18:01:38.759] elements: [4] 'a', 'b', 'c', 'd' [18:01:38.759] signalConditionsASAP(numeric, pos=1) ... [18:01:38.759] - nx: 4 [18:01:38.760] - relay: TRUE [18:01:38.760] - stdout: TRUE [18:01:38.760] - signal: TRUE [18:01:38.760] - resignal: FALSE [18:01:38.760] - force: TRUE [18:01:38.760] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.760] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.761] - until=2 [18:01:38.761] - relaying element #2 [18:01:38.761] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.761] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.761] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.761] length: 3 (resolved future 1) [18:01:38.762] resolved() for 'SequentialFuture' ... [18:01:38.762] - state: 'finished' [18:01:38.762] - run: TRUE [18:01:38.762] - result: 'FutureResult' [18:01:38.762] resolved() for 'SequentialFuture' ... done [18:01:38.762] Future #2 [18:01:38.763] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.763] - nx: 4 [18:01:38.763] - relay: TRUE [18:01:38.763] - stdout: TRUE [18:01:38.763] - signal: TRUE [18:01:38.763] - resignal: FALSE [18:01:38.764] - force: TRUE [18:01:38.764] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.764] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.764] - until=2 [18:01:38.764] - relaying element #2 [18:01:38.765] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.765] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.765] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.765] length: 2 (resolved future 2) [18:01:38.765] resolved() for 'SequentialFuture' ... [18:01:38.765] - state: 'finished' [18:01:38.766] - run: TRUE [18:01:38.766] - result: 'FutureResult' [18:01:38.766] resolved() for 'SequentialFuture' ... done [18:01:38.766] Future #3 [18:01:38.766] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.766] - nx: 4 [18:01:38.767] - relay: TRUE [18:01:38.767] - stdout: TRUE [18:01:38.767] - signal: TRUE [18:01:38.767] - resignal: FALSE [18:01:38.767] - force: TRUE [18:01:38.767] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.768] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.768] - until=3 [18:01:38.768] - relaying element #3 [18:01:38.768] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.768] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.768] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.769] length: 1 (resolved future 3) [18:01:38.769] resolved() for 'SequentialFuture' ... [18:01:38.769] - state: 'finished' [18:01:38.769] - run: TRUE [18:01:38.769] - result: 'FutureResult' [18:01:38.770] resolved() for 'SequentialFuture' ... done [18:01:38.770] Future #4 [18:01:38.770] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:38.770] - nx: 4 [18:01:38.770] - relay: TRUE [18:01:38.770] - stdout: TRUE [18:01:38.771] - signal: TRUE [18:01:38.771] - resignal: FALSE [18:01:38.771] - force: TRUE [18:01:38.771] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.771] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.771] - until=4 [18:01:38.771] - relaying element #4 [18:01:38.772] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.772] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.772] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:38.772] length: 0 (resolved future 4) [18:01:38.772] Relaying remaining futures [18:01:38.773] signalConditionsASAP(NULL, pos=0) ... [18:01:38.773] - nx: 4 [18:01:38.773] - relay: TRUE [18:01:38.773] - stdout: TRUE [18:01:38.773] - signal: TRUE [18:01:38.773] - resignal: FALSE [18:01:38.773] - force: TRUE [18:01:38.774] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.774] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:38.774] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.774] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.774] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.774] resolve() on environment ... DONE Dimensions: c(1, 6) [18:01:38.775] getGlobalsAndPackages() ... [18:01:38.775] Searching for globals... [18:01:38.776] [18:01:38.776] Searching for globals ... DONE [18:01:38.776] - globals: [0] [18:01:38.776] getGlobalsAndPackages() ... DONE [18:01:38.776] run() for 'Future' ... [18:01:38.777] - state: 'created' [18:01:38.777] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.777] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.777] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.778] - Field: 'label' [18:01:38.778] - Field: 'local' [18:01:38.778] - Field: 'owner' [18:01:38.778] - Field: 'envir' [18:01:38.778] - Field: 'packages' [18:01:38.778] - Field: 'gc' [18:01:38.779] - Field: 'conditions' [18:01:38.779] - Field: 'expr' [18:01:38.779] - Field: 'uuid' [18:01:38.779] - Field: 'seed' [18:01:38.779] - Field: 'version' [18:01:38.780] - Field: 'result' [18:01:38.780] - Field: 'asynchronous' [18:01:38.780] - Field: 'calls' [18:01:38.780] - Field: 'globals' [18:01:38.780] - Field: 'stdout' [18:01:38.780] - Field: 'earlySignal' [18:01:38.781] - Field: 'lazy' [18:01:38.781] - Field: 'state' [18:01:38.782] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.782] - Launch lazy future ... [18:01:38.782] Packages needed by the future expression (n = 0): [18:01:38.783] Packages needed by future strategies (n = 0): [18:01:38.783] { [18:01:38.783] { [18:01:38.783] { [18:01:38.783] ...future.startTime <- base::Sys.time() [18:01:38.783] { [18:01:38.783] { [18:01:38.783] { [18:01:38.783] base::local({ [18:01:38.783] has_future <- base::requireNamespace("future", [18:01:38.783] quietly = TRUE) [18:01:38.783] if (has_future) { [18:01:38.783] ns <- base::getNamespace("future") [18:01:38.783] version <- ns[[".package"]][["version"]] [18:01:38.783] if (is.null(version)) [18:01:38.783] version <- utils::packageVersion("future") [18:01:38.783] } [18:01:38.783] else { [18:01:38.783] version <- NULL [18:01:38.783] } [18:01:38.783] if (!has_future || version < "1.8.0") { [18:01:38.783] info <- base::c(r_version = base::gsub("R version ", [18:01:38.783] "", base::R.version$version.string), [18:01:38.783] platform = base::sprintf("%s (%s-bit)", [18:01:38.783] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.783] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.783] "release", "version")], collapse = " "), [18:01:38.783] hostname = base::Sys.info()[["nodename"]]) [18:01:38.783] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.783] info) [18:01:38.783] info <- base::paste(info, collapse = "; ") [18:01:38.783] if (!has_future) { [18:01:38.783] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.783] info) [18:01:38.783] } [18:01:38.783] else { [18:01:38.783] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.783] info, version) [18:01:38.783] } [18:01:38.783] base::stop(msg) [18:01:38.783] } [18:01:38.783] }) [18:01:38.783] } [18:01:38.783] options(future.plan = NULL) [18:01:38.783] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.783] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.783] } [18:01:38.783] ...future.workdir <- getwd() [18:01:38.783] } [18:01:38.783] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.783] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.783] } [18:01:38.783] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.783] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.783] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.783] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.783] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.783] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.783] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.783] base::names(...future.oldOptions)) [18:01:38.783] } [18:01:38.783] if (FALSE) { [18:01:38.783] } [18:01:38.783] else { [18:01:38.783] if (TRUE) { [18:01:38.783] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.783] open = "w") [18:01:38.783] } [18:01:38.783] else { [18:01:38.783] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.783] windows = "NUL", "/dev/null"), open = "w") [18:01:38.783] } [18:01:38.783] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.783] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.783] base::sink(type = "output", split = FALSE) [18:01:38.783] base::close(...future.stdout) [18:01:38.783] }, add = TRUE) [18:01:38.783] } [18:01:38.783] ...future.frame <- base::sys.nframe() [18:01:38.783] ...future.conditions <- base::list() [18:01:38.783] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.783] if (FALSE) { [18:01:38.783] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.783] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.783] } [18:01:38.783] ...future.result <- base::tryCatch({ [18:01:38.783] base::withCallingHandlers({ [18:01:38.783] ...future.value <- base::withVisible(base::local(2)) [18:01:38.783] future::FutureResult(value = ...future.value$value, [18:01:38.783] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.783] ...future.rng), globalenv = if (FALSE) [18:01:38.783] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.783] ...future.globalenv.names)) [18:01:38.783] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.783] }, condition = base::local({ [18:01:38.783] c <- base::c [18:01:38.783] inherits <- base::inherits [18:01:38.783] invokeRestart <- base::invokeRestart [18:01:38.783] length <- base::length [18:01:38.783] list <- base::list [18:01:38.783] seq.int <- base::seq.int [18:01:38.783] signalCondition <- base::signalCondition [18:01:38.783] sys.calls <- base::sys.calls [18:01:38.783] `[[` <- base::`[[` [18:01:38.783] `+` <- base::`+` [18:01:38.783] `<<-` <- base::`<<-` [18:01:38.783] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.783] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.783] 3L)] [18:01:38.783] } [18:01:38.783] function(cond) { [18:01:38.783] is_error <- inherits(cond, "error") [18:01:38.783] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.783] NULL) [18:01:38.783] if (is_error) { [18:01:38.783] sessionInformation <- function() { [18:01:38.783] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.783] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.783] search = base::search(), system = base::Sys.info()) [18:01:38.783] } [18:01:38.783] ...future.conditions[[length(...future.conditions) + [18:01:38.783] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.783] cond$call), session = sessionInformation(), [18:01:38.783] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.783] signalCondition(cond) [18:01:38.783] } [18:01:38.783] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.783] "immediateCondition"))) { [18:01:38.783] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.783] ...future.conditions[[length(...future.conditions) + [18:01:38.783] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.783] if (TRUE && !signal) { [18:01:38.783] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.783] { [18:01:38.783] inherits <- base::inherits [18:01:38.783] invokeRestart <- base::invokeRestart [18:01:38.783] is.null <- base::is.null [18:01:38.783] muffled <- FALSE [18:01:38.783] if (inherits(cond, "message")) { [18:01:38.783] muffled <- grepl(pattern, "muffleMessage") [18:01:38.783] if (muffled) [18:01:38.783] invokeRestart("muffleMessage") [18:01:38.783] } [18:01:38.783] else if (inherits(cond, "warning")) { [18:01:38.783] muffled <- grepl(pattern, "muffleWarning") [18:01:38.783] if (muffled) [18:01:38.783] invokeRestart("muffleWarning") [18:01:38.783] } [18:01:38.783] else if (inherits(cond, "condition")) { [18:01:38.783] if (!is.null(pattern)) { [18:01:38.783] computeRestarts <- base::computeRestarts [18:01:38.783] grepl <- base::grepl [18:01:38.783] restarts <- computeRestarts(cond) [18:01:38.783] for (restart in restarts) { [18:01:38.783] name <- restart$name [18:01:38.783] if (is.null(name)) [18:01:38.783] next [18:01:38.783] if (!grepl(pattern, name)) [18:01:38.783] next [18:01:38.783] invokeRestart(restart) [18:01:38.783] muffled <- TRUE [18:01:38.783] break [18:01:38.783] } [18:01:38.783] } [18:01:38.783] } [18:01:38.783] invisible(muffled) [18:01:38.783] } [18:01:38.783] muffleCondition(cond, pattern = "^muffle") [18:01:38.783] } [18:01:38.783] } [18:01:38.783] else { [18:01:38.783] if (TRUE) { [18:01:38.783] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.783] { [18:01:38.783] inherits <- base::inherits [18:01:38.783] invokeRestart <- base::invokeRestart [18:01:38.783] is.null <- base::is.null [18:01:38.783] muffled <- FALSE [18:01:38.783] if (inherits(cond, "message")) { [18:01:38.783] muffled <- grepl(pattern, "muffleMessage") [18:01:38.783] if (muffled) [18:01:38.783] invokeRestart("muffleMessage") [18:01:38.783] } [18:01:38.783] else if (inherits(cond, "warning")) { [18:01:38.783] muffled <- grepl(pattern, "muffleWarning") [18:01:38.783] if (muffled) [18:01:38.783] invokeRestart("muffleWarning") [18:01:38.783] } [18:01:38.783] else if (inherits(cond, "condition")) { [18:01:38.783] if (!is.null(pattern)) { [18:01:38.783] computeRestarts <- base::computeRestarts [18:01:38.783] grepl <- base::grepl [18:01:38.783] restarts <- computeRestarts(cond) [18:01:38.783] for (restart in restarts) { [18:01:38.783] name <- restart$name [18:01:38.783] if (is.null(name)) [18:01:38.783] next [18:01:38.783] if (!grepl(pattern, name)) [18:01:38.783] next [18:01:38.783] invokeRestart(restart) [18:01:38.783] muffled <- TRUE [18:01:38.783] break [18:01:38.783] } [18:01:38.783] } [18:01:38.783] } [18:01:38.783] invisible(muffled) [18:01:38.783] } [18:01:38.783] muffleCondition(cond, pattern = "^muffle") [18:01:38.783] } [18:01:38.783] } [18:01:38.783] } [18:01:38.783] })) [18:01:38.783] }, error = function(ex) { [18:01:38.783] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.783] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.783] ...future.rng), started = ...future.startTime, [18:01:38.783] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.783] version = "1.8"), class = "FutureResult") [18:01:38.783] }, finally = { [18:01:38.783] if (!identical(...future.workdir, getwd())) [18:01:38.783] setwd(...future.workdir) [18:01:38.783] { [18:01:38.783] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.783] ...future.oldOptions$nwarnings <- NULL [18:01:38.783] } [18:01:38.783] base::options(...future.oldOptions) [18:01:38.783] if (.Platform$OS.type == "windows") { [18:01:38.783] old_names <- names(...future.oldEnvVars) [18:01:38.783] envs <- base::Sys.getenv() [18:01:38.783] names <- names(envs) [18:01:38.783] common <- intersect(names, old_names) [18:01:38.783] added <- setdiff(names, old_names) [18:01:38.783] removed <- setdiff(old_names, names) [18:01:38.783] changed <- common[...future.oldEnvVars[common] != [18:01:38.783] envs[common]] [18:01:38.783] NAMES <- toupper(changed) [18:01:38.783] args <- list() [18:01:38.783] for (kk in seq_along(NAMES)) { [18:01:38.783] name <- changed[[kk]] [18:01:38.783] NAME <- NAMES[[kk]] [18:01:38.783] if (name != NAME && is.element(NAME, old_names)) [18:01:38.783] next [18:01:38.783] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.783] } [18:01:38.783] NAMES <- toupper(added) [18:01:38.783] for (kk in seq_along(NAMES)) { [18:01:38.783] name <- added[[kk]] [18:01:38.783] NAME <- NAMES[[kk]] [18:01:38.783] if (name != NAME && is.element(NAME, old_names)) [18:01:38.783] next [18:01:38.783] args[[name]] <- "" [18:01:38.783] } [18:01:38.783] NAMES <- toupper(removed) [18:01:38.783] for (kk in seq_along(NAMES)) { [18:01:38.783] name <- removed[[kk]] [18:01:38.783] NAME <- NAMES[[kk]] [18:01:38.783] if (name != NAME && is.element(NAME, old_names)) [18:01:38.783] next [18:01:38.783] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.783] } [18:01:38.783] if (length(args) > 0) [18:01:38.783] base::do.call(base::Sys.setenv, args = args) [18:01:38.783] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.783] } [18:01:38.783] else { [18:01:38.783] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.783] } [18:01:38.783] { [18:01:38.783] if (base::length(...future.futureOptionsAdded) > [18:01:38.783] 0L) { [18:01:38.783] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.783] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.783] base::options(opts) [18:01:38.783] } [18:01:38.783] { [18:01:38.783] { [18:01:38.783] NULL [18:01:38.783] RNGkind("Mersenne-Twister") [18:01:38.783] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.783] inherits = FALSE) [18:01:38.783] } [18:01:38.783] options(future.plan = NULL) [18:01:38.783] if (is.na(NA_character_)) [18:01:38.783] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.783] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.783] future::plan(list(function (..., envir = parent.frame()) [18:01:38.783] { [18:01:38.783] future <- SequentialFuture(..., envir = envir) [18:01:38.783] if (!future$lazy) [18:01:38.783] future <- run(future) [18:01:38.783] invisible(future) [18:01:38.783] }), .cleanup = FALSE, .init = FALSE) [18:01:38.783] } [18:01:38.783] } [18:01:38.783] } [18:01:38.783] }) [18:01:38.783] if (TRUE) { [18:01:38.783] base::sink(type = "output", split = FALSE) [18:01:38.783] if (TRUE) { [18:01:38.783] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.783] } [18:01:38.783] else { [18:01:38.783] ...future.result["stdout"] <- base::list(NULL) [18:01:38.783] } [18:01:38.783] base::close(...future.stdout) [18:01:38.783] ...future.stdout <- NULL [18:01:38.783] } [18:01:38.783] ...future.result$conditions <- ...future.conditions [18:01:38.783] ...future.result$finished <- base::Sys.time() [18:01:38.783] ...future.result [18:01:38.783] } [18:01:38.787] plan(): Setting new future strategy stack: [18:01:38.787] List of future strategies: [18:01:38.787] 1. sequential: [18:01:38.787] - args: function (..., envir = parent.frame()) [18:01:38.787] - tweaked: FALSE [18:01:38.787] - call: NULL [18:01:38.788] plan(): nbrOfWorkers() = 1 [18:01:38.789] plan(): Setting new future strategy stack: [18:01:38.789] List of future strategies: [18:01:38.789] 1. sequential: [18:01:38.789] - args: function (..., envir = parent.frame()) [18:01:38.789] - tweaked: FALSE [18:01:38.789] - call: plan(strategy) [18:01:38.789] plan(): nbrOfWorkers() = 1 [18:01:38.790] SequentialFuture started (and completed) [18:01:38.790] - Launch lazy future ... done [18:01:38.790] run() for 'SequentialFuture' ... done [18:01:38.790] getGlobalsAndPackages() ... [18:01:38.790] Searching for globals... [18:01:38.791] [18:01:38.791] Searching for globals ... DONE [18:01:38.791] - globals: [0] [18:01:38.791] getGlobalsAndPackages() ... DONE [18:01:38.792] run() for 'Future' ... [18:01:38.792] - state: 'created' [18:01:38.792] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.792] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.793] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.793] - Field: 'label' [18:01:38.793] - Field: 'local' [18:01:38.793] - Field: 'owner' [18:01:38.793] - Field: 'envir' [18:01:38.793] - Field: 'packages' [18:01:38.794] - Field: 'gc' [18:01:38.794] - Field: 'conditions' [18:01:38.794] - Field: 'expr' [18:01:38.794] - Field: 'uuid' [18:01:38.794] - Field: 'seed' [18:01:38.794] - Field: 'version' [18:01:38.795] - Field: 'result' [18:01:38.795] - Field: 'asynchronous' [18:01:38.795] - Field: 'calls' [18:01:38.795] - Field: 'globals' [18:01:38.795] - Field: 'stdout' [18:01:38.795] - Field: 'earlySignal' [18:01:38.796] - Field: 'lazy' [18:01:38.796] - Field: 'state' [18:01:38.796] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.796] - Launch lazy future ... [18:01:38.796] Packages needed by the future expression (n = 0): [18:01:38.797] Packages needed by future strategies (n = 0): [18:01:38.797] { [18:01:38.797] { [18:01:38.797] { [18:01:38.797] ...future.startTime <- base::Sys.time() [18:01:38.797] { [18:01:38.797] { [18:01:38.797] { [18:01:38.797] base::local({ [18:01:38.797] has_future <- base::requireNamespace("future", [18:01:38.797] quietly = TRUE) [18:01:38.797] if (has_future) { [18:01:38.797] ns <- base::getNamespace("future") [18:01:38.797] version <- ns[[".package"]][["version"]] [18:01:38.797] if (is.null(version)) [18:01:38.797] version <- utils::packageVersion("future") [18:01:38.797] } [18:01:38.797] else { [18:01:38.797] version <- NULL [18:01:38.797] } [18:01:38.797] if (!has_future || version < "1.8.0") { [18:01:38.797] info <- base::c(r_version = base::gsub("R version ", [18:01:38.797] "", base::R.version$version.string), [18:01:38.797] platform = base::sprintf("%s (%s-bit)", [18:01:38.797] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.797] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.797] "release", "version")], collapse = " "), [18:01:38.797] hostname = base::Sys.info()[["nodename"]]) [18:01:38.797] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.797] info) [18:01:38.797] info <- base::paste(info, collapse = "; ") [18:01:38.797] if (!has_future) { [18:01:38.797] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.797] info) [18:01:38.797] } [18:01:38.797] else { [18:01:38.797] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.797] info, version) [18:01:38.797] } [18:01:38.797] base::stop(msg) [18:01:38.797] } [18:01:38.797] }) [18:01:38.797] } [18:01:38.797] options(future.plan = NULL) [18:01:38.797] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.797] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.797] } [18:01:38.797] ...future.workdir <- getwd() [18:01:38.797] } [18:01:38.797] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.797] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.797] } [18:01:38.797] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.797] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.797] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.797] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.797] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.797] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.797] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.797] base::names(...future.oldOptions)) [18:01:38.797] } [18:01:38.797] if (FALSE) { [18:01:38.797] } [18:01:38.797] else { [18:01:38.797] if (TRUE) { [18:01:38.797] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.797] open = "w") [18:01:38.797] } [18:01:38.797] else { [18:01:38.797] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.797] windows = "NUL", "/dev/null"), open = "w") [18:01:38.797] } [18:01:38.797] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.797] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.797] base::sink(type = "output", split = FALSE) [18:01:38.797] base::close(...future.stdout) [18:01:38.797] }, add = TRUE) [18:01:38.797] } [18:01:38.797] ...future.frame <- base::sys.nframe() [18:01:38.797] ...future.conditions <- base::list() [18:01:38.797] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.797] if (FALSE) { [18:01:38.797] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.797] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.797] } [18:01:38.797] ...future.result <- base::tryCatch({ [18:01:38.797] base::withCallingHandlers({ [18:01:38.797] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.797] future::FutureResult(value = ...future.value$value, [18:01:38.797] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.797] ...future.rng), globalenv = if (FALSE) [18:01:38.797] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.797] ...future.globalenv.names)) [18:01:38.797] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.797] }, condition = base::local({ [18:01:38.797] c <- base::c [18:01:38.797] inherits <- base::inherits [18:01:38.797] invokeRestart <- base::invokeRestart [18:01:38.797] length <- base::length [18:01:38.797] list <- base::list [18:01:38.797] seq.int <- base::seq.int [18:01:38.797] signalCondition <- base::signalCondition [18:01:38.797] sys.calls <- base::sys.calls [18:01:38.797] `[[` <- base::`[[` [18:01:38.797] `+` <- base::`+` [18:01:38.797] `<<-` <- base::`<<-` [18:01:38.797] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.797] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.797] 3L)] [18:01:38.797] } [18:01:38.797] function(cond) { [18:01:38.797] is_error <- inherits(cond, "error") [18:01:38.797] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.797] NULL) [18:01:38.797] if (is_error) { [18:01:38.797] sessionInformation <- function() { [18:01:38.797] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.797] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.797] search = base::search(), system = base::Sys.info()) [18:01:38.797] } [18:01:38.797] ...future.conditions[[length(...future.conditions) + [18:01:38.797] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.797] cond$call), session = sessionInformation(), [18:01:38.797] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.797] signalCondition(cond) [18:01:38.797] } [18:01:38.797] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.797] "immediateCondition"))) { [18:01:38.797] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.797] ...future.conditions[[length(...future.conditions) + [18:01:38.797] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.797] if (TRUE && !signal) { [18:01:38.797] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.797] { [18:01:38.797] inherits <- base::inherits [18:01:38.797] invokeRestart <- base::invokeRestart [18:01:38.797] is.null <- base::is.null [18:01:38.797] muffled <- FALSE [18:01:38.797] if (inherits(cond, "message")) { [18:01:38.797] muffled <- grepl(pattern, "muffleMessage") [18:01:38.797] if (muffled) [18:01:38.797] invokeRestart("muffleMessage") [18:01:38.797] } [18:01:38.797] else if (inherits(cond, "warning")) { [18:01:38.797] muffled <- grepl(pattern, "muffleWarning") [18:01:38.797] if (muffled) [18:01:38.797] invokeRestart("muffleWarning") [18:01:38.797] } [18:01:38.797] else if (inherits(cond, "condition")) { [18:01:38.797] if (!is.null(pattern)) { [18:01:38.797] computeRestarts <- base::computeRestarts [18:01:38.797] grepl <- base::grepl [18:01:38.797] restarts <- computeRestarts(cond) [18:01:38.797] for (restart in restarts) { [18:01:38.797] name <- restart$name [18:01:38.797] if (is.null(name)) [18:01:38.797] next [18:01:38.797] if (!grepl(pattern, name)) [18:01:38.797] next [18:01:38.797] invokeRestart(restart) [18:01:38.797] muffled <- TRUE [18:01:38.797] break [18:01:38.797] } [18:01:38.797] } [18:01:38.797] } [18:01:38.797] invisible(muffled) [18:01:38.797] } [18:01:38.797] muffleCondition(cond, pattern = "^muffle") [18:01:38.797] } [18:01:38.797] } [18:01:38.797] else { [18:01:38.797] if (TRUE) { [18:01:38.797] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.797] { [18:01:38.797] inherits <- base::inherits [18:01:38.797] invokeRestart <- base::invokeRestart [18:01:38.797] is.null <- base::is.null [18:01:38.797] muffled <- FALSE [18:01:38.797] if (inherits(cond, "message")) { [18:01:38.797] muffled <- grepl(pattern, "muffleMessage") [18:01:38.797] if (muffled) [18:01:38.797] invokeRestart("muffleMessage") [18:01:38.797] } [18:01:38.797] else if (inherits(cond, "warning")) { [18:01:38.797] muffled <- grepl(pattern, "muffleWarning") [18:01:38.797] if (muffled) [18:01:38.797] invokeRestart("muffleWarning") [18:01:38.797] } [18:01:38.797] else if (inherits(cond, "condition")) { [18:01:38.797] if (!is.null(pattern)) { [18:01:38.797] computeRestarts <- base::computeRestarts [18:01:38.797] grepl <- base::grepl [18:01:38.797] restarts <- computeRestarts(cond) [18:01:38.797] for (restart in restarts) { [18:01:38.797] name <- restart$name [18:01:38.797] if (is.null(name)) [18:01:38.797] next [18:01:38.797] if (!grepl(pattern, name)) [18:01:38.797] next [18:01:38.797] invokeRestart(restart) [18:01:38.797] muffled <- TRUE [18:01:38.797] break [18:01:38.797] } [18:01:38.797] } [18:01:38.797] } [18:01:38.797] invisible(muffled) [18:01:38.797] } [18:01:38.797] muffleCondition(cond, pattern = "^muffle") [18:01:38.797] } [18:01:38.797] } [18:01:38.797] } [18:01:38.797] })) [18:01:38.797] }, error = function(ex) { [18:01:38.797] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.797] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.797] ...future.rng), started = ...future.startTime, [18:01:38.797] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.797] version = "1.8"), class = "FutureResult") [18:01:38.797] }, finally = { [18:01:38.797] if (!identical(...future.workdir, getwd())) [18:01:38.797] setwd(...future.workdir) [18:01:38.797] { [18:01:38.797] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.797] ...future.oldOptions$nwarnings <- NULL [18:01:38.797] } [18:01:38.797] base::options(...future.oldOptions) [18:01:38.797] if (.Platform$OS.type == "windows") { [18:01:38.797] old_names <- names(...future.oldEnvVars) [18:01:38.797] envs <- base::Sys.getenv() [18:01:38.797] names <- names(envs) [18:01:38.797] common <- intersect(names, old_names) [18:01:38.797] added <- setdiff(names, old_names) [18:01:38.797] removed <- setdiff(old_names, names) [18:01:38.797] changed <- common[...future.oldEnvVars[common] != [18:01:38.797] envs[common]] [18:01:38.797] NAMES <- toupper(changed) [18:01:38.797] args <- list() [18:01:38.797] for (kk in seq_along(NAMES)) { [18:01:38.797] name <- changed[[kk]] [18:01:38.797] NAME <- NAMES[[kk]] [18:01:38.797] if (name != NAME && is.element(NAME, old_names)) [18:01:38.797] next [18:01:38.797] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.797] } [18:01:38.797] NAMES <- toupper(added) [18:01:38.797] for (kk in seq_along(NAMES)) { [18:01:38.797] name <- added[[kk]] [18:01:38.797] NAME <- NAMES[[kk]] [18:01:38.797] if (name != NAME && is.element(NAME, old_names)) [18:01:38.797] next [18:01:38.797] args[[name]] <- "" [18:01:38.797] } [18:01:38.797] NAMES <- toupper(removed) [18:01:38.797] for (kk in seq_along(NAMES)) { [18:01:38.797] name <- removed[[kk]] [18:01:38.797] NAME <- NAMES[[kk]] [18:01:38.797] if (name != NAME && is.element(NAME, old_names)) [18:01:38.797] next [18:01:38.797] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.797] } [18:01:38.797] if (length(args) > 0) [18:01:38.797] base::do.call(base::Sys.setenv, args = args) [18:01:38.797] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.797] } [18:01:38.797] else { [18:01:38.797] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.797] } [18:01:38.797] { [18:01:38.797] if (base::length(...future.futureOptionsAdded) > [18:01:38.797] 0L) { [18:01:38.797] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.797] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.797] base::options(opts) [18:01:38.797] } [18:01:38.797] { [18:01:38.797] { [18:01:38.797] NULL [18:01:38.797] RNGkind("Mersenne-Twister") [18:01:38.797] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.797] inherits = FALSE) [18:01:38.797] } [18:01:38.797] options(future.plan = NULL) [18:01:38.797] if (is.na(NA_character_)) [18:01:38.797] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.797] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.797] future::plan(list(function (..., envir = parent.frame()) [18:01:38.797] { [18:01:38.797] future <- SequentialFuture(..., envir = envir) [18:01:38.797] if (!future$lazy) [18:01:38.797] future <- run(future) [18:01:38.797] invisible(future) [18:01:38.797] }), .cleanup = FALSE, .init = FALSE) [18:01:38.797] } [18:01:38.797] } [18:01:38.797] } [18:01:38.797] }) [18:01:38.797] if (TRUE) { [18:01:38.797] base::sink(type = "output", split = FALSE) [18:01:38.797] if (TRUE) { [18:01:38.797] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.797] } [18:01:38.797] else { [18:01:38.797] ...future.result["stdout"] <- base::list(NULL) [18:01:38.797] } [18:01:38.797] base::close(...future.stdout) [18:01:38.797] ...future.stdout <- NULL [18:01:38.797] } [18:01:38.797] ...future.result$conditions <- ...future.conditions [18:01:38.797] ...future.result$finished <- base::Sys.time() [18:01:38.797] ...future.result [18:01:38.797] } [18:01:38.801] plan(): Setting new future strategy stack: [18:01:38.801] List of future strategies: [18:01:38.801] 1. sequential: [18:01:38.801] - args: function (..., envir = parent.frame()) [18:01:38.801] - tweaked: FALSE [18:01:38.801] - call: NULL [18:01:38.802] plan(): nbrOfWorkers() = 1 [18:01:38.803] plan(): Setting new future strategy stack: [18:01:38.803] List of future strategies: [18:01:38.803] 1. sequential: [18:01:38.803] - args: function (..., envir = parent.frame()) [18:01:38.803] - tweaked: FALSE [18:01:38.803] - call: plan(strategy) [18:01:38.803] plan(): nbrOfWorkers() = 1 [18:01:38.804] SequentialFuture started (and completed) [18:01:38.804] - Launch lazy future ... done [18:01:38.804] run() for 'SequentialFuture' ... done [18:01:38.804] getGlobalsAndPackages() ... [18:01:38.805] Searching for globals... [18:01:38.805] - globals found: [1] '{' [18:01:38.805] Searching for globals ... DONE [18:01:38.806] Resolving globals: FALSE [18:01:38.806] [18:01:38.806] [18:01:38.806] getGlobalsAndPackages() ... DONE [18:01:38.807] run() for 'Future' ... [18:01:38.807] - state: 'created' [18:01:38.807] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.807] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.807] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.808] - Field: 'label' [18:01:38.808] - Field: 'local' [18:01:38.808] - Field: 'owner' [18:01:38.808] - Field: 'envir' [18:01:38.808] - Field: 'packages' [18:01:38.809] - Field: 'gc' [18:01:38.809] - Field: 'conditions' [18:01:38.809] - Field: 'expr' [18:01:38.809] - Field: 'uuid' [18:01:38.809] - Field: 'seed' [18:01:38.809] - Field: 'version' [18:01:38.810] - Field: 'result' [18:01:38.810] - Field: 'asynchronous' [18:01:38.810] - Field: 'calls' [18:01:38.810] - Field: 'globals' [18:01:38.810] - Field: 'stdout' [18:01:38.810] - Field: 'earlySignal' [18:01:38.811] - Field: 'lazy' [18:01:38.811] - Field: 'state' [18:01:38.811] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.811] - Launch lazy future ... [18:01:38.811] Packages needed by the future expression (n = 0): [18:01:38.812] Packages needed by future strategies (n = 0): [18:01:38.812] { [18:01:38.812] { [18:01:38.812] { [18:01:38.812] ...future.startTime <- base::Sys.time() [18:01:38.812] { [18:01:38.812] { [18:01:38.812] { [18:01:38.812] base::local({ [18:01:38.812] has_future <- base::requireNamespace("future", [18:01:38.812] quietly = TRUE) [18:01:38.812] if (has_future) { [18:01:38.812] ns <- base::getNamespace("future") [18:01:38.812] version <- ns[[".package"]][["version"]] [18:01:38.812] if (is.null(version)) [18:01:38.812] version <- utils::packageVersion("future") [18:01:38.812] } [18:01:38.812] else { [18:01:38.812] version <- NULL [18:01:38.812] } [18:01:38.812] if (!has_future || version < "1.8.0") { [18:01:38.812] info <- base::c(r_version = base::gsub("R version ", [18:01:38.812] "", base::R.version$version.string), [18:01:38.812] platform = base::sprintf("%s (%s-bit)", [18:01:38.812] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.812] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.812] "release", "version")], collapse = " "), [18:01:38.812] hostname = base::Sys.info()[["nodename"]]) [18:01:38.812] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.812] info) [18:01:38.812] info <- base::paste(info, collapse = "; ") [18:01:38.812] if (!has_future) { [18:01:38.812] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.812] info) [18:01:38.812] } [18:01:38.812] else { [18:01:38.812] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.812] info, version) [18:01:38.812] } [18:01:38.812] base::stop(msg) [18:01:38.812] } [18:01:38.812] }) [18:01:38.812] } [18:01:38.812] options(future.plan = NULL) [18:01:38.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.812] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.812] } [18:01:38.812] ...future.workdir <- getwd() [18:01:38.812] } [18:01:38.812] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.812] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.812] } [18:01:38.812] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.812] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.812] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.812] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.812] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.812] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.812] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.812] base::names(...future.oldOptions)) [18:01:38.812] } [18:01:38.812] if (FALSE) { [18:01:38.812] } [18:01:38.812] else { [18:01:38.812] if (TRUE) { [18:01:38.812] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.812] open = "w") [18:01:38.812] } [18:01:38.812] else { [18:01:38.812] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.812] windows = "NUL", "/dev/null"), open = "w") [18:01:38.812] } [18:01:38.812] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.812] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.812] base::sink(type = "output", split = FALSE) [18:01:38.812] base::close(...future.stdout) [18:01:38.812] }, add = TRUE) [18:01:38.812] } [18:01:38.812] ...future.frame <- base::sys.nframe() [18:01:38.812] ...future.conditions <- base::list() [18:01:38.812] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.812] if (FALSE) { [18:01:38.812] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.812] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.812] } [18:01:38.812] ...future.result <- base::tryCatch({ [18:01:38.812] base::withCallingHandlers({ [18:01:38.812] ...future.value <- base::withVisible(base::local({ [18:01:38.812] 4 [18:01:38.812] })) [18:01:38.812] future::FutureResult(value = ...future.value$value, [18:01:38.812] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.812] ...future.rng), globalenv = if (FALSE) [18:01:38.812] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.812] ...future.globalenv.names)) [18:01:38.812] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.812] }, condition = base::local({ [18:01:38.812] c <- base::c [18:01:38.812] inherits <- base::inherits [18:01:38.812] invokeRestart <- base::invokeRestart [18:01:38.812] length <- base::length [18:01:38.812] list <- base::list [18:01:38.812] seq.int <- base::seq.int [18:01:38.812] signalCondition <- base::signalCondition [18:01:38.812] sys.calls <- base::sys.calls [18:01:38.812] `[[` <- base::`[[` [18:01:38.812] `+` <- base::`+` [18:01:38.812] `<<-` <- base::`<<-` [18:01:38.812] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.812] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.812] 3L)] [18:01:38.812] } [18:01:38.812] function(cond) { [18:01:38.812] is_error <- inherits(cond, "error") [18:01:38.812] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.812] NULL) [18:01:38.812] if (is_error) { [18:01:38.812] sessionInformation <- function() { [18:01:38.812] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.812] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.812] search = base::search(), system = base::Sys.info()) [18:01:38.812] } [18:01:38.812] ...future.conditions[[length(...future.conditions) + [18:01:38.812] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.812] cond$call), session = sessionInformation(), [18:01:38.812] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.812] signalCondition(cond) [18:01:38.812] } [18:01:38.812] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.812] "immediateCondition"))) { [18:01:38.812] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.812] ...future.conditions[[length(...future.conditions) + [18:01:38.812] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.812] if (TRUE && !signal) { [18:01:38.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.812] { [18:01:38.812] inherits <- base::inherits [18:01:38.812] invokeRestart <- base::invokeRestart [18:01:38.812] is.null <- base::is.null [18:01:38.812] muffled <- FALSE [18:01:38.812] if (inherits(cond, "message")) { [18:01:38.812] muffled <- grepl(pattern, "muffleMessage") [18:01:38.812] if (muffled) [18:01:38.812] invokeRestart("muffleMessage") [18:01:38.812] } [18:01:38.812] else if (inherits(cond, "warning")) { [18:01:38.812] muffled <- grepl(pattern, "muffleWarning") [18:01:38.812] if (muffled) [18:01:38.812] invokeRestart("muffleWarning") [18:01:38.812] } [18:01:38.812] else if (inherits(cond, "condition")) { [18:01:38.812] if (!is.null(pattern)) { [18:01:38.812] computeRestarts <- base::computeRestarts [18:01:38.812] grepl <- base::grepl [18:01:38.812] restarts <- computeRestarts(cond) [18:01:38.812] for (restart in restarts) { [18:01:38.812] name <- restart$name [18:01:38.812] if (is.null(name)) [18:01:38.812] next [18:01:38.812] if (!grepl(pattern, name)) [18:01:38.812] next [18:01:38.812] invokeRestart(restart) [18:01:38.812] muffled <- TRUE [18:01:38.812] break [18:01:38.812] } [18:01:38.812] } [18:01:38.812] } [18:01:38.812] invisible(muffled) [18:01:38.812] } [18:01:38.812] muffleCondition(cond, pattern = "^muffle") [18:01:38.812] } [18:01:38.812] } [18:01:38.812] else { [18:01:38.812] if (TRUE) { [18:01:38.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.812] { [18:01:38.812] inherits <- base::inherits [18:01:38.812] invokeRestart <- base::invokeRestart [18:01:38.812] is.null <- base::is.null [18:01:38.812] muffled <- FALSE [18:01:38.812] if (inherits(cond, "message")) { [18:01:38.812] muffled <- grepl(pattern, "muffleMessage") [18:01:38.812] if (muffled) [18:01:38.812] invokeRestart("muffleMessage") [18:01:38.812] } [18:01:38.812] else if (inherits(cond, "warning")) { [18:01:38.812] muffled <- grepl(pattern, "muffleWarning") [18:01:38.812] if (muffled) [18:01:38.812] invokeRestart("muffleWarning") [18:01:38.812] } [18:01:38.812] else if (inherits(cond, "condition")) { [18:01:38.812] if (!is.null(pattern)) { [18:01:38.812] computeRestarts <- base::computeRestarts [18:01:38.812] grepl <- base::grepl [18:01:38.812] restarts <- computeRestarts(cond) [18:01:38.812] for (restart in restarts) { [18:01:38.812] name <- restart$name [18:01:38.812] if (is.null(name)) [18:01:38.812] next [18:01:38.812] if (!grepl(pattern, name)) [18:01:38.812] next [18:01:38.812] invokeRestart(restart) [18:01:38.812] muffled <- TRUE [18:01:38.812] break [18:01:38.812] } [18:01:38.812] } [18:01:38.812] } [18:01:38.812] invisible(muffled) [18:01:38.812] } [18:01:38.812] muffleCondition(cond, pattern = "^muffle") [18:01:38.812] } [18:01:38.812] } [18:01:38.812] } [18:01:38.812] })) [18:01:38.812] }, error = function(ex) { [18:01:38.812] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.812] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.812] ...future.rng), started = ...future.startTime, [18:01:38.812] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.812] version = "1.8"), class = "FutureResult") [18:01:38.812] }, finally = { [18:01:38.812] if (!identical(...future.workdir, getwd())) [18:01:38.812] setwd(...future.workdir) [18:01:38.812] { [18:01:38.812] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.812] ...future.oldOptions$nwarnings <- NULL [18:01:38.812] } [18:01:38.812] base::options(...future.oldOptions) [18:01:38.812] if (.Platform$OS.type == "windows") { [18:01:38.812] old_names <- names(...future.oldEnvVars) [18:01:38.812] envs <- base::Sys.getenv() [18:01:38.812] names <- names(envs) [18:01:38.812] common <- intersect(names, old_names) [18:01:38.812] added <- setdiff(names, old_names) [18:01:38.812] removed <- setdiff(old_names, names) [18:01:38.812] changed <- common[...future.oldEnvVars[common] != [18:01:38.812] envs[common]] [18:01:38.812] NAMES <- toupper(changed) [18:01:38.812] args <- list() [18:01:38.812] for (kk in seq_along(NAMES)) { [18:01:38.812] name <- changed[[kk]] [18:01:38.812] NAME <- NAMES[[kk]] [18:01:38.812] if (name != NAME && is.element(NAME, old_names)) [18:01:38.812] next [18:01:38.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.812] } [18:01:38.812] NAMES <- toupper(added) [18:01:38.812] for (kk in seq_along(NAMES)) { [18:01:38.812] name <- added[[kk]] [18:01:38.812] NAME <- NAMES[[kk]] [18:01:38.812] if (name != NAME && is.element(NAME, old_names)) [18:01:38.812] next [18:01:38.812] args[[name]] <- "" [18:01:38.812] } [18:01:38.812] NAMES <- toupper(removed) [18:01:38.812] for (kk in seq_along(NAMES)) { [18:01:38.812] name <- removed[[kk]] [18:01:38.812] NAME <- NAMES[[kk]] [18:01:38.812] if (name != NAME && is.element(NAME, old_names)) [18:01:38.812] next [18:01:38.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.812] } [18:01:38.812] if (length(args) > 0) [18:01:38.812] base::do.call(base::Sys.setenv, args = args) [18:01:38.812] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.812] } [18:01:38.812] else { [18:01:38.812] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.812] } [18:01:38.812] { [18:01:38.812] if (base::length(...future.futureOptionsAdded) > [18:01:38.812] 0L) { [18:01:38.812] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.812] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.812] base::options(opts) [18:01:38.812] } [18:01:38.812] { [18:01:38.812] { [18:01:38.812] NULL [18:01:38.812] RNGkind("Mersenne-Twister") [18:01:38.812] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.812] inherits = FALSE) [18:01:38.812] } [18:01:38.812] options(future.plan = NULL) [18:01:38.812] if (is.na(NA_character_)) [18:01:38.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.812] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.812] future::plan(list(function (..., envir = parent.frame()) [18:01:38.812] { [18:01:38.812] future <- SequentialFuture(..., envir = envir) [18:01:38.812] if (!future$lazy) [18:01:38.812] future <- run(future) [18:01:38.812] invisible(future) [18:01:38.812] }), .cleanup = FALSE, .init = FALSE) [18:01:38.812] } [18:01:38.812] } [18:01:38.812] } [18:01:38.812] }) [18:01:38.812] if (TRUE) { [18:01:38.812] base::sink(type = "output", split = FALSE) [18:01:38.812] if (TRUE) { [18:01:38.812] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.812] } [18:01:38.812] else { [18:01:38.812] ...future.result["stdout"] <- base::list(NULL) [18:01:38.812] } [18:01:38.812] base::close(...future.stdout) [18:01:38.812] ...future.stdout <- NULL [18:01:38.812] } [18:01:38.812] ...future.result$conditions <- ...future.conditions [18:01:38.812] ...future.result$finished <- base::Sys.time() [18:01:38.812] ...future.result [18:01:38.812] } [18:01:38.816] plan(): Setting new future strategy stack: [18:01:38.816] List of future strategies: [18:01:38.816] 1. sequential: [18:01:38.816] - args: function (..., envir = parent.frame()) [18:01:38.816] - tweaked: FALSE [18:01:38.816] - call: NULL [18:01:38.817] plan(): nbrOfWorkers() = 1 [18:01:38.818] plan(): Setting new future strategy stack: [18:01:38.818] List of future strategies: [18:01:38.818] 1. sequential: [18:01:38.818] - args: function (..., envir = parent.frame()) [18:01:38.818] - tweaked: FALSE [18:01:38.818] - call: plan(strategy) [18:01:38.818] plan(): nbrOfWorkers() = 1 [18:01:38.819] SequentialFuture started (and completed) [18:01:38.819] - Launch lazy future ... done [18:01:38.819] run() for 'SequentialFuture' ... done [18:01:38.821] resolved() for 'SequentialFuture' ... [18:01:38.821] - state: 'finished' [18:01:38.821] - run: TRUE [18:01:38.821] - result: 'FutureResult' [18:01:38.821] resolved() for 'SequentialFuture' ... done [18:01:38.822] resolved() for 'SequentialFuture' ... [18:01:38.822] - state: 'finished' [18:01:38.822] - run: TRUE [18:01:38.822] - result: 'FutureResult' [18:01:38.822] resolved() for 'SequentialFuture' ... done [18:01:38.822] resolved() for 'SequentialFuture' ... [18:01:38.823] - state: 'finished' [18:01:38.823] - run: TRUE [18:01:38.823] - result: 'FutureResult' [18:01:38.823] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:38.825] resolve() on environment ... [18:01:38.825] recursive: 0 [18:01:38.825] elements: [4] 'a', 'b', 'c', 'd' [18:01:38.826] signalConditionsASAP(numeric, pos=1) ... [18:01:38.826] - nx: 4 [18:01:38.826] - relay: TRUE [18:01:38.827] - stdout: TRUE [18:01:38.827] - signal: TRUE [18:01:38.827] - resignal: FALSE [18:01:38.828] - force: TRUE [18:01:38.828] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.828] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.828] - until=2 [18:01:38.828] - relaying element #2 [18:01:38.828] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.828] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.829] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.829] length: 3 (resolved future 1) [18:01:38.829] resolved() for 'SequentialFuture' ... [18:01:38.829] - state: 'finished' [18:01:38.829] - run: TRUE [18:01:38.830] - result: 'FutureResult' [18:01:38.830] resolved() for 'SequentialFuture' ... done [18:01:38.830] Future #2 [18:01:38.830] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.830] - nx: 4 [18:01:38.830] - relay: TRUE [18:01:38.831] - stdout: TRUE [18:01:38.831] - signal: TRUE [18:01:38.831] - resignal: FALSE [18:01:38.831] - force: TRUE [18:01:38.831] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.831] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.831] - until=2 [18:01:38.832] - relaying element #2 [18:01:38.832] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.832] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.832] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.832] length: 2 (resolved future 2) [18:01:38.833] resolved() for 'SequentialFuture' ... [18:01:38.833] - state: 'finished' [18:01:38.833] - run: TRUE [18:01:38.833] - result: 'FutureResult' [18:01:38.833] resolved() for 'SequentialFuture' ... done [18:01:38.833] Future #3 [18:01:38.834] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.834] - nx: 4 [18:01:38.834] - relay: TRUE [18:01:38.834] - stdout: TRUE [18:01:38.834] - signal: TRUE [18:01:38.834] - resignal: FALSE [18:01:38.835] - force: TRUE [18:01:38.835] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.835] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.835] - until=3 [18:01:38.835] - relaying element #3 [18:01:38.835] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.836] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.836] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.836] length: 1 (resolved future 3) [18:01:38.836] resolved() for 'SequentialFuture' ... [18:01:38.836] - state: 'finished' [18:01:38.836] - run: TRUE [18:01:38.837] - result: 'FutureResult' [18:01:38.837] resolved() for 'SequentialFuture' ... done [18:01:38.837] Future #4 [18:01:38.837] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:38.837] - nx: 4 [18:01:38.838] - relay: TRUE [18:01:38.838] - stdout: TRUE [18:01:38.838] - signal: TRUE [18:01:38.838] - resignal: FALSE [18:01:38.838] - force: TRUE [18:01:38.838] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.838] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.839] - until=4 [18:01:38.839] - relaying element #4 [18:01:38.839] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.839] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.839] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:38.840] length: 0 (resolved future 4) [18:01:38.840] Relaying remaining futures [18:01:38.840] signalConditionsASAP(NULL, pos=0) ... [18:01:38.840] - nx: 4 [18:01:38.840] - relay: TRUE [18:01:38.840] - stdout: TRUE [18:01:38.840] - signal: TRUE [18:01:38.841] - resignal: FALSE [18:01:38.841] - force: TRUE [18:01:38.841] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.841] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:38.841] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.841] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.842] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.842] resolve() on environment ... DONE Dimensions: c(2, 3) [18:01:38.842] getGlobalsAndPackages() ... [18:01:38.843] Searching for globals... [18:01:38.843] [18:01:38.843] Searching for globals ... DONE [18:01:38.843] - globals: [0] [18:01:38.843] getGlobalsAndPackages() ... DONE [18:01:38.844] run() for 'Future' ... [18:01:38.844] - state: 'created' [18:01:38.844] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.844] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.845] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.845] - Field: 'label' [18:01:38.845] - Field: 'local' [18:01:38.845] - Field: 'owner' [18:01:38.845] - Field: 'envir' [18:01:38.846] - Field: 'packages' [18:01:38.846] - Field: 'gc' [18:01:38.846] - Field: 'conditions' [18:01:38.846] - Field: 'expr' [18:01:38.846] - Field: 'uuid' [18:01:38.846] - Field: 'seed' [18:01:38.847] - Field: 'version' [18:01:38.847] - Field: 'result' [18:01:38.847] - Field: 'asynchronous' [18:01:38.847] - Field: 'calls' [18:01:38.847] - Field: 'globals' [18:01:38.847] - Field: 'stdout' [18:01:38.848] - Field: 'earlySignal' [18:01:38.848] - Field: 'lazy' [18:01:38.848] - Field: 'state' [18:01:38.848] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.848] - Launch lazy future ... [18:01:38.849] Packages needed by the future expression (n = 0): [18:01:38.849] Packages needed by future strategies (n = 0): [18:01:38.849] { [18:01:38.849] { [18:01:38.849] { [18:01:38.849] ...future.startTime <- base::Sys.time() [18:01:38.849] { [18:01:38.849] { [18:01:38.849] { [18:01:38.849] base::local({ [18:01:38.849] has_future <- base::requireNamespace("future", [18:01:38.849] quietly = TRUE) [18:01:38.849] if (has_future) { [18:01:38.849] ns <- base::getNamespace("future") [18:01:38.849] version <- ns[[".package"]][["version"]] [18:01:38.849] if (is.null(version)) [18:01:38.849] version <- utils::packageVersion("future") [18:01:38.849] } [18:01:38.849] else { [18:01:38.849] version <- NULL [18:01:38.849] } [18:01:38.849] if (!has_future || version < "1.8.0") { [18:01:38.849] info <- base::c(r_version = base::gsub("R version ", [18:01:38.849] "", base::R.version$version.string), [18:01:38.849] platform = base::sprintf("%s (%s-bit)", [18:01:38.849] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.849] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.849] "release", "version")], collapse = " "), [18:01:38.849] hostname = base::Sys.info()[["nodename"]]) [18:01:38.849] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.849] info) [18:01:38.849] info <- base::paste(info, collapse = "; ") [18:01:38.849] if (!has_future) { [18:01:38.849] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.849] info) [18:01:38.849] } [18:01:38.849] else { [18:01:38.849] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.849] info, version) [18:01:38.849] } [18:01:38.849] base::stop(msg) [18:01:38.849] } [18:01:38.849] }) [18:01:38.849] } [18:01:38.849] options(future.plan = NULL) [18:01:38.849] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.849] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.849] } [18:01:38.849] ...future.workdir <- getwd() [18:01:38.849] } [18:01:38.849] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.849] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.849] } [18:01:38.849] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.849] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.849] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.849] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.849] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.849] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.849] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.849] base::names(...future.oldOptions)) [18:01:38.849] } [18:01:38.849] if (FALSE) { [18:01:38.849] } [18:01:38.849] else { [18:01:38.849] if (TRUE) { [18:01:38.849] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.849] open = "w") [18:01:38.849] } [18:01:38.849] else { [18:01:38.849] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.849] windows = "NUL", "/dev/null"), open = "w") [18:01:38.849] } [18:01:38.849] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.849] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.849] base::sink(type = "output", split = FALSE) [18:01:38.849] base::close(...future.stdout) [18:01:38.849] }, add = TRUE) [18:01:38.849] } [18:01:38.849] ...future.frame <- base::sys.nframe() [18:01:38.849] ...future.conditions <- base::list() [18:01:38.849] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.849] if (FALSE) { [18:01:38.849] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.849] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.849] } [18:01:38.849] ...future.result <- base::tryCatch({ [18:01:38.849] base::withCallingHandlers({ [18:01:38.849] ...future.value <- base::withVisible(base::local(2)) [18:01:38.849] future::FutureResult(value = ...future.value$value, [18:01:38.849] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.849] ...future.rng), globalenv = if (FALSE) [18:01:38.849] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.849] ...future.globalenv.names)) [18:01:38.849] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.849] }, condition = base::local({ [18:01:38.849] c <- base::c [18:01:38.849] inherits <- base::inherits [18:01:38.849] invokeRestart <- base::invokeRestart [18:01:38.849] length <- base::length [18:01:38.849] list <- base::list [18:01:38.849] seq.int <- base::seq.int [18:01:38.849] signalCondition <- base::signalCondition [18:01:38.849] sys.calls <- base::sys.calls [18:01:38.849] `[[` <- base::`[[` [18:01:38.849] `+` <- base::`+` [18:01:38.849] `<<-` <- base::`<<-` [18:01:38.849] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.849] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.849] 3L)] [18:01:38.849] } [18:01:38.849] function(cond) { [18:01:38.849] is_error <- inherits(cond, "error") [18:01:38.849] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.849] NULL) [18:01:38.849] if (is_error) { [18:01:38.849] sessionInformation <- function() { [18:01:38.849] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.849] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.849] search = base::search(), system = base::Sys.info()) [18:01:38.849] } [18:01:38.849] ...future.conditions[[length(...future.conditions) + [18:01:38.849] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.849] cond$call), session = sessionInformation(), [18:01:38.849] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.849] signalCondition(cond) [18:01:38.849] } [18:01:38.849] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.849] "immediateCondition"))) { [18:01:38.849] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.849] ...future.conditions[[length(...future.conditions) + [18:01:38.849] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.849] if (TRUE && !signal) { [18:01:38.849] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.849] { [18:01:38.849] inherits <- base::inherits [18:01:38.849] invokeRestart <- base::invokeRestart [18:01:38.849] is.null <- base::is.null [18:01:38.849] muffled <- FALSE [18:01:38.849] if (inherits(cond, "message")) { [18:01:38.849] muffled <- grepl(pattern, "muffleMessage") [18:01:38.849] if (muffled) [18:01:38.849] invokeRestart("muffleMessage") [18:01:38.849] } [18:01:38.849] else if (inherits(cond, "warning")) { [18:01:38.849] muffled <- grepl(pattern, "muffleWarning") [18:01:38.849] if (muffled) [18:01:38.849] invokeRestart("muffleWarning") [18:01:38.849] } [18:01:38.849] else if (inherits(cond, "condition")) { [18:01:38.849] if (!is.null(pattern)) { [18:01:38.849] computeRestarts <- base::computeRestarts [18:01:38.849] grepl <- base::grepl [18:01:38.849] restarts <- computeRestarts(cond) [18:01:38.849] for (restart in restarts) { [18:01:38.849] name <- restart$name [18:01:38.849] if (is.null(name)) [18:01:38.849] next [18:01:38.849] if (!grepl(pattern, name)) [18:01:38.849] next [18:01:38.849] invokeRestart(restart) [18:01:38.849] muffled <- TRUE [18:01:38.849] break [18:01:38.849] } [18:01:38.849] } [18:01:38.849] } [18:01:38.849] invisible(muffled) [18:01:38.849] } [18:01:38.849] muffleCondition(cond, pattern = "^muffle") [18:01:38.849] } [18:01:38.849] } [18:01:38.849] else { [18:01:38.849] if (TRUE) { [18:01:38.849] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.849] { [18:01:38.849] inherits <- base::inherits [18:01:38.849] invokeRestart <- base::invokeRestart [18:01:38.849] is.null <- base::is.null [18:01:38.849] muffled <- FALSE [18:01:38.849] if (inherits(cond, "message")) { [18:01:38.849] muffled <- grepl(pattern, "muffleMessage") [18:01:38.849] if (muffled) [18:01:38.849] invokeRestart("muffleMessage") [18:01:38.849] } [18:01:38.849] else if (inherits(cond, "warning")) { [18:01:38.849] muffled <- grepl(pattern, "muffleWarning") [18:01:38.849] if (muffled) [18:01:38.849] invokeRestart("muffleWarning") [18:01:38.849] } [18:01:38.849] else if (inherits(cond, "condition")) { [18:01:38.849] if (!is.null(pattern)) { [18:01:38.849] computeRestarts <- base::computeRestarts [18:01:38.849] grepl <- base::grepl [18:01:38.849] restarts <- computeRestarts(cond) [18:01:38.849] for (restart in restarts) { [18:01:38.849] name <- restart$name [18:01:38.849] if (is.null(name)) [18:01:38.849] next [18:01:38.849] if (!grepl(pattern, name)) [18:01:38.849] next [18:01:38.849] invokeRestart(restart) [18:01:38.849] muffled <- TRUE [18:01:38.849] break [18:01:38.849] } [18:01:38.849] } [18:01:38.849] } [18:01:38.849] invisible(muffled) [18:01:38.849] } [18:01:38.849] muffleCondition(cond, pattern = "^muffle") [18:01:38.849] } [18:01:38.849] } [18:01:38.849] } [18:01:38.849] })) [18:01:38.849] }, error = function(ex) { [18:01:38.849] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.849] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.849] ...future.rng), started = ...future.startTime, [18:01:38.849] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.849] version = "1.8"), class = "FutureResult") [18:01:38.849] }, finally = { [18:01:38.849] if (!identical(...future.workdir, getwd())) [18:01:38.849] setwd(...future.workdir) [18:01:38.849] { [18:01:38.849] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.849] ...future.oldOptions$nwarnings <- NULL [18:01:38.849] } [18:01:38.849] base::options(...future.oldOptions) [18:01:38.849] if (.Platform$OS.type == "windows") { [18:01:38.849] old_names <- names(...future.oldEnvVars) [18:01:38.849] envs <- base::Sys.getenv() [18:01:38.849] names <- names(envs) [18:01:38.849] common <- intersect(names, old_names) [18:01:38.849] added <- setdiff(names, old_names) [18:01:38.849] removed <- setdiff(old_names, names) [18:01:38.849] changed <- common[...future.oldEnvVars[common] != [18:01:38.849] envs[common]] [18:01:38.849] NAMES <- toupper(changed) [18:01:38.849] args <- list() [18:01:38.849] for (kk in seq_along(NAMES)) { [18:01:38.849] name <- changed[[kk]] [18:01:38.849] NAME <- NAMES[[kk]] [18:01:38.849] if (name != NAME && is.element(NAME, old_names)) [18:01:38.849] next [18:01:38.849] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.849] } [18:01:38.849] NAMES <- toupper(added) [18:01:38.849] for (kk in seq_along(NAMES)) { [18:01:38.849] name <- added[[kk]] [18:01:38.849] NAME <- NAMES[[kk]] [18:01:38.849] if (name != NAME && is.element(NAME, old_names)) [18:01:38.849] next [18:01:38.849] args[[name]] <- "" [18:01:38.849] } [18:01:38.849] NAMES <- toupper(removed) [18:01:38.849] for (kk in seq_along(NAMES)) { [18:01:38.849] name <- removed[[kk]] [18:01:38.849] NAME <- NAMES[[kk]] [18:01:38.849] if (name != NAME && is.element(NAME, old_names)) [18:01:38.849] next [18:01:38.849] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.849] } [18:01:38.849] if (length(args) > 0) [18:01:38.849] base::do.call(base::Sys.setenv, args = args) [18:01:38.849] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.849] } [18:01:38.849] else { [18:01:38.849] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.849] } [18:01:38.849] { [18:01:38.849] if (base::length(...future.futureOptionsAdded) > [18:01:38.849] 0L) { [18:01:38.849] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.849] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.849] base::options(opts) [18:01:38.849] } [18:01:38.849] { [18:01:38.849] { [18:01:38.849] NULL [18:01:38.849] RNGkind("Mersenne-Twister") [18:01:38.849] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.849] inherits = FALSE) [18:01:38.849] } [18:01:38.849] options(future.plan = NULL) [18:01:38.849] if (is.na(NA_character_)) [18:01:38.849] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.849] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.849] future::plan(list(function (..., envir = parent.frame()) [18:01:38.849] { [18:01:38.849] future <- SequentialFuture(..., envir = envir) [18:01:38.849] if (!future$lazy) [18:01:38.849] future <- run(future) [18:01:38.849] invisible(future) [18:01:38.849] }), .cleanup = FALSE, .init = FALSE) [18:01:38.849] } [18:01:38.849] } [18:01:38.849] } [18:01:38.849] }) [18:01:38.849] if (TRUE) { [18:01:38.849] base::sink(type = "output", split = FALSE) [18:01:38.849] if (TRUE) { [18:01:38.849] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.849] } [18:01:38.849] else { [18:01:38.849] ...future.result["stdout"] <- base::list(NULL) [18:01:38.849] } [18:01:38.849] base::close(...future.stdout) [18:01:38.849] ...future.stdout <- NULL [18:01:38.849] } [18:01:38.849] ...future.result$conditions <- ...future.conditions [18:01:38.849] ...future.result$finished <- base::Sys.time() [18:01:38.849] ...future.result [18:01:38.849] } [18:01:38.853] plan(): Setting new future strategy stack: [18:01:38.853] List of future strategies: [18:01:38.853] 1. sequential: [18:01:38.853] - args: function (..., envir = parent.frame()) [18:01:38.853] - tweaked: FALSE [18:01:38.853] - call: NULL [18:01:38.854] plan(): nbrOfWorkers() = 1 [18:01:38.855] plan(): Setting new future strategy stack: [18:01:38.855] List of future strategies: [18:01:38.855] 1. sequential: [18:01:38.855] - args: function (..., envir = parent.frame()) [18:01:38.855] - tweaked: FALSE [18:01:38.855] - call: plan(strategy) [18:01:38.855] plan(): nbrOfWorkers() = 1 [18:01:38.856] SequentialFuture started (and completed) [18:01:38.856] - Launch lazy future ... done [18:01:38.856] run() for 'SequentialFuture' ... done [18:01:38.856] getGlobalsAndPackages() ... [18:01:38.856] Searching for globals... [18:01:38.857] [18:01:38.857] Searching for globals ... DONE [18:01:38.857] - globals: [0] [18:01:38.857] getGlobalsAndPackages() ... DONE [18:01:38.858] run() for 'Future' ... [18:01:38.858] - state: 'created' [18:01:38.858] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.858] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.859] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.859] - Field: 'label' [18:01:38.859] - Field: 'local' [18:01:38.859] - Field: 'owner' [18:01:38.859] - Field: 'envir' [18:01:38.859] - Field: 'packages' [18:01:38.860] - Field: 'gc' [18:01:38.860] - Field: 'conditions' [18:01:38.860] - Field: 'expr' [18:01:38.860] - Field: 'uuid' [18:01:38.860] - Field: 'seed' [18:01:38.861] - Field: 'version' [18:01:38.861] - Field: 'result' [18:01:38.861] - Field: 'asynchronous' [18:01:38.861] - Field: 'calls' [18:01:38.861] - Field: 'globals' [18:01:38.862] - Field: 'stdout' [18:01:38.862] - Field: 'earlySignal' [18:01:38.862] - Field: 'lazy' [18:01:38.862] - Field: 'state' [18:01:38.862] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.863] - Launch lazy future ... [18:01:38.863] Packages needed by the future expression (n = 0): [18:01:38.863] Packages needed by future strategies (n = 0): [18:01:38.863] { [18:01:38.863] { [18:01:38.863] { [18:01:38.863] ...future.startTime <- base::Sys.time() [18:01:38.863] { [18:01:38.863] { [18:01:38.863] { [18:01:38.863] base::local({ [18:01:38.863] has_future <- base::requireNamespace("future", [18:01:38.863] quietly = TRUE) [18:01:38.863] if (has_future) { [18:01:38.863] ns <- base::getNamespace("future") [18:01:38.863] version <- ns[[".package"]][["version"]] [18:01:38.863] if (is.null(version)) [18:01:38.863] version <- utils::packageVersion("future") [18:01:38.863] } [18:01:38.863] else { [18:01:38.863] version <- NULL [18:01:38.863] } [18:01:38.863] if (!has_future || version < "1.8.0") { [18:01:38.863] info <- base::c(r_version = base::gsub("R version ", [18:01:38.863] "", base::R.version$version.string), [18:01:38.863] platform = base::sprintf("%s (%s-bit)", [18:01:38.863] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.863] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.863] "release", "version")], collapse = " "), [18:01:38.863] hostname = base::Sys.info()[["nodename"]]) [18:01:38.863] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.863] info) [18:01:38.863] info <- base::paste(info, collapse = "; ") [18:01:38.863] if (!has_future) { [18:01:38.863] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.863] info) [18:01:38.863] } [18:01:38.863] else { [18:01:38.863] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.863] info, version) [18:01:38.863] } [18:01:38.863] base::stop(msg) [18:01:38.863] } [18:01:38.863] }) [18:01:38.863] } [18:01:38.863] options(future.plan = NULL) [18:01:38.863] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.863] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.863] } [18:01:38.863] ...future.workdir <- getwd() [18:01:38.863] } [18:01:38.863] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.863] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.863] } [18:01:38.863] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.863] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.863] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.863] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.863] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.863] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.863] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.863] base::names(...future.oldOptions)) [18:01:38.863] } [18:01:38.863] if (FALSE) { [18:01:38.863] } [18:01:38.863] else { [18:01:38.863] if (TRUE) { [18:01:38.863] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.863] open = "w") [18:01:38.863] } [18:01:38.863] else { [18:01:38.863] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.863] windows = "NUL", "/dev/null"), open = "w") [18:01:38.863] } [18:01:38.863] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.863] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.863] base::sink(type = "output", split = FALSE) [18:01:38.863] base::close(...future.stdout) [18:01:38.863] }, add = TRUE) [18:01:38.863] } [18:01:38.863] ...future.frame <- base::sys.nframe() [18:01:38.863] ...future.conditions <- base::list() [18:01:38.863] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.863] if (FALSE) { [18:01:38.863] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.863] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.863] } [18:01:38.863] ...future.result <- base::tryCatch({ [18:01:38.863] base::withCallingHandlers({ [18:01:38.863] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.863] future::FutureResult(value = ...future.value$value, [18:01:38.863] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.863] ...future.rng), globalenv = if (FALSE) [18:01:38.863] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.863] ...future.globalenv.names)) [18:01:38.863] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.863] }, condition = base::local({ [18:01:38.863] c <- base::c [18:01:38.863] inherits <- base::inherits [18:01:38.863] invokeRestart <- base::invokeRestart [18:01:38.863] length <- base::length [18:01:38.863] list <- base::list [18:01:38.863] seq.int <- base::seq.int [18:01:38.863] signalCondition <- base::signalCondition [18:01:38.863] sys.calls <- base::sys.calls [18:01:38.863] `[[` <- base::`[[` [18:01:38.863] `+` <- base::`+` [18:01:38.863] `<<-` <- base::`<<-` [18:01:38.863] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.863] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.863] 3L)] [18:01:38.863] } [18:01:38.863] function(cond) { [18:01:38.863] is_error <- inherits(cond, "error") [18:01:38.863] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.863] NULL) [18:01:38.863] if (is_error) { [18:01:38.863] sessionInformation <- function() { [18:01:38.863] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.863] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.863] search = base::search(), system = base::Sys.info()) [18:01:38.863] } [18:01:38.863] ...future.conditions[[length(...future.conditions) + [18:01:38.863] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.863] cond$call), session = sessionInformation(), [18:01:38.863] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.863] signalCondition(cond) [18:01:38.863] } [18:01:38.863] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.863] "immediateCondition"))) { [18:01:38.863] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.863] ...future.conditions[[length(...future.conditions) + [18:01:38.863] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.863] if (TRUE && !signal) { [18:01:38.863] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.863] { [18:01:38.863] inherits <- base::inherits [18:01:38.863] invokeRestart <- base::invokeRestart [18:01:38.863] is.null <- base::is.null [18:01:38.863] muffled <- FALSE [18:01:38.863] if (inherits(cond, "message")) { [18:01:38.863] muffled <- grepl(pattern, "muffleMessage") [18:01:38.863] if (muffled) [18:01:38.863] invokeRestart("muffleMessage") [18:01:38.863] } [18:01:38.863] else if (inherits(cond, "warning")) { [18:01:38.863] muffled <- grepl(pattern, "muffleWarning") [18:01:38.863] if (muffled) [18:01:38.863] invokeRestart("muffleWarning") [18:01:38.863] } [18:01:38.863] else if (inherits(cond, "condition")) { [18:01:38.863] if (!is.null(pattern)) { [18:01:38.863] computeRestarts <- base::computeRestarts [18:01:38.863] grepl <- base::grepl [18:01:38.863] restarts <- computeRestarts(cond) [18:01:38.863] for (restart in restarts) { [18:01:38.863] name <- restart$name [18:01:38.863] if (is.null(name)) [18:01:38.863] next [18:01:38.863] if (!grepl(pattern, name)) [18:01:38.863] next [18:01:38.863] invokeRestart(restart) [18:01:38.863] muffled <- TRUE [18:01:38.863] break [18:01:38.863] } [18:01:38.863] } [18:01:38.863] } [18:01:38.863] invisible(muffled) [18:01:38.863] } [18:01:38.863] muffleCondition(cond, pattern = "^muffle") [18:01:38.863] } [18:01:38.863] } [18:01:38.863] else { [18:01:38.863] if (TRUE) { [18:01:38.863] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.863] { [18:01:38.863] inherits <- base::inherits [18:01:38.863] invokeRestart <- base::invokeRestart [18:01:38.863] is.null <- base::is.null [18:01:38.863] muffled <- FALSE [18:01:38.863] if (inherits(cond, "message")) { [18:01:38.863] muffled <- grepl(pattern, "muffleMessage") [18:01:38.863] if (muffled) [18:01:38.863] invokeRestart("muffleMessage") [18:01:38.863] } [18:01:38.863] else if (inherits(cond, "warning")) { [18:01:38.863] muffled <- grepl(pattern, "muffleWarning") [18:01:38.863] if (muffled) [18:01:38.863] invokeRestart("muffleWarning") [18:01:38.863] } [18:01:38.863] else if (inherits(cond, "condition")) { [18:01:38.863] if (!is.null(pattern)) { [18:01:38.863] computeRestarts <- base::computeRestarts [18:01:38.863] grepl <- base::grepl [18:01:38.863] restarts <- computeRestarts(cond) [18:01:38.863] for (restart in restarts) { [18:01:38.863] name <- restart$name [18:01:38.863] if (is.null(name)) [18:01:38.863] next [18:01:38.863] if (!grepl(pattern, name)) [18:01:38.863] next [18:01:38.863] invokeRestart(restart) [18:01:38.863] muffled <- TRUE [18:01:38.863] break [18:01:38.863] } [18:01:38.863] } [18:01:38.863] } [18:01:38.863] invisible(muffled) [18:01:38.863] } [18:01:38.863] muffleCondition(cond, pattern = "^muffle") [18:01:38.863] } [18:01:38.863] } [18:01:38.863] } [18:01:38.863] })) [18:01:38.863] }, error = function(ex) { [18:01:38.863] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.863] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.863] ...future.rng), started = ...future.startTime, [18:01:38.863] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.863] version = "1.8"), class = "FutureResult") [18:01:38.863] }, finally = { [18:01:38.863] if (!identical(...future.workdir, getwd())) [18:01:38.863] setwd(...future.workdir) [18:01:38.863] { [18:01:38.863] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.863] ...future.oldOptions$nwarnings <- NULL [18:01:38.863] } [18:01:38.863] base::options(...future.oldOptions) [18:01:38.863] if (.Platform$OS.type == "windows") { [18:01:38.863] old_names <- names(...future.oldEnvVars) [18:01:38.863] envs <- base::Sys.getenv() [18:01:38.863] names <- names(envs) [18:01:38.863] common <- intersect(names, old_names) [18:01:38.863] added <- setdiff(names, old_names) [18:01:38.863] removed <- setdiff(old_names, names) [18:01:38.863] changed <- common[...future.oldEnvVars[common] != [18:01:38.863] envs[common]] [18:01:38.863] NAMES <- toupper(changed) [18:01:38.863] args <- list() [18:01:38.863] for (kk in seq_along(NAMES)) { [18:01:38.863] name <- changed[[kk]] [18:01:38.863] NAME <- NAMES[[kk]] [18:01:38.863] if (name != NAME && is.element(NAME, old_names)) [18:01:38.863] next [18:01:38.863] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.863] } [18:01:38.863] NAMES <- toupper(added) [18:01:38.863] for (kk in seq_along(NAMES)) { [18:01:38.863] name <- added[[kk]] [18:01:38.863] NAME <- NAMES[[kk]] [18:01:38.863] if (name != NAME && is.element(NAME, old_names)) [18:01:38.863] next [18:01:38.863] args[[name]] <- "" [18:01:38.863] } [18:01:38.863] NAMES <- toupper(removed) [18:01:38.863] for (kk in seq_along(NAMES)) { [18:01:38.863] name <- removed[[kk]] [18:01:38.863] NAME <- NAMES[[kk]] [18:01:38.863] if (name != NAME && is.element(NAME, old_names)) [18:01:38.863] next [18:01:38.863] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.863] } [18:01:38.863] if (length(args) > 0) [18:01:38.863] base::do.call(base::Sys.setenv, args = args) [18:01:38.863] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.863] } [18:01:38.863] else { [18:01:38.863] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.863] } [18:01:38.863] { [18:01:38.863] if (base::length(...future.futureOptionsAdded) > [18:01:38.863] 0L) { [18:01:38.863] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.863] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.863] base::options(opts) [18:01:38.863] } [18:01:38.863] { [18:01:38.863] { [18:01:38.863] NULL [18:01:38.863] RNGkind("Mersenne-Twister") [18:01:38.863] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.863] inherits = FALSE) [18:01:38.863] } [18:01:38.863] options(future.plan = NULL) [18:01:38.863] if (is.na(NA_character_)) [18:01:38.863] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.863] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.863] future::plan(list(function (..., envir = parent.frame()) [18:01:38.863] { [18:01:38.863] future <- SequentialFuture(..., envir = envir) [18:01:38.863] if (!future$lazy) [18:01:38.863] future <- run(future) [18:01:38.863] invisible(future) [18:01:38.863] }), .cleanup = FALSE, .init = FALSE) [18:01:38.863] } [18:01:38.863] } [18:01:38.863] } [18:01:38.863] }) [18:01:38.863] if (TRUE) { [18:01:38.863] base::sink(type = "output", split = FALSE) [18:01:38.863] if (TRUE) { [18:01:38.863] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.863] } [18:01:38.863] else { [18:01:38.863] ...future.result["stdout"] <- base::list(NULL) [18:01:38.863] } [18:01:38.863] base::close(...future.stdout) [18:01:38.863] ...future.stdout <- NULL [18:01:38.863] } [18:01:38.863] ...future.result$conditions <- ...future.conditions [18:01:38.863] ...future.result$finished <- base::Sys.time() [18:01:38.863] ...future.result [18:01:38.863] } [18:01:38.867] plan(): Setting new future strategy stack: [18:01:38.867] List of future strategies: [18:01:38.867] 1. sequential: [18:01:38.867] - args: function (..., envir = parent.frame()) [18:01:38.867] - tweaked: FALSE [18:01:38.867] - call: NULL [18:01:38.868] plan(): nbrOfWorkers() = 1 [18:01:38.870] plan(): Setting new future strategy stack: [18:01:38.870] List of future strategies: [18:01:38.870] 1. sequential: [18:01:38.870] - args: function (..., envir = parent.frame()) [18:01:38.870] - tweaked: FALSE [18:01:38.870] - call: plan(strategy) [18:01:38.870] plan(): nbrOfWorkers() = 1 [18:01:38.871] SequentialFuture started (and completed) [18:01:38.871] - Launch lazy future ... done [18:01:38.871] run() for 'SequentialFuture' ... done [18:01:38.871] getGlobalsAndPackages() ... [18:01:38.872] Searching for globals... [18:01:38.872] - globals found: [1] '{' [18:01:38.872] Searching for globals ... DONE [18:01:38.873] Resolving globals: FALSE [18:01:38.873] [18:01:38.873] [18:01:38.873] getGlobalsAndPackages() ... DONE [18:01:38.873] run() for 'Future' ... [18:01:38.874] - state: 'created' [18:01:38.874] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.874] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.874] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.875] - Field: 'label' [18:01:38.875] - Field: 'local' [18:01:38.875] - Field: 'owner' [18:01:38.875] - Field: 'envir' [18:01:38.875] - Field: 'packages' [18:01:38.875] - Field: 'gc' [18:01:38.876] - Field: 'conditions' [18:01:38.876] - Field: 'expr' [18:01:38.876] - Field: 'uuid' [18:01:38.876] - Field: 'seed' [18:01:38.876] - Field: 'version' [18:01:38.876] - Field: 'result' [18:01:38.877] - Field: 'asynchronous' [18:01:38.877] - Field: 'calls' [18:01:38.877] - Field: 'globals' [18:01:38.877] - Field: 'stdout' [18:01:38.877] - Field: 'earlySignal' [18:01:38.877] - Field: 'lazy' [18:01:38.878] - Field: 'state' [18:01:38.878] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.878] - Launch lazy future ... [18:01:38.878] Packages needed by the future expression (n = 0): [18:01:38.878] Packages needed by future strategies (n = 0): [18:01:38.879] { [18:01:38.879] { [18:01:38.879] { [18:01:38.879] ...future.startTime <- base::Sys.time() [18:01:38.879] { [18:01:38.879] { [18:01:38.879] { [18:01:38.879] base::local({ [18:01:38.879] has_future <- base::requireNamespace("future", [18:01:38.879] quietly = TRUE) [18:01:38.879] if (has_future) { [18:01:38.879] ns <- base::getNamespace("future") [18:01:38.879] version <- ns[[".package"]][["version"]] [18:01:38.879] if (is.null(version)) [18:01:38.879] version <- utils::packageVersion("future") [18:01:38.879] } [18:01:38.879] else { [18:01:38.879] version <- NULL [18:01:38.879] } [18:01:38.879] if (!has_future || version < "1.8.0") { [18:01:38.879] info <- base::c(r_version = base::gsub("R version ", [18:01:38.879] "", base::R.version$version.string), [18:01:38.879] platform = base::sprintf("%s (%s-bit)", [18:01:38.879] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.879] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.879] "release", "version")], collapse = " "), [18:01:38.879] hostname = base::Sys.info()[["nodename"]]) [18:01:38.879] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.879] info) [18:01:38.879] info <- base::paste(info, collapse = "; ") [18:01:38.879] if (!has_future) { [18:01:38.879] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.879] info) [18:01:38.879] } [18:01:38.879] else { [18:01:38.879] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.879] info, version) [18:01:38.879] } [18:01:38.879] base::stop(msg) [18:01:38.879] } [18:01:38.879] }) [18:01:38.879] } [18:01:38.879] options(future.plan = NULL) [18:01:38.879] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.879] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.879] } [18:01:38.879] ...future.workdir <- getwd() [18:01:38.879] } [18:01:38.879] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.879] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.879] } [18:01:38.879] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.879] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.879] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.879] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.879] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.879] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.879] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.879] base::names(...future.oldOptions)) [18:01:38.879] } [18:01:38.879] if (FALSE) { [18:01:38.879] } [18:01:38.879] else { [18:01:38.879] if (TRUE) { [18:01:38.879] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.879] open = "w") [18:01:38.879] } [18:01:38.879] else { [18:01:38.879] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.879] windows = "NUL", "/dev/null"), open = "w") [18:01:38.879] } [18:01:38.879] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.879] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.879] base::sink(type = "output", split = FALSE) [18:01:38.879] base::close(...future.stdout) [18:01:38.879] }, add = TRUE) [18:01:38.879] } [18:01:38.879] ...future.frame <- base::sys.nframe() [18:01:38.879] ...future.conditions <- base::list() [18:01:38.879] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.879] if (FALSE) { [18:01:38.879] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.879] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.879] } [18:01:38.879] ...future.result <- base::tryCatch({ [18:01:38.879] base::withCallingHandlers({ [18:01:38.879] ...future.value <- base::withVisible(base::local({ [18:01:38.879] 4 [18:01:38.879] })) [18:01:38.879] future::FutureResult(value = ...future.value$value, [18:01:38.879] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.879] ...future.rng), globalenv = if (FALSE) [18:01:38.879] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.879] ...future.globalenv.names)) [18:01:38.879] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.879] }, condition = base::local({ [18:01:38.879] c <- base::c [18:01:38.879] inherits <- base::inherits [18:01:38.879] invokeRestart <- base::invokeRestart [18:01:38.879] length <- base::length [18:01:38.879] list <- base::list [18:01:38.879] seq.int <- base::seq.int [18:01:38.879] signalCondition <- base::signalCondition [18:01:38.879] sys.calls <- base::sys.calls [18:01:38.879] `[[` <- base::`[[` [18:01:38.879] `+` <- base::`+` [18:01:38.879] `<<-` <- base::`<<-` [18:01:38.879] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.879] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.879] 3L)] [18:01:38.879] } [18:01:38.879] function(cond) { [18:01:38.879] is_error <- inherits(cond, "error") [18:01:38.879] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.879] NULL) [18:01:38.879] if (is_error) { [18:01:38.879] sessionInformation <- function() { [18:01:38.879] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.879] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.879] search = base::search(), system = base::Sys.info()) [18:01:38.879] } [18:01:38.879] ...future.conditions[[length(...future.conditions) + [18:01:38.879] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.879] cond$call), session = sessionInformation(), [18:01:38.879] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.879] signalCondition(cond) [18:01:38.879] } [18:01:38.879] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.879] "immediateCondition"))) { [18:01:38.879] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.879] ...future.conditions[[length(...future.conditions) + [18:01:38.879] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.879] if (TRUE && !signal) { [18:01:38.879] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.879] { [18:01:38.879] inherits <- base::inherits [18:01:38.879] invokeRestart <- base::invokeRestart [18:01:38.879] is.null <- base::is.null [18:01:38.879] muffled <- FALSE [18:01:38.879] if (inherits(cond, "message")) { [18:01:38.879] muffled <- grepl(pattern, "muffleMessage") [18:01:38.879] if (muffled) [18:01:38.879] invokeRestart("muffleMessage") [18:01:38.879] } [18:01:38.879] else if (inherits(cond, "warning")) { [18:01:38.879] muffled <- grepl(pattern, "muffleWarning") [18:01:38.879] if (muffled) [18:01:38.879] invokeRestart("muffleWarning") [18:01:38.879] } [18:01:38.879] else if (inherits(cond, "condition")) { [18:01:38.879] if (!is.null(pattern)) { [18:01:38.879] computeRestarts <- base::computeRestarts [18:01:38.879] grepl <- base::grepl [18:01:38.879] restarts <- computeRestarts(cond) [18:01:38.879] for (restart in restarts) { [18:01:38.879] name <- restart$name [18:01:38.879] if (is.null(name)) [18:01:38.879] next [18:01:38.879] if (!grepl(pattern, name)) [18:01:38.879] next [18:01:38.879] invokeRestart(restart) [18:01:38.879] muffled <- TRUE [18:01:38.879] break [18:01:38.879] } [18:01:38.879] } [18:01:38.879] } [18:01:38.879] invisible(muffled) [18:01:38.879] } [18:01:38.879] muffleCondition(cond, pattern = "^muffle") [18:01:38.879] } [18:01:38.879] } [18:01:38.879] else { [18:01:38.879] if (TRUE) { [18:01:38.879] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.879] { [18:01:38.879] inherits <- base::inherits [18:01:38.879] invokeRestart <- base::invokeRestart [18:01:38.879] is.null <- base::is.null [18:01:38.879] muffled <- FALSE [18:01:38.879] if (inherits(cond, "message")) { [18:01:38.879] muffled <- grepl(pattern, "muffleMessage") [18:01:38.879] if (muffled) [18:01:38.879] invokeRestart("muffleMessage") [18:01:38.879] } [18:01:38.879] else if (inherits(cond, "warning")) { [18:01:38.879] muffled <- grepl(pattern, "muffleWarning") [18:01:38.879] if (muffled) [18:01:38.879] invokeRestart("muffleWarning") [18:01:38.879] } [18:01:38.879] else if (inherits(cond, "condition")) { [18:01:38.879] if (!is.null(pattern)) { [18:01:38.879] computeRestarts <- base::computeRestarts [18:01:38.879] grepl <- base::grepl [18:01:38.879] restarts <- computeRestarts(cond) [18:01:38.879] for (restart in restarts) { [18:01:38.879] name <- restart$name [18:01:38.879] if (is.null(name)) [18:01:38.879] next [18:01:38.879] if (!grepl(pattern, name)) [18:01:38.879] next [18:01:38.879] invokeRestart(restart) [18:01:38.879] muffled <- TRUE [18:01:38.879] break [18:01:38.879] } [18:01:38.879] } [18:01:38.879] } [18:01:38.879] invisible(muffled) [18:01:38.879] } [18:01:38.879] muffleCondition(cond, pattern = "^muffle") [18:01:38.879] } [18:01:38.879] } [18:01:38.879] } [18:01:38.879] })) [18:01:38.879] }, error = function(ex) { [18:01:38.879] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.879] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.879] ...future.rng), started = ...future.startTime, [18:01:38.879] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.879] version = "1.8"), class = "FutureResult") [18:01:38.879] }, finally = { [18:01:38.879] if (!identical(...future.workdir, getwd())) [18:01:38.879] setwd(...future.workdir) [18:01:38.879] { [18:01:38.879] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.879] ...future.oldOptions$nwarnings <- NULL [18:01:38.879] } [18:01:38.879] base::options(...future.oldOptions) [18:01:38.879] if (.Platform$OS.type == "windows") { [18:01:38.879] old_names <- names(...future.oldEnvVars) [18:01:38.879] envs <- base::Sys.getenv() [18:01:38.879] names <- names(envs) [18:01:38.879] common <- intersect(names, old_names) [18:01:38.879] added <- setdiff(names, old_names) [18:01:38.879] removed <- setdiff(old_names, names) [18:01:38.879] changed <- common[...future.oldEnvVars[common] != [18:01:38.879] envs[common]] [18:01:38.879] NAMES <- toupper(changed) [18:01:38.879] args <- list() [18:01:38.879] for (kk in seq_along(NAMES)) { [18:01:38.879] name <- changed[[kk]] [18:01:38.879] NAME <- NAMES[[kk]] [18:01:38.879] if (name != NAME && is.element(NAME, old_names)) [18:01:38.879] next [18:01:38.879] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.879] } [18:01:38.879] NAMES <- toupper(added) [18:01:38.879] for (kk in seq_along(NAMES)) { [18:01:38.879] name <- added[[kk]] [18:01:38.879] NAME <- NAMES[[kk]] [18:01:38.879] if (name != NAME && is.element(NAME, old_names)) [18:01:38.879] next [18:01:38.879] args[[name]] <- "" [18:01:38.879] } [18:01:38.879] NAMES <- toupper(removed) [18:01:38.879] for (kk in seq_along(NAMES)) { [18:01:38.879] name <- removed[[kk]] [18:01:38.879] NAME <- NAMES[[kk]] [18:01:38.879] if (name != NAME && is.element(NAME, old_names)) [18:01:38.879] next [18:01:38.879] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.879] } [18:01:38.879] if (length(args) > 0) [18:01:38.879] base::do.call(base::Sys.setenv, args = args) [18:01:38.879] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.879] } [18:01:38.879] else { [18:01:38.879] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.879] } [18:01:38.879] { [18:01:38.879] if (base::length(...future.futureOptionsAdded) > [18:01:38.879] 0L) { [18:01:38.879] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.879] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.879] base::options(opts) [18:01:38.879] } [18:01:38.879] { [18:01:38.879] { [18:01:38.879] NULL [18:01:38.879] RNGkind("Mersenne-Twister") [18:01:38.879] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.879] inherits = FALSE) [18:01:38.879] } [18:01:38.879] options(future.plan = NULL) [18:01:38.879] if (is.na(NA_character_)) [18:01:38.879] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.879] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.879] future::plan(list(function (..., envir = parent.frame()) [18:01:38.879] { [18:01:38.879] future <- SequentialFuture(..., envir = envir) [18:01:38.879] if (!future$lazy) [18:01:38.879] future <- run(future) [18:01:38.879] invisible(future) [18:01:38.879] }), .cleanup = FALSE, .init = FALSE) [18:01:38.879] } [18:01:38.879] } [18:01:38.879] } [18:01:38.879] }) [18:01:38.879] if (TRUE) { [18:01:38.879] base::sink(type = "output", split = FALSE) [18:01:38.879] if (TRUE) { [18:01:38.879] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.879] } [18:01:38.879] else { [18:01:38.879] ...future.result["stdout"] <- base::list(NULL) [18:01:38.879] } [18:01:38.879] base::close(...future.stdout) [18:01:38.879] ...future.stdout <- NULL [18:01:38.879] } [18:01:38.879] ...future.result$conditions <- ...future.conditions [18:01:38.879] ...future.result$finished <- base::Sys.time() [18:01:38.879] ...future.result [18:01:38.879] } [18:01:38.883] plan(): Setting new future strategy stack: [18:01:38.883] List of future strategies: [18:01:38.883] 1. sequential: [18:01:38.883] - args: function (..., envir = parent.frame()) [18:01:38.883] - tweaked: FALSE [18:01:38.883] - call: NULL [18:01:38.883] plan(): nbrOfWorkers() = 1 [18:01:38.884] plan(): Setting new future strategy stack: [18:01:38.884] List of future strategies: [18:01:38.884] 1. sequential: [18:01:38.884] - args: function (..., envir = parent.frame()) [18:01:38.884] - tweaked: FALSE [18:01:38.884] - call: plan(strategy) [18:01:38.885] plan(): nbrOfWorkers() = 1 [18:01:38.885] SequentialFuture started (and completed) [18:01:38.885] - Launch lazy future ... done [18:01:38.885] run() for 'SequentialFuture' ... done [18:01:38.887] resolved() for 'SequentialFuture' ... [18:01:38.887] - state: 'finished' [18:01:38.887] - run: TRUE [18:01:38.887] - result: 'FutureResult' [18:01:38.888] resolved() for 'SequentialFuture' ... done [18:01:38.888] resolved() for 'SequentialFuture' ... [18:01:38.888] - state: 'finished' [18:01:38.888] - run: TRUE [18:01:38.888] - result: 'FutureResult' [18:01:38.888] resolved() for 'SequentialFuture' ... done [18:01:38.889] resolved() for 'SequentialFuture' ... [18:01:38.889] - state: 'finished' [18:01:38.889] - run: TRUE [18:01:38.889] - result: 'FutureResult' [18:01:38.889] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:38.891] resolve() on environment ... [18:01:38.891] recursive: 0 [18:01:38.891] elements: [4] 'a', 'b', 'c', 'd' [18:01:38.892] signalConditionsASAP(numeric, pos=1) ... [18:01:38.892] - nx: 4 [18:01:38.892] - relay: TRUE [18:01:38.892] - stdout: TRUE [18:01:38.892] - signal: TRUE [18:01:38.892] - resignal: FALSE [18:01:38.892] - force: TRUE [18:01:38.893] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.893] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.893] - until=2 [18:01:38.893] - relaying element #2 [18:01:38.893] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.893] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.894] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.894] length: 3 (resolved future 1) [18:01:38.894] resolved() for 'SequentialFuture' ... [18:01:38.894] - state: 'finished' [18:01:38.894] - run: TRUE [18:01:38.894] - result: 'FutureResult' [18:01:38.895] resolved() for 'SequentialFuture' ... done [18:01:38.895] Future #2 [18:01:38.895] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.895] - nx: 4 [18:01:38.895] - relay: TRUE [18:01:38.895] - stdout: TRUE [18:01:38.896] - signal: TRUE [18:01:38.896] - resignal: FALSE [18:01:38.896] - force: TRUE [18:01:38.896] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.896] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.896] - until=2 [18:01:38.896] - relaying element #2 [18:01:38.897] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.897] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.897] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.897] length: 2 (resolved future 2) [18:01:38.897] resolved() for 'SequentialFuture' ... [18:01:38.897] - state: 'finished' [18:01:38.898] - run: TRUE [18:01:38.898] - result: 'FutureResult' [18:01:38.898] resolved() for 'SequentialFuture' ... done [18:01:38.898] Future #3 [18:01:38.898] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.899] - nx: 4 [18:01:38.899] - relay: TRUE [18:01:38.899] - stdout: TRUE [18:01:38.899] - signal: TRUE [18:01:38.899] - resignal: FALSE [18:01:38.899] - force: TRUE [18:01:38.899] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.900] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.900] - until=3 [18:01:38.900] - relaying element #3 [18:01:38.900] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.900] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.900] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.901] length: 1 (resolved future 3) [18:01:38.901] resolved() for 'SequentialFuture' ... [18:01:38.901] - state: 'finished' [18:01:38.901] - run: TRUE [18:01:38.901] - result: 'FutureResult' [18:01:38.901] resolved() for 'SequentialFuture' ... done [18:01:38.902] Future #4 [18:01:38.902] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:38.902] - nx: 4 [18:01:38.902] - relay: TRUE [18:01:38.902] - stdout: TRUE [18:01:38.902] - signal: TRUE [18:01:38.903] - resignal: FALSE [18:01:38.903] - force: TRUE [18:01:38.903] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.903] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.903] - until=4 [18:01:38.903] - relaying element #4 [18:01:38.904] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.904] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.904] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:38.904] length: 0 (resolved future 4) [18:01:38.904] Relaying remaining futures [18:01:38.904] signalConditionsASAP(NULL, pos=0) ... [18:01:38.904] - nx: 4 [18:01:38.906] - relay: TRUE [18:01:38.906] - stdout: TRUE [18:01:38.906] - signal: TRUE [18:01:38.906] - resignal: FALSE [18:01:38.906] - force: TRUE [18:01:38.906] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.906] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:38.907] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.907] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.907] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.907] resolve() on environment ... DONE Dimensions: c(2, 3, 1) [18:01:38.908] getGlobalsAndPackages() ... [18:01:38.908] Searching for globals... [18:01:38.909] [18:01:38.909] Searching for globals ... DONE [18:01:38.909] - globals: [0] [18:01:38.909] getGlobalsAndPackages() ... DONE [18:01:38.909] run() for 'Future' ... [18:01:38.910] - state: 'created' [18:01:38.910] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.910] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.911] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.911] - Field: 'label' [18:01:38.911] - Field: 'local' [18:01:38.911] - Field: 'owner' [18:01:38.911] - Field: 'envir' [18:01:38.912] - Field: 'packages' [18:01:38.912] - Field: 'gc' [18:01:38.912] - Field: 'conditions' [18:01:38.912] - Field: 'expr' [18:01:38.913] - Field: 'uuid' [18:01:38.913] - Field: 'seed' [18:01:38.913] - Field: 'version' [18:01:38.913] - Field: 'result' [18:01:38.914] - Field: 'asynchronous' [18:01:38.914] - Field: 'calls' [18:01:38.914] - Field: 'globals' [18:01:38.914] - Field: 'stdout' [18:01:38.915] - Field: 'earlySignal' [18:01:38.915] - Field: 'lazy' [18:01:38.915] - Field: 'state' [18:01:38.915] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.915] - Launch lazy future ... [18:01:38.916] Packages needed by the future expression (n = 0): [18:01:38.916] Packages needed by future strategies (n = 0): [18:01:38.917] { [18:01:38.917] { [18:01:38.917] { [18:01:38.917] ...future.startTime <- base::Sys.time() [18:01:38.917] { [18:01:38.917] { [18:01:38.917] { [18:01:38.917] base::local({ [18:01:38.917] has_future <- base::requireNamespace("future", [18:01:38.917] quietly = TRUE) [18:01:38.917] if (has_future) { [18:01:38.917] ns <- base::getNamespace("future") [18:01:38.917] version <- ns[[".package"]][["version"]] [18:01:38.917] if (is.null(version)) [18:01:38.917] version <- utils::packageVersion("future") [18:01:38.917] } [18:01:38.917] else { [18:01:38.917] version <- NULL [18:01:38.917] } [18:01:38.917] if (!has_future || version < "1.8.0") { [18:01:38.917] info <- base::c(r_version = base::gsub("R version ", [18:01:38.917] "", base::R.version$version.string), [18:01:38.917] platform = base::sprintf("%s (%s-bit)", [18:01:38.917] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.917] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.917] "release", "version")], collapse = " "), [18:01:38.917] hostname = base::Sys.info()[["nodename"]]) [18:01:38.917] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.917] info) [18:01:38.917] info <- base::paste(info, collapse = "; ") [18:01:38.917] if (!has_future) { [18:01:38.917] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.917] info) [18:01:38.917] } [18:01:38.917] else { [18:01:38.917] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.917] info, version) [18:01:38.917] } [18:01:38.917] base::stop(msg) [18:01:38.917] } [18:01:38.917] }) [18:01:38.917] } [18:01:38.917] options(future.plan = NULL) [18:01:38.917] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.917] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.917] } [18:01:38.917] ...future.workdir <- getwd() [18:01:38.917] } [18:01:38.917] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.917] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.917] } [18:01:38.917] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.917] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.917] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.917] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.917] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.917] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.917] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.917] base::names(...future.oldOptions)) [18:01:38.917] } [18:01:38.917] if (FALSE) { [18:01:38.917] } [18:01:38.917] else { [18:01:38.917] if (TRUE) { [18:01:38.917] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.917] open = "w") [18:01:38.917] } [18:01:38.917] else { [18:01:38.917] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.917] windows = "NUL", "/dev/null"), open = "w") [18:01:38.917] } [18:01:38.917] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.917] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.917] base::sink(type = "output", split = FALSE) [18:01:38.917] base::close(...future.stdout) [18:01:38.917] }, add = TRUE) [18:01:38.917] } [18:01:38.917] ...future.frame <- base::sys.nframe() [18:01:38.917] ...future.conditions <- base::list() [18:01:38.917] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.917] if (FALSE) { [18:01:38.917] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.917] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.917] } [18:01:38.917] ...future.result <- base::tryCatch({ [18:01:38.917] base::withCallingHandlers({ [18:01:38.917] ...future.value <- base::withVisible(base::local(2)) [18:01:38.917] future::FutureResult(value = ...future.value$value, [18:01:38.917] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.917] ...future.rng), globalenv = if (FALSE) [18:01:38.917] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.917] ...future.globalenv.names)) [18:01:38.917] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.917] }, condition = base::local({ [18:01:38.917] c <- base::c [18:01:38.917] inherits <- base::inherits [18:01:38.917] invokeRestart <- base::invokeRestart [18:01:38.917] length <- base::length [18:01:38.917] list <- base::list [18:01:38.917] seq.int <- base::seq.int [18:01:38.917] signalCondition <- base::signalCondition [18:01:38.917] sys.calls <- base::sys.calls [18:01:38.917] `[[` <- base::`[[` [18:01:38.917] `+` <- base::`+` [18:01:38.917] `<<-` <- base::`<<-` [18:01:38.917] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.917] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.917] 3L)] [18:01:38.917] } [18:01:38.917] function(cond) { [18:01:38.917] is_error <- inherits(cond, "error") [18:01:38.917] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.917] NULL) [18:01:38.917] if (is_error) { [18:01:38.917] sessionInformation <- function() { [18:01:38.917] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.917] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.917] search = base::search(), system = base::Sys.info()) [18:01:38.917] } [18:01:38.917] ...future.conditions[[length(...future.conditions) + [18:01:38.917] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.917] cond$call), session = sessionInformation(), [18:01:38.917] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.917] signalCondition(cond) [18:01:38.917] } [18:01:38.917] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.917] "immediateCondition"))) { [18:01:38.917] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.917] ...future.conditions[[length(...future.conditions) + [18:01:38.917] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.917] if (TRUE && !signal) { [18:01:38.917] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.917] { [18:01:38.917] inherits <- base::inherits [18:01:38.917] invokeRestart <- base::invokeRestart [18:01:38.917] is.null <- base::is.null [18:01:38.917] muffled <- FALSE [18:01:38.917] if (inherits(cond, "message")) { [18:01:38.917] muffled <- grepl(pattern, "muffleMessage") [18:01:38.917] if (muffled) [18:01:38.917] invokeRestart("muffleMessage") [18:01:38.917] } [18:01:38.917] else if (inherits(cond, "warning")) { [18:01:38.917] muffled <- grepl(pattern, "muffleWarning") [18:01:38.917] if (muffled) [18:01:38.917] invokeRestart("muffleWarning") [18:01:38.917] } [18:01:38.917] else if (inherits(cond, "condition")) { [18:01:38.917] if (!is.null(pattern)) { [18:01:38.917] computeRestarts <- base::computeRestarts [18:01:38.917] grepl <- base::grepl [18:01:38.917] restarts <- computeRestarts(cond) [18:01:38.917] for (restart in restarts) { [18:01:38.917] name <- restart$name [18:01:38.917] if (is.null(name)) [18:01:38.917] next [18:01:38.917] if (!grepl(pattern, name)) [18:01:38.917] next [18:01:38.917] invokeRestart(restart) [18:01:38.917] muffled <- TRUE [18:01:38.917] break [18:01:38.917] } [18:01:38.917] } [18:01:38.917] } [18:01:38.917] invisible(muffled) [18:01:38.917] } [18:01:38.917] muffleCondition(cond, pattern = "^muffle") [18:01:38.917] } [18:01:38.917] } [18:01:38.917] else { [18:01:38.917] if (TRUE) { [18:01:38.917] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.917] { [18:01:38.917] inherits <- base::inherits [18:01:38.917] invokeRestart <- base::invokeRestart [18:01:38.917] is.null <- base::is.null [18:01:38.917] muffled <- FALSE [18:01:38.917] if (inherits(cond, "message")) { [18:01:38.917] muffled <- grepl(pattern, "muffleMessage") [18:01:38.917] if (muffled) [18:01:38.917] invokeRestart("muffleMessage") [18:01:38.917] } [18:01:38.917] else if (inherits(cond, "warning")) { [18:01:38.917] muffled <- grepl(pattern, "muffleWarning") [18:01:38.917] if (muffled) [18:01:38.917] invokeRestart("muffleWarning") [18:01:38.917] } [18:01:38.917] else if (inherits(cond, "condition")) { [18:01:38.917] if (!is.null(pattern)) { [18:01:38.917] computeRestarts <- base::computeRestarts [18:01:38.917] grepl <- base::grepl [18:01:38.917] restarts <- computeRestarts(cond) [18:01:38.917] for (restart in restarts) { [18:01:38.917] name <- restart$name [18:01:38.917] if (is.null(name)) [18:01:38.917] next [18:01:38.917] if (!grepl(pattern, name)) [18:01:38.917] next [18:01:38.917] invokeRestart(restart) [18:01:38.917] muffled <- TRUE [18:01:38.917] break [18:01:38.917] } [18:01:38.917] } [18:01:38.917] } [18:01:38.917] invisible(muffled) [18:01:38.917] } [18:01:38.917] muffleCondition(cond, pattern = "^muffle") [18:01:38.917] } [18:01:38.917] } [18:01:38.917] } [18:01:38.917] })) [18:01:38.917] }, error = function(ex) { [18:01:38.917] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.917] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.917] ...future.rng), started = ...future.startTime, [18:01:38.917] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.917] version = "1.8"), class = "FutureResult") [18:01:38.917] }, finally = { [18:01:38.917] if (!identical(...future.workdir, getwd())) [18:01:38.917] setwd(...future.workdir) [18:01:38.917] { [18:01:38.917] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.917] ...future.oldOptions$nwarnings <- NULL [18:01:38.917] } [18:01:38.917] base::options(...future.oldOptions) [18:01:38.917] if (.Platform$OS.type == "windows") { [18:01:38.917] old_names <- names(...future.oldEnvVars) [18:01:38.917] envs <- base::Sys.getenv() [18:01:38.917] names <- names(envs) [18:01:38.917] common <- intersect(names, old_names) [18:01:38.917] added <- setdiff(names, old_names) [18:01:38.917] removed <- setdiff(old_names, names) [18:01:38.917] changed <- common[...future.oldEnvVars[common] != [18:01:38.917] envs[common]] [18:01:38.917] NAMES <- toupper(changed) [18:01:38.917] args <- list() [18:01:38.917] for (kk in seq_along(NAMES)) { [18:01:38.917] name <- changed[[kk]] [18:01:38.917] NAME <- NAMES[[kk]] [18:01:38.917] if (name != NAME && is.element(NAME, old_names)) [18:01:38.917] next [18:01:38.917] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.917] } [18:01:38.917] NAMES <- toupper(added) [18:01:38.917] for (kk in seq_along(NAMES)) { [18:01:38.917] name <- added[[kk]] [18:01:38.917] NAME <- NAMES[[kk]] [18:01:38.917] if (name != NAME && is.element(NAME, old_names)) [18:01:38.917] next [18:01:38.917] args[[name]] <- "" [18:01:38.917] } [18:01:38.917] NAMES <- toupper(removed) [18:01:38.917] for (kk in seq_along(NAMES)) { [18:01:38.917] name <- removed[[kk]] [18:01:38.917] NAME <- NAMES[[kk]] [18:01:38.917] if (name != NAME && is.element(NAME, old_names)) [18:01:38.917] next [18:01:38.917] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.917] } [18:01:38.917] if (length(args) > 0) [18:01:38.917] base::do.call(base::Sys.setenv, args = args) [18:01:38.917] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.917] } [18:01:38.917] else { [18:01:38.917] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.917] } [18:01:38.917] { [18:01:38.917] if (base::length(...future.futureOptionsAdded) > [18:01:38.917] 0L) { [18:01:38.917] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.917] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.917] base::options(opts) [18:01:38.917] } [18:01:38.917] { [18:01:38.917] { [18:01:38.917] NULL [18:01:38.917] RNGkind("Mersenne-Twister") [18:01:38.917] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.917] inherits = FALSE) [18:01:38.917] } [18:01:38.917] options(future.plan = NULL) [18:01:38.917] if (is.na(NA_character_)) [18:01:38.917] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.917] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.917] future::plan(list(function (..., envir = parent.frame()) [18:01:38.917] { [18:01:38.917] future <- SequentialFuture(..., envir = envir) [18:01:38.917] if (!future$lazy) [18:01:38.917] future <- run(future) [18:01:38.917] invisible(future) [18:01:38.917] }), .cleanup = FALSE, .init = FALSE) [18:01:38.917] } [18:01:38.917] } [18:01:38.917] } [18:01:38.917] }) [18:01:38.917] if (TRUE) { [18:01:38.917] base::sink(type = "output", split = FALSE) [18:01:38.917] if (TRUE) { [18:01:38.917] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.917] } [18:01:38.917] else { [18:01:38.917] ...future.result["stdout"] <- base::list(NULL) [18:01:38.917] } [18:01:38.917] base::close(...future.stdout) [18:01:38.917] ...future.stdout <- NULL [18:01:38.917] } [18:01:38.917] ...future.result$conditions <- ...future.conditions [18:01:38.917] ...future.result$finished <- base::Sys.time() [18:01:38.917] ...future.result [18:01:38.917] } [18:01:38.922] plan(): Setting new future strategy stack: [18:01:38.922] List of future strategies: [18:01:38.922] 1. sequential: [18:01:38.922] - args: function (..., envir = parent.frame()) [18:01:38.922] - tweaked: FALSE [18:01:38.922] - call: NULL [18:01:38.922] plan(): nbrOfWorkers() = 1 [18:01:38.924] plan(): Setting new future strategy stack: [18:01:38.924] List of future strategies: [18:01:38.924] 1. sequential: [18:01:38.924] - args: function (..., envir = parent.frame()) [18:01:38.924] - tweaked: FALSE [18:01:38.924] - call: plan(strategy) [18:01:38.925] plan(): nbrOfWorkers() = 1 [18:01:38.925] SequentialFuture started (and completed) [18:01:38.925] - Launch lazy future ... done [18:01:38.925] run() for 'SequentialFuture' ... done [18:01:38.926] getGlobalsAndPackages() ... [18:01:38.926] Searching for globals... [18:01:38.926] [18:01:38.926] Searching for globals ... DONE [18:01:38.927] - globals: [0] [18:01:38.927] getGlobalsAndPackages() ... DONE [18:01:38.927] run() for 'Future' ... [18:01:38.927] - state: 'created' [18:01:38.928] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.928] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.928] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.929] - Field: 'label' [18:01:38.929] - Field: 'local' [18:01:38.929] - Field: 'owner' [18:01:38.929] - Field: 'envir' [18:01:38.930] - Field: 'packages' [18:01:38.930] - Field: 'gc' [18:01:38.930] - Field: 'conditions' [18:01:38.930] - Field: 'expr' [18:01:38.930] - Field: 'uuid' [18:01:38.931] - Field: 'seed' [18:01:38.931] - Field: 'version' [18:01:38.931] - Field: 'result' [18:01:38.931] - Field: 'asynchronous' [18:01:38.932] - Field: 'calls' [18:01:38.932] - Field: 'globals' [18:01:38.932] - Field: 'stdout' [18:01:38.932] - Field: 'earlySignal' [18:01:38.932] - Field: 'lazy' [18:01:38.933] - Field: 'state' [18:01:38.933] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.933] - Launch lazy future ... [18:01:38.933] Packages needed by the future expression (n = 0): [18:01:38.934] Packages needed by future strategies (n = 0): [18:01:38.934] { [18:01:38.934] { [18:01:38.934] { [18:01:38.934] ...future.startTime <- base::Sys.time() [18:01:38.934] { [18:01:38.934] { [18:01:38.934] { [18:01:38.934] base::local({ [18:01:38.934] has_future <- base::requireNamespace("future", [18:01:38.934] quietly = TRUE) [18:01:38.934] if (has_future) { [18:01:38.934] ns <- base::getNamespace("future") [18:01:38.934] version <- ns[[".package"]][["version"]] [18:01:38.934] if (is.null(version)) [18:01:38.934] version <- utils::packageVersion("future") [18:01:38.934] } [18:01:38.934] else { [18:01:38.934] version <- NULL [18:01:38.934] } [18:01:38.934] if (!has_future || version < "1.8.0") { [18:01:38.934] info <- base::c(r_version = base::gsub("R version ", [18:01:38.934] "", base::R.version$version.string), [18:01:38.934] platform = base::sprintf("%s (%s-bit)", [18:01:38.934] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.934] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.934] "release", "version")], collapse = " "), [18:01:38.934] hostname = base::Sys.info()[["nodename"]]) [18:01:38.934] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.934] info) [18:01:38.934] info <- base::paste(info, collapse = "; ") [18:01:38.934] if (!has_future) { [18:01:38.934] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.934] info) [18:01:38.934] } [18:01:38.934] else { [18:01:38.934] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.934] info, version) [18:01:38.934] } [18:01:38.934] base::stop(msg) [18:01:38.934] } [18:01:38.934] }) [18:01:38.934] } [18:01:38.934] options(future.plan = NULL) [18:01:38.934] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.934] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.934] } [18:01:38.934] ...future.workdir <- getwd() [18:01:38.934] } [18:01:38.934] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.934] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.934] } [18:01:38.934] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.934] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.934] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.934] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.934] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.934] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.934] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.934] base::names(...future.oldOptions)) [18:01:38.934] } [18:01:38.934] if (FALSE) { [18:01:38.934] } [18:01:38.934] else { [18:01:38.934] if (TRUE) { [18:01:38.934] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.934] open = "w") [18:01:38.934] } [18:01:38.934] else { [18:01:38.934] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.934] windows = "NUL", "/dev/null"), open = "w") [18:01:38.934] } [18:01:38.934] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.934] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.934] base::sink(type = "output", split = FALSE) [18:01:38.934] base::close(...future.stdout) [18:01:38.934] }, add = TRUE) [18:01:38.934] } [18:01:38.934] ...future.frame <- base::sys.nframe() [18:01:38.934] ...future.conditions <- base::list() [18:01:38.934] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.934] if (FALSE) { [18:01:38.934] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.934] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.934] } [18:01:38.934] ...future.result <- base::tryCatch({ [18:01:38.934] base::withCallingHandlers({ [18:01:38.934] ...future.value <- base::withVisible(base::local(NULL)) [18:01:38.934] future::FutureResult(value = ...future.value$value, [18:01:38.934] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.934] ...future.rng), globalenv = if (FALSE) [18:01:38.934] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.934] ...future.globalenv.names)) [18:01:38.934] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.934] }, condition = base::local({ [18:01:38.934] c <- base::c [18:01:38.934] inherits <- base::inherits [18:01:38.934] invokeRestart <- base::invokeRestart [18:01:38.934] length <- base::length [18:01:38.934] list <- base::list [18:01:38.934] seq.int <- base::seq.int [18:01:38.934] signalCondition <- base::signalCondition [18:01:38.934] sys.calls <- base::sys.calls [18:01:38.934] `[[` <- base::`[[` [18:01:38.934] `+` <- base::`+` [18:01:38.934] `<<-` <- base::`<<-` [18:01:38.934] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.934] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.934] 3L)] [18:01:38.934] } [18:01:38.934] function(cond) { [18:01:38.934] is_error <- inherits(cond, "error") [18:01:38.934] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.934] NULL) [18:01:38.934] if (is_error) { [18:01:38.934] sessionInformation <- function() { [18:01:38.934] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.934] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.934] search = base::search(), system = base::Sys.info()) [18:01:38.934] } [18:01:38.934] ...future.conditions[[length(...future.conditions) + [18:01:38.934] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.934] cond$call), session = sessionInformation(), [18:01:38.934] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.934] signalCondition(cond) [18:01:38.934] } [18:01:38.934] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.934] "immediateCondition"))) { [18:01:38.934] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.934] ...future.conditions[[length(...future.conditions) + [18:01:38.934] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.934] if (TRUE && !signal) { [18:01:38.934] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.934] { [18:01:38.934] inherits <- base::inherits [18:01:38.934] invokeRestart <- base::invokeRestart [18:01:38.934] is.null <- base::is.null [18:01:38.934] muffled <- FALSE [18:01:38.934] if (inherits(cond, "message")) { [18:01:38.934] muffled <- grepl(pattern, "muffleMessage") [18:01:38.934] if (muffled) [18:01:38.934] invokeRestart("muffleMessage") [18:01:38.934] } [18:01:38.934] else if (inherits(cond, "warning")) { [18:01:38.934] muffled <- grepl(pattern, "muffleWarning") [18:01:38.934] if (muffled) [18:01:38.934] invokeRestart("muffleWarning") [18:01:38.934] } [18:01:38.934] else if (inherits(cond, "condition")) { [18:01:38.934] if (!is.null(pattern)) { [18:01:38.934] computeRestarts <- base::computeRestarts [18:01:38.934] grepl <- base::grepl [18:01:38.934] restarts <- computeRestarts(cond) [18:01:38.934] for (restart in restarts) { [18:01:38.934] name <- restart$name [18:01:38.934] if (is.null(name)) [18:01:38.934] next [18:01:38.934] if (!grepl(pattern, name)) [18:01:38.934] next [18:01:38.934] invokeRestart(restart) [18:01:38.934] muffled <- TRUE [18:01:38.934] break [18:01:38.934] } [18:01:38.934] } [18:01:38.934] } [18:01:38.934] invisible(muffled) [18:01:38.934] } [18:01:38.934] muffleCondition(cond, pattern = "^muffle") [18:01:38.934] } [18:01:38.934] } [18:01:38.934] else { [18:01:38.934] if (TRUE) { [18:01:38.934] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.934] { [18:01:38.934] inherits <- base::inherits [18:01:38.934] invokeRestart <- base::invokeRestart [18:01:38.934] is.null <- base::is.null [18:01:38.934] muffled <- FALSE [18:01:38.934] if (inherits(cond, "message")) { [18:01:38.934] muffled <- grepl(pattern, "muffleMessage") [18:01:38.934] if (muffled) [18:01:38.934] invokeRestart("muffleMessage") [18:01:38.934] } [18:01:38.934] else if (inherits(cond, "warning")) { [18:01:38.934] muffled <- grepl(pattern, "muffleWarning") [18:01:38.934] if (muffled) [18:01:38.934] invokeRestart("muffleWarning") [18:01:38.934] } [18:01:38.934] else if (inherits(cond, "condition")) { [18:01:38.934] if (!is.null(pattern)) { [18:01:38.934] computeRestarts <- base::computeRestarts [18:01:38.934] grepl <- base::grepl [18:01:38.934] restarts <- computeRestarts(cond) [18:01:38.934] for (restart in restarts) { [18:01:38.934] name <- restart$name [18:01:38.934] if (is.null(name)) [18:01:38.934] next [18:01:38.934] if (!grepl(pattern, name)) [18:01:38.934] next [18:01:38.934] invokeRestart(restart) [18:01:38.934] muffled <- TRUE [18:01:38.934] break [18:01:38.934] } [18:01:38.934] } [18:01:38.934] } [18:01:38.934] invisible(muffled) [18:01:38.934] } [18:01:38.934] muffleCondition(cond, pattern = "^muffle") [18:01:38.934] } [18:01:38.934] } [18:01:38.934] } [18:01:38.934] })) [18:01:38.934] }, error = function(ex) { [18:01:38.934] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.934] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.934] ...future.rng), started = ...future.startTime, [18:01:38.934] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.934] version = "1.8"), class = "FutureResult") [18:01:38.934] }, finally = { [18:01:38.934] if (!identical(...future.workdir, getwd())) [18:01:38.934] setwd(...future.workdir) [18:01:38.934] { [18:01:38.934] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.934] ...future.oldOptions$nwarnings <- NULL [18:01:38.934] } [18:01:38.934] base::options(...future.oldOptions) [18:01:38.934] if (.Platform$OS.type == "windows") { [18:01:38.934] old_names <- names(...future.oldEnvVars) [18:01:38.934] envs <- base::Sys.getenv() [18:01:38.934] names <- names(envs) [18:01:38.934] common <- intersect(names, old_names) [18:01:38.934] added <- setdiff(names, old_names) [18:01:38.934] removed <- setdiff(old_names, names) [18:01:38.934] changed <- common[...future.oldEnvVars[common] != [18:01:38.934] envs[common]] [18:01:38.934] NAMES <- toupper(changed) [18:01:38.934] args <- list() [18:01:38.934] for (kk in seq_along(NAMES)) { [18:01:38.934] name <- changed[[kk]] [18:01:38.934] NAME <- NAMES[[kk]] [18:01:38.934] if (name != NAME && is.element(NAME, old_names)) [18:01:38.934] next [18:01:38.934] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.934] } [18:01:38.934] NAMES <- toupper(added) [18:01:38.934] for (kk in seq_along(NAMES)) { [18:01:38.934] name <- added[[kk]] [18:01:38.934] NAME <- NAMES[[kk]] [18:01:38.934] if (name != NAME && is.element(NAME, old_names)) [18:01:38.934] next [18:01:38.934] args[[name]] <- "" [18:01:38.934] } [18:01:38.934] NAMES <- toupper(removed) [18:01:38.934] for (kk in seq_along(NAMES)) { [18:01:38.934] name <- removed[[kk]] [18:01:38.934] NAME <- NAMES[[kk]] [18:01:38.934] if (name != NAME && is.element(NAME, old_names)) [18:01:38.934] next [18:01:38.934] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.934] } [18:01:38.934] if (length(args) > 0) [18:01:38.934] base::do.call(base::Sys.setenv, args = args) [18:01:38.934] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.934] } [18:01:38.934] else { [18:01:38.934] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.934] } [18:01:38.934] { [18:01:38.934] if (base::length(...future.futureOptionsAdded) > [18:01:38.934] 0L) { [18:01:38.934] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.934] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.934] base::options(opts) [18:01:38.934] } [18:01:38.934] { [18:01:38.934] { [18:01:38.934] NULL [18:01:38.934] RNGkind("Mersenne-Twister") [18:01:38.934] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.934] inherits = FALSE) [18:01:38.934] } [18:01:38.934] options(future.plan = NULL) [18:01:38.934] if (is.na(NA_character_)) [18:01:38.934] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.934] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.934] future::plan(list(function (..., envir = parent.frame()) [18:01:38.934] { [18:01:38.934] future <- SequentialFuture(..., envir = envir) [18:01:38.934] if (!future$lazy) [18:01:38.934] future <- run(future) [18:01:38.934] invisible(future) [18:01:38.934] }), .cleanup = FALSE, .init = FALSE) [18:01:38.934] } [18:01:38.934] } [18:01:38.934] } [18:01:38.934] }) [18:01:38.934] if (TRUE) { [18:01:38.934] base::sink(type = "output", split = FALSE) [18:01:38.934] if (TRUE) { [18:01:38.934] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.934] } [18:01:38.934] else { [18:01:38.934] ...future.result["stdout"] <- base::list(NULL) [18:01:38.934] } [18:01:38.934] base::close(...future.stdout) [18:01:38.934] ...future.stdout <- NULL [18:01:38.934] } [18:01:38.934] ...future.result$conditions <- ...future.conditions [18:01:38.934] ...future.result$finished <- base::Sys.time() [18:01:38.934] ...future.result [18:01:38.934] } [18:01:38.938] plan(): Setting new future strategy stack: [18:01:38.938] List of future strategies: [18:01:38.938] 1. sequential: [18:01:38.938] - args: function (..., envir = parent.frame()) [18:01:38.938] - tweaked: FALSE [18:01:38.938] - call: NULL [18:01:38.939] plan(): nbrOfWorkers() = 1 [18:01:38.940] plan(): Setting new future strategy stack: [18:01:38.940] List of future strategies: [18:01:38.940] 1. sequential: [18:01:38.940] - args: function (..., envir = parent.frame()) [18:01:38.940] - tweaked: FALSE [18:01:38.940] - call: plan(strategy) [18:01:38.940] plan(): nbrOfWorkers() = 1 [18:01:38.940] SequentialFuture started (and completed) [18:01:38.941] - Launch lazy future ... done [18:01:38.941] run() for 'SequentialFuture' ... done [18:01:38.941] getGlobalsAndPackages() ... [18:01:38.941] Searching for globals... [18:01:38.942] - globals found: [1] '{' [18:01:38.942] Searching for globals ... DONE [18:01:38.942] Resolving globals: FALSE [18:01:38.943] [18:01:38.943] [18:01:38.943] getGlobalsAndPackages() ... DONE [18:01:38.943] run() for 'Future' ... [18:01:38.943] - state: 'created' [18:01:38.944] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.944] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.944] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.944] - Field: 'label' [18:01:38.944] - Field: 'local' [18:01:38.945] - Field: 'owner' [18:01:38.945] - Field: 'envir' [18:01:38.945] - Field: 'packages' [18:01:38.945] - Field: 'gc' [18:01:38.945] - Field: 'conditions' [18:01:38.945] - Field: 'expr' [18:01:38.946] - Field: 'uuid' [18:01:38.946] - Field: 'seed' [18:01:38.946] - Field: 'version' [18:01:38.946] - Field: 'result' [18:01:38.946] - Field: 'asynchronous' [18:01:38.946] - Field: 'calls' [18:01:38.947] - Field: 'globals' [18:01:38.947] - Field: 'stdout' [18:01:38.947] - Field: 'earlySignal' [18:01:38.947] - Field: 'lazy' [18:01:38.947] - Field: 'state' [18:01:38.947] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.948] - Launch lazy future ... [18:01:38.948] Packages needed by the future expression (n = 0): [18:01:38.948] Packages needed by future strategies (n = 0): [18:01:38.948] { [18:01:38.948] { [18:01:38.948] { [18:01:38.948] ...future.startTime <- base::Sys.time() [18:01:38.948] { [18:01:38.948] { [18:01:38.948] { [18:01:38.948] base::local({ [18:01:38.948] has_future <- base::requireNamespace("future", [18:01:38.948] quietly = TRUE) [18:01:38.948] if (has_future) { [18:01:38.948] ns <- base::getNamespace("future") [18:01:38.948] version <- ns[[".package"]][["version"]] [18:01:38.948] if (is.null(version)) [18:01:38.948] version <- utils::packageVersion("future") [18:01:38.948] } [18:01:38.948] else { [18:01:38.948] version <- NULL [18:01:38.948] } [18:01:38.948] if (!has_future || version < "1.8.0") { [18:01:38.948] info <- base::c(r_version = base::gsub("R version ", [18:01:38.948] "", base::R.version$version.string), [18:01:38.948] platform = base::sprintf("%s (%s-bit)", [18:01:38.948] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.948] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.948] "release", "version")], collapse = " "), [18:01:38.948] hostname = base::Sys.info()[["nodename"]]) [18:01:38.948] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.948] info) [18:01:38.948] info <- base::paste(info, collapse = "; ") [18:01:38.948] if (!has_future) { [18:01:38.948] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.948] info) [18:01:38.948] } [18:01:38.948] else { [18:01:38.948] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.948] info, version) [18:01:38.948] } [18:01:38.948] base::stop(msg) [18:01:38.948] } [18:01:38.948] }) [18:01:38.948] } [18:01:38.948] options(future.plan = NULL) [18:01:38.948] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.948] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.948] } [18:01:38.948] ...future.workdir <- getwd() [18:01:38.948] } [18:01:38.948] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.948] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.948] } [18:01:38.948] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.948] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.948] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.948] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.948] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.948] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.948] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.948] base::names(...future.oldOptions)) [18:01:38.948] } [18:01:38.948] if (FALSE) { [18:01:38.948] } [18:01:38.948] else { [18:01:38.948] if (TRUE) { [18:01:38.948] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.948] open = "w") [18:01:38.948] } [18:01:38.948] else { [18:01:38.948] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.948] windows = "NUL", "/dev/null"), open = "w") [18:01:38.948] } [18:01:38.948] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.948] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.948] base::sink(type = "output", split = FALSE) [18:01:38.948] base::close(...future.stdout) [18:01:38.948] }, add = TRUE) [18:01:38.948] } [18:01:38.948] ...future.frame <- base::sys.nframe() [18:01:38.948] ...future.conditions <- base::list() [18:01:38.948] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.948] if (FALSE) { [18:01:38.948] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.948] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.948] } [18:01:38.948] ...future.result <- base::tryCatch({ [18:01:38.948] base::withCallingHandlers({ [18:01:38.948] ...future.value <- base::withVisible(base::local({ [18:01:38.948] 4 [18:01:38.948] })) [18:01:38.948] future::FutureResult(value = ...future.value$value, [18:01:38.948] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.948] ...future.rng), globalenv = if (FALSE) [18:01:38.948] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.948] ...future.globalenv.names)) [18:01:38.948] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.948] }, condition = base::local({ [18:01:38.948] c <- base::c [18:01:38.948] inherits <- base::inherits [18:01:38.948] invokeRestart <- base::invokeRestart [18:01:38.948] length <- base::length [18:01:38.948] list <- base::list [18:01:38.948] seq.int <- base::seq.int [18:01:38.948] signalCondition <- base::signalCondition [18:01:38.948] sys.calls <- base::sys.calls [18:01:38.948] `[[` <- base::`[[` [18:01:38.948] `+` <- base::`+` [18:01:38.948] `<<-` <- base::`<<-` [18:01:38.948] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.948] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.948] 3L)] [18:01:38.948] } [18:01:38.948] function(cond) { [18:01:38.948] is_error <- inherits(cond, "error") [18:01:38.948] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.948] NULL) [18:01:38.948] if (is_error) { [18:01:38.948] sessionInformation <- function() { [18:01:38.948] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.948] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.948] search = base::search(), system = base::Sys.info()) [18:01:38.948] } [18:01:38.948] ...future.conditions[[length(...future.conditions) + [18:01:38.948] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.948] cond$call), session = sessionInformation(), [18:01:38.948] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.948] signalCondition(cond) [18:01:38.948] } [18:01:38.948] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.948] "immediateCondition"))) { [18:01:38.948] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.948] ...future.conditions[[length(...future.conditions) + [18:01:38.948] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.948] if (TRUE && !signal) { [18:01:38.948] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.948] { [18:01:38.948] inherits <- base::inherits [18:01:38.948] invokeRestart <- base::invokeRestart [18:01:38.948] is.null <- base::is.null [18:01:38.948] muffled <- FALSE [18:01:38.948] if (inherits(cond, "message")) { [18:01:38.948] muffled <- grepl(pattern, "muffleMessage") [18:01:38.948] if (muffled) [18:01:38.948] invokeRestart("muffleMessage") [18:01:38.948] } [18:01:38.948] else if (inherits(cond, "warning")) { [18:01:38.948] muffled <- grepl(pattern, "muffleWarning") [18:01:38.948] if (muffled) [18:01:38.948] invokeRestart("muffleWarning") [18:01:38.948] } [18:01:38.948] else if (inherits(cond, "condition")) { [18:01:38.948] if (!is.null(pattern)) { [18:01:38.948] computeRestarts <- base::computeRestarts [18:01:38.948] grepl <- base::grepl [18:01:38.948] restarts <- computeRestarts(cond) [18:01:38.948] for (restart in restarts) { [18:01:38.948] name <- restart$name [18:01:38.948] if (is.null(name)) [18:01:38.948] next [18:01:38.948] if (!grepl(pattern, name)) [18:01:38.948] next [18:01:38.948] invokeRestart(restart) [18:01:38.948] muffled <- TRUE [18:01:38.948] break [18:01:38.948] } [18:01:38.948] } [18:01:38.948] } [18:01:38.948] invisible(muffled) [18:01:38.948] } [18:01:38.948] muffleCondition(cond, pattern = "^muffle") [18:01:38.948] } [18:01:38.948] } [18:01:38.948] else { [18:01:38.948] if (TRUE) { [18:01:38.948] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.948] { [18:01:38.948] inherits <- base::inherits [18:01:38.948] invokeRestart <- base::invokeRestart [18:01:38.948] is.null <- base::is.null [18:01:38.948] muffled <- FALSE [18:01:38.948] if (inherits(cond, "message")) { [18:01:38.948] muffled <- grepl(pattern, "muffleMessage") [18:01:38.948] if (muffled) [18:01:38.948] invokeRestart("muffleMessage") [18:01:38.948] } [18:01:38.948] else if (inherits(cond, "warning")) { [18:01:38.948] muffled <- grepl(pattern, "muffleWarning") [18:01:38.948] if (muffled) [18:01:38.948] invokeRestart("muffleWarning") [18:01:38.948] } [18:01:38.948] else if (inherits(cond, "condition")) { [18:01:38.948] if (!is.null(pattern)) { [18:01:38.948] computeRestarts <- base::computeRestarts [18:01:38.948] grepl <- base::grepl [18:01:38.948] restarts <- computeRestarts(cond) [18:01:38.948] for (restart in restarts) { [18:01:38.948] name <- restart$name [18:01:38.948] if (is.null(name)) [18:01:38.948] next [18:01:38.948] if (!grepl(pattern, name)) [18:01:38.948] next [18:01:38.948] invokeRestart(restart) [18:01:38.948] muffled <- TRUE [18:01:38.948] break [18:01:38.948] } [18:01:38.948] } [18:01:38.948] } [18:01:38.948] invisible(muffled) [18:01:38.948] } [18:01:38.948] muffleCondition(cond, pattern = "^muffle") [18:01:38.948] } [18:01:38.948] } [18:01:38.948] } [18:01:38.948] })) [18:01:38.948] }, error = function(ex) { [18:01:38.948] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.948] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.948] ...future.rng), started = ...future.startTime, [18:01:38.948] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.948] version = "1.8"), class = "FutureResult") [18:01:38.948] }, finally = { [18:01:38.948] if (!identical(...future.workdir, getwd())) [18:01:38.948] setwd(...future.workdir) [18:01:38.948] { [18:01:38.948] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.948] ...future.oldOptions$nwarnings <- NULL [18:01:38.948] } [18:01:38.948] base::options(...future.oldOptions) [18:01:38.948] if (.Platform$OS.type == "windows") { [18:01:38.948] old_names <- names(...future.oldEnvVars) [18:01:38.948] envs <- base::Sys.getenv() [18:01:38.948] names <- names(envs) [18:01:38.948] common <- intersect(names, old_names) [18:01:38.948] added <- setdiff(names, old_names) [18:01:38.948] removed <- setdiff(old_names, names) [18:01:38.948] changed <- common[...future.oldEnvVars[common] != [18:01:38.948] envs[common]] [18:01:38.948] NAMES <- toupper(changed) [18:01:38.948] args <- list() [18:01:38.948] for (kk in seq_along(NAMES)) { [18:01:38.948] name <- changed[[kk]] [18:01:38.948] NAME <- NAMES[[kk]] [18:01:38.948] if (name != NAME && is.element(NAME, old_names)) [18:01:38.948] next [18:01:38.948] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.948] } [18:01:38.948] NAMES <- toupper(added) [18:01:38.948] for (kk in seq_along(NAMES)) { [18:01:38.948] name <- added[[kk]] [18:01:38.948] NAME <- NAMES[[kk]] [18:01:38.948] if (name != NAME && is.element(NAME, old_names)) [18:01:38.948] next [18:01:38.948] args[[name]] <- "" [18:01:38.948] } [18:01:38.948] NAMES <- toupper(removed) [18:01:38.948] for (kk in seq_along(NAMES)) { [18:01:38.948] name <- removed[[kk]] [18:01:38.948] NAME <- NAMES[[kk]] [18:01:38.948] if (name != NAME && is.element(NAME, old_names)) [18:01:38.948] next [18:01:38.948] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.948] } [18:01:38.948] if (length(args) > 0) [18:01:38.948] base::do.call(base::Sys.setenv, args = args) [18:01:38.948] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.948] } [18:01:38.948] else { [18:01:38.948] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.948] } [18:01:38.948] { [18:01:38.948] if (base::length(...future.futureOptionsAdded) > [18:01:38.948] 0L) { [18:01:38.948] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.948] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.948] base::options(opts) [18:01:38.948] } [18:01:38.948] { [18:01:38.948] { [18:01:38.948] NULL [18:01:38.948] RNGkind("Mersenne-Twister") [18:01:38.948] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.948] inherits = FALSE) [18:01:38.948] } [18:01:38.948] options(future.plan = NULL) [18:01:38.948] if (is.na(NA_character_)) [18:01:38.948] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.948] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.948] future::plan(list(function (..., envir = parent.frame()) [18:01:38.948] { [18:01:38.948] future <- SequentialFuture(..., envir = envir) [18:01:38.948] if (!future$lazy) [18:01:38.948] future <- run(future) [18:01:38.948] invisible(future) [18:01:38.948] }), .cleanup = FALSE, .init = FALSE) [18:01:38.948] } [18:01:38.948] } [18:01:38.948] } [18:01:38.948] }) [18:01:38.948] if (TRUE) { [18:01:38.948] base::sink(type = "output", split = FALSE) [18:01:38.948] if (TRUE) { [18:01:38.948] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.948] } [18:01:38.948] else { [18:01:38.948] ...future.result["stdout"] <- base::list(NULL) [18:01:38.948] } [18:01:38.948] base::close(...future.stdout) [18:01:38.948] ...future.stdout <- NULL [18:01:38.948] } [18:01:38.948] ...future.result$conditions <- ...future.conditions [18:01:38.948] ...future.result$finished <- base::Sys.time() [18:01:38.948] ...future.result [18:01:38.948] } [18:01:38.952] plan(): Setting new future strategy stack: [18:01:38.952] List of future strategies: [18:01:38.952] 1. sequential: [18:01:38.952] - args: function (..., envir = parent.frame()) [18:01:38.952] - tweaked: FALSE [18:01:38.952] - call: NULL [18:01:38.953] plan(): nbrOfWorkers() = 1 [18:01:38.955] plan(): Setting new future strategy stack: [18:01:38.955] List of future strategies: [18:01:38.955] 1. sequential: [18:01:38.955] - args: function (..., envir = parent.frame()) [18:01:38.955] - tweaked: FALSE [18:01:38.955] - call: plan(strategy) [18:01:38.956] plan(): nbrOfWorkers() = 1 [18:01:38.956] SequentialFuture started (and completed) [18:01:38.956] - Launch lazy future ... done [18:01:38.956] run() for 'SequentialFuture' ... done [18:01:38.958] resolved() for 'SequentialFuture' ... [18:01:38.958] - state: 'finished' [18:01:38.958] - run: TRUE [18:01:38.958] - result: 'FutureResult' [18:01:38.958] resolved() for 'SequentialFuture' ... done [18:01:38.959] resolved() for 'SequentialFuture' ... [18:01:38.959] - state: 'finished' [18:01:38.959] - run: TRUE [18:01:38.959] - result: 'FutureResult' [18:01:38.959] resolved() for 'SequentialFuture' ... done [18:01:38.959] resolved() for 'SequentialFuture' ... [18:01:38.960] - state: 'finished' [18:01:38.960] - run: TRUE [18:01:38.960] - result: 'FutureResult' [18:01:38.960] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:38.961] resolve() on environment ... [18:01:38.962] recursive: 0 [18:01:38.962] elements: [4] 'a', 'b', 'c', 'd' [18:01:38.962] signalConditionsASAP(numeric, pos=1) ... [18:01:38.962] - nx: 4 [18:01:38.963] - relay: TRUE [18:01:38.963] - stdout: TRUE [18:01:38.963] - signal: TRUE [18:01:38.963] - resignal: FALSE [18:01:38.963] - force: TRUE [18:01:38.963] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.964] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.964] - until=2 [18:01:38.964] - relaying element #2 [18:01:38.964] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.964] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.964] signalConditionsASAP(NULL, pos=1) ... done [18:01:38.965] length: 3 (resolved future 1) [18:01:38.965] resolved() for 'SequentialFuture' ... [18:01:38.965] - state: 'finished' [18:01:38.965] - run: TRUE [18:01:38.965] - result: 'FutureResult' [18:01:38.965] resolved() for 'SequentialFuture' ... done [18:01:38.966] Future #2 [18:01:38.966] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:38.966] - nx: 4 [18:01:38.966] - relay: TRUE [18:01:38.966] - stdout: TRUE [18:01:38.966] - signal: TRUE [18:01:38.966] - resignal: FALSE [18:01:38.967] - force: TRUE [18:01:38.967] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:38.967] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:38.967] - until=2 [18:01:38.967] - relaying element #2 [18:01:38.967] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.968] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.968] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:38.968] length: 2 (resolved future 2) [18:01:38.968] resolved() for 'SequentialFuture' ... [18:01:38.968] - state: 'finished' [18:01:38.968] - run: TRUE [18:01:38.969] - result: 'FutureResult' [18:01:38.969] resolved() for 'SequentialFuture' ... done [18:01:38.969] Future #3 [18:01:38.969] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:38.969] - nx: 4 [18:01:38.969] - relay: TRUE [18:01:38.969] - stdout: TRUE [18:01:38.970] - signal: TRUE [18:01:38.970] - resignal: FALSE [18:01:38.970] - force: TRUE [18:01:38.970] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:38.970] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:38.971] - until=3 [18:01:38.971] - relaying element #3 [18:01:38.971] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.971] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.971] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:38.971] length: 1 (resolved future 3) [18:01:38.972] resolved() for 'SequentialFuture' ... [18:01:38.972] - state: 'finished' [18:01:38.972] - run: TRUE [18:01:38.972] - result: 'FutureResult' [18:01:38.972] resolved() for 'SequentialFuture' ... done [18:01:38.972] Future #4 [18:01:38.973] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:38.973] - nx: 4 [18:01:38.973] - relay: TRUE [18:01:38.973] - stdout: TRUE [18:01:38.973] - signal: TRUE [18:01:38.973] - resignal: FALSE [18:01:38.974] - force: TRUE [18:01:38.974] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:38.974] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:38.974] - until=4 [18:01:38.974] - relaying element #4 [18:01:38.974] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.975] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.975] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:38.975] length: 0 (resolved future 4) [18:01:38.975] Relaying remaining futures [18:01:38.975] signalConditionsASAP(NULL, pos=0) ... [18:01:38.975] - nx: 4 [18:01:38.976] - relay: TRUE [18:01:38.976] - stdout: TRUE [18:01:38.976] - signal: TRUE [18:01:38.976] - resignal: FALSE [18:01:38.976] - force: TRUE [18:01:38.976] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.976] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:38.977] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:38.977] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:38.977] signalConditionsASAP(NULL, pos=0) ... done [18:01:38.977] resolve() on environment ... DONE Dimensions: c(2, 1, 3, 1) [18:01:38.978] getGlobalsAndPackages() ... [18:01:38.978] Searching for globals... [18:01:38.978] [18:01:38.979] Searching for globals ... DONE [18:01:38.979] - globals: [0] [18:01:38.979] getGlobalsAndPackages() ... DONE [18:01:38.979] run() for 'Future' ... [18:01:38.979] - state: 'created' [18:01:38.980] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.980] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.980] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.980] - Field: 'label' [18:01:38.980] - Field: 'local' [18:01:38.981] - Field: 'owner' [18:01:38.981] - Field: 'envir' [18:01:38.981] - Field: 'packages' [18:01:38.981] - Field: 'gc' [18:01:38.981] - Field: 'conditions' [18:01:38.981] - Field: 'expr' [18:01:38.982] - Field: 'uuid' [18:01:38.982] - Field: 'seed' [18:01:38.982] - Field: 'version' [18:01:38.982] - Field: 'result' [18:01:38.982] - Field: 'asynchronous' [18:01:38.983] - Field: 'calls' [18:01:38.983] - Field: 'globals' [18:01:38.983] - Field: 'stdout' [18:01:38.983] - Field: 'earlySignal' [18:01:38.983] - Field: 'lazy' [18:01:38.983] - Field: 'state' [18:01:38.984] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.984] - Launch lazy future ... [18:01:38.984] Packages needed by the future expression (n = 0): [18:01:38.984] Packages needed by future strategies (n = 0): [18:01:38.985] { [18:01:38.985] { [18:01:38.985] { [18:01:38.985] ...future.startTime <- base::Sys.time() [18:01:38.985] { [18:01:38.985] { [18:01:38.985] { [18:01:38.985] base::local({ [18:01:38.985] has_future <- base::requireNamespace("future", [18:01:38.985] quietly = TRUE) [18:01:38.985] if (has_future) { [18:01:38.985] ns <- base::getNamespace("future") [18:01:38.985] version <- ns[[".package"]][["version"]] [18:01:38.985] if (is.null(version)) [18:01:38.985] version <- utils::packageVersion("future") [18:01:38.985] } [18:01:38.985] else { [18:01:38.985] version <- NULL [18:01:38.985] } [18:01:38.985] if (!has_future || version < "1.8.0") { [18:01:38.985] info <- base::c(r_version = base::gsub("R version ", [18:01:38.985] "", base::R.version$version.string), [18:01:38.985] platform = base::sprintf("%s (%s-bit)", [18:01:38.985] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:38.985] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:38.985] "release", "version")], collapse = " "), [18:01:38.985] hostname = base::Sys.info()[["nodename"]]) [18:01:38.985] info <- base::sprintf("%s: %s", base::names(info), [18:01:38.985] info) [18:01:38.985] info <- base::paste(info, collapse = "; ") [18:01:38.985] if (!has_future) { [18:01:38.985] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:38.985] info) [18:01:38.985] } [18:01:38.985] else { [18:01:38.985] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:38.985] info, version) [18:01:38.985] } [18:01:38.985] base::stop(msg) [18:01:38.985] } [18:01:38.985] }) [18:01:38.985] } [18:01:38.985] options(future.plan = NULL) [18:01:38.985] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.985] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:38.985] } [18:01:38.985] ...future.workdir <- getwd() [18:01:38.985] } [18:01:38.985] ...future.oldOptions <- base::as.list(base::.Options) [18:01:38.985] ...future.oldEnvVars <- base::Sys.getenv() [18:01:38.985] } [18:01:38.985] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:38.985] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:38.985] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:38.985] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:38.985] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:38.985] future.stdout.windows.reencode = NULL, width = 80L) [18:01:38.985] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:38.985] base::names(...future.oldOptions)) [18:01:38.985] } [18:01:38.985] if (FALSE) { [18:01:38.985] } [18:01:38.985] else { [18:01:38.985] if (TRUE) { [18:01:38.985] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:38.985] open = "w") [18:01:38.985] } [18:01:38.985] else { [18:01:38.985] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:38.985] windows = "NUL", "/dev/null"), open = "w") [18:01:38.985] } [18:01:38.985] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:38.985] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:38.985] base::sink(type = "output", split = FALSE) [18:01:38.985] base::close(...future.stdout) [18:01:38.985] }, add = TRUE) [18:01:38.985] } [18:01:38.985] ...future.frame <- base::sys.nframe() [18:01:38.985] ...future.conditions <- base::list() [18:01:38.985] ...future.rng <- base::globalenv()$.Random.seed [18:01:38.985] if (FALSE) { [18:01:38.985] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:38.985] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:38.985] } [18:01:38.985] ...future.result <- base::tryCatch({ [18:01:38.985] base::withCallingHandlers({ [18:01:38.985] ...future.value <- base::withVisible(base::local(2)) [18:01:38.985] future::FutureResult(value = ...future.value$value, [18:01:38.985] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.985] ...future.rng), globalenv = if (FALSE) [18:01:38.985] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:38.985] ...future.globalenv.names)) [18:01:38.985] else NULL, started = ...future.startTime, version = "1.8") [18:01:38.985] }, condition = base::local({ [18:01:38.985] c <- base::c [18:01:38.985] inherits <- base::inherits [18:01:38.985] invokeRestart <- base::invokeRestart [18:01:38.985] length <- base::length [18:01:38.985] list <- base::list [18:01:38.985] seq.int <- base::seq.int [18:01:38.985] signalCondition <- base::signalCondition [18:01:38.985] sys.calls <- base::sys.calls [18:01:38.985] `[[` <- base::`[[` [18:01:38.985] `+` <- base::`+` [18:01:38.985] `<<-` <- base::`<<-` [18:01:38.985] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:38.985] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:38.985] 3L)] [18:01:38.985] } [18:01:38.985] function(cond) { [18:01:38.985] is_error <- inherits(cond, "error") [18:01:38.985] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:38.985] NULL) [18:01:38.985] if (is_error) { [18:01:38.985] sessionInformation <- function() { [18:01:38.985] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:38.985] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:38.985] search = base::search(), system = base::Sys.info()) [18:01:38.985] } [18:01:38.985] ...future.conditions[[length(...future.conditions) + [18:01:38.985] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:38.985] cond$call), session = sessionInformation(), [18:01:38.985] timestamp = base::Sys.time(), signaled = 0L) [18:01:38.985] signalCondition(cond) [18:01:38.985] } [18:01:38.985] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:38.985] "immediateCondition"))) { [18:01:38.985] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:38.985] ...future.conditions[[length(...future.conditions) + [18:01:38.985] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:38.985] if (TRUE && !signal) { [18:01:38.985] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.985] { [18:01:38.985] inherits <- base::inherits [18:01:38.985] invokeRestart <- base::invokeRestart [18:01:38.985] is.null <- base::is.null [18:01:38.985] muffled <- FALSE [18:01:38.985] if (inherits(cond, "message")) { [18:01:38.985] muffled <- grepl(pattern, "muffleMessage") [18:01:38.985] if (muffled) [18:01:38.985] invokeRestart("muffleMessage") [18:01:38.985] } [18:01:38.985] else if (inherits(cond, "warning")) { [18:01:38.985] muffled <- grepl(pattern, "muffleWarning") [18:01:38.985] if (muffled) [18:01:38.985] invokeRestart("muffleWarning") [18:01:38.985] } [18:01:38.985] else if (inherits(cond, "condition")) { [18:01:38.985] if (!is.null(pattern)) { [18:01:38.985] computeRestarts <- base::computeRestarts [18:01:38.985] grepl <- base::grepl [18:01:38.985] restarts <- computeRestarts(cond) [18:01:38.985] for (restart in restarts) { [18:01:38.985] name <- restart$name [18:01:38.985] if (is.null(name)) [18:01:38.985] next [18:01:38.985] if (!grepl(pattern, name)) [18:01:38.985] next [18:01:38.985] invokeRestart(restart) [18:01:38.985] muffled <- TRUE [18:01:38.985] break [18:01:38.985] } [18:01:38.985] } [18:01:38.985] } [18:01:38.985] invisible(muffled) [18:01:38.985] } [18:01:38.985] muffleCondition(cond, pattern = "^muffle") [18:01:38.985] } [18:01:38.985] } [18:01:38.985] else { [18:01:38.985] if (TRUE) { [18:01:38.985] muffleCondition <- function (cond, pattern = "^muffle") [18:01:38.985] { [18:01:38.985] inherits <- base::inherits [18:01:38.985] invokeRestart <- base::invokeRestart [18:01:38.985] is.null <- base::is.null [18:01:38.985] muffled <- FALSE [18:01:38.985] if (inherits(cond, "message")) { [18:01:38.985] muffled <- grepl(pattern, "muffleMessage") [18:01:38.985] if (muffled) [18:01:38.985] invokeRestart("muffleMessage") [18:01:38.985] } [18:01:38.985] else if (inherits(cond, "warning")) { [18:01:38.985] muffled <- grepl(pattern, "muffleWarning") [18:01:38.985] if (muffled) [18:01:38.985] invokeRestart("muffleWarning") [18:01:38.985] } [18:01:38.985] else if (inherits(cond, "condition")) { [18:01:38.985] if (!is.null(pattern)) { [18:01:38.985] computeRestarts <- base::computeRestarts [18:01:38.985] grepl <- base::grepl [18:01:38.985] restarts <- computeRestarts(cond) [18:01:38.985] for (restart in restarts) { [18:01:38.985] name <- restart$name [18:01:38.985] if (is.null(name)) [18:01:38.985] next [18:01:38.985] if (!grepl(pattern, name)) [18:01:38.985] next [18:01:38.985] invokeRestart(restart) [18:01:38.985] muffled <- TRUE [18:01:38.985] break [18:01:38.985] } [18:01:38.985] } [18:01:38.985] } [18:01:38.985] invisible(muffled) [18:01:38.985] } [18:01:38.985] muffleCondition(cond, pattern = "^muffle") [18:01:38.985] } [18:01:38.985] } [18:01:38.985] } [18:01:38.985] })) [18:01:38.985] }, error = function(ex) { [18:01:38.985] base::structure(base::list(value = NULL, visible = NULL, [18:01:38.985] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:38.985] ...future.rng), started = ...future.startTime, [18:01:38.985] finished = Sys.time(), session_uuid = NA_character_, [18:01:38.985] version = "1.8"), class = "FutureResult") [18:01:38.985] }, finally = { [18:01:38.985] if (!identical(...future.workdir, getwd())) [18:01:38.985] setwd(...future.workdir) [18:01:38.985] { [18:01:38.985] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:38.985] ...future.oldOptions$nwarnings <- NULL [18:01:38.985] } [18:01:38.985] base::options(...future.oldOptions) [18:01:38.985] if (.Platform$OS.type == "windows") { [18:01:38.985] old_names <- names(...future.oldEnvVars) [18:01:38.985] envs <- base::Sys.getenv() [18:01:38.985] names <- names(envs) [18:01:38.985] common <- intersect(names, old_names) [18:01:38.985] added <- setdiff(names, old_names) [18:01:38.985] removed <- setdiff(old_names, names) [18:01:38.985] changed <- common[...future.oldEnvVars[common] != [18:01:38.985] envs[common]] [18:01:38.985] NAMES <- toupper(changed) [18:01:38.985] args <- list() [18:01:38.985] for (kk in seq_along(NAMES)) { [18:01:38.985] name <- changed[[kk]] [18:01:38.985] NAME <- NAMES[[kk]] [18:01:38.985] if (name != NAME && is.element(NAME, old_names)) [18:01:38.985] next [18:01:38.985] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.985] } [18:01:38.985] NAMES <- toupper(added) [18:01:38.985] for (kk in seq_along(NAMES)) { [18:01:38.985] name <- added[[kk]] [18:01:38.985] NAME <- NAMES[[kk]] [18:01:38.985] if (name != NAME && is.element(NAME, old_names)) [18:01:38.985] next [18:01:38.985] args[[name]] <- "" [18:01:38.985] } [18:01:38.985] NAMES <- toupper(removed) [18:01:38.985] for (kk in seq_along(NAMES)) { [18:01:38.985] name <- removed[[kk]] [18:01:38.985] NAME <- NAMES[[kk]] [18:01:38.985] if (name != NAME && is.element(NAME, old_names)) [18:01:38.985] next [18:01:38.985] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:38.985] } [18:01:38.985] if (length(args) > 0) [18:01:38.985] base::do.call(base::Sys.setenv, args = args) [18:01:38.985] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:38.985] } [18:01:38.985] else { [18:01:38.985] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:38.985] } [18:01:38.985] { [18:01:38.985] if (base::length(...future.futureOptionsAdded) > [18:01:38.985] 0L) { [18:01:38.985] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:38.985] base::names(opts) <- ...future.futureOptionsAdded [18:01:38.985] base::options(opts) [18:01:38.985] } [18:01:38.985] { [18:01:38.985] { [18:01:38.985] NULL [18:01:38.985] RNGkind("Mersenne-Twister") [18:01:38.985] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:38.985] inherits = FALSE) [18:01:38.985] } [18:01:38.985] options(future.plan = NULL) [18:01:38.985] if (is.na(NA_character_)) [18:01:38.985] Sys.unsetenv("R_FUTURE_PLAN") [18:01:38.985] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:38.985] future::plan(list(function (..., envir = parent.frame()) [18:01:38.985] { [18:01:38.985] future <- SequentialFuture(..., envir = envir) [18:01:38.985] if (!future$lazy) [18:01:38.985] future <- run(future) [18:01:38.985] invisible(future) [18:01:38.985] }), .cleanup = FALSE, .init = FALSE) [18:01:38.985] } [18:01:38.985] } [18:01:38.985] } [18:01:38.985] }) [18:01:38.985] if (TRUE) { [18:01:38.985] base::sink(type = "output", split = FALSE) [18:01:38.985] if (TRUE) { [18:01:38.985] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:38.985] } [18:01:38.985] else { [18:01:38.985] ...future.result["stdout"] <- base::list(NULL) [18:01:38.985] } [18:01:38.985] base::close(...future.stdout) [18:01:38.985] ...future.stdout <- NULL [18:01:38.985] } [18:01:38.985] ...future.result$conditions <- ...future.conditions [18:01:38.985] ...future.result$finished <- base::Sys.time() [18:01:38.985] ...future.result [18:01:38.985] } [18:01:38.989] plan(): Setting new future strategy stack: [18:01:38.989] List of future strategies: [18:01:38.989] 1. sequential: [18:01:38.989] - args: function (..., envir = parent.frame()) [18:01:38.989] - tweaked: FALSE [18:01:38.989] - call: NULL [18:01:38.989] plan(): nbrOfWorkers() = 1 [18:01:38.990] plan(): Setting new future strategy stack: [18:01:38.991] List of future strategies: [18:01:38.991] 1. sequential: [18:01:38.991] - args: function (..., envir = parent.frame()) [18:01:38.991] - tweaked: FALSE [18:01:38.991] - call: plan(strategy) [18:01:38.992] plan(): nbrOfWorkers() = 1 [18:01:38.992] SequentialFuture started (and completed) [18:01:38.992] - Launch lazy future ... done [18:01:38.993] run() for 'SequentialFuture' ... done [18:01:38.993] getGlobalsAndPackages() ... [18:01:38.993] Searching for globals... [18:01:38.993] [18:01:38.993] Searching for globals ... DONE [18:01:38.994] - globals: [0] [18:01:38.994] getGlobalsAndPackages() ... DONE [18:01:38.994] run() for 'Future' ... [18:01:38.994] - state: 'created' [18:01:38.994] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:38.995] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:38.995] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:38.995] - Field: 'label' [18:01:38.995] - Field: 'local' [18:01:38.996] - Field: 'owner' [18:01:38.996] - Field: 'envir' [18:01:38.996] - Field: 'packages' [18:01:38.996] - Field: 'gc' [18:01:38.996] - Field: 'conditions' [18:01:38.996] - Field: 'expr' [18:01:38.997] - Field: 'uuid' [18:01:38.997] - Field: 'seed' [18:01:38.997] - Field: 'version' [18:01:38.997] - Field: 'result' [18:01:38.997] - Field: 'asynchronous' [18:01:38.997] - Field: 'calls' [18:01:38.998] - Field: 'globals' [18:01:38.998] - Field: 'stdout' [18:01:38.998] - Field: 'earlySignal' [18:01:38.998] - Field: 'lazy' [18:01:38.998] - Field: 'state' [18:01:38.999] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:38.999] - Launch lazy future ... [18:01:38.999] Packages needed by the future expression (n = 0): [18:01:38.999] Packages needed by future strategies (n = 0): [18:01:39.000] { [18:01:39.000] { [18:01:39.000] { [18:01:39.000] ...future.startTime <- base::Sys.time() [18:01:39.000] { [18:01:39.000] { [18:01:39.000] { [18:01:39.000] base::local({ [18:01:39.000] has_future <- base::requireNamespace("future", [18:01:39.000] quietly = TRUE) [18:01:39.000] if (has_future) { [18:01:39.000] ns <- base::getNamespace("future") [18:01:39.000] version <- ns[[".package"]][["version"]] [18:01:39.000] if (is.null(version)) [18:01:39.000] version <- utils::packageVersion("future") [18:01:39.000] } [18:01:39.000] else { [18:01:39.000] version <- NULL [18:01:39.000] } [18:01:39.000] if (!has_future || version < "1.8.0") { [18:01:39.000] info <- base::c(r_version = base::gsub("R version ", [18:01:39.000] "", base::R.version$version.string), [18:01:39.000] platform = base::sprintf("%s (%s-bit)", [18:01:39.000] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.000] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.000] "release", "version")], collapse = " "), [18:01:39.000] hostname = base::Sys.info()[["nodename"]]) [18:01:39.000] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.000] info) [18:01:39.000] info <- base::paste(info, collapse = "; ") [18:01:39.000] if (!has_future) { [18:01:39.000] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.000] info) [18:01:39.000] } [18:01:39.000] else { [18:01:39.000] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.000] info, version) [18:01:39.000] } [18:01:39.000] base::stop(msg) [18:01:39.000] } [18:01:39.000] }) [18:01:39.000] } [18:01:39.000] options(future.plan = NULL) [18:01:39.000] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.000] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.000] } [18:01:39.000] ...future.workdir <- getwd() [18:01:39.000] } [18:01:39.000] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.000] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.000] } [18:01:39.000] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.000] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.000] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.000] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.000] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.000] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.000] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.000] base::names(...future.oldOptions)) [18:01:39.000] } [18:01:39.000] if (FALSE) { [18:01:39.000] } [18:01:39.000] else { [18:01:39.000] if (TRUE) { [18:01:39.000] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.000] open = "w") [18:01:39.000] } [18:01:39.000] else { [18:01:39.000] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.000] windows = "NUL", "/dev/null"), open = "w") [18:01:39.000] } [18:01:39.000] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.000] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.000] base::sink(type = "output", split = FALSE) [18:01:39.000] base::close(...future.stdout) [18:01:39.000] }, add = TRUE) [18:01:39.000] } [18:01:39.000] ...future.frame <- base::sys.nframe() [18:01:39.000] ...future.conditions <- base::list() [18:01:39.000] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.000] if (FALSE) { [18:01:39.000] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.000] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.000] } [18:01:39.000] ...future.result <- base::tryCatch({ [18:01:39.000] base::withCallingHandlers({ [18:01:39.000] ...future.value <- base::withVisible(base::local(NULL)) [18:01:39.000] future::FutureResult(value = ...future.value$value, [18:01:39.000] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.000] ...future.rng), globalenv = if (FALSE) [18:01:39.000] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.000] ...future.globalenv.names)) [18:01:39.000] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.000] }, condition = base::local({ [18:01:39.000] c <- base::c [18:01:39.000] inherits <- base::inherits [18:01:39.000] invokeRestart <- base::invokeRestart [18:01:39.000] length <- base::length [18:01:39.000] list <- base::list [18:01:39.000] seq.int <- base::seq.int [18:01:39.000] signalCondition <- base::signalCondition [18:01:39.000] sys.calls <- base::sys.calls [18:01:39.000] `[[` <- base::`[[` [18:01:39.000] `+` <- base::`+` [18:01:39.000] `<<-` <- base::`<<-` [18:01:39.000] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.000] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.000] 3L)] [18:01:39.000] } [18:01:39.000] function(cond) { [18:01:39.000] is_error <- inherits(cond, "error") [18:01:39.000] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.000] NULL) [18:01:39.000] if (is_error) { [18:01:39.000] sessionInformation <- function() { [18:01:39.000] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.000] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.000] search = base::search(), system = base::Sys.info()) [18:01:39.000] } [18:01:39.000] ...future.conditions[[length(...future.conditions) + [18:01:39.000] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.000] cond$call), session = sessionInformation(), [18:01:39.000] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.000] signalCondition(cond) [18:01:39.000] } [18:01:39.000] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.000] "immediateCondition"))) { [18:01:39.000] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.000] ...future.conditions[[length(...future.conditions) + [18:01:39.000] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.000] if (TRUE && !signal) { [18:01:39.000] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.000] { [18:01:39.000] inherits <- base::inherits [18:01:39.000] invokeRestart <- base::invokeRestart [18:01:39.000] is.null <- base::is.null [18:01:39.000] muffled <- FALSE [18:01:39.000] if (inherits(cond, "message")) { [18:01:39.000] muffled <- grepl(pattern, "muffleMessage") [18:01:39.000] if (muffled) [18:01:39.000] invokeRestart("muffleMessage") [18:01:39.000] } [18:01:39.000] else if (inherits(cond, "warning")) { [18:01:39.000] muffled <- grepl(pattern, "muffleWarning") [18:01:39.000] if (muffled) [18:01:39.000] invokeRestart("muffleWarning") [18:01:39.000] } [18:01:39.000] else if (inherits(cond, "condition")) { [18:01:39.000] if (!is.null(pattern)) { [18:01:39.000] computeRestarts <- base::computeRestarts [18:01:39.000] grepl <- base::grepl [18:01:39.000] restarts <- computeRestarts(cond) [18:01:39.000] for (restart in restarts) { [18:01:39.000] name <- restart$name [18:01:39.000] if (is.null(name)) [18:01:39.000] next [18:01:39.000] if (!grepl(pattern, name)) [18:01:39.000] next [18:01:39.000] invokeRestart(restart) [18:01:39.000] muffled <- TRUE [18:01:39.000] break [18:01:39.000] } [18:01:39.000] } [18:01:39.000] } [18:01:39.000] invisible(muffled) [18:01:39.000] } [18:01:39.000] muffleCondition(cond, pattern = "^muffle") [18:01:39.000] } [18:01:39.000] } [18:01:39.000] else { [18:01:39.000] if (TRUE) { [18:01:39.000] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.000] { [18:01:39.000] inherits <- base::inherits [18:01:39.000] invokeRestart <- base::invokeRestart [18:01:39.000] is.null <- base::is.null [18:01:39.000] muffled <- FALSE [18:01:39.000] if (inherits(cond, "message")) { [18:01:39.000] muffled <- grepl(pattern, "muffleMessage") [18:01:39.000] if (muffled) [18:01:39.000] invokeRestart("muffleMessage") [18:01:39.000] } [18:01:39.000] else if (inherits(cond, "warning")) { [18:01:39.000] muffled <- grepl(pattern, "muffleWarning") [18:01:39.000] if (muffled) [18:01:39.000] invokeRestart("muffleWarning") [18:01:39.000] } [18:01:39.000] else if (inherits(cond, "condition")) { [18:01:39.000] if (!is.null(pattern)) { [18:01:39.000] computeRestarts <- base::computeRestarts [18:01:39.000] grepl <- base::grepl [18:01:39.000] restarts <- computeRestarts(cond) [18:01:39.000] for (restart in restarts) { [18:01:39.000] name <- restart$name [18:01:39.000] if (is.null(name)) [18:01:39.000] next [18:01:39.000] if (!grepl(pattern, name)) [18:01:39.000] next [18:01:39.000] invokeRestart(restart) [18:01:39.000] muffled <- TRUE [18:01:39.000] break [18:01:39.000] } [18:01:39.000] } [18:01:39.000] } [18:01:39.000] invisible(muffled) [18:01:39.000] } [18:01:39.000] muffleCondition(cond, pattern = "^muffle") [18:01:39.000] } [18:01:39.000] } [18:01:39.000] } [18:01:39.000] })) [18:01:39.000] }, error = function(ex) { [18:01:39.000] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.000] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.000] ...future.rng), started = ...future.startTime, [18:01:39.000] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.000] version = "1.8"), class = "FutureResult") [18:01:39.000] }, finally = { [18:01:39.000] if (!identical(...future.workdir, getwd())) [18:01:39.000] setwd(...future.workdir) [18:01:39.000] { [18:01:39.000] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.000] ...future.oldOptions$nwarnings <- NULL [18:01:39.000] } [18:01:39.000] base::options(...future.oldOptions) [18:01:39.000] if (.Platform$OS.type == "windows") { [18:01:39.000] old_names <- names(...future.oldEnvVars) [18:01:39.000] envs <- base::Sys.getenv() [18:01:39.000] names <- names(envs) [18:01:39.000] common <- intersect(names, old_names) [18:01:39.000] added <- setdiff(names, old_names) [18:01:39.000] removed <- setdiff(old_names, names) [18:01:39.000] changed <- common[...future.oldEnvVars[common] != [18:01:39.000] envs[common]] [18:01:39.000] NAMES <- toupper(changed) [18:01:39.000] args <- list() [18:01:39.000] for (kk in seq_along(NAMES)) { [18:01:39.000] name <- changed[[kk]] [18:01:39.000] NAME <- NAMES[[kk]] [18:01:39.000] if (name != NAME && is.element(NAME, old_names)) [18:01:39.000] next [18:01:39.000] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.000] } [18:01:39.000] NAMES <- toupper(added) [18:01:39.000] for (kk in seq_along(NAMES)) { [18:01:39.000] name <- added[[kk]] [18:01:39.000] NAME <- NAMES[[kk]] [18:01:39.000] if (name != NAME && is.element(NAME, old_names)) [18:01:39.000] next [18:01:39.000] args[[name]] <- "" [18:01:39.000] } [18:01:39.000] NAMES <- toupper(removed) [18:01:39.000] for (kk in seq_along(NAMES)) { [18:01:39.000] name <- removed[[kk]] [18:01:39.000] NAME <- NAMES[[kk]] [18:01:39.000] if (name != NAME && is.element(NAME, old_names)) [18:01:39.000] next [18:01:39.000] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.000] } [18:01:39.000] if (length(args) > 0) [18:01:39.000] base::do.call(base::Sys.setenv, args = args) [18:01:39.000] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.000] } [18:01:39.000] else { [18:01:39.000] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.000] } [18:01:39.000] { [18:01:39.000] if (base::length(...future.futureOptionsAdded) > [18:01:39.000] 0L) { [18:01:39.000] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.000] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.000] base::options(opts) [18:01:39.000] } [18:01:39.000] { [18:01:39.000] { [18:01:39.000] NULL [18:01:39.000] RNGkind("Mersenne-Twister") [18:01:39.000] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.000] inherits = FALSE) [18:01:39.000] } [18:01:39.000] options(future.plan = NULL) [18:01:39.000] if (is.na(NA_character_)) [18:01:39.000] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.000] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.000] future::plan(list(function (..., envir = parent.frame()) [18:01:39.000] { [18:01:39.000] future <- SequentialFuture(..., envir = envir) [18:01:39.000] if (!future$lazy) [18:01:39.000] future <- run(future) [18:01:39.000] invisible(future) [18:01:39.000] }), .cleanup = FALSE, .init = FALSE) [18:01:39.000] } [18:01:39.000] } [18:01:39.000] } [18:01:39.000] }) [18:01:39.000] if (TRUE) { [18:01:39.000] base::sink(type = "output", split = FALSE) [18:01:39.000] if (TRUE) { [18:01:39.000] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.000] } [18:01:39.000] else { [18:01:39.000] ...future.result["stdout"] <- base::list(NULL) [18:01:39.000] } [18:01:39.000] base::close(...future.stdout) [18:01:39.000] ...future.stdout <- NULL [18:01:39.000] } [18:01:39.000] ...future.result$conditions <- ...future.conditions [18:01:39.000] ...future.result$finished <- base::Sys.time() [18:01:39.000] ...future.result [18:01:39.000] } [18:01:39.004] plan(): Setting new future strategy stack: [18:01:39.004] List of future strategies: [18:01:39.004] 1. sequential: [18:01:39.004] - args: function (..., envir = parent.frame()) [18:01:39.004] - tweaked: FALSE [18:01:39.004] - call: NULL [18:01:39.004] plan(): nbrOfWorkers() = 1 [18:01:39.005] plan(): Setting new future strategy stack: [18:01:39.005] List of future strategies: [18:01:39.005] 1. sequential: [18:01:39.005] - args: function (..., envir = parent.frame()) [18:01:39.005] - tweaked: FALSE [18:01:39.005] - call: plan(strategy) [18:01:39.006] plan(): nbrOfWorkers() = 1 [18:01:39.006] SequentialFuture started (and completed) [18:01:39.006] - Launch lazy future ... done [18:01:39.006] run() for 'SequentialFuture' ... done [18:01:39.007] getGlobalsAndPackages() ... [18:01:39.007] Searching for globals... [18:01:39.008] - globals found: [1] '{' [18:01:39.008] Searching for globals ... DONE [18:01:39.008] Resolving globals: FALSE [18:01:39.008] [18:01:39.009] [18:01:39.009] getGlobalsAndPackages() ... DONE [18:01:39.009] run() for 'Future' ... [18:01:39.009] - state: 'created' [18:01:39.009] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.010] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.010] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.010] - Field: 'label' [18:01:39.010] - Field: 'local' [18:01:39.011] - Field: 'owner' [18:01:39.011] - Field: 'envir' [18:01:39.011] - Field: 'packages' [18:01:39.011] - Field: 'gc' [18:01:39.011] - Field: 'conditions' [18:01:39.011] - Field: 'expr' [18:01:39.012] - Field: 'uuid' [18:01:39.012] - Field: 'seed' [18:01:39.012] - Field: 'version' [18:01:39.012] - Field: 'result' [18:01:39.012] - Field: 'asynchronous' [18:01:39.012] - Field: 'calls' [18:01:39.013] - Field: 'globals' [18:01:39.013] - Field: 'stdout' [18:01:39.013] - Field: 'earlySignal' [18:01:39.013] - Field: 'lazy' [18:01:39.013] - Field: 'state' [18:01:39.013] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.014] - Launch lazy future ... [18:01:39.014] Packages needed by the future expression (n = 0): [18:01:39.014] Packages needed by future strategies (n = 0): [18:01:39.015] { [18:01:39.015] { [18:01:39.015] { [18:01:39.015] ...future.startTime <- base::Sys.time() [18:01:39.015] { [18:01:39.015] { [18:01:39.015] { [18:01:39.015] base::local({ [18:01:39.015] has_future <- base::requireNamespace("future", [18:01:39.015] quietly = TRUE) [18:01:39.015] if (has_future) { [18:01:39.015] ns <- base::getNamespace("future") [18:01:39.015] version <- ns[[".package"]][["version"]] [18:01:39.015] if (is.null(version)) [18:01:39.015] version <- utils::packageVersion("future") [18:01:39.015] } [18:01:39.015] else { [18:01:39.015] version <- NULL [18:01:39.015] } [18:01:39.015] if (!has_future || version < "1.8.0") { [18:01:39.015] info <- base::c(r_version = base::gsub("R version ", [18:01:39.015] "", base::R.version$version.string), [18:01:39.015] platform = base::sprintf("%s (%s-bit)", [18:01:39.015] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.015] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.015] "release", "version")], collapse = " "), [18:01:39.015] hostname = base::Sys.info()[["nodename"]]) [18:01:39.015] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.015] info) [18:01:39.015] info <- base::paste(info, collapse = "; ") [18:01:39.015] if (!has_future) { [18:01:39.015] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.015] info) [18:01:39.015] } [18:01:39.015] else { [18:01:39.015] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.015] info, version) [18:01:39.015] } [18:01:39.015] base::stop(msg) [18:01:39.015] } [18:01:39.015] }) [18:01:39.015] } [18:01:39.015] options(future.plan = NULL) [18:01:39.015] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.015] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.015] } [18:01:39.015] ...future.workdir <- getwd() [18:01:39.015] } [18:01:39.015] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.015] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.015] } [18:01:39.015] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.015] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.015] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.015] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.015] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.015] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.015] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.015] base::names(...future.oldOptions)) [18:01:39.015] } [18:01:39.015] if (FALSE) { [18:01:39.015] } [18:01:39.015] else { [18:01:39.015] if (TRUE) { [18:01:39.015] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.015] open = "w") [18:01:39.015] } [18:01:39.015] else { [18:01:39.015] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.015] windows = "NUL", "/dev/null"), open = "w") [18:01:39.015] } [18:01:39.015] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.015] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.015] base::sink(type = "output", split = FALSE) [18:01:39.015] base::close(...future.stdout) [18:01:39.015] }, add = TRUE) [18:01:39.015] } [18:01:39.015] ...future.frame <- base::sys.nframe() [18:01:39.015] ...future.conditions <- base::list() [18:01:39.015] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.015] if (FALSE) { [18:01:39.015] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.015] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.015] } [18:01:39.015] ...future.result <- base::tryCatch({ [18:01:39.015] base::withCallingHandlers({ [18:01:39.015] ...future.value <- base::withVisible(base::local({ [18:01:39.015] 4 [18:01:39.015] })) [18:01:39.015] future::FutureResult(value = ...future.value$value, [18:01:39.015] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.015] ...future.rng), globalenv = if (FALSE) [18:01:39.015] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.015] ...future.globalenv.names)) [18:01:39.015] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.015] }, condition = base::local({ [18:01:39.015] c <- base::c [18:01:39.015] inherits <- base::inherits [18:01:39.015] invokeRestart <- base::invokeRestart [18:01:39.015] length <- base::length [18:01:39.015] list <- base::list [18:01:39.015] seq.int <- base::seq.int [18:01:39.015] signalCondition <- base::signalCondition [18:01:39.015] sys.calls <- base::sys.calls [18:01:39.015] `[[` <- base::`[[` [18:01:39.015] `+` <- base::`+` [18:01:39.015] `<<-` <- base::`<<-` [18:01:39.015] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.015] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.015] 3L)] [18:01:39.015] } [18:01:39.015] function(cond) { [18:01:39.015] is_error <- inherits(cond, "error") [18:01:39.015] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.015] NULL) [18:01:39.015] if (is_error) { [18:01:39.015] sessionInformation <- function() { [18:01:39.015] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.015] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.015] search = base::search(), system = base::Sys.info()) [18:01:39.015] } [18:01:39.015] ...future.conditions[[length(...future.conditions) + [18:01:39.015] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.015] cond$call), session = sessionInformation(), [18:01:39.015] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.015] signalCondition(cond) [18:01:39.015] } [18:01:39.015] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.015] "immediateCondition"))) { [18:01:39.015] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.015] ...future.conditions[[length(...future.conditions) + [18:01:39.015] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.015] if (TRUE && !signal) { [18:01:39.015] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.015] { [18:01:39.015] inherits <- base::inherits [18:01:39.015] invokeRestart <- base::invokeRestart [18:01:39.015] is.null <- base::is.null [18:01:39.015] muffled <- FALSE [18:01:39.015] if (inherits(cond, "message")) { [18:01:39.015] muffled <- grepl(pattern, "muffleMessage") [18:01:39.015] if (muffled) [18:01:39.015] invokeRestart("muffleMessage") [18:01:39.015] } [18:01:39.015] else if (inherits(cond, "warning")) { [18:01:39.015] muffled <- grepl(pattern, "muffleWarning") [18:01:39.015] if (muffled) [18:01:39.015] invokeRestart("muffleWarning") [18:01:39.015] } [18:01:39.015] else if (inherits(cond, "condition")) { [18:01:39.015] if (!is.null(pattern)) { [18:01:39.015] computeRestarts <- base::computeRestarts [18:01:39.015] grepl <- base::grepl [18:01:39.015] restarts <- computeRestarts(cond) [18:01:39.015] for (restart in restarts) { [18:01:39.015] name <- restart$name [18:01:39.015] if (is.null(name)) [18:01:39.015] next [18:01:39.015] if (!grepl(pattern, name)) [18:01:39.015] next [18:01:39.015] invokeRestart(restart) [18:01:39.015] muffled <- TRUE [18:01:39.015] break [18:01:39.015] } [18:01:39.015] } [18:01:39.015] } [18:01:39.015] invisible(muffled) [18:01:39.015] } [18:01:39.015] muffleCondition(cond, pattern = "^muffle") [18:01:39.015] } [18:01:39.015] } [18:01:39.015] else { [18:01:39.015] if (TRUE) { [18:01:39.015] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.015] { [18:01:39.015] inherits <- base::inherits [18:01:39.015] invokeRestart <- base::invokeRestart [18:01:39.015] is.null <- base::is.null [18:01:39.015] muffled <- FALSE [18:01:39.015] if (inherits(cond, "message")) { [18:01:39.015] muffled <- grepl(pattern, "muffleMessage") [18:01:39.015] if (muffled) [18:01:39.015] invokeRestart("muffleMessage") [18:01:39.015] } [18:01:39.015] else if (inherits(cond, "warning")) { [18:01:39.015] muffled <- grepl(pattern, "muffleWarning") [18:01:39.015] if (muffled) [18:01:39.015] invokeRestart("muffleWarning") [18:01:39.015] } [18:01:39.015] else if (inherits(cond, "condition")) { [18:01:39.015] if (!is.null(pattern)) { [18:01:39.015] computeRestarts <- base::computeRestarts [18:01:39.015] grepl <- base::grepl [18:01:39.015] restarts <- computeRestarts(cond) [18:01:39.015] for (restart in restarts) { [18:01:39.015] name <- restart$name [18:01:39.015] if (is.null(name)) [18:01:39.015] next [18:01:39.015] if (!grepl(pattern, name)) [18:01:39.015] next [18:01:39.015] invokeRestart(restart) [18:01:39.015] muffled <- TRUE [18:01:39.015] break [18:01:39.015] } [18:01:39.015] } [18:01:39.015] } [18:01:39.015] invisible(muffled) [18:01:39.015] } [18:01:39.015] muffleCondition(cond, pattern = "^muffle") [18:01:39.015] } [18:01:39.015] } [18:01:39.015] } [18:01:39.015] })) [18:01:39.015] }, error = function(ex) { [18:01:39.015] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.015] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.015] ...future.rng), started = ...future.startTime, [18:01:39.015] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.015] version = "1.8"), class = "FutureResult") [18:01:39.015] }, finally = { [18:01:39.015] if (!identical(...future.workdir, getwd())) [18:01:39.015] setwd(...future.workdir) [18:01:39.015] { [18:01:39.015] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.015] ...future.oldOptions$nwarnings <- NULL [18:01:39.015] } [18:01:39.015] base::options(...future.oldOptions) [18:01:39.015] if (.Platform$OS.type == "windows") { [18:01:39.015] old_names <- names(...future.oldEnvVars) [18:01:39.015] envs <- base::Sys.getenv() [18:01:39.015] names <- names(envs) [18:01:39.015] common <- intersect(names, old_names) [18:01:39.015] added <- setdiff(names, old_names) [18:01:39.015] removed <- setdiff(old_names, names) [18:01:39.015] changed <- common[...future.oldEnvVars[common] != [18:01:39.015] envs[common]] [18:01:39.015] NAMES <- toupper(changed) [18:01:39.015] args <- list() [18:01:39.015] for (kk in seq_along(NAMES)) { [18:01:39.015] name <- changed[[kk]] [18:01:39.015] NAME <- NAMES[[kk]] [18:01:39.015] if (name != NAME && is.element(NAME, old_names)) [18:01:39.015] next [18:01:39.015] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.015] } [18:01:39.015] NAMES <- toupper(added) [18:01:39.015] for (kk in seq_along(NAMES)) { [18:01:39.015] name <- added[[kk]] [18:01:39.015] NAME <- NAMES[[kk]] [18:01:39.015] if (name != NAME && is.element(NAME, old_names)) [18:01:39.015] next [18:01:39.015] args[[name]] <- "" [18:01:39.015] } [18:01:39.015] NAMES <- toupper(removed) [18:01:39.015] for (kk in seq_along(NAMES)) { [18:01:39.015] name <- removed[[kk]] [18:01:39.015] NAME <- NAMES[[kk]] [18:01:39.015] if (name != NAME && is.element(NAME, old_names)) [18:01:39.015] next [18:01:39.015] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.015] } [18:01:39.015] if (length(args) > 0) [18:01:39.015] base::do.call(base::Sys.setenv, args = args) [18:01:39.015] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.015] } [18:01:39.015] else { [18:01:39.015] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.015] } [18:01:39.015] { [18:01:39.015] if (base::length(...future.futureOptionsAdded) > [18:01:39.015] 0L) { [18:01:39.015] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.015] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.015] base::options(opts) [18:01:39.015] } [18:01:39.015] { [18:01:39.015] { [18:01:39.015] NULL [18:01:39.015] RNGkind("Mersenne-Twister") [18:01:39.015] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.015] inherits = FALSE) [18:01:39.015] } [18:01:39.015] options(future.plan = NULL) [18:01:39.015] if (is.na(NA_character_)) [18:01:39.015] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.015] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.015] future::plan(list(function (..., envir = parent.frame()) [18:01:39.015] { [18:01:39.015] future <- SequentialFuture(..., envir = envir) [18:01:39.015] if (!future$lazy) [18:01:39.015] future <- run(future) [18:01:39.015] invisible(future) [18:01:39.015] }), .cleanup = FALSE, .init = FALSE) [18:01:39.015] } [18:01:39.015] } [18:01:39.015] } [18:01:39.015] }) [18:01:39.015] if (TRUE) { [18:01:39.015] base::sink(type = "output", split = FALSE) [18:01:39.015] if (TRUE) { [18:01:39.015] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.015] } [18:01:39.015] else { [18:01:39.015] ...future.result["stdout"] <- base::list(NULL) [18:01:39.015] } [18:01:39.015] base::close(...future.stdout) [18:01:39.015] ...future.stdout <- NULL [18:01:39.015] } [18:01:39.015] ...future.result$conditions <- ...future.conditions [18:01:39.015] ...future.result$finished <- base::Sys.time() [18:01:39.015] ...future.result [18:01:39.015] } [18:01:39.019] plan(): Setting new future strategy stack: [18:01:39.019] List of future strategies: [18:01:39.019] 1. sequential: [18:01:39.019] - args: function (..., envir = parent.frame()) [18:01:39.019] - tweaked: FALSE [18:01:39.019] - call: NULL [18:01:39.019] plan(): nbrOfWorkers() = 1 [18:01:39.020] plan(): Setting new future strategy stack: [18:01:39.021] List of future strategies: [18:01:39.021] 1. sequential: [18:01:39.021] - args: function (..., envir = parent.frame()) [18:01:39.021] - tweaked: FALSE [18:01:39.021] - call: plan(strategy) [18:01:39.021] plan(): nbrOfWorkers() = 1 [18:01:39.021] SequentialFuture started (and completed) [18:01:39.022] - Launch lazy future ... done [18:01:39.022] run() for 'SequentialFuture' ... done [18:01:39.023] resolved() for 'SequentialFuture' ... [18:01:39.024] - state: 'finished' [18:01:39.024] - run: TRUE [18:01:39.024] - result: 'FutureResult' [18:01:39.024] resolved() for 'SequentialFuture' ... done [18:01:39.024] resolved() for 'SequentialFuture' ... [18:01:39.025] - state: 'finished' [18:01:39.025] - run: TRUE [18:01:39.025] - result: 'FutureResult' [18:01:39.025] resolved() for 'SequentialFuture' ... done [18:01:39.025] resolved() for 'SequentialFuture' ... [18:01:39.025] - state: 'finished' [18:01:39.026] - run: TRUE [18:01:39.026] - result: 'FutureResult' [18:01:39.026] resolved() for 'SequentialFuture' ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:39.027] resolve() on environment ... [18:01:39.027] recursive: 0 [18:01:39.028] elements: [4] 'a', 'b', 'c', 'd' [18:01:39.028] signalConditionsASAP(numeric, pos=1) ... [18:01:39.028] - nx: 4 [18:01:39.029] - relay: TRUE [18:01:39.029] - stdout: TRUE [18:01:39.029] - signal: TRUE [18:01:39.029] - resignal: FALSE [18:01:39.029] - force: TRUE [18:01:39.029] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:39.030] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:39.030] - until=2 [18:01:39.030] - relaying element #2 [18:01:39.030] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:39.030] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:39.030] signalConditionsASAP(NULL, pos=1) ... done [18:01:39.031] length: 3 (resolved future 1) [18:01:39.032] resolved() for 'SequentialFuture' ... [18:01:39.032] - state: 'finished' [18:01:39.032] - run: TRUE [18:01:39.032] - result: 'FutureResult' [18:01:39.032] resolved() for 'SequentialFuture' ... done [18:01:39.033] Future #2 [18:01:39.033] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:39.033] - nx: 4 [18:01:39.033] - relay: TRUE [18:01:39.033] - stdout: TRUE [18:01:39.033] - signal: TRUE [18:01:39.034] - resignal: FALSE [18:01:39.034] - force: TRUE [18:01:39.034] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:39.034] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:39.034] - until=2 [18:01:39.034] - relaying element #2 [18:01:39.035] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:39.035] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:39.035] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:39.035] length: 2 (resolved future 2) [18:01:39.035] resolved() for 'SequentialFuture' ... [18:01:39.036] - state: 'finished' [18:01:39.036] - run: TRUE [18:01:39.036] - result: 'FutureResult' [18:01:39.036] resolved() for 'SequentialFuture' ... done [18:01:39.036] Future #3 [18:01:39.036] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:39.037] - nx: 4 [18:01:39.037] - relay: TRUE [18:01:39.037] - stdout: TRUE [18:01:39.037] - signal: TRUE [18:01:39.037] - resignal: FALSE [18:01:39.037] - force: TRUE [18:01:39.038] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:39.038] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:39.038] - until=3 [18:01:39.038] - relaying element #3 [18:01:39.038] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:39.038] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:39.039] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:39.039] length: 1 (resolved future 3) [18:01:39.039] resolved() for 'SequentialFuture' ... [18:01:39.039] - state: 'finished' [18:01:39.039] - run: TRUE [18:01:39.039] - result: 'FutureResult' [18:01:39.040] resolved() for 'SequentialFuture' ... done [18:01:39.040] Future #4 [18:01:39.040] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:39.040] - nx: 4 [18:01:39.040] - relay: TRUE [18:01:39.041] - stdout: TRUE [18:01:39.041] - signal: TRUE [18:01:39.041] - resignal: FALSE [18:01:39.041] - force: TRUE [18:01:39.041] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:39.041] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:39.041] - until=4 [18:01:39.042] - relaying element #4 [18:01:39.042] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:39.042] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:39.042] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:39.042] length: 0 (resolved future 4) [18:01:39.043] Relaying remaining futures [18:01:39.043] signalConditionsASAP(NULL, pos=0) ... [18:01:39.043] - nx: 4 [18:01:39.043] - relay: TRUE [18:01:39.043] - stdout: TRUE [18:01:39.043] - signal: TRUE [18:01:39.043] - resignal: FALSE [18:01:39.044] - force: TRUE [18:01:39.044] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:39.044] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:39.044] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:39.044] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:39.044] signalConditionsASAP(NULL, pos=0) ... done [18:01:39.045] resolve() on environment ... DONE *** futures() - environment ... DONE Type of object: listenv Type of future: sequential [18:01:39.046] plan(): Setting new future strategy stack: [18:01:39.046] List of future strategies: [18:01:39.046] 1. sequential: [18:01:39.046] - args: function (..., envir = parent.frame()) [18:01:39.046] - tweaked: FALSE [18:01:39.046] - call: plan(strategy) [18:01:39.046] plan(): nbrOfWorkers() = 1 Dimensions: NULL [18:01:39.047] getGlobalsAndPackages() ... [18:01:39.047] Searching for globals... [18:01:39.047] [18:01:39.047] Searching for globals ... DONE [18:01:39.048] - globals: [0] [18:01:39.048] getGlobalsAndPackages() ... DONE [18:01:39.048] run() for 'Future' ... [18:01:39.048] - state: 'created' [18:01:39.048] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.049] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.049] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.049] - Field: 'label' [18:01:39.049] - Field: 'local' [18:01:39.049] - Field: 'owner' [18:01:39.050] - Field: 'envir' [18:01:39.050] - Field: 'packages' [18:01:39.050] - Field: 'gc' [18:01:39.050] - Field: 'conditions' [18:01:39.050] - Field: 'expr' [18:01:39.051] - Field: 'uuid' [18:01:39.051] - Field: 'seed' [18:01:39.051] - Field: 'version' [18:01:39.051] - Field: 'result' [18:01:39.051] - Field: 'asynchronous' [18:01:39.051] - Field: 'calls' [18:01:39.052] - Field: 'globals' [18:01:39.052] - Field: 'stdout' [18:01:39.052] - Field: 'earlySignal' [18:01:39.052] - Field: 'lazy' [18:01:39.052] - Field: 'state' [18:01:39.052] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.053] - Launch lazy future ... [18:01:39.053] Packages needed by the future expression (n = 0): [18:01:39.053] Packages needed by future strategies (n = 0): [18:01:39.054] { [18:01:39.054] { [18:01:39.054] { [18:01:39.054] ...future.startTime <- base::Sys.time() [18:01:39.054] { [18:01:39.054] { [18:01:39.054] { [18:01:39.054] base::local({ [18:01:39.054] has_future <- base::requireNamespace("future", [18:01:39.054] quietly = TRUE) [18:01:39.054] if (has_future) { [18:01:39.054] ns <- base::getNamespace("future") [18:01:39.054] version <- ns[[".package"]][["version"]] [18:01:39.054] if (is.null(version)) [18:01:39.054] version <- utils::packageVersion("future") [18:01:39.054] } [18:01:39.054] else { [18:01:39.054] version <- NULL [18:01:39.054] } [18:01:39.054] if (!has_future || version < "1.8.0") { [18:01:39.054] info <- base::c(r_version = base::gsub("R version ", [18:01:39.054] "", base::R.version$version.string), [18:01:39.054] platform = base::sprintf("%s (%s-bit)", [18:01:39.054] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.054] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.054] "release", "version")], collapse = " "), [18:01:39.054] hostname = base::Sys.info()[["nodename"]]) [18:01:39.054] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.054] info) [18:01:39.054] info <- base::paste(info, collapse = "; ") [18:01:39.054] if (!has_future) { [18:01:39.054] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.054] info) [18:01:39.054] } [18:01:39.054] else { [18:01:39.054] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.054] info, version) [18:01:39.054] } [18:01:39.054] base::stop(msg) [18:01:39.054] } [18:01:39.054] }) [18:01:39.054] } [18:01:39.054] options(future.plan = NULL) [18:01:39.054] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.054] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.054] } [18:01:39.054] ...future.workdir <- getwd() [18:01:39.054] } [18:01:39.054] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.054] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.054] } [18:01:39.054] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.054] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.054] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.054] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.054] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.054] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.054] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.054] base::names(...future.oldOptions)) [18:01:39.054] } [18:01:39.054] if (FALSE) { [18:01:39.054] } [18:01:39.054] else { [18:01:39.054] if (TRUE) { [18:01:39.054] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.054] open = "w") [18:01:39.054] } [18:01:39.054] else { [18:01:39.054] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.054] windows = "NUL", "/dev/null"), open = "w") [18:01:39.054] } [18:01:39.054] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.054] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.054] base::sink(type = "output", split = FALSE) [18:01:39.054] base::close(...future.stdout) [18:01:39.054] }, add = TRUE) [18:01:39.054] } [18:01:39.054] ...future.frame <- base::sys.nframe() [18:01:39.054] ...future.conditions <- base::list() [18:01:39.054] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.054] if (FALSE) { [18:01:39.054] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.054] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.054] } [18:01:39.054] ...future.result <- base::tryCatch({ [18:01:39.054] base::withCallingHandlers({ [18:01:39.054] ...future.value <- base::withVisible(base::local(2)) [18:01:39.054] future::FutureResult(value = ...future.value$value, [18:01:39.054] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.054] ...future.rng), globalenv = if (FALSE) [18:01:39.054] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.054] ...future.globalenv.names)) [18:01:39.054] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.054] }, condition = base::local({ [18:01:39.054] c <- base::c [18:01:39.054] inherits <- base::inherits [18:01:39.054] invokeRestart <- base::invokeRestart [18:01:39.054] length <- base::length [18:01:39.054] list <- base::list [18:01:39.054] seq.int <- base::seq.int [18:01:39.054] signalCondition <- base::signalCondition [18:01:39.054] sys.calls <- base::sys.calls [18:01:39.054] `[[` <- base::`[[` [18:01:39.054] `+` <- base::`+` [18:01:39.054] `<<-` <- base::`<<-` [18:01:39.054] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.054] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.054] 3L)] [18:01:39.054] } [18:01:39.054] function(cond) { [18:01:39.054] is_error <- inherits(cond, "error") [18:01:39.054] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.054] NULL) [18:01:39.054] if (is_error) { [18:01:39.054] sessionInformation <- function() { [18:01:39.054] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.054] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.054] search = base::search(), system = base::Sys.info()) [18:01:39.054] } [18:01:39.054] ...future.conditions[[length(...future.conditions) + [18:01:39.054] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.054] cond$call), session = sessionInformation(), [18:01:39.054] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.054] signalCondition(cond) [18:01:39.054] } [18:01:39.054] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.054] "immediateCondition"))) { [18:01:39.054] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.054] ...future.conditions[[length(...future.conditions) + [18:01:39.054] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.054] if (TRUE && !signal) { [18:01:39.054] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.054] { [18:01:39.054] inherits <- base::inherits [18:01:39.054] invokeRestart <- base::invokeRestart [18:01:39.054] is.null <- base::is.null [18:01:39.054] muffled <- FALSE [18:01:39.054] if (inherits(cond, "message")) { [18:01:39.054] muffled <- grepl(pattern, "muffleMessage") [18:01:39.054] if (muffled) [18:01:39.054] invokeRestart("muffleMessage") [18:01:39.054] } [18:01:39.054] else if (inherits(cond, "warning")) { [18:01:39.054] muffled <- grepl(pattern, "muffleWarning") [18:01:39.054] if (muffled) [18:01:39.054] invokeRestart("muffleWarning") [18:01:39.054] } [18:01:39.054] else if (inherits(cond, "condition")) { [18:01:39.054] if (!is.null(pattern)) { [18:01:39.054] computeRestarts <- base::computeRestarts [18:01:39.054] grepl <- base::grepl [18:01:39.054] restarts <- computeRestarts(cond) [18:01:39.054] for (restart in restarts) { [18:01:39.054] name <- restart$name [18:01:39.054] if (is.null(name)) [18:01:39.054] next [18:01:39.054] if (!grepl(pattern, name)) [18:01:39.054] next [18:01:39.054] invokeRestart(restart) [18:01:39.054] muffled <- TRUE [18:01:39.054] break [18:01:39.054] } [18:01:39.054] } [18:01:39.054] } [18:01:39.054] invisible(muffled) [18:01:39.054] } [18:01:39.054] muffleCondition(cond, pattern = "^muffle") [18:01:39.054] } [18:01:39.054] } [18:01:39.054] else { [18:01:39.054] if (TRUE) { [18:01:39.054] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.054] { [18:01:39.054] inherits <- base::inherits [18:01:39.054] invokeRestart <- base::invokeRestart [18:01:39.054] is.null <- base::is.null [18:01:39.054] muffled <- FALSE [18:01:39.054] if (inherits(cond, "message")) { [18:01:39.054] muffled <- grepl(pattern, "muffleMessage") [18:01:39.054] if (muffled) [18:01:39.054] invokeRestart("muffleMessage") [18:01:39.054] } [18:01:39.054] else if (inherits(cond, "warning")) { [18:01:39.054] muffled <- grepl(pattern, "muffleWarning") [18:01:39.054] if (muffled) [18:01:39.054] invokeRestart("muffleWarning") [18:01:39.054] } [18:01:39.054] else if (inherits(cond, "condition")) { [18:01:39.054] if (!is.null(pattern)) { [18:01:39.054] computeRestarts <- base::computeRestarts [18:01:39.054] grepl <- base::grepl [18:01:39.054] restarts <- computeRestarts(cond) [18:01:39.054] for (restart in restarts) { [18:01:39.054] name <- restart$name [18:01:39.054] if (is.null(name)) [18:01:39.054] next [18:01:39.054] if (!grepl(pattern, name)) [18:01:39.054] next [18:01:39.054] invokeRestart(restart) [18:01:39.054] muffled <- TRUE [18:01:39.054] break [18:01:39.054] } [18:01:39.054] } [18:01:39.054] } [18:01:39.054] invisible(muffled) [18:01:39.054] } [18:01:39.054] muffleCondition(cond, pattern = "^muffle") [18:01:39.054] } [18:01:39.054] } [18:01:39.054] } [18:01:39.054] })) [18:01:39.054] }, error = function(ex) { [18:01:39.054] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.054] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.054] ...future.rng), started = ...future.startTime, [18:01:39.054] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.054] version = "1.8"), class = "FutureResult") [18:01:39.054] }, finally = { [18:01:39.054] if (!identical(...future.workdir, getwd())) [18:01:39.054] setwd(...future.workdir) [18:01:39.054] { [18:01:39.054] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.054] ...future.oldOptions$nwarnings <- NULL [18:01:39.054] } [18:01:39.054] base::options(...future.oldOptions) [18:01:39.054] if (.Platform$OS.type == "windows") { [18:01:39.054] old_names <- names(...future.oldEnvVars) [18:01:39.054] envs <- base::Sys.getenv() [18:01:39.054] names <- names(envs) [18:01:39.054] common <- intersect(names, old_names) [18:01:39.054] added <- setdiff(names, old_names) [18:01:39.054] removed <- setdiff(old_names, names) [18:01:39.054] changed <- common[...future.oldEnvVars[common] != [18:01:39.054] envs[common]] [18:01:39.054] NAMES <- toupper(changed) [18:01:39.054] args <- list() [18:01:39.054] for (kk in seq_along(NAMES)) { [18:01:39.054] name <- changed[[kk]] [18:01:39.054] NAME <- NAMES[[kk]] [18:01:39.054] if (name != NAME && is.element(NAME, old_names)) [18:01:39.054] next [18:01:39.054] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.054] } [18:01:39.054] NAMES <- toupper(added) [18:01:39.054] for (kk in seq_along(NAMES)) { [18:01:39.054] name <- added[[kk]] [18:01:39.054] NAME <- NAMES[[kk]] [18:01:39.054] if (name != NAME && is.element(NAME, old_names)) [18:01:39.054] next [18:01:39.054] args[[name]] <- "" [18:01:39.054] } [18:01:39.054] NAMES <- toupper(removed) [18:01:39.054] for (kk in seq_along(NAMES)) { [18:01:39.054] name <- removed[[kk]] [18:01:39.054] NAME <- NAMES[[kk]] [18:01:39.054] if (name != NAME && is.element(NAME, old_names)) [18:01:39.054] next [18:01:39.054] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.054] } [18:01:39.054] if (length(args) > 0) [18:01:39.054] base::do.call(base::Sys.setenv, args = args) [18:01:39.054] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.054] } [18:01:39.054] else { [18:01:39.054] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.054] } [18:01:39.054] { [18:01:39.054] if (base::length(...future.futureOptionsAdded) > [18:01:39.054] 0L) { [18:01:39.054] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.054] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.054] base::options(opts) [18:01:39.054] } [18:01:39.054] { [18:01:39.054] { [18:01:39.054] NULL [18:01:39.054] RNGkind("Mersenne-Twister") [18:01:39.054] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.054] inherits = FALSE) [18:01:39.054] } [18:01:39.054] options(future.plan = NULL) [18:01:39.054] if (is.na(NA_character_)) [18:01:39.054] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.054] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.054] future::plan(list(function (..., envir = parent.frame()) [18:01:39.054] { [18:01:39.054] future <- SequentialFuture(..., envir = envir) [18:01:39.054] if (!future$lazy) [18:01:39.054] future <- run(future) [18:01:39.054] invisible(future) [18:01:39.054] }), .cleanup = FALSE, .init = FALSE) [18:01:39.054] } [18:01:39.054] } [18:01:39.054] } [18:01:39.054] }) [18:01:39.054] if (TRUE) { [18:01:39.054] base::sink(type = "output", split = FALSE) [18:01:39.054] if (TRUE) { [18:01:39.054] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.054] } [18:01:39.054] else { [18:01:39.054] ...future.result["stdout"] <- base::list(NULL) [18:01:39.054] } [18:01:39.054] base::close(...future.stdout) [18:01:39.054] ...future.stdout <- NULL [18:01:39.054] } [18:01:39.054] ...future.result$conditions <- ...future.conditions [18:01:39.054] ...future.result$finished <- base::Sys.time() [18:01:39.054] ...future.result [18:01:39.054] } [18:01:39.057] plan(): Setting new future strategy stack: [18:01:39.058] List of future strategies: [18:01:39.058] 1. sequential: [18:01:39.058] - args: function (..., envir = parent.frame()) [18:01:39.058] - tweaked: FALSE [18:01:39.058] - call: NULL [18:01:39.058] plan(): nbrOfWorkers() = 1 [18:01:39.059] plan(): Setting new future strategy stack: [18:01:39.059] List of future strategies: [18:01:39.059] 1. sequential: [18:01:39.059] - args: function (..., envir = parent.frame()) [18:01:39.059] - tweaked: FALSE [18:01:39.059] - call: plan(strategy) [18:01:39.060] plan(): nbrOfWorkers() = 1 [18:01:39.060] SequentialFuture started (and completed) [18:01:39.060] - Launch lazy future ... done [18:01:39.060] run() for 'SequentialFuture' ... done [18:01:39.061] getGlobalsAndPackages() ... [18:01:39.061] Searching for globals... [18:01:39.061] [18:01:39.061] Searching for globals ... DONE [18:01:39.062] - globals: [0] [18:01:39.062] getGlobalsAndPackages() ... DONE [18:01:39.062] run() for 'Future' ... [18:01:39.062] - state: 'created' [18:01:39.062] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.063] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.063] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.063] - Field: 'label' [18:01:39.063] - Field: 'local' [18:01:39.063] - Field: 'owner' [18:01:39.064] - Field: 'envir' [18:01:39.064] - Field: 'packages' [18:01:39.064] - Field: 'gc' [18:01:39.064] - Field: 'conditions' [18:01:39.064] - Field: 'expr' [18:01:39.065] - Field: 'uuid' [18:01:39.065] - Field: 'seed' [18:01:39.065] - Field: 'version' [18:01:39.065] - Field: 'result' [18:01:39.065] - Field: 'asynchronous' [18:01:39.066] - Field: 'calls' [18:01:39.066] - Field: 'globals' [18:01:39.066] - Field: 'stdout' [18:01:39.066] - Field: 'earlySignal' [18:01:39.066] - Field: 'lazy' [18:01:39.066] - Field: 'state' [18:01:39.067] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.067] - Launch lazy future ... [18:01:39.067] Packages needed by the future expression (n = 0): [18:01:39.067] Packages needed by future strategies (n = 0): [18:01:39.068] { [18:01:39.068] { [18:01:39.068] { [18:01:39.068] ...future.startTime <- base::Sys.time() [18:01:39.068] { [18:01:39.068] { [18:01:39.068] { [18:01:39.068] base::local({ [18:01:39.068] has_future <- base::requireNamespace("future", [18:01:39.068] quietly = TRUE) [18:01:39.068] if (has_future) { [18:01:39.068] ns <- base::getNamespace("future") [18:01:39.068] version <- ns[[".package"]][["version"]] [18:01:39.068] if (is.null(version)) [18:01:39.068] version <- utils::packageVersion("future") [18:01:39.068] } [18:01:39.068] else { [18:01:39.068] version <- NULL [18:01:39.068] } [18:01:39.068] if (!has_future || version < "1.8.0") { [18:01:39.068] info <- base::c(r_version = base::gsub("R version ", [18:01:39.068] "", base::R.version$version.string), [18:01:39.068] platform = base::sprintf("%s (%s-bit)", [18:01:39.068] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.068] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.068] "release", "version")], collapse = " "), [18:01:39.068] hostname = base::Sys.info()[["nodename"]]) [18:01:39.068] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.068] info) [18:01:39.068] info <- base::paste(info, collapse = "; ") [18:01:39.068] if (!has_future) { [18:01:39.068] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.068] info) [18:01:39.068] } [18:01:39.068] else { [18:01:39.068] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.068] info, version) [18:01:39.068] } [18:01:39.068] base::stop(msg) [18:01:39.068] } [18:01:39.068] }) [18:01:39.068] } [18:01:39.068] options(future.plan = NULL) [18:01:39.068] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.068] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.068] } [18:01:39.068] ...future.workdir <- getwd() [18:01:39.068] } [18:01:39.068] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.068] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.068] } [18:01:39.068] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.068] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.068] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.068] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.068] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.068] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.068] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.068] base::names(...future.oldOptions)) [18:01:39.068] } [18:01:39.068] if (FALSE) { [18:01:39.068] } [18:01:39.068] else { [18:01:39.068] if (TRUE) { [18:01:39.068] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.068] open = "w") [18:01:39.068] } [18:01:39.068] else { [18:01:39.068] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.068] windows = "NUL", "/dev/null"), open = "w") [18:01:39.068] } [18:01:39.068] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.068] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.068] base::sink(type = "output", split = FALSE) [18:01:39.068] base::close(...future.stdout) [18:01:39.068] }, add = TRUE) [18:01:39.068] } [18:01:39.068] ...future.frame <- base::sys.nframe() [18:01:39.068] ...future.conditions <- base::list() [18:01:39.068] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.068] if (FALSE) { [18:01:39.068] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.068] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.068] } [18:01:39.068] ...future.result <- base::tryCatch({ [18:01:39.068] base::withCallingHandlers({ [18:01:39.068] ...future.value <- base::withVisible(base::local(NULL)) [18:01:39.068] future::FutureResult(value = ...future.value$value, [18:01:39.068] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.068] ...future.rng), globalenv = if (FALSE) [18:01:39.068] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.068] ...future.globalenv.names)) [18:01:39.068] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.068] }, condition = base::local({ [18:01:39.068] c <- base::c [18:01:39.068] inherits <- base::inherits [18:01:39.068] invokeRestart <- base::invokeRestart [18:01:39.068] length <- base::length [18:01:39.068] list <- base::list [18:01:39.068] seq.int <- base::seq.int [18:01:39.068] signalCondition <- base::signalCondition [18:01:39.068] sys.calls <- base::sys.calls [18:01:39.068] `[[` <- base::`[[` [18:01:39.068] `+` <- base::`+` [18:01:39.068] `<<-` <- base::`<<-` [18:01:39.068] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.068] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.068] 3L)] [18:01:39.068] } [18:01:39.068] function(cond) { [18:01:39.068] is_error <- inherits(cond, "error") [18:01:39.068] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.068] NULL) [18:01:39.068] if (is_error) { [18:01:39.068] sessionInformation <- function() { [18:01:39.068] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.068] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.068] search = base::search(), system = base::Sys.info()) [18:01:39.068] } [18:01:39.068] ...future.conditions[[length(...future.conditions) + [18:01:39.068] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.068] cond$call), session = sessionInformation(), [18:01:39.068] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.068] signalCondition(cond) [18:01:39.068] } [18:01:39.068] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.068] "immediateCondition"))) { [18:01:39.068] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.068] ...future.conditions[[length(...future.conditions) + [18:01:39.068] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.068] if (TRUE && !signal) { [18:01:39.068] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.068] { [18:01:39.068] inherits <- base::inherits [18:01:39.068] invokeRestart <- base::invokeRestart [18:01:39.068] is.null <- base::is.null [18:01:39.068] muffled <- FALSE [18:01:39.068] if (inherits(cond, "message")) { [18:01:39.068] muffled <- grepl(pattern, "muffleMessage") [18:01:39.068] if (muffled) [18:01:39.068] invokeRestart("muffleMessage") [18:01:39.068] } [18:01:39.068] else if (inherits(cond, "warning")) { [18:01:39.068] muffled <- grepl(pattern, "muffleWarning") [18:01:39.068] if (muffled) [18:01:39.068] invokeRestart("muffleWarning") [18:01:39.068] } [18:01:39.068] else if (inherits(cond, "condition")) { [18:01:39.068] if (!is.null(pattern)) { [18:01:39.068] computeRestarts <- base::computeRestarts [18:01:39.068] grepl <- base::grepl [18:01:39.068] restarts <- computeRestarts(cond) [18:01:39.068] for (restart in restarts) { [18:01:39.068] name <- restart$name [18:01:39.068] if (is.null(name)) [18:01:39.068] next [18:01:39.068] if (!grepl(pattern, name)) [18:01:39.068] next [18:01:39.068] invokeRestart(restart) [18:01:39.068] muffled <- TRUE [18:01:39.068] break [18:01:39.068] } [18:01:39.068] } [18:01:39.068] } [18:01:39.068] invisible(muffled) [18:01:39.068] } [18:01:39.068] muffleCondition(cond, pattern = "^muffle") [18:01:39.068] } [18:01:39.068] } [18:01:39.068] else { [18:01:39.068] if (TRUE) { [18:01:39.068] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.068] { [18:01:39.068] inherits <- base::inherits [18:01:39.068] invokeRestart <- base::invokeRestart [18:01:39.068] is.null <- base::is.null [18:01:39.068] muffled <- FALSE [18:01:39.068] if (inherits(cond, "message")) { [18:01:39.068] muffled <- grepl(pattern, "muffleMessage") [18:01:39.068] if (muffled) [18:01:39.068] invokeRestart("muffleMessage") [18:01:39.068] } [18:01:39.068] else if (inherits(cond, "warning")) { [18:01:39.068] muffled <- grepl(pattern, "muffleWarning") [18:01:39.068] if (muffled) [18:01:39.068] invokeRestart("muffleWarning") [18:01:39.068] } [18:01:39.068] else if (inherits(cond, "condition")) { [18:01:39.068] if (!is.null(pattern)) { [18:01:39.068] computeRestarts <- base::computeRestarts [18:01:39.068] grepl <- base::grepl [18:01:39.068] restarts <- computeRestarts(cond) [18:01:39.068] for (restart in restarts) { [18:01:39.068] name <- restart$name [18:01:39.068] if (is.null(name)) [18:01:39.068] next [18:01:39.068] if (!grepl(pattern, name)) [18:01:39.068] next [18:01:39.068] invokeRestart(restart) [18:01:39.068] muffled <- TRUE [18:01:39.068] break [18:01:39.068] } [18:01:39.068] } [18:01:39.068] } [18:01:39.068] invisible(muffled) [18:01:39.068] } [18:01:39.068] muffleCondition(cond, pattern = "^muffle") [18:01:39.068] } [18:01:39.068] } [18:01:39.068] } [18:01:39.068] })) [18:01:39.068] }, error = function(ex) { [18:01:39.068] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.068] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.068] ...future.rng), started = ...future.startTime, [18:01:39.068] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.068] version = "1.8"), class = "FutureResult") [18:01:39.068] }, finally = { [18:01:39.068] if (!identical(...future.workdir, getwd())) [18:01:39.068] setwd(...future.workdir) [18:01:39.068] { [18:01:39.068] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.068] ...future.oldOptions$nwarnings <- NULL [18:01:39.068] } [18:01:39.068] base::options(...future.oldOptions) [18:01:39.068] if (.Platform$OS.type == "windows") { [18:01:39.068] old_names <- names(...future.oldEnvVars) [18:01:39.068] envs <- base::Sys.getenv() [18:01:39.068] names <- names(envs) [18:01:39.068] common <- intersect(names, old_names) [18:01:39.068] added <- setdiff(names, old_names) [18:01:39.068] removed <- setdiff(old_names, names) [18:01:39.068] changed <- common[...future.oldEnvVars[common] != [18:01:39.068] envs[common]] [18:01:39.068] NAMES <- toupper(changed) [18:01:39.068] args <- list() [18:01:39.068] for (kk in seq_along(NAMES)) { [18:01:39.068] name <- changed[[kk]] [18:01:39.068] NAME <- NAMES[[kk]] [18:01:39.068] if (name != NAME && is.element(NAME, old_names)) [18:01:39.068] next [18:01:39.068] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.068] } [18:01:39.068] NAMES <- toupper(added) [18:01:39.068] for (kk in seq_along(NAMES)) { [18:01:39.068] name <- added[[kk]] [18:01:39.068] NAME <- NAMES[[kk]] [18:01:39.068] if (name != NAME && is.element(NAME, old_names)) [18:01:39.068] next [18:01:39.068] args[[name]] <- "" [18:01:39.068] } [18:01:39.068] NAMES <- toupper(removed) [18:01:39.068] for (kk in seq_along(NAMES)) { [18:01:39.068] name <- removed[[kk]] [18:01:39.068] NAME <- NAMES[[kk]] [18:01:39.068] if (name != NAME && is.element(NAME, old_names)) [18:01:39.068] next [18:01:39.068] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.068] } [18:01:39.068] if (length(args) > 0) [18:01:39.068] base::do.call(base::Sys.setenv, args = args) [18:01:39.068] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.068] } [18:01:39.068] else { [18:01:39.068] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.068] } [18:01:39.068] { [18:01:39.068] if (base::length(...future.futureOptionsAdded) > [18:01:39.068] 0L) { [18:01:39.068] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.068] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.068] base::options(opts) [18:01:39.068] } [18:01:39.068] { [18:01:39.068] { [18:01:39.068] NULL [18:01:39.068] RNGkind("Mersenne-Twister") [18:01:39.068] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.068] inherits = FALSE) [18:01:39.068] } [18:01:39.068] options(future.plan = NULL) [18:01:39.068] if (is.na(NA_character_)) [18:01:39.068] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.068] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.068] future::plan(list(function (..., envir = parent.frame()) [18:01:39.068] { [18:01:39.068] future <- SequentialFuture(..., envir = envir) [18:01:39.068] if (!future$lazy) [18:01:39.068] future <- run(future) [18:01:39.068] invisible(future) [18:01:39.068] }), .cleanup = FALSE, .init = FALSE) [18:01:39.068] } [18:01:39.068] } [18:01:39.068] } [18:01:39.068] }) [18:01:39.068] if (TRUE) { [18:01:39.068] base::sink(type = "output", split = FALSE) [18:01:39.068] if (TRUE) { [18:01:39.068] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.068] } [18:01:39.068] else { [18:01:39.068] ...future.result["stdout"] <- base::list(NULL) [18:01:39.068] } [18:01:39.068] base::close(...future.stdout) [18:01:39.068] ...future.stdout <- NULL [18:01:39.068] } [18:01:39.068] ...future.result$conditions <- ...future.conditions [18:01:39.068] ...future.result$finished <- base::Sys.time() [18:01:39.068] ...future.result [18:01:39.068] } [18:01:39.094] plan(): Setting new future strategy stack: [18:01:39.094] List of future strategies: [18:01:39.094] 1. sequential: [18:01:39.094] - args: function (..., envir = parent.frame()) [18:01:39.094] - tweaked: FALSE [18:01:39.094] - call: NULL [18:01:39.095] plan(): nbrOfWorkers() = 1 [18:01:39.096] plan(): Setting new future strategy stack: [18:01:39.096] List of future strategies: [18:01:39.096] 1. sequential: [18:01:39.096] - args: function (..., envir = parent.frame()) [18:01:39.096] - tweaked: FALSE [18:01:39.096] - call: plan(strategy) [18:01:39.097] plan(): nbrOfWorkers() = 1 [18:01:39.097] SequentialFuture started (and completed) [18:01:39.097] - Launch lazy future ... done [18:01:39.097] run() for 'SequentialFuture' ... done [18:01:39.098] getGlobalsAndPackages() ... [18:01:39.098] Searching for globals... [18:01:39.099] - globals found: [1] '{' [18:01:39.099] Searching for globals ... DONE [18:01:39.099] Resolving globals: FALSE [18:01:39.100] [18:01:39.100] [18:01:39.100] getGlobalsAndPackages() ... DONE [18:01:39.100] run() for 'Future' ... [18:01:39.100] - state: 'created' [18:01:39.101] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.101] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.101] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.101] - Field: 'label' [18:01:39.101] - Field: 'local' [18:01:39.102] - Field: 'owner' [18:01:39.102] - Field: 'envir' [18:01:39.102] - Field: 'packages' [18:01:39.102] - Field: 'gc' [18:01:39.102] - Field: 'conditions' [18:01:39.103] - Field: 'expr' [18:01:39.103] - Field: 'uuid' [18:01:39.103] - Field: 'seed' [18:01:39.103] - Field: 'version' [18:01:39.103] - Field: 'result' [18:01:39.103] - Field: 'asynchronous' [18:01:39.104] - Field: 'calls' [18:01:39.104] - Field: 'globals' [18:01:39.104] - Field: 'stdout' [18:01:39.104] - Field: 'earlySignal' [18:01:39.104] - Field: 'lazy' [18:01:39.104] - Field: 'state' [18:01:39.105] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.105] - Launch lazy future ... [18:01:39.105] Packages needed by the future expression (n = 0): [18:01:39.105] Packages needed by future strategies (n = 0): [18:01:39.106] { [18:01:39.106] { [18:01:39.106] { [18:01:39.106] ...future.startTime <- base::Sys.time() [18:01:39.106] { [18:01:39.106] { [18:01:39.106] { [18:01:39.106] base::local({ [18:01:39.106] has_future <- base::requireNamespace("future", [18:01:39.106] quietly = TRUE) [18:01:39.106] if (has_future) { [18:01:39.106] ns <- base::getNamespace("future") [18:01:39.106] version <- ns[[".package"]][["version"]] [18:01:39.106] if (is.null(version)) [18:01:39.106] version <- utils::packageVersion("future") [18:01:39.106] } [18:01:39.106] else { [18:01:39.106] version <- NULL [18:01:39.106] } [18:01:39.106] if (!has_future || version < "1.8.0") { [18:01:39.106] info <- base::c(r_version = base::gsub("R version ", [18:01:39.106] "", base::R.version$version.string), [18:01:39.106] platform = base::sprintf("%s (%s-bit)", [18:01:39.106] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.106] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.106] "release", "version")], collapse = " "), [18:01:39.106] hostname = base::Sys.info()[["nodename"]]) [18:01:39.106] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.106] info) [18:01:39.106] info <- base::paste(info, collapse = "; ") [18:01:39.106] if (!has_future) { [18:01:39.106] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.106] info) [18:01:39.106] } [18:01:39.106] else { [18:01:39.106] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.106] info, version) [18:01:39.106] } [18:01:39.106] base::stop(msg) [18:01:39.106] } [18:01:39.106] }) [18:01:39.106] } [18:01:39.106] options(future.plan = NULL) [18:01:39.106] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.106] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.106] } [18:01:39.106] ...future.workdir <- getwd() [18:01:39.106] } [18:01:39.106] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.106] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.106] } [18:01:39.106] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.106] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.106] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.106] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.106] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.106] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.106] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.106] base::names(...future.oldOptions)) [18:01:39.106] } [18:01:39.106] if (FALSE) { [18:01:39.106] } [18:01:39.106] else { [18:01:39.106] if (TRUE) { [18:01:39.106] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.106] open = "w") [18:01:39.106] } [18:01:39.106] else { [18:01:39.106] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.106] windows = "NUL", "/dev/null"), open = "w") [18:01:39.106] } [18:01:39.106] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.106] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.106] base::sink(type = "output", split = FALSE) [18:01:39.106] base::close(...future.stdout) [18:01:39.106] }, add = TRUE) [18:01:39.106] } [18:01:39.106] ...future.frame <- base::sys.nframe() [18:01:39.106] ...future.conditions <- base::list() [18:01:39.106] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.106] if (FALSE) { [18:01:39.106] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.106] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.106] } [18:01:39.106] ...future.result <- base::tryCatch({ [18:01:39.106] base::withCallingHandlers({ [18:01:39.106] ...future.value <- base::withVisible(base::local({ [18:01:39.106] 4 [18:01:39.106] })) [18:01:39.106] future::FutureResult(value = ...future.value$value, [18:01:39.106] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.106] ...future.rng), globalenv = if (FALSE) [18:01:39.106] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.106] ...future.globalenv.names)) [18:01:39.106] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.106] }, condition = base::local({ [18:01:39.106] c <- base::c [18:01:39.106] inherits <- base::inherits [18:01:39.106] invokeRestart <- base::invokeRestart [18:01:39.106] length <- base::length [18:01:39.106] list <- base::list [18:01:39.106] seq.int <- base::seq.int [18:01:39.106] signalCondition <- base::signalCondition [18:01:39.106] sys.calls <- base::sys.calls [18:01:39.106] `[[` <- base::`[[` [18:01:39.106] `+` <- base::`+` [18:01:39.106] `<<-` <- base::`<<-` [18:01:39.106] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.106] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.106] 3L)] [18:01:39.106] } [18:01:39.106] function(cond) { [18:01:39.106] is_error <- inherits(cond, "error") [18:01:39.106] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.106] NULL) [18:01:39.106] if (is_error) { [18:01:39.106] sessionInformation <- function() { [18:01:39.106] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.106] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.106] search = base::search(), system = base::Sys.info()) [18:01:39.106] } [18:01:39.106] ...future.conditions[[length(...future.conditions) + [18:01:39.106] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.106] cond$call), session = sessionInformation(), [18:01:39.106] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.106] signalCondition(cond) [18:01:39.106] } [18:01:39.106] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.106] "immediateCondition"))) { [18:01:39.106] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.106] ...future.conditions[[length(...future.conditions) + [18:01:39.106] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.106] if (TRUE && !signal) { [18:01:39.106] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.106] { [18:01:39.106] inherits <- base::inherits [18:01:39.106] invokeRestart <- base::invokeRestart [18:01:39.106] is.null <- base::is.null [18:01:39.106] muffled <- FALSE [18:01:39.106] if (inherits(cond, "message")) { [18:01:39.106] muffled <- grepl(pattern, "muffleMessage") [18:01:39.106] if (muffled) [18:01:39.106] invokeRestart("muffleMessage") [18:01:39.106] } [18:01:39.106] else if (inherits(cond, "warning")) { [18:01:39.106] muffled <- grepl(pattern, "muffleWarning") [18:01:39.106] if (muffled) [18:01:39.106] invokeRestart("muffleWarning") [18:01:39.106] } [18:01:39.106] else if (inherits(cond, "condition")) { [18:01:39.106] if (!is.null(pattern)) { [18:01:39.106] computeRestarts <- base::computeRestarts [18:01:39.106] grepl <- base::grepl [18:01:39.106] restarts <- computeRestarts(cond) [18:01:39.106] for (restart in restarts) { [18:01:39.106] name <- restart$name [18:01:39.106] if (is.null(name)) [18:01:39.106] next [18:01:39.106] if (!grepl(pattern, name)) [18:01:39.106] next [18:01:39.106] invokeRestart(restart) [18:01:39.106] muffled <- TRUE [18:01:39.106] break [18:01:39.106] } [18:01:39.106] } [18:01:39.106] } [18:01:39.106] invisible(muffled) [18:01:39.106] } [18:01:39.106] muffleCondition(cond, pattern = "^muffle") [18:01:39.106] } [18:01:39.106] } [18:01:39.106] else { [18:01:39.106] if (TRUE) { [18:01:39.106] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.106] { [18:01:39.106] inherits <- base::inherits [18:01:39.106] invokeRestart <- base::invokeRestart [18:01:39.106] is.null <- base::is.null [18:01:39.106] muffled <- FALSE [18:01:39.106] if (inherits(cond, "message")) { [18:01:39.106] muffled <- grepl(pattern, "muffleMessage") [18:01:39.106] if (muffled) [18:01:39.106] invokeRestart("muffleMessage") [18:01:39.106] } [18:01:39.106] else if (inherits(cond, "warning")) { [18:01:39.106] muffled <- grepl(pattern, "muffleWarning") [18:01:39.106] if (muffled) [18:01:39.106] invokeRestart("muffleWarning") [18:01:39.106] } [18:01:39.106] else if (inherits(cond, "condition")) { [18:01:39.106] if (!is.null(pattern)) { [18:01:39.106] computeRestarts <- base::computeRestarts [18:01:39.106] grepl <- base::grepl [18:01:39.106] restarts <- computeRestarts(cond) [18:01:39.106] for (restart in restarts) { [18:01:39.106] name <- restart$name [18:01:39.106] if (is.null(name)) [18:01:39.106] next [18:01:39.106] if (!grepl(pattern, name)) [18:01:39.106] next [18:01:39.106] invokeRestart(restart) [18:01:39.106] muffled <- TRUE [18:01:39.106] break [18:01:39.106] } [18:01:39.106] } [18:01:39.106] } [18:01:39.106] invisible(muffled) [18:01:39.106] } [18:01:39.106] muffleCondition(cond, pattern = "^muffle") [18:01:39.106] } [18:01:39.106] } [18:01:39.106] } [18:01:39.106] })) [18:01:39.106] }, error = function(ex) { [18:01:39.106] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.106] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.106] ...future.rng), started = ...future.startTime, [18:01:39.106] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.106] version = "1.8"), class = "FutureResult") [18:01:39.106] }, finally = { [18:01:39.106] if (!identical(...future.workdir, getwd())) [18:01:39.106] setwd(...future.workdir) [18:01:39.106] { [18:01:39.106] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.106] ...future.oldOptions$nwarnings <- NULL [18:01:39.106] } [18:01:39.106] base::options(...future.oldOptions) [18:01:39.106] if (.Platform$OS.type == "windows") { [18:01:39.106] old_names <- names(...future.oldEnvVars) [18:01:39.106] envs <- base::Sys.getenv() [18:01:39.106] names <- names(envs) [18:01:39.106] common <- intersect(names, old_names) [18:01:39.106] added <- setdiff(names, old_names) [18:01:39.106] removed <- setdiff(old_names, names) [18:01:39.106] changed <- common[...future.oldEnvVars[common] != [18:01:39.106] envs[common]] [18:01:39.106] NAMES <- toupper(changed) [18:01:39.106] args <- list() [18:01:39.106] for (kk in seq_along(NAMES)) { [18:01:39.106] name <- changed[[kk]] [18:01:39.106] NAME <- NAMES[[kk]] [18:01:39.106] if (name != NAME && is.element(NAME, old_names)) [18:01:39.106] next [18:01:39.106] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.106] } [18:01:39.106] NAMES <- toupper(added) [18:01:39.106] for (kk in seq_along(NAMES)) { [18:01:39.106] name <- added[[kk]] [18:01:39.106] NAME <- NAMES[[kk]] [18:01:39.106] if (name != NAME && is.element(NAME, old_names)) [18:01:39.106] next [18:01:39.106] args[[name]] <- "" [18:01:39.106] } [18:01:39.106] NAMES <- toupper(removed) [18:01:39.106] for (kk in seq_along(NAMES)) { [18:01:39.106] name <- removed[[kk]] [18:01:39.106] NAME <- NAMES[[kk]] [18:01:39.106] if (name != NAME && is.element(NAME, old_names)) [18:01:39.106] next [18:01:39.106] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.106] } [18:01:39.106] if (length(args) > 0) [18:01:39.106] base::do.call(base::Sys.setenv, args = args) [18:01:39.106] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.106] } [18:01:39.106] else { [18:01:39.106] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.106] } [18:01:39.106] { [18:01:39.106] if (base::length(...future.futureOptionsAdded) > [18:01:39.106] 0L) { [18:01:39.106] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.106] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.106] base::options(opts) [18:01:39.106] } [18:01:39.106] { [18:01:39.106] { [18:01:39.106] NULL [18:01:39.106] RNGkind("Mersenne-Twister") [18:01:39.106] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.106] inherits = FALSE) [18:01:39.106] } [18:01:39.106] options(future.plan = NULL) [18:01:39.106] if (is.na(NA_character_)) [18:01:39.106] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.106] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.106] future::plan(list(function (..., envir = parent.frame()) [18:01:39.106] { [18:01:39.106] future <- SequentialFuture(..., envir = envir) [18:01:39.106] if (!future$lazy) [18:01:39.106] future <- run(future) [18:01:39.106] invisible(future) [18:01:39.106] }), .cleanup = FALSE, .init = FALSE) [18:01:39.106] } [18:01:39.106] } [18:01:39.106] } [18:01:39.106] }) [18:01:39.106] if (TRUE) { [18:01:39.106] base::sink(type = "output", split = FALSE) [18:01:39.106] if (TRUE) { [18:01:39.106] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.106] } [18:01:39.106] else { [18:01:39.106] ...future.result["stdout"] <- base::list(NULL) [18:01:39.106] } [18:01:39.106] base::close(...future.stdout) [18:01:39.106] ...future.stdout <- NULL [18:01:39.106] } [18:01:39.106] ...future.result$conditions <- ...future.conditions [18:01:39.106] ...future.result$finished <- base::Sys.time() [18:01:39.106] ...future.result [18:01:39.106] } [18:01:39.110] plan(): Setting new future strategy stack: [18:01:39.110] List of future strategies: [18:01:39.110] 1. sequential: [18:01:39.110] - args: function (..., envir = parent.frame()) [18:01:39.110] - tweaked: FALSE [18:01:39.110] - call: NULL [18:01:39.111] plan(): nbrOfWorkers() = 1 [18:01:39.112] plan(): Setting new future strategy stack: [18:01:39.112] List of future strategies: [18:01:39.112] 1. sequential: [18:01:39.112] - args: function (..., envir = parent.frame()) [18:01:39.112] - tweaked: FALSE [18:01:39.112] - call: plan(strategy) [18:01:39.113] plan(): nbrOfWorkers() = 1 [18:01:39.113] SequentialFuture started (and completed) [18:01:39.113] - Launch lazy future ... done [18:01:39.113] run() for 'SequentialFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' [18:01:39.117] resolved() for 'SequentialFuture' ... [18:01:39.117] - state: 'finished' [18:01:39.117] - run: TRUE [18:01:39.118] - result: 'FutureResult' [18:01:39.118] resolved() for 'SequentialFuture' ... done [18:01:39.118] resolved() for 'SequentialFuture' ... [18:01:39.118] - state: 'finished' [18:01:39.118] - run: TRUE [18:01:39.119] - result: 'FutureResult' [18:01:39.119] resolved() for 'SequentialFuture' ... done [18:01:39.119] resolved() for 'SequentialFuture' ... [18:01:39.119] - state: 'finished' [18:01:39.119] - run: TRUE [18:01:39.120] - result: 'FutureResult' [18:01:39.120] resolved() for 'SequentialFuture' ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [18:01:39.122] resolve() on list environment ... [18:01:39.122] recursive: 0 [18:01:39.123] length: 6 [18:01:39.123] elements: 'a', 'b', 'c', 'd', '', '' [18:01:39.124] signalConditionsASAP(numeric, pos=1) ... [18:01:39.124] - nx: 6 [18:01:39.124] - relay: TRUE [18:01:39.124] - stdout: TRUE [18:01:39.124] - signal: TRUE [18:01:39.124] - resignal: FALSE [18:01:39.124] - force: TRUE [18:01:39.125] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.125] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.125] - until=2 [18:01:39.125] - relaying element #2 [18:01:39.125] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.125] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.126] signalConditionsASAP(NULL, pos=1) ... done [18:01:39.126] length: 5 (resolved future 1) [18:01:39.126] resolved() for 'SequentialFuture' ... [18:01:39.126] - state: 'finished' [18:01:39.126] - run: TRUE [18:01:39.127] - result: 'FutureResult' [18:01:39.127] resolved() for 'SequentialFuture' ... done [18:01:39.127] Future #2 [18:01:39.127] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:39.127] - nx: 6 [18:01:39.127] - relay: TRUE [18:01:39.128] - stdout: TRUE [18:01:39.128] - signal: TRUE [18:01:39.128] - resignal: FALSE [18:01:39.128] - force: TRUE [18:01:39.128] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.128] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.129] - until=2 [18:01:39.129] - relaying element #2 [18:01:39.129] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.129] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.129] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:39.130] length: 4 (resolved future 2) [18:01:39.130] resolved() for 'SequentialFuture' ... [18:01:39.130] - state: 'finished' [18:01:39.130] - run: TRUE [18:01:39.130] - result: 'FutureResult' [18:01:39.130] resolved() for 'SequentialFuture' ... done [18:01:39.131] Future #3 [18:01:39.131] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:39.131] - nx: 6 [18:01:39.131] - relay: TRUE [18:01:39.131] - stdout: TRUE [18:01:39.131] - signal: TRUE [18:01:39.132] - resignal: FALSE [18:01:39.132] - force: TRUE [18:01:39.132] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.132] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.132] - until=3 [18:01:39.132] - relaying element #3 [18:01:39.133] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.133] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.133] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:39.133] length: 3 (resolved future 3) [18:01:39.133] resolved() for 'SequentialFuture' ... [18:01:39.134] - state: 'finished' [18:01:39.134] - run: TRUE [18:01:39.134] - result: 'FutureResult' [18:01:39.134] resolved() for 'SequentialFuture' ... done [18:01:39.134] Future #4 [18:01:39.135] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:39.136] - nx: 6 [18:01:39.136] - relay: TRUE [18:01:39.136] - stdout: TRUE [18:01:39.136] - signal: TRUE [18:01:39.136] - resignal: FALSE [18:01:39.136] - force: TRUE [18:01:39.137] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.137] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.137] - until=4 [18:01:39.137] - relaying element #4 [18:01:39.137] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.138] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.138] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:39.138] length: 2 (resolved future 4) [18:01:39.138] signalConditionsASAP(NULL, pos=5) ... [18:01:39.138] - nx: 6 [18:01:39.138] - relay: TRUE [18:01:39.138] - stdout: TRUE [18:01:39.139] - signal: TRUE [18:01:39.139] - resignal: FALSE [18:01:39.139] - force: TRUE [18:01:39.139] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.139] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.139] - until=6 [18:01:39.140] - relaying element #6 [18:01:39.140] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.140] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.140] signalConditionsASAP(NULL, pos=5) ... done [18:01:39.140] length: 1 (resolved future 5) [18:01:39.140] signalConditionsASAP(numeric, pos=6) ... [18:01:39.141] - nx: 6 [18:01:39.141] - relay: TRUE [18:01:39.141] - stdout: TRUE [18:01:39.141] - signal: TRUE [18:01:39.141] - resignal: FALSE [18:01:39.141] - force: TRUE [18:01:39.141] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.142] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.142] - until=6 [18:01:39.142] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.142] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.142] signalConditionsASAP(numeric, pos=6) ... done [18:01:39.142] length: 0 (resolved future 6) [18:01:39.143] Relaying remaining futures [18:01:39.143] signalConditionsASAP(NULL, pos=0) ... [18:01:39.143] - nx: 6 [18:01:39.143] - relay: TRUE [18:01:39.143] - stdout: TRUE [18:01:39.143] - signal: TRUE [18:01:39.143] - resignal: FALSE [18:01:39.144] - force: TRUE [18:01:39.144] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.144] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:39.144] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.144] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.145] signalConditionsASAP(NULL, pos=0) ... done [18:01:39.145] resolve() on list environment ... DONE Classes 'listenv', 'environment' Dimensions: c(1, 6) [18:01:39.146] getGlobalsAndPackages() ... [18:01:39.146] Searching for globals... [18:01:39.146] [18:01:39.146] Searching for globals ... DONE [18:01:39.147] - globals: [0] [18:01:39.147] getGlobalsAndPackages() ... DONE [18:01:39.147] run() for 'Future' ... [18:01:39.147] - state: 'created' [18:01:39.147] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.148] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.148] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.148] - Field: 'label' [18:01:39.148] - Field: 'local' [18:01:39.148] - Field: 'owner' [18:01:39.149] - Field: 'envir' [18:01:39.149] - Field: 'packages' [18:01:39.149] - Field: 'gc' [18:01:39.149] - Field: 'conditions' [18:01:39.149] - Field: 'expr' [18:01:39.149] - Field: 'uuid' [18:01:39.150] - Field: 'seed' [18:01:39.150] - Field: 'version' [18:01:39.150] - Field: 'result' [18:01:39.150] - Field: 'asynchronous' [18:01:39.150] - Field: 'calls' [18:01:39.151] - Field: 'globals' [18:01:39.151] - Field: 'stdout' [18:01:39.151] - Field: 'earlySignal' [18:01:39.151] - Field: 'lazy' [18:01:39.151] - Field: 'state' [18:01:39.151] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.152] - Launch lazy future ... [18:01:39.152] Packages needed by the future expression (n = 0): [18:01:39.152] Packages needed by future strategies (n = 0): [18:01:39.153] { [18:01:39.153] { [18:01:39.153] { [18:01:39.153] ...future.startTime <- base::Sys.time() [18:01:39.153] { [18:01:39.153] { [18:01:39.153] { [18:01:39.153] base::local({ [18:01:39.153] has_future <- base::requireNamespace("future", [18:01:39.153] quietly = TRUE) [18:01:39.153] if (has_future) { [18:01:39.153] ns <- base::getNamespace("future") [18:01:39.153] version <- ns[[".package"]][["version"]] [18:01:39.153] if (is.null(version)) [18:01:39.153] version <- utils::packageVersion("future") [18:01:39.153] } [18:01:39.153] else { [18:01:39.153] version <- NULL [18:01:39.153] } [18:01:39.153] if (!has_future || version < "1.8.0") { [18:01:39.153] info <- base::c(r_version = base::gsub("R version ", [18:01:39.153] "", base::R.version$version.string), [18:01:39.153] platform = base::sprintf("%s (%s-bit)", [18:01:39.153] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.153] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.153] "release", "version")], collapse = " "), [18:01:39.153] hostname = base::Sys.info()[["nodename"]]) [18:01:39.153] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.153] info) [18:01:39.153] info <- base::paste(info, collapse = "; ") [18:01:39.153] if (!has_future) { [18:01:39.153] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.153] info) [18:01:39.153] } [18:01:39.153] else { [18:01:39.153] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.153] info, version) [18:01:39.153] } [18:01:39.153] base::stop(msg) [18:01:39.153] } [18:01:39.153] }) [18:01:39.153] } [18:01:39.153] options(future.plan = NULL) [18:01:39.153] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.153] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.153] } [18:01:39.153] ...future.workdir <- getwd() [18:01:39.153] } [18:01:39.153] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.153] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.153] } [18:01:39.153] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.153] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.153] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.153] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.153] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.153] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.153] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.153] base::names(...future.oldOptions)) [18:01:39.153] } [18:01:39.153] if (FALSE) { [18:01:39.153] } [18:01:39.153] else { [18:01:39.153] if (TRUE) { [18:01:39.153] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.153] open = "w") [18:01:39.153] } [18:01:39.153] else { [18:01:39.153] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.153] windows = "NUL", "/dev/null"), open = "w") [18:01:39.153] } [18:01:39.153] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.153] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.153] base::sink(type = "output", split = FALSE) [18:01:39.153] base::close(...future.stdout) [18:01:39.153] }, add = TRUE) [18:01:39.153] } [18:01:39.153] ...future.frame <- base::sys.nframe() [18:01:39.153] ...future.conditions <- base::list() [18:01:39.153] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.153] if (FALSE) { [18:01:39.153] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.153] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.153] } [18:01:39.153] ...future.result <- base::tryCatch({ [18:01:39.153] base::withCallingHandlers({ [18:01:39.153] ...future.value <- base::withVisible(base::local(2)) [18:01:39.153] future::FutureResult(value = ...future.value$value, [18:01:39.153] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.153] ...future.rng), globalenv = if (FALSE) [18:01:39.153] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.153] ...future.globalenv.names)) [18:01:39.153] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.153] }, condition = base::local({ [18:01:39.153] c <- base::c [18:01:39.153] inherits <- base::inherits [18:01:39.153] invokeRestart <- base::invokeRestart [18:01:39.153] length <- base::length [18:01:39.153] list <- base::list [18:01:39.153] seq.int <- base::seq.int [18:01:39.153] signalCondition <- base::signalCondition [18:01:39.153] sys.calls <- base::sys.calls [18:01:39.153] `[[` <- base::`[[` [18:01:39.153] `+` <- base::`+` [18:01:39.153] `<<-` <- base::`<<-` [18:01:39.153] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.153] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.153] 3L)] [18:01:39.153] } [18:01:39.153] function(cond) { [18:01:39.153] is_error <- inherits(cond, "error") [18:01:39.153] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.153] NULL) [18:01:39.153] if (is_error) { [18:01:39.153] sessionInformation <- function() { [18:01:39.153] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.153] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.153] search = base::search(), system = base::Sys.info()) [18:01:39.153] } [18:01:39.153] ...future.conditions[[length(...future.conditions) + [18:01:39.153] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.153] cond$call), session = sessionInformation(), [18:01:39.153] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.153] signalCondition(cond) [18:01:39.153] } [18:01:39.153] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.153] "immediateCondition"))) { [18:01:39.153] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.153] ...future.conditions[[length(...future.conditions) + [18:01:39.153] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.153] if (TRUE && !signal) { [18:01:39.153] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.153] { [18:01:39.153] inherits <- base::inherits [18:01:39.153] invokeRestart <- base::invokeRestart [18:01:39.153] is.null <- base::is.null [18:01:39.153] muffled <- FALSE [18:01:39.153] if (inherits(cond, "message")) { [18:01:39.153] muffled <- grepl(pattern, "muffleMessage") [18:01:39.153] if (muffled) [18:01:39.153] invokeRestart("muffleMessage") [18:01:39.153] } [18:01:39.153] else if (inherits(cond, "warning")) { [18:01:39.153] muffled <- grepl(pattern, "muffleWarning") [18:01:39.153] if (muffled) [18:01:39.153] invokeRestart("muffleWarning") [18:01:39.153] } [18:01:39.153] else if (inherits(cond, "condition")) { [18:01:39.153] if (!is.null(pattern)) { [18:01:39.153] computeRestarts <- base::computeRestarts [18:01:39.153] grepl <- base::grepl [18:01:39.153] restarts <- computeRestarts(cond) [18:01:39.153] for (restart in restarts) { [18:01:39.153] name <- restart$name [18:01:39.153] if (is.null(name)) [18:01:39.153] next [18:01:39.153] if (!grepl(pattern, name)) [18:01:39.153] next [18:01:39.153] invokeRestart(restart) [18:01:39.153] muffled <- TRUE [18:01:39.153] break [18:01:39.153] } [18:01:39.153] } [18:01:39.153] } [18:01:39.153] invisible(muffled) [18:01:39.153] } [18:01:39.153] muffleCondition(cond, pattern = "^muffle") [18:01:39.153] } [18:01:39.153] } [18:01:39.153] else { [18:01:39.153] if (TRUE) { [18:01:39.153] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.153] { [18:01:39.153] inherits <- base::inherits [18:01:39.153] invokeRestart <- base::invokeRestart [18:01:39.153] is.null <- base::is.null [18:01:39.153] muffled <- FALSE [18:01:39.153] if (inherits(cond, "message")) { [18:01:39.153] muffled <- grepl(pattern, "muffleMessage") [18:01:39.153] if (muffled) [18:01:39.153] invokeRestart("muffleMessage") [18:01:39.153] } [18:01:39.153] else if (inherits(cond, "warning")) { [18:01:39.153] muffled <- grepl(pattern, "muffleWarning") [18:01:39.153] if (muffled) [18:01:39.153] invokeRestart("muffleWarning") [18:01:39.153] } [18:01:39.153] else if (inherits(cond, "condition")) { [18:01:39.153] if (!is.null(pattern)) { [18:01:39.153] computeRestarts <- base::computeRestarts [18:01:39.153] grepl <- base::grepl [18:01:39.153] restarts <- computeRestarts(cond) [18:01:39.153] for (restart in restarts) { [18:01:39.153] name <- restart$name [18:01:39.153] if (is.null(name)) [18:01:39.153] next [18:01:39.153] if (!grepl(pattern, name)) [18:01:39.153] next [18:01:39.153] invokeRestart(restart) [18:01:39.153] muffled <- TRUE [18:01:39.153] break [18:01:39.153] } [18:01:39.153] } [18:01:39.153] } [18:01:39.153] invisible(muffled) [18:01:39.153] } [18:01:39.153] muffleCondition(cond, pattern = "^muffle") [18:01:39.153] } [18:01:39.153] } [18:01:39.153] } [18:01:39.153] })) [18:01:39.153] }, error = function(ex) { [18:01:39.153] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.153] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.153] ...future.rng), started = ...future.startTime, [18:01:39.153] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.153] version = "1.8"), class = "FutureResult") [18:01:39.153] }, finally = { [18:01:39.153] if (!identical(...future.workdir, getwd())) [18:01:39.153] setwd(...future.workdir) [18:01:39.153] { [18:01:39.153] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.153] ...future.oldOptions$nwarnings <- NULL [18:01:39.153] } [18:01:39.153] base::options(...future.oldOptions) [18:01:39.153] if (.Platform$OS.type == "windows") { [18:01:39.153] old_names <- names(...future.oldEnvVars) [18:01:39.153] envs <- base::Sys.getenv() [18:01:39.153] names <- names(envs) [18:01:39.153] common <- intersect(names, old_names) [18:01:39.153] added <- setdiff(names, old_names) [18:01:39.153] removed <- setdiff(old_names, names) [18:01:39.153] changed <- common[...future.oldEnvVars[common] != [18:01:39.153] envs[common]] [18:01:39.153] NAMES <- toupper(changed) [18:01:39.153] args <- list() [18:01:39.153] for (kk in seq_along(NAMES)) { [18:01:39.153] name <- changed[[kk]] [18:01:39.153] NAME <- NAMES[[kk]] [18:01:39.153] if (name != NAME && is.element(NAME, old_names)) [18:01:39.153] next [18:01:39.153] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.153] } [18:01:39.153] NAMES <- toupper(added) [18:01:39.153] for (kk in seq_along(NAMES)) { [18:01:39.153] name <- added[[kk]] [18:01:39.153] NAME <- NAMES[[kk]] [18:01:39.153] if (name != NAME && is.element(NAME, old_names)) [18:01:39.153] next [18:01:39.153] args[[name]] <- "" [18:01:39.153] } [18:01:39.153] NAMES <- toupper(removed) [18:01:39.153] for (kk in seq_along(NAMES)) { [18:01:39.153] name <- removed[[kk]] [18:01:39.153] NAME <- NAMES[[kk]] [18:01:39.153] if (name != NAME && is.element(NAME, old_names)) [18:01:39.153] next [18:01:39.153] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.153] } [18:01:39.153] if (length(args) > 0) [18:01:39.153] base::do.call(base::Sys.setenv, args = args) [18:01:39.153] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.153] } [18:01:39.153] else { [18:01:39.153] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.153] } [18:01:39.153] { [18:01:39.153] if (base::length(...future.futureOptionsAdded) > [18:01:39.153] 0L) { [18:01:39.153] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.153] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.153] base::options(opts) [18:01:39.153] } [18:01:39.153] { [18:01:39.153] { [18:01:39.153] NULL [18:01:39.153] RNGkind("Mersenne-Twister") [18:01:39.153] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.153] inherits = FALSE) [18:01:39.153] } [18:01:39.153] options(future.plan = NULL) [18:01:39.153] if (is.na(NA_character_)) [18:01:39.153] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.153] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.153] future::plan(list(function (..., envir = parent.frame()) [18:01:39.153] { [18:01:39.153] future <- SequentialFuture(..., envir = envir) [18:01:39.153] if (!future$lazy) [18:01:39.153] future <- run(future) [18:01:39.153] invisible(future) [18:01:39.153] }), .cleanup = FALSE, .init = FALSE) [18:01:39.153] } [18:01:39.153] } [18:01:39.153] } [18:01:39.153] }) [18:01:39.153] if (TRUE) { [18:01:39.153] base::sink(type = "output", split = FALSE) [18:01:39.153] if (TRUE) { [18:01:39.153] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.153] } [18:01:39.153] else { [18:01:39.153] ...future.result["stdout"] <- base::list(NULL) [18:01:39.153] } [18:01:39.153] base::close(...future.stdout) [18:01:39.153] ...future.stdout <- NULL [18:01:39.153] } [18:01:39.153] ...future.result$conditions <- ...future.conditions [18:01:39.153] ...future.result$finished <- base::Sys.time() [18:01:39.153] ...future.result [18:01:39.153] } [18:01:39.156] plan(): Setting new future strategy stack: [18:01:39.157] List of future strategies: [18:01:39.157] 1. sequential: [18:01:39.157] - args: function (..., envir = parent.frame()) [18:01:39.157] - tweaked: FALSE [18:01:39.157] - call: NULL [18:01:39.157] plan(): nbrOfWorkers() = 1 [18:01:39.158] plan(): Setting new future strategy stack: [18:01:39.158] List of future strategies: [18:01:39.158] 1. sequential: [18:01:39.158] - args: function (..., envir = parent.frame()) [18:01:39.158] - tweaked: FALSE [18:01:39.158] - call: plan(strategy) [18:01:39.159] plan(): nbrOfWorkers() = 1 [18:01:39.159] SequentialFuture started (and completed) [18:01:39.159] - Launch lazy future ... done [18:01:39.160] run() for 'SequentialFuture' ... done [18:01:39.160] getGlobalsAndPackages() ... [18:01:39.160] Searching for globals... [18:01:39.160] [18:01:39.161] Searching for globals ... DONE [18:01:39.161] - globals: [0] [18:01:39.161] getGlobalsAndPackages() ... DONE [18:01:39.161] run() for 'Future' ... [18:01:39.161] - state: 'created' [18:01:39.162] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.162] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.162] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.162] - Field: 'label' [18:01:39.162] - Field: 'local' [18:01:39.163] - Field: 'owner' [18:01:39.163] - Field: 'envir' [18:01:39.163] - Field: 'packages' [18:01:39.163] - Field: 'gc' [18:01:39.163] - Field: 'conditions' [18:01:39.164] - Field: 'expr' [18:01:39.164] - Field: 'uuid' [18:01:39.164] - Field: 'seed' [18:01:39.164] - Field: 'version' [18:01:39.164] - Field: 'result' [18:01:39.164] - Field: 'asynchronous' [18:01:39.165] - Field: 'calls' [18:01:39.165] - Field: 'globals' [18:01:39.165] - Field: 'stdout' [18:01:39.165] - Field: 'earlySignal' [18:01:39.165] - Field: 'lazy' [18:01:39.165] - Field: 'state' [18:01:39.166] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.166] - Launch lazy future ... [18:01:39.166] Packages needed by the future expression (n = 0): [18:01:39.166] Packages needed by future strategies (n = 0): [18:01:39.167] { [18:01:39.167] { [18:01:39.167] { [18:01:39.167] ...future.startTime <- base::Sys.time() [18:01:39.167] { [18:01:39.167] { [18:01:39.167] { [18:01:39.167] base::local({ [18:01:39.167] has_future <- base::requireNamespace("future", [18:01:39.167] quietly = TRUE) [18:01:39.167] if (has_future) { [18:01:39.167] ns <- base::getNamespace("future") [18:01:39.167] version <- ns[[".package"]][["version"]] [18:01:39.167] if (is.null(version)) [18:01:39.167] version <- utils::packageVersion("future") [18:01:39.167] } [18:01:39.167] else { [18:01:39.167] version <- NULL [18:01:39.167] } [18:01:39.167] if (!has_future || version < "1.8.0") { [18:01:39.167] info <- base::c(r_version = base::gsub("R version ", [18:01:39.167] "", base::R.version$version.string), [18:01:39.167] platform = base::sprintf("%s (%s-bit)", [18:01:39.167] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.167] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.167] "release", "version")], collapse = " "), [18:01:39.167] hostname = base::Sys.info()[["nodename"]]) [18:01:39.167] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.167] info) [18:01:39.167] info <- base::paste(info, collapse = "; ") [18:01:39.167] if (!has_future) { [18:01:39.167] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.167] info) [18:01:39.167] } [18:01:39.167] else { [18:01:39.167] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.167] info, version) [18:01:39.167] } [18:01:39.167] base::stop(msg) [18:01:39.167] } [18:01:39.167] }) [18:01:39.167] } [18:01:39.167] options(future.plan = NULL) [18:01:39.167] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.167] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.167] } [18:01:39.167] ...future.workdir <- getwd() [18:01:39.167] } [18:01:39.167] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.167] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.167] } [18:01:39.167] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.167] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.167] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.167] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.167] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.167] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.167] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.167] base::names(...future.oldOptions)) [18:01:39.167] } [18:01:39.167] if (FALSE) { [18:01:39.167] } [18:01:39.167] else { [18:01:39.167] if (TRUE) { [18:01:39.167] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.167] open = "w") [18:01:39.167] } [18:01:39.167] else { [18:01:39.167] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.167] windows = "NUL", "/dev/null"), open = "w") [18:01:39.167] } [18:01:39.167] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.167] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.167] base::sink(type = "output", split = FALSE) [18:01:39.167] base::close(...future.stdout) [18:01:39.167] }, add = TRUE) [18:01:39.167] } [18:01:39.167] ...future.frame <- base::sys.nframe() [18:01:39.167] ...future.conditions <- base::list() [18:01:39.167] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.167] if (FALSE) { [18:01:39.167] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.167] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.167] } [18:01:39.167] ...future.result <- base::tryCatch({ [18:01:39.167] base::withCallingHandlers({ [18:01:39.167] ...future.value <- base::withVisible(base::local(NULL)) [18:01:39.167] future::FutureResult(value = ...future.value$value, [18:01:39.167] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.167] ...future.rng), globalenv = if (FALSE) [18:01:39.167] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.167] ...future.globalenv.names)) [18:01:39.167] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.167] }, condition = base::local({ [18:01:39.167] c <- base::c [18:01:39.167] inherits <- base::inherits [18:01:39.167] invokeRestart <- base::invokeRestart [18:01:39.167] length <- base::length [18:01:39.167] list <- base::list [18:01:39.167] seq.int <- base::seq.int [18:01:39.167] signalCondition <- base::signalCondition [18:01:39.167] sys.calls <- base::sys.calls [18:01:39.167] `[[` <- base::`[[` [18:01:39.167] `+` <- base::`+` [18:01:39.167] `<<-` <- base::`<<-` [18:01:39.167] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.167] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.167] 3L)] [18:01:39.167] } [18:01:39.167] function(cond) { [18:01:39.167] is_error <- inherits(cond, "error") [18:01:39.167] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.167] NULL) [18:01:39.167] if (is_error) { [18:01:39.167] sessionInformation <- function() { [18:01:39.167] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.167] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.167] search = base::search(), system = base::Sys.info()) [18:01:39.167] } [18:01:39.167] ...future.conditions[[length(...future.conditions) + [18:01:39.167] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.167] cond$call), session = sessionInformation(), [18:01:39.167] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.167] signalCondition(cond) [18:01:39.167] } [18:01:39.167] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.167] "immediateCondition"))) { [18:01:39.167] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.167] ...future.conditions[[length(...future.conditions) + [18:01:39.167] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.167] if (TRUE && !signal) { [18:01:39.167] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.167] { [18:01:39.167] inherits <- base::inherits [18:01:39.167] invokeRestart <- base::invokeRestart [18:01:39.167] is.null <- base::is.null [18:01:39.167] muffled <- FALSE [18:01:39.167] if (inherits(cond, "message")) { [18:01:39.167] muffled <- grepl(pattern, "muffleMessage") [18:01:39.167] if (muffled) [18:01:39.167] invokeRestart("muffleMessage") [18:01:39.167] } [18:01:39.167] else if (inherits(cond, "warning")) { [18:01:39.167] muffled <- grepl(pattern, "muffleWarning") [18:01:39.167] if (muffled) [18:01:39.167] invokeRestart("muffleWarning") [18:01:39.167] } [18:01:39.167] else if (inherits(cond, "condition")) { [18:01:39.167] if (!is.null(pattern)) { [18:01:39.167] computeRestarts <- base::computeRestarts [18:01:39.167] grepl <- base::grepl [18:01:39.167] restarts <- computeRestarts(cond) [18:01:39.167] for (restart in restarts) { [18:01:39.167] name <- restart$name [18:01:39.167] if (is.null(name)) [18:01:39.167] next [18:01:39.167] if (!grepl(pattern, name)) [18:01:39.167] next [18:01:39.167] invokeRestart(restart) [18:01:39.167] muffled <- TRUE [18:01:39.167] break [18:01:39.167] } [18:01:39.167] } [18:01:39.167] } [18:01:39.167] invisible(muffled) [18:01:39.167] } [18:01:39.167] muffleCondition(cond, pattern = "^muffle") [18:01:39.167] } [18:01:39.167] } [18:01:39.167] else { [18:01:39.167] if (TRUE) { [18:01:39.167] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.167] { [18:01:39.167] inherits <- base::inherits [18:01:39.167] invokeRestart <- base::invokeRestart [18:01:39.167] is.null <- base::is.null [18:01:39.167] muffled <- FALSE [18:01:39.167] if (inherits(cond, "message")) { [18:01:39.167] muffled <- grepl(pattern, "muffleMessage") [18:01:39.167] if (muffled) [18:01:39.167] invokeRestart("muffleMessage") [18:01:39.167] } [18:01:39.167] else if (inherits(cond, "warning")) { [18:01:39.167] muffled <- grepl(pattern, "muffleWarning") [18:01:39.167] if (muffled) [18:01:39.167] invokeRestart("muffleWarning") [18:01:39.167] } [18:01:39.167] else if (inherits(cond, "condition")) { [18:01:39.167] if (!is.null(pattern)) { [18:01:39.167] computeRestarts <- base::computeRestarts [18:01:39.167] grepl <- base::grepl [18:01:39.167] restarts <- computeRestarts(cond) [18:01:39.167] for (restart in restarts) { [18:01:39.167] name <- restart$name [18:01:39.167] if (is.null(name)) [18:01:39.167] next [18:01:39.167] if (!grepl(pattern, name)) [18:01:39.167] next [18:01:39.167] invokeRestart(restart) [18:01:39.167] muffled <- TRUE [18:01:39.167] break [18:01:39.167] } [18:01:39.167] } [18:01:39.167] } [18:01:39.167] invisible(muffled) [18:01:39.167] } [18:01:39.167] muffleCondition(cond, pattern = "^muffle") [18:01:39.167] } [18:01:39.167] } [18:01:39.167] } [18:01:39.167] })) [18:01:39.167] }, error = function(ex) { [18:01:39.167] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.167] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.167] ...future.rng), started = ...future.startTime, [18:01:39.167] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.167] version = "1.8"), class = "FutureResult") [18:01:39.167] }, finally = { [18:01:39.167] if (!identical(...future.workdir, getwd())) [18:01:39.167] setwd(...future.workdir) [18:01:39.167] { [18:01:39.167] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.167] ...future.oldOptions$nwarnings <- NULL [18:01:39.167] } [18:01:39.167] base::options(...future.oldOptions) [18:01:39.167] if (.Platform$OS.type == "windows") { [18:01:39.167] old_names <- names(...future.oldEnvVars) [18:01:39.167] envs <- base::Sys.getenv() [18:01:39.167] names <- names(envs) [18:01:39.167] common <- intersect(names, old_names) [18:01:39.167] added <- setdiff(names, old_names) [18:01:39.167] removed <- setdiff(old_names, names) [18:01:39.167] changed <- common[...future.oldEnvVars[common] != [18:01:39.167] envs[common]] [18:01:39.167] NAMES <- toupper(changed) [18:01:39.167] args <- list() [18:01:39.167] for (kk in seq_along(NAMES)) { [18:01:39.167] name <- changed[[kk]] [18:01:39.167] NAME <- NAMES[[kk]] [18:01:39.167] if (name != NAME && is.element(NAME, old_names)) [18:01:39.167] next [18:01:39.167] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.167] } [18:01:39.167] NAMES <- toupper(added) [18:01:39.167] for (kk in seq_along(NAMES)) { [18:01:39.167] name <- added[[kk]] [18:01:39.167] NAME <- NAMES[[kk]] [18:01:39.167] if (name != NAME && is.element(NAME, old_names)) [18:01:39.167] next [18:01:39.167] args[[name]] <- "" [18:01:39.167] } [18:01:39.167] NAMES <- toupper(removed) [18:01:39.167] for (kk in seq_along(NAMES)) { [18:01:39.167] name <- removed[[kk]] [18:01:39.167] NAME <- NAMES[[kk]] [18:01:39.167] if (name != NAME && is.element(NAME, old_names)) [18:01:39.167] next [18:01:39.167] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.167] } [18:01:39.167] if (length(args) > 0) [18:01:39.167] base::do.call(base::Sys.setenv, args = args) [18:01:39.167] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.167] } [18:01:39.167] else { [18:01:39.167] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.167] } [18:01:39.167] { [18:01:39.167] if (base::length(...future.futureOptionsAdded) > [18:01:39.167] 0L) { [18:01:39.167] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.167] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.167] base::options(opts) [18:01:39.167] } [18:01:39.167] { [18:01:39.167] { [18:01:39.167] NULL [18:01:39.167] RNGkind("Mersenne-Twister") [18:01:39.167] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.167] inherits = FALSE) [18:01:39.167] } [18:01:39.167] options(future.plan = NULL) [18:01:39.167] if (is.na(NA_character_)) [18:01:39.167] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.167] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.167] future::plan(list(function (..., envir = parent.frame()) [18:01:39.167] { [18:01:39.167] future <- SequentialFuture(..., envir = envir) [18:01:39.167] if (!future$lazy) [18:01:39.167] future <- run(future) [18:01:39.167] invisible(future) [18:01:39.167] }), .cleanup = FALSE, .init = FALSE) [18:01:39.167] } [18:01:39.167] } [18:01:39.167] } [18:01:39.167] }) [18:01:39.167] if (TRUE) { [18:01:39.167] base::sink(type = "output", split = FALSE) [18:01:39.167] if (TRUE) { [18:01:39.167] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.167] } [18:01:39.167] else { [18:01:39.167] ...future.result["stdout"] <- base::list(NULL) [18:01:39.167] } [18:01:39.167] base::close(...future.stdout) [18:01:39.167] ...future.stdout <- NULL [18:01:39.167] } [18:01:39.167] ...future.result$conditions <- ...future.conditions [18:01:39.167] ...future.result$finished <- base::Sys.time() [18:01:39.167] ...future.result [18:01:39.167] } [18:01:39.171] plan(): Setting new future strategy stack: [18:01:39.171] List of future strategies: [18:01:39.171] 1. sequential: [18:01:39.171] - args: function (..., envir = parent.frame()) [18:01:39.171] - tweaked: FALSE [18:01:39.171] - call: NULL [18:01:39.171] plan(): nbrOfWorkers() = 1 [18:01:39.172] plan(): Setting new future strategy stack: [18:01:39.173] List of future strategies: [18:01:39.173] 1. sequential: [18:01:39.173] - args: function (..., envir = parent.frame()) [18:01:39.173] - tweaked: FALSE [18:01:39.173] - call: plan(strategy) [18:01:39.173] plan(): nbrOfWorkers() = 1 [18:01:39.173] SequentialFuture started (and completed) [18:01:39.174] - Launch lazy future ... done [18:01:39.174] run() for 'SequentialFuture' ... done [18:01:39.174] getGlobalsAndPackages() ... [18:01:39.175] Searching for globals... [18:01:39.175] - globals found: [1] '{' [18:01:39.175] Searching for globals ... DONE [18:01:39.176] Resolving globals: FALSE [18:01:39.176] [18:01:39.176] [18:01:39.176] getGlobalsAndPackages() ... DONE [18:01:39.177] run() for 'Future' ... [18:01:39.177] - state: 'created' [18:01:39.177] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.177] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.178] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.178] - Field: 'label' [18:01:39.178] - Field: 'local' [18:01:39.178] - Field: 'owner' [18:01:39.178] - Field: 'envir' [18:01:39.178] - Field: 'packages' [18:01:39.179] - Field: 'gc' [18:01:39.179] - Field: 'conditions' [18:01:39.179] - Field: 'expr' [18:01:39.179] - Field: 'uuid' [18:01:39.180] - Field: 'seed' [18:01:39.180] - Field: 'version' [18:01:39.181] - Field: 'result' [18:01:39.181] - Field: 'asynchronous' [18:01:39.181] - Field: 'calls' [18:01:39.181] - Field: 'globals' [18:01:39.181] - Field: 'stdout' [18:01:39.181] - Field: 'earlySignal' [18:01:39.182] - Field: 'lazy' [18:01:39.182] - Field: 'state' [18:01:39.182] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.182] - Launch lazy future ... [18:01:39.182] Packages needed by the future expression (n = 0): [18:01:39.183] Packages needed by future strategies (n = 0): [18:01:39.183] { [18:01:39.183] { [18:01:39.183] { [18:01:39.183] ...future.startTime <- base::Sys.time() [18:01:39.183] { [18:01:39.183] { [18:01:39.183] { [18:01:39.183] base::local({ [18:01:39.183] has_future <- base::requireNamespace("future", [18:01:39.183] quietly = TRUE) [18:01:39.183] if (has_future) { [18:01:39.183] ns <- base::getNamespace("future") [18:01:39.183] version <- ns[[".package"]][["version"]] [18:01:39.183] if (is.null(version)) [18:01:39.183] version <- utils::packageVersion("future") [18:01:39.183] } [18:01:39.183] else { [18:01:39.183] version <- NULL [18:01:39.183] } [18:01:39.183] if (!has_future || version < "1.8.0") { [18:01:39.183] info <- base::c(r_version = base::gsub("R version ", [18:01:39.183] "", base::R.version$version.string), [18:01:39.183] platform = base::sprintf("%s (%s-bit)", [18:01:39.183] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.183] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.183] "release", "version")], collapse = " "), [18:01:39.183] hostname = base::Sys.info()[["nodename"]]) [18:01:39.183] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.183] info) [18:01:39.183] info <- base::paste(info, collapse = "; ") [18:01:39.183] if (!has_future) { [18:01:39.183] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.183] info) [18:01:39.183] } [18:01:39.183] else { [18:01:39.183] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.183] info, version) [18:01:39.183] } [18:01:39.183] base::stop(msg) [18:01:39.183] } [18:01:39.183] }) [18:01:39.183] } [18:01:39.183] options(future.plan = NULL) [18:01:39.183] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.183] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.183] } [18:01:39.183] ...future.workdir <- getwd() [18:01:39.183] } [18:01:39.183] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.183] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.183] } [18:01:39.183] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.183] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.183] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.183] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.183] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.183] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.183] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.183] base::names(...future.oldOptions)) [18:01:39.183] } [18:01:39.183] if (FALSE) { [18:01:39.183] } [18:01:39.183] else { [18:01:39.183] if (TRUE) { [18:01:39.183] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.183] open = "w") [18:01:39.183] } [18:01:39.183] else { [18:01:39.183] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.183] windows = "NUL", "/dev/null"), open = "w") [18:01:39.183] } [18:01:39.183] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.183] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.183] base::sink(type = "output", split = FALSE) [18:01:39.183] base::close(...future.stdout) [18:01:39.183] }, add = TRUE) [18:01:39.183] } [18:01:39.183] ...future.frame <- base::sys.nframe() [18:01:39.183] ...future.conditions <- base::list() [18:01:39.183] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.183] if (FALSE) { [18:01:39.183] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.183] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.183] } [18:01:39.183] ...future.result <- base::tryCatch({ [18:01:39.183] base::withCallingHandlers({ [18:01:39.183] ...future.value <- base::withVisible(base::local({ [18:01:39.183] 4 [18:01:39.183] })) [18:01:39.183] future::FutureResult(value = ...future.value$value, [18:01:39.183] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.183] ...future.rng), globalenv = if (FALSE) [18:01:39.183] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.183] ...future.globalenv.names)) [18:01:39.183] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.183] }, condition = base::local({ [18:01:39.183] c <- base::c [18:01:39.183] inherits <- base::inherits [18:01:39.183] invokeRestart <- base::invokeRestart [18:01:39.183] length <- base::length [18:01:39.183] list <- base::list [18:01:39.183] seq.int <- base::seq.int [18:01:39.183] signalCondition <- base::signalCondition [18:01:39.183] sys.calls <- base::sys.calls [18:01:39.183] `[[` <- base::`[[` [18:01:39.183] `+` <- base::`+` [18:01:39.183] `<<-` <- base::`<<-` [18:01:39.183] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.183] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.183] 3L)] [18:01:39.183] } [18:01:39.183] function(cond) { [18:01:39.183] is_error <- inherits(cond, "error") [18:01:39.183] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.183] NULL) [18:01:39.183] if (is_error) { [18:01:39.183] sessionInformation <- function() { [18:01:39.183] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.183] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.183] search = base::search(), system = base::Sys.info()) [18:01:39.183] } [18:01:39.183] ...future.conditions[[length(...future.conditions) + [18:01:39.183] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.183] cond$call), session = sessionInformation(), [18:01:39.183] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.183] signalCondition(cond) [18:01:39.183] } [18:01:39.183] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.183] "immediateCondition"))) { [18:01:39.183] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.183] ...future.conditions[[length(...future.conditions) + [18:01:39.183] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.183] if (TRUE && !signal) { [18:01:39.183] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.183] { [18:01:39.183] inherits <- base::inherits [18:01:39.183] invokeRestart <- base::invokeRestart [18:01:39.183] is.null <- base::is.null [18:01:39.183] muffled <- FALSE [18:01:39.183] if (inherits(cond, "message")) { [18:01:39.183] muffled <- grepl(pattern, "muffleMessage") [18:01:39.183] if (muffled) [18:01:39.183] invokeRestart("muffleMessage") [18:01:39.183] } [18:01:39.183] else if (inherits(cond, "warning")) { [18:01:39.183] muffled <- grepl(pattern, "muffleWarning") [18:01:39.183] if (muffled) [18:01:39.183] invokeRestart("muffleWarning") [18:01:39.183] } [18:01:39.183] else if (inherits(cond, "condition")) { [18:01:39.183] if (!is.null(pattern)) { [18:01:39.183] computeRestarts <- base::computeRestarts [18:01:39.183] grepl <- base::grepl [18:01:39.183] restarts <- computeRestarts(cond) [18:01:39.183] for (restart in restarts) { [18:01:39.183] name <- restart$name [18:01:39.183] if (is.null(name)) [18:01:39.183] next [18:01:39.183] if (!grepl(pattern, name)) [18:01:39.183] next [18:01:39.183] invokeRestart(restart) [18:01:39.183] muffled <- TRUE [18:01:39.183] break [18:01:39.183] } [18:01:39.183] } [18:01:39.183] } [18:01:39.183] invisible(muffled) [18:01:39.183] } [18:01:39.183] muffleCondition(cond, pattern = "^muffle") [18:01:39.183] } [18:01:39.183] } [18:01:39.183] else { [18:01:39.183] if (TRUE) { [18:01:39.183] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.183] { [18:01:39.183] inherits <- base::inherits [18:01:39.183] invokeRestart <- base::invokeRestart [18:01:39.183] is.null <- base::is.null [18:01:39.183] muffled <- FALSE [18:01:39.183] if (inherits(cond, "message")) { [18:01:39.183] muffled <- grepl(pattern, "muffleMessage") [18:01:39.183] if (muffled) [18:01:39.183] invokeRestart("muffleMessage") [18:01:39.183] } [18:01:39.183] else if (inherits(cond, "warning")) { [18:01:39.183] muffled <- grepl(pattern, "muffleWarning") [18:01:39.183] if (muffled) [18:01:39.183] invokeRestart("muffleWarning") [18:01:39.183] } [18:01:39.183] else if (inherits(cond, "condition")) { [18:01:39.183] if (!is.null(pattern)) { [18:01:39.183] computeRestarts <- base::computeRestarts [18:01:39.183] grepl <- base::grepl [18:01:39.183] restarts <- computeRestarts(cond) [18:01:39.183] for (restart in restarts) { [18:01:39.183] name <- restart$name [18:01:39.183] if (is.null(name)) [18:01:39.183] next [18:01:39.183] if (!grepl(pattern, name)) [18:01:39.183] next [18:01:39.183] invokeRestart(restart) [18:01:39.183] muffled <- TRUE [18:01:39.183] break [18:01:39.183] } [18:01:39.183] } [18:01:39.183] } [18:01:39.183] invisible(muffled) [18:01:39.183] } [18:01:39.183] muffleCondition(cond, pattern = "^muffle") [18:01:39.183] } [18:01:39.183] } [18:01:39.183] } [18:01:39.183] })) [18:01:39.183] }, error = function(ex) { [18:01:39.183] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.183] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.183] ...future.rng), started = ...future.startTime, [18:01:39.183] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.183] version = "1.8"), class = "FutureResult") [18:01:39.183] }, finally = { [18:01:39.183] if (!identical(...future.workdir, getwd())) [18:01:39.183] setwd(...future.workdir) [18:01:39.183] { [18:01:39.183] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.183] ...future.oldOptions$nwarnings <- NULL [18:01:39.183] } [18:01:39.183] base::options(...future.oldOptions) [18:01:39.183] if (.Platform$OS.type == "windows") { [18:01:39.183] old_names <- names(...future.oldEnvVars) [18:01:39.183] envs <- base::Sys.getenv() [18:01:39.183] names <- names(envs) [18:01:39.183] common <- intersect(names, old_names) [18:01:39.183] added <- setdiff(names, old_names) [18:01:39.183] removed <- setdiff(old_names, names) [18:01:39.183] changed <- common[...future.oldEnvVars[common] != [18:01:39.183] envs[common]] [18:01:39.183] NAMES <- toupper(changed) [18:01:39.183] args <- list() [18:01:39.183] for (kk in seq_along(NAMES)) { [18:01:39.183] name <- changed[[kk]] [18:01:39.183] NAME <- NAMES[[kk]] [18:01:39.183] if (name != NAME && is.element(NAME, old_names)) [18:01:39.183] next [18:01:39.183] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.183] } [18:01:39.183] NAMES <- toupper(added) [18:01:39.183] for (kk in seq_along(NAMES)) { [18:01:39.183] name <- added[[kk]] [18:01:39.183] NAME <- NAMES[[kk]] [18:01:39.183] if (name != NAME && is.element(NAME, old_names)) [18:01:39.183] next [18:01:39.183] args[[name]] <- "" [18:01:39.183] } [18:01:39.183] NAMES <- toupper(removed) [18:01:39.183] for (kk in seq_along(NAMES)) { [18:01:39.183] name <- removed[[kk]] [18:01:39.183] NAME <- NAMES[[kk]] [18:01:39.183] if (name != NAME && is.element(NAME, old_names)) [18:01:39.183] next [18:01:39.183] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.183] } [18:01:39.183] if (length(args) > 0) [18:01:39.183] base::do.call(base::Sys.setenv, args = args) [18:01:39.183] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.183] } [18:01:39.183] else { [18:01:39.183] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.183] } [18:01:39.183] { [18:01:39.183] if (base::length(...future.futureOptionsAdded) > [18:01:39.183] 0L) { [18:01:39.183] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.183] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.183] base::options(opts) [18:01:39.183] } [18:01:39.183] { [18:01:39.183] { [18:01:39.183] NULL [18:01:39.183] RNGkind("Mersenne-Twister") [18:01:39.183] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.183] inherits = FALSE) [18:01:39.183] } [18:01:39.183] options(future.plan = NULL) [18:01:39.183] if (is.na(NA_character_)) [18:01:39.183] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.183] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.183] future::plan(list(function (..., envir = parent.frame()) [18:01:39.183] { [18:01:39.183] future <- SequentialFuture(..., envir = envir) [18:01:39.183] if (!future$lazy) [18:01:39.183] future <- run(future) [18:01:39.183] invisible(future) [18:01:39.183] }), .cleanup = FALSE, .init = FALSE) [18:01:39.183] } [18:01:39.183] } [18:01:39.183] } [18:01:39.183] }) [18:01:39.183] if (TRUE) { [18:01:39.183] base::sink(type = "output", split = FALSE) [18:01:39.183] if (TRUE) { [18:01:39.183] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.183] } [18:01:39.183] else { [18:01:39.183] ...future.result["stdout"] <- base::list(NULL) [18:01:39.183] } [18:01:39.183] base::close(...future.stdout) [18:01:39.183] ...future.stdout <- NULL [18:01:39.183] } [18:01:39.183] ...future.result$conditions <- ...future.conditions [18:01:39.183] ...future.result$finished <- base::Sys.time() [18:01:39.183] ...future.result [18:01:39.183] } [18:01:39.187] plan(): Setting new future strategy stack: [18:01:39.187] List of future strategies: [18:01:39.187] 1. sequential: [18:01:39.187] - args: function (..., envir = parent.frame()) [18:01:39.187] - tweaked: FALSE [18:01:39.187] - call: NULL [18:01:39.188] plan(): nbrOfWorkers() = 1 [18:01:39.189] plan(): Setting new future strategy stack: [18:01:39.189] List of future strategies: [18:01:39.189] 1. sequential: [18:01:39.189] - args: function (..., envir = parent.frame()) [18:01:39.189] - tweaked: FALSE [18:01:39.189] - call: plan(strategy) [18:01:39.190] plan(): nbrOfWorkers() = 1 [18:01:39.190] SequentialFuture started (and completed) [18:01:39.190] - Launch lazy future ... done [18:01:39.190] 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" ... [18:01:39.194] resolved() for 'SequentialFuture' ... [18:01:39.195] - state: 'finished' [18:01:39.195] - run: TRUE [18:01:39.195] - result: 'FutureResult' [18:01:39.195] resolved() for 'SequentialFuture' ... done [18:01:39.195] resolved() for 'SequentialFuture' ... [18:01:39.196] - state: 'finished' [18:01:39.196] - run: TRUE [18:01:39.196] - result: 'FutureResult' [18:01:39.196] resolved() for 'SequentialFuture' ... done [18:01:39.196] resolved() for 'SequentialFuture' ... [18:01:39.197] - state: 'finished' [18:01:39.197] - run: TRUE [18:01:39.197] - result: 'FutureResult' [18:01:39.197] 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" ... [18:01:39.200] resolve() on list environment ... [18:01:39.200] recursive: 0 [18:01:39.201] length: 6 [18:01:39.201] elements: 'a', 'b', 'c', 'd', '', '' [18:01:39.201] signalConditionsASAP(numeric, pos=1) ... [18:01:39.202] - nx: 6 [18:01:39.202] - relay: TRUE [18:01:39.202] - stdout: TRUE [18:01:39.202] - signal: TRUE [18:01:39.202] - resignal: FALSE [18:01:39.202] - force: TRUE [18:01:39.202] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.203] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.203] - until=2 [18:01:39.203] - relaying element #2 [18:01:39.203] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.203] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.203] signalConditionsASAP(NULL, pos=1) ... done [18:01:39.204] length: 5 (resolved future 1) [18:01:39.204] resolved() for 'SequentialFuture' ... [18:01:39.204] - state: 'finished' [18:01:39.204] - run: TRUE [18:01:39.204] - result: 'FutureResult' [18:01:39.205] resolved() for 'SequentialFuture' ... done [18:01:39.205] Future #2 [18:01:39.205] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:39.205] - nx: 6 [18:01:39.205] - relay: TRUE [18:01:39.205] - stdout: TRUE [18:01:39.206] - signal: TRUE [18:01:39.206] - resignal: FALSE [18:01:39.206] - force: TRUE [18:01:39.206] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.206] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.206] - until=2 [18:01:39.207] - relaying element #2 [18:01:39.207] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.207] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.207] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:39.207] length: 4 (resolved future 2) [18:01:39.207] resolved() for 'SequentialFuture' ... [18:01:39.208] - state: 'finished' [18:01:39.208] - run: TRUE [18:01:39.208] - result: 'FutureResult' [18:01:39.208] resolved() for 'SequentialFuture' ... done [18:01:39.208] Future #3 [18:01:39.209] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:39.209] - nx: 6 [18:01:39.209] - relay: TRUE [18:01:39.209] - stdout: TRUE [18:01:39.209] - signal: TRUE [18:01:39.209] - resignal: FALSE [18:01:39.209] - force: TRUE [18:01:39.210] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.210] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.210] - until=3 [18:01:39.210] - relaying element #3 [18:01:39.210] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.211] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.211] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:39.211] length: 3 (resolved future 3) [18:01:39.211] resolved() for 'SequentialFuture' ... [18:01:39.211] - state: 'finished' [18:01:39.211] - run: TRUE [18:01:39.212] - result: 'FutureResult' [18:01:39.212] resolved() for 'SequentialFuture' ... done [18:01:39.212] Future #4 [18:01:39.212] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:39.212] - nx: 6 [18:01:39.213] - relay: TRUE [18:01:39.213] - stdout: TRUE [18:01:39.213] - signal: TRUE [18:01:39.213] - resignal: FALSE [18:01:39.213] - force: TRUE [18:01:39.213] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.213] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.214] - until=4 [18:01:39.214] - relaying element #4 [18:01:39.214] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.214] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.214] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:39.215] length: 2 (resolved future 4) [18:01:39.215] signalConditionsASAP(NULL, pos=5) ... [18:01:39.215] - nx: 6 [18:01:39.215] - relay: TRUE [18:01:39.215] - stdout: TRUE [18:01:39.215] - signal: TRUE [18:01:39.215] - resignal: FALSE [18:01:39.216] - force: TRUE [18:01:39.216] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.216] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.216] - until=6 [18:01:39.216] - relaying element #6 [18:01:39.216] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.217] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.217] signalConditionsASAP(NULL, pos=5) ... done [18:01:39.218] length: 1 (resolved future 5) [18:01:39.218] signalConditionsASAP(numeric, pos=6) ... [18:01:39.218] - nx: 6 [18:01:39.218] - relay: TRUE [18:01:39.218] - stdout: TRUE [18:01:39.218] - signal: TRUE [18:01:39.219] - resignal: FALSE [18:01:39.219] - force: TRUE [18:01:39.219] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.219] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.219] - until=6 [18:01:39.219] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.220] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.220] signalConditionsASAP(numeric, pos=6) ... done [18:01:39.220] length: 0 (resolved future 6) [18:01:39.220] Relaying remaining futures [18:01:39.220] signalConditionsASAP(NULL, pos=0) ... [18:01:39.220] - nx: 6 [18:01:39.220] - relay: TRUE [18:01:39.221] - stdout: TRUE [18:01:39.221] - signal: TRUE [18:01:39.221] - resignal: FALSE [18:01:39.221] - force: TRUE [18:01:39.221] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.221] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:39.222] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.222] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.222] signalConditionsASAP(NULL, pos=0) ... done [18:01:39.222] 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) [18:01:39.224] getGlobalsAndPackages() ... [18:01:39.225] Searching for globals... [18:01:39.225] [18:01:39.225] Searching for globals ... DONE [18:01:39.225] - globals: [0] [18:01:39.225] getGlobalsAndPackages() ... DONE [18:01:39.226] run() for 'Future' ... [18:01:39.226] - state: 'created' [18:01:39.226] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.226] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.227] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.227] - Field: 'label' [18:01:39.227] - Field: 'local' [18:01:39.227] - Field: 'owner' [18:01:39.227] - Field: 'envir' [18:01:39.228] - Field: 'packages' [18:01:39.228] - Field: 'gc' [18:01:39.228] - Field: 'conditions' [18:01:39.228] - Field: 'expr' [18:01:39.228] - Field: 'uuid' [18:01:39.228] - Field: 'seed' [18:01:39.229] - Field: 'version' [18:01:39.229] - Field: 'result' [18:01:39.229] - Field: 'asynchronous' [18:01:39.229] - Field: 'calls' [18:01:39.229] - Field: 'globals' [18:01:39.229] - Field: 'stdout' [18:01:39.230] - Field: 'earlySignal' [18:01:39.230] - Field: 'lazy' [18:01:39.230] - Field: 'state' [18:01:39.230] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.230] - Launch lazy future ... [18:01:39.231] Packages needed by the future expression (n = 0): [18:01:39.231] Packages needed by future strategies (n = 0): [18:01:39.231] { [18:01:39.231] { [18:01:39.231] { [18:01:39.231] ...future.startTime <- base::Sys.time() [18:01:39.231] { [18:01:39.231] { [18:01:39.231] { [18:01:39.231] base::local({ [18:01:39.231] has_future <- base::requireNamespace("future", [18:01:39.231] quietly = TRUE) [18:01:39.231] if (has_future) { [18:01:39.231] ns <- base::getNamespace("future") [18:01:39.231] version <- ns[[".package"]][["version"]] [18:01:39.231] if (is.null(version)) [18:01:39.231] version <- utils::packageVersion("future") [18:01:39.231] } [18:01:39.231] else { [18:01:39.231] version <- NULL [18:01:39.231] } [18:01:39.231] if (!has_future || version < "1.8.0") { [18:01:39.231] info <- base::c(r_version = base::gsub("R version ", [18:01:39.231] "", base::R.version$version.string), [18:01:39.231] platform = base::sprintf("%s (%s-bit)", [18:01:39.231] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.231] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.231] "release", "version")], collapse = " "), [18:01:39.231] hostname = base::Sys.info()[["nodename"]]) [18:01:39.231] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.231] info) [18:01:39.231] info <- base::paste(info, collapse = "; ") [18:01:39.231] if (!has_future) { [18:01:39.231] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.231] info) [18:01:39.231] } [18:01:39.231] else { [18:01:39.231] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.231] info, version) [18:01:39.231] } [18:01:39.231] base::stop(msg) [18:01:39.231] } [18:01:39.231] }) [18:01:39.231] } [18:01:39.231] options(future.plan = NULL) [18:01:39.231] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.231] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.231] } [18:01:39.231] ...future.workdir <- getwd() [18:01:39.231] } [18:01:39.231] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.231] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.231] } [18:01:39.231] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.231] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.231] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.231] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.231] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.231] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.231] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.231] base::names(...future.oldOptions)) [18:01:39.231] } [18:01:39.231] if (FALSE) { [18:01:39.231] } [18:01:39.231] else { [18:01:39.231] if (TRUE) { [18:01:39.231] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.231] open = "w") [18:01:39.231] } [18:01:39.231] else { [18:01:39.231] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.231] windows = "NUL", "/dev/null"), open = "w") [18:01:39.231] } [18:01:39.231] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.231] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.231] base::sink(type = "output", split = FALSE) [18:01:39.231] base::close(...future.stdout) [18:01:39.231] }, add = TRUE) [18:01:39.231] } [18:01:39.231] ...future.frame <- base::sys.nframe() [18:01:39.231] ...future.conditions <- base::list() [18:01:39.231] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.231] if (FALSE) { [18:01:39.231] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.231] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.231] } [18:01:39.231] ...future.result <- base::tryCatch({ [18:01:39.231] base::withCallingHandlers({ [18:01:39.231] ...future.value <- base::withVisible(base::local(2)) [18:01:39.231] future::FutureResult(value = ...future.value$value, [18:01:39.231] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.231] ...future.rng), globalenv = if (FALSE) [18:01:39.231] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.231] ...future.globalenv.names)) [18:01:39.231] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.231] }, condition = base::local({ [18:01:39.231] c <- base::c [18:01:39.231] inherits <- base::inherits [18:01:39.231] invokeRestart <- base::invokeRestart [18:01:39.231] length <- base::length [18:01:39.231] list <- base::list [18:01:39.231] seq.int <- base::seq.int [18:01:39.231] signalCondition <- base::signalCondition [18:01:39.231] sys.calls <- base::sys.calls [18:01:39.231] `[[` <- base::`[[` [18:01:39.231] `+` <- base::`+` [18:01:39.231] `<<-` <- base::`<<-` [18:01:39.231] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.231] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.231] 3L)] [18:01:39.231] } [18:01:39.231] function(cond) { [18:01:39.231] is_error <- inherits(cond, "error") [18:01:39.231] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.231] NULL) [18:01:39.231] if (is_error) { [18:01:39.231] sessionInformation <- function() { [18:01:39.231] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.231] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.231] search = base::search(), system = base::Sys.info()) [18:01:39.231] } [18:01:39.231] ...future.conditions[[length(...future.conditions) + [18:01:39.231] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.231] cond$call), session = sessionInformation(), [18:01:39.231] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.231] signalCondition(cond) [18:01:39.231] } [18:01:39.231] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.231] "immediateCondition"))) { [18:01:39.231] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.231] ...future.conditions[[length(...future.conditions) + [18:01:39.231] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.231] if (TRUE && !signal) { [18:01:39.231] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.231] { [18:01:39.231] inherits <- base::inherits [18:01:39.231] invokeRestart <- base::invokeRestart [18:01:39.231] is.null <- base::is.null [18:01:39.231] muffled <- FALSE [18:01:39.231] if (inherits(cond, "message")) { [18:01:39.231] muffled <- grepl(pattern, "muffleMessage") [18:01:39.231] if (muffled) [18:01:39.231] invokeRestart("muffleMessage") [18:01:39.231] } [18:01:39.231] else if (inherits(cond, "warning")) { [18:01:39.231] muffled <- grepl(pattern, "muffleWarning") [18:01:39.231] if (muffled) [18:01:39.231] invokeRestart("muffleWarning") [18:01:39.231] } [18:01:39.231] else if (inherits(cond, "condition")) { [18:01:39.231] if (!is.null(pattern)) { [18:01:39.231] computeRestarts <- base::computeRestarts [18:01:39.231] grepl <- base::grepl [18:01:39.231] restarts <- computeRestarts(cond) [18:01:39.231] for (restart in restarts) { [18:01:39.231] name <- restart$name [18:01:39.231] if (is.null(name)) [18:01:39.231] next [18:01:39.231] if (!grepl(pattern, name)) [18:01:39.231] next [18:01:39.231] invokeRestart(restart) [18:01:39.231] muffled <- TRUE [18:01:39.231] break [18:01:39.231] } [18:01:39.231] } [18:01:39.231] } [18:01:39.231] invisible(muffled) [18:01:39.231] } [18:01:39.231] muffleCondition(cond, pattern = "^muffle") [18:01:39.231] } [18:01:39.231] } [18:01:39.231] else { [18:01:39.231] if (TRUE) { [18:01:39.231] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.231] { [18:01:39.231] inherits <- base::inherits [18:01:39.231] invokeRestart <- base::invokeRestart [18:01:39.231] is.null <- base::is.null [18:01:39.231] muffled <- FALSE [18:01:39.231] if (inherits(cond, "message")) { [18:01:39.231] muffled <- grepl(pattern, "muffleMessage") [18:01:39.231] if (muffled) [18:01:39.231] invokeRestart("muffleMessage") [18:01:39.231] } [18:01:39.231] else if (inherits(cond, "warning")) { [18:01:39.231] muffled <- grepl(pattern, "muffleWarning") [18:01:39.231] if (muffled) [18:01:39.231] invokeRestart("muffleWarning") [18:01:39.231] } [18:01:39.231] else if (inherits(cond, "condition")) { [18:01:39.231] if (!is.null(pattern)) { [18:01:39.231] computeRestarts <- base::computeRestarts [18:01:39.231] grepl <- base::grepl [18:01:39.231] restarts <- computeRestarts(cond) [18:01:39.231] for (restart in restarts) { [18:01:39.231] name <- restart$name [18:01:39.231] if (is.null(name)) [18:01:39.231] next [18:01:39.231] if (!grepl(pattern, name)) [18:01:39.231] next [18:01:39.231] invokeRestart(restart) [18:01:39.231] muffled <- TRUE [18:01:39.231] break [18:01:39.231] } [18:01:39.231] } [18:01:39.231] } [18:01:39.231] invisible(muffled) [18:01:39.231] } [18:01:39.231] muffleCondition(cond, pattern = "^muffle") [18:01:39.231] } [18:01:39.231] } [18:01:39.231] } [18:01:39.231] })) [18:01:39.231] }, error = function(ex) { [18:01:39.231] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.231] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.231] ...future.rng), started = ...future.startTime, [18:01:39.231] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.231] version = "1.8"), class = "FutureResult") [18:01:39.231] }, finally = { [18:01:39.231] if (!identical(...future.workdir, getwd())) [18:01:39.231] setwd(...future.workdir) [18:01:39.231] { [18:01:39.231] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.231] ...future.oldOptions$nwarnings <- NULL [18:01:39.231] } [18:01:39.231] base::options(...future.oldOptions) [18:01:39.231] if (.Platform$OS.type == "windows") { [18:01:39.231] old_names <- names(...future.oldEnvVars) [18:01:39.231] envs <- base::Sys.getenv() [18:01:39.231] names <- names(envs) [18:01:39.231] common <- intersect(names, old_names) [18:01:39.231] added <- setdiff(names, old_names) [18:01:39.231] removed <- setdiff(old_names, names) [18:01:39.231] changed <- common[...future.oldEnvVars[common] != [18:01:39.231] envs[common]] [18:01:39.231] NAMES <- toupper(changed) [18:01:39.231] args <- list() [18:01:39.231] for (kk in seq_along(NAMES)) { [18:01:39.231] name <- changed[[kk]] [18:01:39.231] NAME <- NAMES[[kk]] [18:01:39.231] if (name != NAME && is.element(NAME, old_names)) [18:01:39.231] next [18:01:39.231] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.231] } [18:01:39.231] NAMES <- toupper(added) [18:01:39.231] for (kk in seq_along(NAMES)) { [18:01:39.231] name <- added[[kk]] [18:01:39.231] NAME <- NAMES[[kk]] [18:01:39.231] if (name != NAME && is.element(NAME, old_names)) [18:01:39.231] next [18:01:39.231] args[[name]] <- "" [18:01:39.231] } [18:01:39.231] NAMES <- toupper(removed) [18:01:39.231] for (kk in seq_along(NAMES)) { [18:01:39.231] name <- removed[[kk]] [18:01:39.231] NAME <- NAMES[[kk]] [18:01:39.231] if (name != NAME && is.element(NAME, old_names)) [18:01:39.231] next [18:01:39.231] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.231] } [18:01:39.231] if (length(args) > 0) [18:01:39.231] base::do.call(base::Sys.setenv, args = args) [18:01:39.231] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.231] } [18:01:39.231] else { [18:01:39.231] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.231] } [18:01:39.231] { [18:01:39.231] if (base::length(...future.futureOptionsAdded) > [18:01:39.231] 0L) { [18:01:39.231] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.231] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.231] base::options(opts) [18:01:39.231] } [18:01:39.231] { [18:01:39.231] { [18:01:39.231] NULL [18:01:39.231] RNGkind("Mersenne-Twister") [18:01:39.231] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.231] inherits = FALSE) [18:01:39.231] } [18:01:39.231] options(future.plan = NULL) [18:01:39.231] if (is.na(NA_character_)) [18:01:39.231] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.231] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.231] future::plan(list(function (..., envir = parent.frame()) [18:01:39.231] { [18:01:39.231] future <- SequentialFuture(..., envir = envir) [18:01:39.231] if (!future$lazy) [18:01:39.231] future <- run(future) [18:01:39.231] invisible(future) [18:01:39.231] }), .cleanup = FALSE, .init = FALSE) [18:01:39.231] } [18:01:39.231] } [18:01:39.231] } [18:01:39.231] }) [18:01:39.231] if (TRUE) { [18:01:39.231] base::sink(type = "output", split = FALSE) [18:01:39.231] if (TRUE) { [18:01:39.231] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.231] } [18:01:39.231] else { [18:01:39.231] ...future.result["stdout"] <- base::list(NULL) [18:01:39.231] } [18:01:39.231] base::close(...future.stdout) [18:01:39.231] ...future.stdout <- NULL [18:01:39.231] } [18:01:39.231] ...future.result$conditions <- ...future.conditions [18:01:39.231] ...future.result$finished <- base::Sys.time() [18:01:39.231] ...future.result [18:01:39.231] } [18:01:39.235] plan(): Setting new future strategy stack: [18:01:39.235] List of future strategies: [18:01:39.235] 1. sequential: [18:01:39.235] - args: function (..., envir = parent.frame()) [18:01:39.235] - tweaked: FALSE [18:01:39.235] - call: NULL [18:01:39.236] plan(): nbrOfWorkers() = 1 [18:01:39.237] plan(): Setting new future strategy stack: [18:01:39.237] List of future strategies: [18:01:39.237] 1. sequential: [18:01:39.237] - args: function (..., envir = parent.frame()) [18:01:39.237] - tweaked: FALSE [18:01:39.237] - call: plan(strategy) [18:01:39.238] plan(): nbrOfWorkers() = 1 [18:01:39.238] SequentialFuture started (and completed) [18:01:39.238] - Launch lazy future ... done [18:01:39.238] run() for 'SequentialFuture' ... done [18:01:39.238] getGlobalsAndPackages() ... [18:01:39.239] Searching for globals... [18:01:39.239] [18:01:39.239] Searching for globals ... DONE [18:01:39.239] - globals: [0] [18:01:39.239] getGlobalsAndPackages() ... DONE [18:01:39.240] run() for 'Future' ... [18:01:39.240] - state: 'created' [18:01:39.240] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.240] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.241] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.241] - Field: 'label' [18:01:39.241] - Field: 'local' [18:01:39.241] - Field: 'owner' [18:01:39.241] - Field: 'envir' [18:01:39.242] - Field: 'packages' [18:01:39.242] - Field: 'gc' [18:01:39.242] - Field: 'conditions' [18:01:39.242] - Field: 'expr' [18:01:39.242] - Field: 'uuid' [18:01:39.242] - Field: 'seed' [18:01:39.243] - Field: 'version' [18:01:39.243] - Field: 'result' [18:01:39.243] - Field: 'asynchronous' [18:01:39.243] - Field: 'calls' [18:01:39.243] - Field: 'globals' [18:01:39.243] - Field: 'stdout' [18:01:39.244] - Field: 'earlySignal' [18:01:39.244] - Field: 'lazy' [18:01:39.244] - Field: 'state' [18:01:39.244] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.244] - Launch lazy future ... [18:01:39.245] Packages needed by the future expression (n = 0): [18:01:39.245] Packages needed by future strategies (n = 0): [18:01:39.245] { [18:01:39.245] { [18:01:39.245] { [18:01:39.245] ...future.startTime <- base::Sys.time() [18:01:39.245] { [18:01:39.245] { [18:01:39.245] { [18:01:39.245] base::local({ [18:01:39.245] has_future <- base::requireNamespace("future", [18:01:39.245] quietly = TRUE) [18:01:39.245] if (has_future) { [18:01:39.245] ns <- base::getNamespace("future") [18:01:39.245] version <- ns[[".package"]][["version"]] [18:01:39.245] if (is.null(version)) [18:01:39.245] version <- utils::packageVersion("future") [18:01:39.245] } [18:01:39.245] else { [18:01:39.245] version <- NULL [18:01:39.245] } [18:01:39.245] if (!has_future || version < "1.8.0") { [18:01:39.245] info <- base::c(r_version = base::gsub("R version ", [18:01:39.245] "", base::R.version$version.string), [18:01:39.245] platform = base::sprintf("%s (%s-bit)", [18:01:39.245] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.245] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.245] "release", "version")], collapse = " "), [18:01:39.245] hostname = base::Sys.info()[["nodename"]]) [18:01:39.245] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.245] info) [18:01:39.245] info <- base::paste(info, collapse = "; ") [18:01:39.245] if (!has_future) { [18:01:39.245] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.245] info) [18:01:39.245] } [18:01:39.245] else { [18:01:39.245] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.245] info, version) [18:01:39.245] } [18:01:39.245] base::stop(msg) [18:01:39.245] } [18:01:39.245] }) [18:01:39.245] } [18:01:39.245] options(future.plan = NULL) [18:01:39.245] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.245] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.245] } [18:01:39.245] ...future.workdir <- getwd() [18:01:39.245] } [18:01:39.245] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.245] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.245] } [18:01:39.245] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.245] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.245] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.245] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.245] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.245] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.245] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.245] base::names(...future.oldOptions)) [18:01:39.245] } [18:01:39.245] if (FALSE) { [18:01:39.245] } [18:01:39.245] else { [18:01:39.245] if (TRUE) { [18:01:39.245] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.245] open = "w") [18:01:39.245] } [18:01:39.245] else { [18:01:39.245] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.245] windows = "NUL", "/dev/null"), open = "w") [18:01:39.245] } [18:01:39.245] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.245] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.245] base::sink(type = "output", split = FALSE) [18:01:39.245] base::close(...future.stdout) [18:01:39.245] }, add = TRUE) [18:01:39.245] } [18:01:39.245] ...future.frame <- base::sys.nframe() [18:01:39.245] ...future.conditions <- base::list() [18:01:39.245] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.245] if (FALSE) { [18:01:39.245] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.245] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.245] } [18:01:39.245] ...future.result <- base::tryCatch({ [18:01:39.245] base::withCallingHandlers({ [18:01:39.245] ...future.value <- base::withVisible(base::local(NULL)) [18:01:39.245] future::FutureResult(value = ...future.value$value, [18:01:39.245] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.245] ...future.rng), globalenv = if (FALSE) [18:01:39.245] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.245] ...future.globalenv.names)) [18:01:39.245] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.245] }, condition = base::local({ [18:01:39.245] c <- base::c [18:01:39.245] inherits <- base::inherits [18:01:39.245] invokeRestart <- base::invokeRestart [18:01:39.245] length <- base::length [18:01:39.245] list <- base::list [18:01:39.245] seq.int <- base::seq.int [18:01:39.245] signalCondition <- base::signalCondition [18:01:39.245] sys.calls <- base::sys.calls [18:01:39.245] `[[` <- base::`[[` [18:01:39.245] `+` <- base::`+` [18:01:39.245] `<<-` <- base::`<<-` [18:01:39.245] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.245] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.245] 3L)] [18:01:39.245] } [18:01:39.245] function(cond) { [18:01:39.245] is_error <- inherits(cond, "error") [18:01:39.245] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.245] NULL) [18:01:39.245] if (is_error) { [18:01:39.245] sessionInformation <- function() { [18:01:39.245] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.245] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.245] search = base::search(), system = base::Sys.info()) [18:01:39.245] } [18:01:39.245] ...future.conditions[[length(...future.conditions) + [18:01:39.245] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.245] cond$call), session = sessionInformation(), [18:01:39.245] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.245] signalCondition(cond) [18:01:39.245] } [18:01:39.245] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.245] "immediateCondition"))) { [18:01:39.245] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.245] ...future.conditions[[length(...future.conditions) + [18:01:39.245] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.245] if (TRUE && !signal) { [18:01:39.245] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.245] { [18:01:39.245] inherits <- base::inherits [18:01:39.245] invokeRestart <- base::invokeRestart [18:01:39.245] is.null <- base::is.null [18:01:39.245] muffled <- FALSE [18:01:39.245] if (inherits(cond, "message")) { [18:01:39.245] muffled <- grepl(pattern, "muffleMessage") [18:01:39.245] if (muffled) [18:01:39.245] invokeRestart("muffleMessage") [18:01:39.245] } [18:01:39.245] else if (inherits(cond, "warning")) { [18:01:39.245] muffled <- grepl(pattern, "muffleWarning") [18:01:39.245] if (muffled) [18:01:39.245] invokeRestart("muffleWarning") [18:01:39.245] } [18:01:39.245] else if (inherits(cond, "condition")) { [18:01:39.245] if (!is.null(pattern)) { [18:01:39.245] computeRestarts <- base::computeRestarts [18:01:39.245] grepl <- base::grepl [18:01:39.245] restarts <- computeRestarts(cond) [18:01:39.245] for (restart in restarts) { [18:01:39.245] name <- restart$name [18:01:39.245] if (is.null(name)) [18:01:39.245] next [18:01:39.245] if (!grepl(pattern, name)) [18:01:39.245] next [18:01:39.245] invokeRestart(restart) [18:01:39.245] muffled <- TRUE [18:01:39.245] break [18:01:39.245] } [18:01:39.245] } [18:01:39.245] } [18:01:39.245] invisible(muffled) [18:01:39.245] } [18:01:39.245] muffleCondition(cond, pattern = "^muffle") [18:01:39.245] } [18:01:39.245] } [18:01:39.245] else { [18:01:39.245] if (TRUE) { [18:01:39.245] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.245] { [18:01:39.245] inherits <- base::inherits [18:01:39.245] invokeRestart <- base::invokeRestart [18:01:39.245] is.null <- base::is.null [18:01:39.245] muffled <- FALSE [18:01:39.245] if (inherits(cond, "message")) { [18:01:39.245] muffled <- grepl(pattern, "muffleMessage") [18:01:39.245] if (muffled) [18:01:39.245] invokeRestart("muffleMessage") [18:01:39.245] } [18:01:39.245] else if (inherits(cond, "warning")) { [18:01:39.245] muffled <- grepl(pattern, "muffleWarning") [18:01:39.245] if (muffled) [18:01:39.245] invokeRestart("muffleWarning") [18:01:39.245] } [18:01:39.245] else if (inherits(cond, "condition")) { [18:01:39.245] if (!is.null(pattern)) { [18:01:39.245] computeRestarts <- base::computeRestarts [18:01:39.245] grepl <- base::grepl [18:01:39.245] restarts <- computeRestarts(cond) [18:01:39.245] for (restart in restarts) { [18:01:39.245] name <- restart$name [18:01:39.245] if (is.null(name)) [18:01:39.245] next [18:01:39.245] if (!grepl(pattern, name)) [18:01:39.245] next [18:01:39.245] invokeRestart(restart) [18:01:39.245] muffled <- TRUE [18:01:39.245] break [18:01:39.245] } [18:01:39.245] } [18:01:39.245] } [18:01:39.245] invisible(muffled) [18:01:39.245] } [18:01:39.245] muffleCondition(cond, pattern = "^muffle") [18:01:39.245] } [18:01:39.245] } [18:01:39.245] } [18:01:39.245] })) [18:01:39.245] }, error = function(ex) { [18:01:39.245] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.245] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.245] ...future.rng), started = ...future.startTime, [18:01:39.245] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.245] version = "1.8"), class = "FutureResult") [18:01:39.245] }, finally = { [18:01:39.245] if (!identical(...future.workdir, getwd())) [18:01:39.245] setwd(...future.workdir) [18:01:39.245] { [18:01:39.245] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.245] ...future.oldOptions$nwarnings <- NULL [18:01:39.245] } [18:01:39.245] base::options(...future.oldOptions) [18:01:39.245] if (.Platform$OS.type == "windows") { [18:01:39.245] old_names <- names(...future.oldEnvVars) [18:01:39.245] envs <- base::Sys.getenv() [18:01:39.245] names <- names(envs) [18:01:39.245] common <- intersect(names, old_names) [18:01:39.245] added <- setdiff(names, old_names) [18:01:39.245] removed <- setdiff(old_names, names) [18:01:39.245] changed <- common[...future.oldEnvVars[common] != [18:01:39.245] envs[common]] [18:01:39.245] NAMES <- toupper(changed) [18:01:39.245] args <- list() [18:01:39.245] for (kk in seq_along(NAMES)) { [18:01:39.245] name <- changed[[kk]] [18:01:39.245] NAME <- NAMES[[kk]] [18:01:39.245] if (name != NAME && is.element(NAME, old_names)) [18:01:39.245] next [18:01:39.245] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.245] } [18:01:39.245] NAMES <- toupper(added) [18:01:39.245] for (kk in seq_along(NAMES)) { [18:01:39.245] name <- added[[kk]] [18:01:39.245] NAME <- NAMES[[kk]] [18:01:39.245] if (name != NAME && is.element(NAME, old_names)) [18:01:39.245] next [18:01:39.245] args[[name]] <- "" [18:01:39.245] } [18:01:39.245] NAMES <- toupper(removed) [18:01:39.245] for (kk in seq_along(NAMES)) { [18:01:39.245] name <- removed[[kk]] [18:01:39.245] NAME <- NAMES[[kk]] [18:01:39.245] if (name != NAME && is.element(NAME, old_names)) [18:01:39.245] next [18:01:39.245] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.245] } [18:01:39.245] if (length(args) > 0) [18:01:39.245] base::do.call(base::Sys.setenv, args = args) [18:01:39.245] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.245] } [18:01:39.245] else { [18:01:39.245] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.245] } [18:01:39.245] { [18:01:39.245] if (base::length(...future.futureOptionsAdded) > [18:01:39.245] 0L) { [18:01:39.245] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.245] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.245] base::options(opts) [18:01:39.245] } [18:01:39.245] { [18:01:39.245] { [18:01:39.245] NULL [18:01:39.245] RNGkind("Mersenne-Twister") [18:01:39.245] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.245] inherits = FALSE) [18:01:39.245] } [18:01:39.245] options(future.plan = NULL) [18:01:39.245] if (is.na(NA_character_)) [18:01:39.245] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.245] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.245] future::plan(list(function (..., envir = parent.frame()) [18:01:39.245] { [18:01:39.245] future <- SequentialFuture(..., envir = envir) [18:01:39.245] if (!future$lazy) [18:01:39.245] future <- run(future) [18:01:39.245] invisible(future) [18:01:39.245] }), .cleanup = FALSE, .init = FALSE) [18:01:39.245] } [18:01:39.245] } [18:01:39.245] } [18:01:39.245] }) [18:01:39.245] if (TRUE) { [18:01:39.245] base::sink(type = "output", split = FALSE) [18:01:39.245] if (TRUE) { [18:01:39.245] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.245] } [18:01:39.245] else { [18:01:39.245] ...future.result["stdout"] <- base::list(NULL) [18:01:39.245] } [18:01:39.245] base::close(...future.stdout) [18:01:39.245] ...future.stdout <- NULL [18:01:39.245] } [18:01:39.245] ...future.result$conditions <- ...future.conditions [18:01:39.245] ...future.result$finished <- base::Sys.time() [18:01:39.245] ...future.result [18:01:39.245] } [18:01:39.249] plan(): Setting new future strategy stack: [18:01:39.249] List of future strategies: [18:01:39.249] 1. sequential: [18:01:39.249] - args: function (..., envir = parent.frame()) [18:01:39.249] - tweaked: FALSE [18:01:39.249] - call: NULL [18:01:39.250] plan(): nbrOfWorkers() = 1 [18:01:39.251] plan(): Setting new future strategy stack: [18:01:39.251] List of future strategies: [18:01:39.251] 1. sequential: [18:01:39.251] - args: function (..., envir = parent.frame()) [18:01:39.251] - tweaked: FALSE [18:01:39.251] - call: plan(strategy) [18:01:39.252] plan(): nbrOfWorkers() = 1 [18:01:39.252] SequentialFuture started (and completed) [18:01:39.252] - Launch lazy future ... done [18:01:39.252] run() for 'SequentialFuture' ... done [18:01:39.253] getGlobalsAndPackages() ... [18:01:39.253] Searching for globals... [18:01:39.253] - globals found: [1] '{' [18:01:39.254] Searching for globals ... DONE [18:01:39.254] Resolving globals: FALSE [18:01:39.254] [18:01:39.254] [18:01:39.254] getGlobalsAndPackages() ... DONE [18:01:39.255] run() for 'Future' ... [18:01:39.255] - state: 'created' [18:01:39.255] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.256] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.256] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.256] - Field: 'label' [18:01:39.256] - Field: 'local' [18:01:39.256] - Field: 'owner' [18:01:39.256] - Field: 'envir' [18:01:39.257] - Field: 'packages' [18:01:39.257] - Field: 'gc' [18:01:39.257] - Field: 'conditions' [18:01:39.257] - Field: 'expr' [18:01:39.257] - Field: 'uuid' [18:01:39.258] - Field: 'seed' [18:01:39.258] - Field: 'version' [18:01:39.258] - Field: 'result' [18:01:39.258] - Field: 'asynchronous' [18:01:39.258] - Field: 'calls' [18:01:39.258] - Field: 'globals' [18:01:39.259] - Field: 'stdout' [18:01:39.259] - Field: 'earlySignal' [18:01:39.259] - Field: 'lazy' [18:01:39.259] - Field: 'state' [18:01:39.259] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.260] - Launch lazy future ... [18:01:39.261] Packages needed by the future expression (n = 0): [18:01:39.261] Packages needed by future strategies (n = 0): [18:01:39.261] { [18:01:39.261] { [18:01:39.261] { [18:01:39.261] ...future.startTime <- base::Sys.time() [18:01:39.261] { [18:01:39.261] { [18:01:39.261] { [18:01:39.261] base::local({ [18:01:39.261] has_future <- base::requireNamespace("future", [18:01:39.261] quietly = TRUE) [18:01:39.261] if (has_future) { [18:01:39.261] ns <- base::getNamespace("future") [18:01:39.261] version <- ns[[".package"]][["version"]] [18:01:39.261] if (is.null(version)) [18:01:39.261] version <- utils::packageVersion("future") [18:01:39.261] } [18:01:39.261] else { [18:01:39.261] version <- NULL [18:01:39.261] } [18:01:39.261] if (!has_future || version < "1.8.0") { [18:01:39.261] info <- base::c(r_version = base::gsub("R version ", [18:01:39.261] "", base::R.version$version.string), [18:01:39.261] platform = base::sprintf("%s (%s-bit)", [18:01:39.261] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.261] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.261] "release", "version")], collapse = " "), [18:01:39.261] hostname = base::Sys.info()[["nodename"]]) [18:01:39.261] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.261] info) [18:01:39.261] info <- base::paste(info, collapse = "; ") [18:01:39.261] if (!has_future) { [18:01:39.261] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.261] info) [18:01:39.261] } [18:01:39.261] else { [18:01:39.261] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.261] info, version) [18:01:39.261] } [18:01:39.261] base::stop(msg) [18:01:39.261] } [18:01:39.261] }) [18:01:39.261] } [18:01:39.261] options(future.plan = NULL) [18:01:39.261] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.261] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.261] } [18:01:39.261] ...future.workdir <- getwd() [18:01:39.261] } [18:01:39.261] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.261] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.261] } [18:01:39.261] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.261] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.261] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.261] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.261] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.261] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.261] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.261] base::names(...future.oldOptions)) [18:01:39.261] } [18:01:39.261] if (FALSE) { [18:01:39.261] } [18:01:39.261] else { [18:01:39.261] if (TRUE) { [18:01:39.261] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.261] open = "w") [18:01:39.261] } [18:01:39.261] else { [18:01:39.261] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.261] windows = "NUL", "/dev/null"), open = "w") [18:01:39.261] } [18:01:39.261] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.261] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.261] base::sink(type = "output", split = FALSE) [18:01:39.261] base::close(...future.stdout) [18:01:39.261] }, add = TRUE) [18:01:39.261] } [18:01:39.261] ...future.frame <- base::sys.nframe() [18:01:39.261] ...future.conditions <- base::list() [18:01:39.261] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.261] if (FALSE) { [18:01:39.261] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.261] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.261] } [18:01:39.261] ...future.result <- base::tryCatch({ [18:01:39.261] base::withCallingHandlers({ [18:01:39.261] ...future.value <- base::withVisible(base::local({ [18:01:39.261] 4 [18:01:39.261] })) [18:01:39.261] future::FutureResult(value = ...future.value$value, [18:01:39.261] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.261] ...future.rng), globalenv = if (FALSE) [18:01:39.261] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.261] ...future.globalenv.names)) [18:01:39.261] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.261] }, condition = base::local({ [18:01:39.261] c <- base::c [18:01:39.261] inherits <- base::inherits [18:01:39.261] invokeRestart <- base::invokeRestart [18:01:39.261] length <- base::length [18:01:39.261] list <- base::list [18:01:39.261] seq.int <- base::seq.int [18:01:39.261] signalCondition <- base::signalCondition [18:01:39.261] sys.calls <- base::sys.calls [18:01:39.261] `[[` <- base::`[[` [18:01:39.261] `+` <- base::`+` [18:01:39.261] `<<-` <- base::`<<-` [18:01:39.261] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.261] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.261] 3L)] [18:01:39.261] } [18:01:39.261] function(cond) { [18:01:39.261] is_error <- inherits(cond, "error") [18:01:39.261] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.261] NULL) [18:01:39.261] if (is_error) { [18:01:39.261] sessionInformation <- function() { [18:01:39.261] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.261] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.261] search = base::search(), system = base::Sys.info()) [18:01:39.261] } [18:01:39.261] ...future.conditions[[length(...future.conditions) + [18:01:39.261] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.261] cond$call), session = sessionInformation(), [18:01:39.261] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.261] signalCondition(cond) [18:01:39.261] } [18:01:39.261] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.261] "immediateCondition"))) { [18:01:39.261] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.261] ...future.conditions[[length(...future.conditions) + [18:01:39.261] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.261] if (TRUE && !signal) { [18:01:39.261] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.261] { [18:01:39.261] inherits <- base::inherits [18:01:39.261] invokeRestart <- base::invokeRestart [18:01:39.261] is.null <- base::is.null [18:01:39.261] muffled <- FALSE [18:01:39.261] if (inherits(cond, "message")) { [18:01:39.261] muffled <- grepl(pattern, "muffleMessage") [18:01:39.261] if (muffled) [18:01:39.261] invokeRestart("muffleMessage") [18:01:39.261] } [18:01:39.261] else if (inherits(cond, "warning")) { [18:01:39.261] muffled <- grepl(pattern, "muffleWarning") [18:01:39.261] if (muffled) [18:01:39.261] invokeRestart("muffleWarning") [18:01:39.261] } [18:01:39.261] else if (inherits(cond, "condition")) { [18:01:39.261] if (!is.null(pattern)) { [18:01:39.261] computeRestarts <- base::computeRestarts [18:01:39.261] grepl <- base::grepl [18:01:39.261] restarts <- computeRestarts(cond) [18:01:39.261] for (restart in restarts) { [18:01:39.261] name <- restart$name [18:01:39.261] if (is.null(name)) [18:01:39.261] next [18:01:39.261] if (!grepl(pattern, name)) [18:01:39.261] next [18:01:39.261] invokeRestart(restart) [18:01:39.261] muffled <- TRUE [18:01:39.261] break [18:01:39.261] } [18:01:39.261] } [18:01:39.261] } [18:01:39.261] invisible(muffled) [18:01:39.261] } [18:01:39.261] muffleCondition(cond, pattern = "^muffle") [18:01:39.261] } [18:01:39.261] } [18:01:39.261] else { [18:01:39.261] if (TRUE) { [18:01:39.261] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.261] { [18:01:39.261] inherits <- base::inherits [18:01:39.261] invokeRestart <- base::invokeRestart [18:01:39.261] is.null <- base::is.null [18:01:39.261] muffled <- FALSE [18:01:39.261] if (inherits(cond, "message")) { [18:01:39.261] muffled <- grepl(pattern, "muffleMessage") [18:01:39.261] if (muffled) [18:01:39.261] invokeRestart("muffleMessage") [18:01:39.261] } [18:01:39.261] else if (inherits(cond, "warning")) { [18:01:39.261] muffled <- grepl(pattern, "muffleWarning") [18:01:39.261] if (muffled) [18:01:39.261] invokeRestart("muffleWarning") [18:01:39.261] } [18:01:39.261] else if (inherits(cond, "condition")) { [18:01:39.261] if (!is.null(pattern)) { [18:01:39.261] computeRestarts <- base::computeRestarts [18:01:39.261] grepl <- base::grepl [18:01:39.261] restarts <- computeRestarts(cond) [18:01:39.261] for (restart in restarts) { [18:01:39.261] name <- restart$name [18:01:39.261] if (is.null(name)) [18:01:39.261] next [18:01:39.261] if (!grepl(pattern, name)) [18:01:39.261] next [18:01:39.261] invokeRestart(restart) [18:01:39.261] muffled <- TRUE [18:01:39.261] break [18:01:39.261] } [18:01:39.261] } [18:01:39.261] } [18:01:39.261] invisible(muffled) [18:01:39.261] } [18:01:39.261] muffleCondition(cond, pattern = "^muffle") [18:01:39.261] } [18:01:39.261] } [18:01:39.261] } [18:01:39.261] })) [18:01:39.261] }, error = function(ex) { [18:01:39.261] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.261] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.261] ...future.rng), started = ...future.startTime, [18:01:39.261] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.261] version = "1.8"), class = "FutureResult") [18:01:39.261] }, finally = { [18:01:39.261] if (!identical(...future.workdir, getwd())) [18:01:39.261] setwd(...future.workdir) [18:01:39.261] { [18:01:39.261] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.261] ...future.oldOptions$nwarnings <- NULL [18:01:39.261] } [18:01:39.261] base::options(...future.oldOptions) [18:01:39.261] if (.Platform$OS.type == "windows") { [18:01:39.261] old_names <- names(...future.oldEnvVars) [18:01:39.261] envs <- base::Sys.getenv() [18:01:39.261] names <- names(envs) [18:01:39.261] common <- intersect(names, old_names) [18:01:39.261] added <- setdiff(names, old_names) [18:01:39.261] removed <- setdiff(old_names, names) [18:01:39.261] changed <- common[...future.oldEnvVars[common] != [18:01:39.261] envs[common]] [18:01:39.261] NAMES <- toupper(changed) [18:01:39.261] args <- list() [18:01:39.261] for (kk in seq_along(NAMES)) { [18:01:39.261] name <- changed[[kk]] [18:01:39.261] NAME <- NAMES[[kk]] [18:01:39.261] if (name != NAME && is.element(NAME, old_names)) [18:01:39.261] next [18:01:39.261] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.261] } [18:01:39.261] NAMES <- toupper(added) [18:01:39.261] for (kk in seq_along(NAMES)) { [18:01:39.261] name <- added[[kk]] [18:01:39.261] NAME <- NAMES[[kk]] [18:01:39.261] if (name != NAME && is.element(NAME, old_names)) [18:01:39.261] next [18:01:39.261] args[[name]] <- "" [18:01:39.261] } [18:01:39.261] NAMES <- toupper(removed) [18:01:39.261] for (kk in seq_along(NAMES)) { [18:01:39.261] name <- removed[[kk]] [18:01:39.261] NAME <- NAMES[[kk]] [18:01:39.261] if (name != NAME && is.element(NAME, old_names)) [18:01:39.261] next [18:01:39.261] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.261] } [18:01:39.261] if (length(args) > 0) [18:01:39.261] base::do.call(base::Sys.setenv, args = args) [18:01:39.261] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.261] } [18:01:39.261] else { [18:01:39.261] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.261] } [18:01:39.261] { [18:01:39.261] if (base::length(...future.futureOptionsAdded) > [18:01:39.261] 0L) { [18:01:39.261] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.261] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.261] base::options(opts) [18:01:39.261] } [18:01:39.261] { [18:01:39.261] { [18:01:39.261] NULL [18:01:39.261] RNGkind("Mersenne-Twister") [18:01:39.261] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.261] inherits = FALSE) [18:01:39.261] } [18:01:39.261] options(future.plan = NULL) [18:01:39.261] if (is.na(NA_character_)) [18:01:39.261] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.261] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.261] future::plan(list(function (..., envir = parent.frame()) [18:01:39.261] { [18:01:39.261] future <- SequentialFuture(..., envir = envir) [18:01:39.261] if (!future$lazy) [18:01:39.261] future <- run(future) [18:01:39.261] invisible(future) [18:01:39.261] }), .cleanup = FALSE, .init = FALSE) [18:01:39.261] } [18:01:39.261] } [18:01:39.261] } [18:01:39.261] }) [18:01:39.261] if (TRUE) { [18:01:39.261] base::sink(type = "output", split = FALSE) [18:01:39.261] if (TRUE) { [18:01:39.261] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.261] } [18:01:39.261] else { [18:01:39.261] ...future.result["stdout"] <- base::list(NULL) [18:01:39.261] } [18:01:39.261] base::close(...future.stdout) [18:01:39.261] ...future.stdout <- NULL [18:01:39.261] } [18:01:39.261] ...future.result$conditions <- ...future.conditions [18:01:39.261] ...future.result$finished <- base::Sys.time() [18:01:39.261] ...future.result [18:01:39.261] } [18:01:39.265] plan(): Setting new future strategy stack: [18:01:39.265] List of future strategies: [18:01:39.265] 1. sequential: [18:01:39.265] - args: function (..., envir = parent.frame()) [18:01:39.265] - tweaked: FALSE [18:01:39.265] - call: NULL [18:01:39.266] plan(): nbrOfWorkers() = 1 [18:01:39.267] plan(): Setting new future strategy stack: [18:01:39.267] List of future strategies: [18:01:39.267] 1. sequential: [18:01:39.267] - args: function (..., envir = parent.frame()) [18:01:39.267] - tweaked: FALSE [18:01:39.267] - call: plan(strategy) [18:01:39.268] plan(): nbrOfWorkers() = 1 [18:01:39.268] SequentialFuture started (and completed) [18:01:39.268] - Launch lazy future ... done [18:01:39.268] 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" [18:01:39.272] resolved() for 'SequentialFuture' ... [18:01:39.273] - state: 'finished' [18:01:39.273] - run: TRUE [18:01:39.273] - result: 'FutureResult' [18:01:39.273] resolved() for 'SequentialFuture' ... done [18:01:39.273] resolved() for 'SequentialFuture' ... [18:01:39.274] - state: 'finished' [18:01:39.274] - run: TRUE [18:01:39.274] - result: 'FutureResult' [18:01:39.274] resolved() for 'SequentialFuture' ... done [18:01:39.274] resolved() for 'SequentialFuture' ... [18:01:39.274] - state: 'finished' [18:01:39.275] - run: TRUE [18:01:39.275] - result: 'FutureResult' [18:01:39.275] 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" ... [18:01:39.278] resolve() on list environment ... [18:01:39.278] recursive: 0 [18:01:39.279] length: 6 [18:01:39.279] elements: 'a', 'b', 'c', 'd', '', '' [18:01:39.279] signalConditionsASAP(numeric, pos=1) ... [18:01:39.279] - nx: 6 [18:01:39.280] - relay: TRUE [18:01:39.280] - stdout: TRUE [18:01:39.280] - signal: TRUE [18:01:39.280] - resignal: FALSE [18:01:39.280] - force: TRUE [18:01:39.280] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.281] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.281] - until=2 [18:01:39.281] - relaying element #2 [18:01:39.281] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.281] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.281] signalConditionsASAP(NULL, pos=1) ... done [18:01:39.281] length: 5 (resolved future 1) [18:01:39.282] resolved() for 'SequentialFuture' ... [18:01:39.282] - state: 'finished' [18:01:39.282] - run: TRUE [18:01:39.282] - result: 'FutureResult' [18:01:39.282] resolved() for 'SequentialFuture' ... done [18:01:39.283] Future #2 [18:01:39.283] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:39.283] - nx: 6 [18:01:39.283] - relay: TRUE [18:01:39.283] - stdout: TRUE [18:01:39.283] - signal: TRUE [18:01:39.284] - resignal: FALSE [18:01:39.284] - force: TRUE [18:01:39.284] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.284] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.284] - until=2 [18:01:39.284] - relaying element #2 [18:01:39.285] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.285] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.285] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:39.285] length: 4 (resolved future 2) [18:01:39.285] resolved() for 'SequentialFuture' ... [18:01:39.286] - state: 'finished' [18:01:39.286] - run: TRUE [18:01:39.286] - result: 'FutureResult' [18:01:39.286] resolved() for 'SequentialFuture' ... done [18:01:39.286] Future #3 [18:01:39.286] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:39.287] - nx: 6 [18:01:39.287] - relay: TRUE [18:01:39.287] - stdout: TRUE [18:01:39.287] - signal: TRUE [18:01:39.287] - resignal: FALSE [18:01:39.287] - force: TRUE [18:01:39.287] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.288] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.288] - until=3 [18:01:39.288] - relaying element #3 [18:01:39.288] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.288] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.289] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:39.289] length: 3 (resolved future 3) [18:01:39.289] resolved() for 'SequentialFuture' ... [18:01:39.289] - state: 'finished' [18:01:39.289] - run: TRUE [18:01:39.289] - result: 'FutureResult' [18:01:39.290] resolved() for 'SequentialFuture' ... done [18:01:39.290] Future #4 [18:01:39.290] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:39.290] - nx: 6 [18:01:39.290] - relay: TRUE [18:01:39.290] - stdout: TRUE [18:01:39.291] - signal: TRUE [18:01:39.291] - resignal: FALSE [18:01:39.291] - force: TRUE [18:01:39.291] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.291] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.291] - until=4 [18:01:39.292] - relaying element #4 [18:01:39.292] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.292] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.292] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:39.292] length: 2 (resolved future 4) [18:01:39.292] signalConditionsASAP(NULL, pos=5) ... [18:01:39.293] - nx: 6 [18:01:39.293] - relay: TRUE [18:01:39.293] - stdout: TRUE [18:01:39.293] - signal: TRUE [18:01:39.293] - resignal: FALSE [18:01:39.293] - force: TRUE [18:01:39.294] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.294] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.294] - until=6 [18:01:39.294] - relaying element #6 [18:01:39.294] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.294] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.294] signalConditionsASAP(NULL, pos=5) ... done [18:01:39.295] length: 1 (resolved future 5) [18:01:39.295] signalConditionsASAP(numeric, pos=6) ... [18:01:39.295] - nx: 6 [18:01:39.295] - relay: TRUE [18:01:39.295] - stdout: TRUE [18:01:39.295] - signal: TRUE [18:01:39.296] - resignal: FALSE [18:01:39.296] - force: TRUE [18:01:39.297] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.297] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.297] - until=6 [18:01:39.297] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.297] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.297] signalConditionsASAP(numeric, pos=6) ... done [18:01:39.298] length: 0 (resolved future 6) [18:01:39.298] Relaying remaining futures [18:01:39.298] signalConditionsASAP(NULL, pos=0) ... [18:01:39.298] - nx: 6 [18:01:39.298] - relay: TRUE [18:01:39.298] - stdout: TRUE [18:01:39.299] - signal: TRUE [18:01:39.299] - resignal: FALSE [18:01:39.299] - force: TRUE [18:01:39.299] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.299] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:39.299] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.300] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.300] signalConditionsASAP(NULL, pos=0) ... done [18:01:39.300] 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) [18:01:39.302] getGlobalsAndPackages() ... [18:01:39.302] Searching for globals... [18:01:39.303] [18:01:39.303] Searching for globals ... DONE [18:01:39.303] - globals: [0] [18:01:39.303] getGlobalsAndPackages() ... DONE [18:01:39.304] run() for 'Future' ... [18:01:39.304] - state: 'created' [18:01:39.304] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.304] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.305] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.305] - Field: 'label' [18:01:39.305] - Field: 'local' [18:01:39.305] - Field: 'owner' [18:01:39.305] - Field: 'envir' [18:01:39.305] - Field: 'packages' [18:01:39.306] - Field: 'gc' [18:01:39.306] - Field: 'conditions' [18:01:39.306] - Field: 'expr' [18:01:39.306] - Field: 'uuid' [18:01:39.306] - Field: 'seed' [18:01:39.306] - Field: 'version' [18:01:39.307] - Field: 'result' [18:01:39.307] - Field: 'asynchronous' [18:01:39.307] - Field: 'calls' [18:01:39.307] - Field: 'globals' [18:01:39.307] - Field: 'stdout' [18:01:39.307] - Field: 'earlySignal' [18:01:39.308] - Field: 'lazy' [18:01:39.308] - Field: 'state' [18:01:39.308] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.308] - Launch lazy future ... [18:01:39.308] Packages needed by the future expression (n = 0): [18:01:39.309] Packages needed by future strategies (n = 0): [18:01:39.309] { [18:01:39.309] { [18:01:39.309] { [18:01:39.309] ...future.startTime <- base::Sys.time() [18:01:39.309] { [18:01:39.309] { [18:01:39.309] { [18:01:39.309] base::local({ [18:01:39.309] has_future <- base::requireNamespace("future", [18:01:39.309] quietly = TRUE) [18:01:39.309] if (has_future) { [18:01:39.309] ns <- base::getNamespace("future") [18:01:39.309] version <- ns[[".package"]][["version"]] [18:01:39.309] if (is.null(version)) [18:01:39.309] version <- utils::packageVersion("future") [18:01:39.309] } [18:01:39.309] else { [18:01:39.309] version <- NULL [18:01:39.309] } [18:01:39.309] if (!has_future || version < "1.8.0") { [18:01:39.309] info <- base::c(r_version = base::gsub("R version ", [18:01:39.309] "", base::R.version$version.string), [18:01:39.309] platform = base::sprintf("%s (%s-bit)", [18:01:39.309] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.309] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.309] "release", "version")], collapse = " "), [18:01:39.309] hostname = base::Sys.info()[["nodename"]]) [18:01:39.309] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.309] info) [18:01:39.309] info <- base::paste(info, collapse = "; ") [18:01:39.309] if (!has_future) { [18:01:39.309] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.309] info) [18:01:39.309] } [18:01:39.309] else { [18:01:39.309] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.309] info, version) [18:01:39.309] } [18:01:39.309] base::stop(msg) [18:01:39.309] } [18:01:39.309] }) [18:01:39.309] } [18:01:39.309] options(future.plan = NULL) [18:01:39.309] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.309] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.309] } [18:01:39.309] ...future.workdir <- getwd() [18:01:39.309] } [18:01:39.309] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.309] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.309] } [18:01:39.309] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.309] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.309] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.309] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.309] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.309] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.309] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.309] base::names(...future.oldOptions)) [18:01:39.309] } [18:01:39.309] if (FALSE) { [18:01:39.309] } [18:01:39.309] else { [18:01:39.309] if (TRUE) { [18:01:39.309] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.309] open = "w") [18:01:39.309] } [18:01:39.309] else { [18:01:39.309] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.309] windows = "NUL", "/dev/null"), open = "w") [18:01:39.309] } [18:01:39.309] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.309] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.309] base::sink(type = "output", split = FALSE) [18:01:39.309] base::close(...future.stdout) [18:01:39.309] }, add = TRUE) [18:01:39.309] } [18:01:39.309] ...future.frame <- base::sys.nframe() [18:01:39.309] ...future.conditions <- base::list() [18:01:39.309] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.309] if (FALSE) { [18:01:39.309] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.309] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.309] } [18:01:39.309] ...future.result <- base::tryCatch({ [18:01:39.309] base::withCallingHandlers({ [18:01:39.309] ...future.value <- base::withVisible(base::local(2)) [18:01:39.309] future::FutureResult(value = ...future.value$value, [18:01:39.309] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.309] ...future.rng), globalenv = if (FALSE) [18:01:39.309] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.309] ...future.globalenv.names)) [18:01:39.309] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.309] }, condition = base::local({ [18:01:39.309] c <- base::c [18:01:39.309] inherits <- base::inherits [18:01:39.309] invokeRestart <- base::invokeRestart [18:01:39.309] length <- base::length [18:01:39.309] list <- base::list [18:01:39.309] seq.int <- base::seq.int [18:01:39.309] signalCondition <- base::signalCondition [18:01:39.309] sys.calls <- base::sys.calls [18:01:39.309] `[[` <- base::`[[` [18:01:39.309] `+` <- base::`+` [18:01:39.309] `<<-` <- base::`<<-` [18:01:39.309] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.309] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.309] 3L)] [18:01:39.309] } [18:01:39.309] function(cond) { [18:01:39.309] is_error <- inherits(cond, "error") [18:01:39.309] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.309] NULL) [18:01:39.309] if (is_error) { [18:01:39.309] sessionInformation <- function() { [18:01:39.309] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.309] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.309] search = base::search(), system = base::Sys.info()) [18:01:39.309] } [18:01:39.309] ...future.conditions[[length(...future.conditions) + [18:01:39.309] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.309] cond$call), session = sessionInformation(), [18:01:39.309] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.309] signalCondition(cond) [18:01:39.309] } [18:01:39.309] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.309] "immediateCondition"))) { [18:01:39.309] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.309] ...future.conditions[[length(...future.conditions) + [18:01:39.309] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.309] if (TRUE && !signal) { [18:01:39.309] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.309] { [18:01:39.309] inherits <- base::inherits [18:01:39.309] invokeRestart <- base::invokeRestart [18:01:39.309] is.null <- base::is.null [18:01:39.309] muffled <- FALSE [18:01:39.309] if (inherits(cond, "message")) { [18:01:39.309] muffled <- grepl(pattern, "muffleMessage") [18:01:39.309] if (muffled) [18:01:39.309] invokeRestart("muffleMessage") [18:01:39.309] } [18:01:39.309] else if (inherits(cond, "warning")) { [18:01:39.309] muffled <- grepl(pattern, "muffleWarning") [18:01:39.309] if (muffled) [18:01:39.309] invokeRestart("muffleWarning") [18:01:39.309] } [18:01:39.309] else if (inherits(cond, "condition")) { [18:01:39.309] if (!is.null(pattern)) { [18:01:39.309] computeRestarts <- base::computeRestarts [18:01:39.309] grepl <- base::grepl [18:01:39.309] restarts <- computeRestarts(cond) [18:01:39.309] for (restart in restarts) { [18:01:39.309] name <- restart$name [18:01:39.309] if (is.null(name)) [18:01:39.309] next [18:01:39.309] if (!grepl(pattern, name)) [18:01:39.309] next [18:01:39.309] invokeRestart(restart) [18:01:39.309] muffled <- TRUE [18:01:39.309] break [18:01:39.309] } [18:01:39.309] } [18:01:39.309] } [18:01:39.309] invisible(muffled) [18:01:39.309] } [18:01:39.309] muffleCondition(cond, pattern = "^muffle") [18:01:39.309] } [18:01:39.309] } [18:01:39.309] else { [18:01:39.309] if (TRUE) { [18:01:39.309] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.309] { [18:01:39.309] inherits <- base::inherits [18:01:39.309] invokeRestart <- base::invokeRestart [18:01:39.309] is.null <- base::is.null [18:01:39.309] muffled <- FALSE [18:01:39.309] if (inherits(cond, "message")) { [18:01:39.309] muffled <- grepl(pattern, "muffleMessage") [18:01:39.309] if (muffled) [18:01:39.309] invokeRestart("muffleMessage") [18:01:39.309] } [18:01:39.309] else if (inherits(cond, "warning")) { [18:01:39.309] muffled <- grepl(pattern, "muffleWarning") [18:01:39.309] if (muffled) [18:01:39.309] invokeRestart("muffleWarning") [18:01:39.309] } [18:01:39.309] else if (inherits(cond, "condition")) { [18:01:39.309] if (!is.null(pattern)) { [18:01:39.309] computeRestarts <- base::computeRestarts [18:01:39.309] grepl <- base::grepl [18:01:39.309] restarts <- computeRestarts(cond) [18:01:39.309] for (restart in restarts) { [18:01:39.309] name <- restart$name [18:01:39.309] if (is.null(name)) [18:01:39.309] next [18:01:39.309] if (!grepl(pattern, name)) [18:01:39.309] next [18:01:39.309] invokeRestart(restart) [18:01:39.309] muffled <- TRUE [18:01:39.309] break [18:01:39.309] } [18:01:39.309] } [18:01:39.309] } [18:01:39.309] invisible(muffled) [18:01:39.309] } [18:01:39.309] muffleCondition(cond, pattern = "^muffle") [18:01:39.309] } [18:01:39.309] } [18:01:39.309] } [18:01:39.309] })) [18:01:39.309] }, error = function(ex) { [18:01:39.309] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.309] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.309] ...future.rng), started = ...future.startTime, [18:01:39.309] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.309] version = "1.8"), class = "FutureResult") [18:01:39.309] }, finally = { [18:01:39.309] if (!identical(...future.workdir, getwd())) [18:01:39.309] setwd(...future.workdir) [18:01:39.309] { [18:01:39.309] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.309] ...future.oldOptions$nwarnings <- NULL [18:01:39.309] } [18:01:39.309] base::options(...future.oldOptions) [18:01:39.309] if (.Platform$OS.type == "windows") { [18:01:39.309] old_names <- names(...future.oldEnvVars) [18:01:39.309] envs <- base::Sys.getenv() [18:01:39.309] names <- names(envs) [18:01:39.309] common <- intersect(names, old_names) [18:01:39.309] added <- setdiff(names, old_names) [18:01:39.309] removed <- setdiff(old_names, names) [18:01:39.309] changed <- common[...future.oldEnvVars[common] != [18:01:39.309] envs[common]] [18:01:39.309] NAMES <- toupper(changed) [18:01:39.309] args <- list() [18:01:39.309] for (kk in seq_along(NAMES)) { [18:01:39.309] name <- changed[[kk]] [18:01:39.309] NAME <- NAMES[[kk]] [18:01:39.309] if (name != NAME && is.element(NAME, old_names)) [18:01:39.309] next [18:01:39.309] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.309] } [18:01:39.309] NAMES <- toupper(added) [18:01:39.309] for (kk in seq_along(NAMES)) { [18:01:39.309] name <- added[[kk]] [18:01:39.309] NAME <- NAMES[[kk]] [18:01:39.309] if (name != NAME && is.element(NAME, old_names)) [18:01:39.309] next [18:01:39.309] args[[name]] <- "" [18:01:39.309] } [18:01:39.309] NAMES <- toupper(removed) [18:01:39.309] for (kk in seq_along(NAMES)) { [18:01:39.309] name <- removed[[kk]] [18:01:39.309] NAME <- NAMES[[kk]] [18:01:39.309] if (name != NAME && is.element(NAME, old_names)) [18:01:39.309] next [18:01:39.309] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.309] } [18:01:39.309] if (length(args) > 0) [18:01:39.309] base::do.call(base::Sys.setenv, args = args) [18:01:39.309] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.309] } [18:01:39.309] else { [18:01:39.309] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.309] } [18:01:39.309] { [18:01:39.309] if (base::length(...future.futureOptionsAdded) > [18:01:39.309] 0L) { [18:01:39.309] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.309] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.309] base::options(opts) [18:01:39.309] } [18:01:39.309] { [18:01:39.309] { [18:01:39.309] NULL [18:01:39.309] RNGkind("Mersenne-Twister") [18:01:39.309] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.309] inherits = FALSE) [18:01:39.309] } [18:01:39.309] options(future.plan = NULL) [18:01:39.309] if (is.na(NA_character_)) [18:01:39.309] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.309] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.309] future::plan(list(function (..., envir = parent.frame()) [18:01:39.309] { [18:01:39.309] future <- SequentialFuture(..., envir = envir) [18:01:39.309] if (!future$lazy) [18:01:39.309] future <- run(future) [18:01:39.309] invisible(future) [18:01:39.309] }), .cleanup = FALSE, .init = FALSE) [18:01:39.309] } [18:01:39.309] } [18:01:39.309] } [18:01:39.309] }) [18:01:39.309] if (TRUE) { [18:01:39.309] base::sink(type = "output", split = FALSE) [18:01:39.309] if (TRUE) { [18:01:39.309] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.309] } [18:01:39.309] else { [18:01:39.309] ...future.result["stdout"] <- base::list(NULL) [18:01:39.309] } [18:01:39.309] base::close(...future.stdout) [18:01:39.309] ...future.stdout <- NULL [18:01:39.309] } [18:01:39.309] ...future.result$conditions <- ...future.conditions [18:01:39.309] ...future.result$finished <- base::Sys.time() [18:01:39.309] ...future.result [18:01:39.309] } [18:01:39.313] plan(): Setting new future strategy stack: [18:01:39.313] List of future strategies: [18:01:39.313] 1. sequential: [18:01:39.313] - args: function (..., envir = parent.frame()) [18:01:39.313] - tweaked: FALSE [18:01:39.313] - call: NULL [18:01:39.314] plan(): nbrOfWorkers() = 1 [18:01:39.315] plan(): Setting new future strategy stack: [18:01:39.315] List of future strategies: [18:01:39.315] 1. sequential: [18:01:39.315] - args: function (..., envir = parent.frame()) [18:01:39.315] - tweaked: FALSE [18:01:39.315] - call: plan(strategy) [18:01:39.316] plan(): nbrOfWorkers() = 1 [18:01:39.316] SequentialFuture started (and completed) [18:01:39.316] - Launch lazy future ... done [18:01:39.316] run() for 'SequentialFuture' ... done [18:01:39.316] getGlobalsAndPackages() ... [18:01:39.317] Searching for globals... [18:01:39.317] [18:01:39.317] Searching for globals ... DONE [18:01:39.317] - globals: [0] [18:01:39.317] getGlobalsAndPackages() ... DONE [18:01:39.318] run() for 'Future' ... [18:01:39.318] - state: 'created' [18:01:39.318] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.318] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.319] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.319] - Field: 'label' [18:01:39.319] - Field: 'local' [18:01:39.319] - Field: 'owner' [18:01:39.319] - Field: 'envir' [18:01:39.320] - Field: 'packages' [18:01:39.320] - Field: 'gc' [18:01:39.320] - Field: 'conditions' [18:01:39.320] - Field: 'expr' [18:01:39.320] - Field: 'uuid' [18:01:39.320] - Field: 'seed' [18:01:39.321] - Field: 'version' [18:01:39.321] - Field: 'result' [18:01:39.321] - Field: 'asynchronous' [18:01:39.321] - Field: 'calls' [18:01:39.321] - Field: 'globals' [18:01:39.321] - Field: 'stdout' [18:01:39.322] - Field: 'earlySignal' [18:01:39.322] - Field: 'lazy' [18:01:39.322] - Field: 'state' [18:01:39.322] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.322] - Launch lazy future ... [18:01:39.323] Packages needed by the future expression (n = 0): [18:01:39.323] Packages needed by future strategies (n = 0): [18:01:39.323] { [18:01:39.323] { [18:01:39.323] { [18:01:39.323] ...future.startTime <- base::Sys.time() [18:01:39.323] { [18:01:39.323] { [18:01:39.323] { [18:01:39.323] base::local({ [18:01:39.323] has_future <- base::requireNamespace("future", [18:01:39.323] quietly = TRUE) [18:01:39.323] if (has_future) { [18:01:39.323] ns <- base::getNamespace("future") [18:01:39.323] version <- ns[[".package"]][["version"]] [18:01:39.323] if (is.null(version)) [18:01:39.323] version <- utils::packageVersion("future") [18:01:39.323] } [18:01:39.323] else { [18:01:39.323] version <- NULL [18:01:39.323] } [18:01:39.323] if (!has_future || version < "1.8.0") { [18:01:39.323] info <- base::c(r_version = base::gsub("R version ", [18:01:39.323] "", base::R.version$version.string), [18:01:39.323] platform = base::sprintf("%s (%s-bit)", [18:01:39.323] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.323] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.323] "release", "version")], collapse = " "), [18:01:39.323] hostname = base::Sys.info()[["nodename"]]) [18:01:39.323] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.323] info) [18:01:39.323] info <- base::paste(info, collapse = "; ") [18:01:39.323] if (!has_future) { [18:01:39.323] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.323] info) [18:01:39.323] } [18:01:39.323] else { [18:01:39.323] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.323] info, version) [18:01:39.323] } [18:01:39.323] base::stop(msg) [18:01:39.323] } [18:01:39.323] }) [18:01:39.323] } [18:01:39.323] options(future.plan = NULL) [18:01:39.323] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.323] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.323] } [18:01:39.323] ...future.workdir <- getwd() [18:01:39.323] } [18:01:39.323] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.323] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.323] } [18:01:39.323] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.323] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.323] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.323] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.323] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.323] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.323] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.323] base::names(...future.oldOptions)) [18:01:39.323] } [18:01:39.323] if (FALSE) { [18:01:39.323] } [18:01:39.323] else { [18:01:39.323] if (TRUE) { [18:01:39.323] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.323] open = "w") [18:01:39.323] } [18:01:39.323] else { [18:01:39.323] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.323] windows = "NUL", "/dev/null"), open = "w") [18:01:39.323] } [18:01:39.323] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.323] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.323] base::sink(type = "output", split = FALSE) [18:01:39.323] base::close(...future.stdout) [18:01:39.323] }, add = TRUE) [18:01:39.323] } [18:01:39.323] ...future.frame <- base::sys.nframe() [18:01:39.323] ...future.conditions <- base::list() [18:01:39.323] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.323] if (FALSE) { [18:01:39.323] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.323] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.323] } [18:01:39.323] ...future.result <- base::tryCatch({ [18:01:39.323] base::withCallingHandlers({ [18:01:39.323] ...future.value <- base::withVisible(base::local(NULL)) [18:01:39.323] future::FutureResult(value = ...future.value$value, [18:01:39.323] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.323] ...future.rng), globalenv = if (FALSE) [18:01:39.323] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.323] ...future.globalenv.names)) [18:01:39.323] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.323] }, condition = base::local({ [18:01:39.323] c <- base::c [18:01:39.323] inherits <- base::inherits [18:01:39.323] invokeRestart <- base::invokeRestart [18:01:39.323] length <- base::length [18:01:39.323] list <- base::list [18:01:39.323] seq.int <- base::seq.int [18:01:39.323] signalCondition <- base::signalCondition [18:01:39.323] sys.calls <- base::sys.calls [18:01:39.323] `[[` <- base::`[[` [18:01:39.323] `+` <- base::`+` [18:01:39.323] `<<-` <- base::`<<-` [18:01:39.323] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.323] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.323] 3L)] [18:01:39.323] } [18:01:39.323] function(cond) { [18:01:39.323] is_error <- inherits(cond, "error") [18:01:39.323] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.323] NULL) [18:01:39.323] if (is_error) { [18:01:39.323] sessionInformation <- function() { [18:01:39.323] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.323] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.323] search = base::search(), system = base::Sys.info()) [18:01:39.323] } [18:01:39.323] ...future.conditions[[length(...future.conditions) + [18:01:39.323] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.323] cond$call), session = sessionInformation(), [18:01:39.323] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.323] signalCondition(cond) [18:01:39.323] } [18:01:39.323] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.323] "immediateCondition"))) { [18:01:39.323] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.323] ...future.conditions[[length(...future.conditions) + [18:01:39.323] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.323] if (TRUE && !signal) { [18:01:39.323] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.323] { [18:01:39.323] inherits <- base::inherits [18:01:39.323] invokeRestart <- base::invokeRestart [18:01:39.323] is.null <- base::is.null [18:01:39.323] muffled <- FALSE [18:01:39.323] if (inherits(cond, "message")) { [18:01:39.323] muffled <- grepl(pattern, "muffleMessage") [18:01:39.323] if (muffled) [18:01:39.323] invokeRestart("muffleMessage") [18:01:39.323] } [18:01:39.323] else if (inherits(cond, "warning")) { [18:01:39.323] muffled <- grepl(pattern, "muffleWarning") [18:01:39.323] if (muffled) [18:01:39.323] invokeRestart("muffleWarning") [18:01:39.323] } [18:01:39.323] else if (inherits(cond, "condition")) { [18:01:39.323] if (!is.null(pattern)) { [18:01:39.323] computeRestarts <- base::computeRestarts [18:01:39.323] grepl <- base::grepl [18:01:39.323] restarts <- computeRestarts(cond) [18:01:39.323] for (restart in restarts) { [18:01:39.323] name <- restart$name [18:01:39.323] if (is.null(name)) [18:01:39.323] next [18:01:39.323] if (!grepl(pattern, name)) [18:01:39.323] next [18:01:39.323] invokeRestart(restart) [18:01:39.323] muffled <- TRUE [18:01:39.323] break [18:01:39.323] } [18:01:39.323] } [18:01:39.323] } [18:01:39.323] invisible(muffled) [18:01:39.323] } [18:01:39.323] muffleCondition(cond, pattern = "^muffle") [18:01:39.323] } [18:01:39.323] } [18:01:39.323] else { [18:01:39.323] if (TRUE) { [18:01:39.323] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.323] { [18:01:39.323] inherits <- base::inherits [18:01:39.323] invokeRestart <- base::invokeRestart [18:01:39.323] is.null <- base::is.null [18:01:39.323] muffled <- FALSE [18:01:39.323] if (inherits(cond, "message")) { [18:01:39.323] muffled <- grepl(pattern, "muffleMessage") [18:01:39.323] if (muffled) [18:01:39.323] invokeRestart("muffleMessage") [18:01:39.323] } [18:01:39.323] else if (inherits(cond, "warning")) { [18:01:39.323] muffled <- grepl(pattern, "muffleWarning") [18:01:39.323] if (muffled) [18:01:39.323] invokeRestart("muffleWarning") [18:01:39.323] } [18:01:39.323] else if (inherits(cond, "condition")) { [18:01:39.323] if (!is.null(pattern)) { [18:01:39.323] computeRestarts <- base::computeRestarts [18:01:39.323] grepl <- base::grepl [18:01:39.323] restarts <- computeRestarts(cond) [18:01:39.323] for (restart in restarts) { [18:01:39.323] name <- restart$name [18:01:39.323] if (is.null(name)) [18:01:39.323] next [18:01:39.323] if (!grepl(pattern, name)) [18:01:39.323] next [18:01:39.323] invokeRestart(restart) [18:01:39.323] muffled <- TRUE [18:01:39.323] break [18:01:39.323] } [18:01:39.323] } [18:01:39.323] } [18:01:39.323] invisible(muffled) [18:01:39.323] } [18:01:39.323] muffleCondition(cond, pattern = "^muffle") [18:01:39.323] } [18:01:39.323] } [18:01:39.323] } [18:01:39.323] })) [18:01:39.323] }, error = function(ex) { [18:01:39.323] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.323] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.323] ...future.rng), started = ...future.startTime, [18:01:39.323] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.323] version = "1.8"), class = "FutureResult") [18:01:39.323] }, finally = { [18:01:39.323] if (!identical(...future.workdir, getwd())) [18:01:39.323] setwd(...future.workdir) [18:01:39.323] { [18:01:39.323] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.323] ...future.oldOptions$nwarnings <- NULL [18:01:39.323] } [18:01:39.323] base::options(...future.oldOptions) [18:01:39.323] if (.Platform$OS.type == "windows") { [18:01:39.323] old_names <- names(...future.oldEnvVars) [18:01:39.323] envs <- base::Sys.getenv() [18:01:39.323] names <- names(envs) [18:01:39.323] common <- intersect(names, old_names) [18:01:39.323] added <- setdiff(names, old_names) [18:01:39.323] removed <- setdiff(old_names, names) [18:01:39.323] changed <- common[...future.oldEnvVars[common] != [18:01:39.323] envs[common]] [18:01:39.323] NAMES <- toupper(changed) [18:01:39.323] args <- list() [18:01:39.323] for (kk in seq_along(NAMES)) { [18:01:39.323] name <- changed[[kk]] [18:01:39.323] NAME <- NAMES[[kk]] [18:01:39.323] if (name != NAME && is.element(NAME, old_names)) [18:01:39.323] next [18:01:39.323] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.323] } [18:01:39.323] NAMES <- toupper(added) [18:01:39.323] for (kk in seq_along(NAMES)) { [18:01:39.323] name <- added[[kk]] [18:01:39.323] NAME <- NAMES[[kk]] [18:01:39.323] if (name != NAME && is.element(NAME, old_names)) [18:01:39.323] next [18:01:39.323] args[[name]] <- "" [18:01:39.323] } [18:01:39.323] NAMES <- toupper(removed) [18:01:39.323] for (kk in seq_along(NAMES)) { [18:01:39.323] name <- removed[[kk]] [18:01:39.323] NAME <- NAMES[[kk]] [18:01:39.323] if (name != NAME && is.element(NAME, old_names)) [18:01:39.323] next [18:01:39.323] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.323] } [18:01:39.323] if (length(args) > 0) [18:01:39.323] base::do.call(base::Sys.setenv, args = args) [18:01:39.323] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.323] } [18:01:39.323] else { [18:01:39.323] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.323] } [18:01:39.323] { [18:01:39.323] if (base::length(...future.futureOptionsAdded) > [18:01:39.323] 0L) { [18:01:39.323] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.323] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.323] base::options(opts) [18:01:39.323] } [18:01:39.323] { [18:01:39.323] { [18:01:39.323] NULL [18:01:39.323] RNGkind("Mersenne-Twister") [18:01:39.323] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.323] inherits = FALSE) [18:01:39.323] } [18:01:39.323] options(future.plan = NULL) [18:01:39.323] if (is.na(NA_character_)) [18:01:39.323] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.323] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.323] future::plan(list(function (..., envir = parent.frame()) [18:01:39.323] { [18:01:39.323] future <- SequentialFuture(..., envir = envir) [18:01:39.323] if (!future$lazy) [18:01:39.323] future <- run(future) [18:01:39.323] invisible(future) [18:01:39.323] }), .cleanup = FALSE, .init = FALSE) [18:01:39.323] } [18:01:39.323] } [18:01:39.323] } [18:01:39.323] }) [18:01:39.323] if (TRUE) { [18:01:39.323] base::sink(type = "output", split = FALSE) [18:01:39.323] if (TRUE) { [18:01:39.323] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.323] } [18:01:39.323] else { [18:01:39.323] ...future.result["stdout"] <- base::list(NULL) [18:01:39.323] } [18:01:39.323] base::close(...future.stdout) [18:01:39.323] ...future.stdout <- NULL [18:01:39.323] } [18:01:39.323] ...future.result$conditions <- ...future.conditions [18:01:39.323] ...future.result$finished <- base::Sys.time() [18:01:39.323] ...future.result [18:01:39.323] } [18:01:39.327] plan(): Setting new future strategy stack: [18:01:39.327] List of future strategies: [18:01:39.327] 1. sequential: [18:01:39.327] - args: function (..., envir = parent.frame()) [18:01:39.327] - tweaked: FALSE [18:01:39.327] - call: NULL [18:01:39.328] plan(): nbrOfWorkers() = 1 [18:01:39.329] plan(): Setting new future strategy stack: [18:01:39.329] List of future strategies: [18:01:39.329] 1. sequential: [18:01:39.329] - args: function (..., envir = parent.frame()) [18:01:39.329] - tweaked: FALSE [18:01:39.329] - call: plan(strategy) [18:01:39.330] plan(): nbrOfWorkers() = 1 [18:01:39.330] SequentialFuture started (and completed) [18:01:39.330] - Launch lazy future ... done [18:01:39.330] run() for 'SequentialFuture' ... done [18:01:39.331] getGlobalsAndPackages() ... [18:01:39.331] Searching for globals... [18:01:39.332] - globals found: [1] '{' [18:01:39.332] Searching for globals ... DONE [18:01:39.332] Resolving globals: FALSE [18:01:39.332] [18:01:39.332] [18:01:39.333] getGlobalsAndPackages() ... DONE [18:01:39.333] run() for 'Future' ... [18:01:39.333] - state: 'created' [18:01:39.333] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.334] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.334] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.334] - Field: 'label' [18:01:39.334] - Field: 'local' [18:01:39.334] - Field: 'owner' [18:01:39.335] - Field: 'envir' [18:01:39.335] - Field: 'packages' [18:01:39.335] - Field: 'gc' [18:01:39.335] - Field: 'conditions' [18:01:39.335] - Field: 'expr' [18:01:39.335] - Field: 'uuid' [18:01:39.336] - Field: 'seed' [18:01:39.336] - Field: 'version' [18:01:39.336] - Field: 'result' [18:01:39.336] - Field: 'asynchronous' [18:01:39.336] - Field: 'calls' [18:01:39.336] - Field: 'globals' [18:01:39.337] - Field: 'stdout' [18:01:39.337] - Field: 'earlySignal' [18:01:39.337] - Field: 'lazy' [18:01:39.337] - Field: 'state' [18:01:39.337] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.337] - Launch lazy future ... [18:01:39.338] Packages needed by the future expression (n = 0): [18:01:39.338] Packages needed by future strategies (n = 0): [18:01:39.339] { [18:01:39.339] { [18:01:39.339] { [18:01:39.339] ...future.startTime <- base::Sys.time() [18:01:39.339] { [18:01:39.339] { [18:01:39.339] { [18:01:39.339] base::local({ [18:01:39.339] has_future <- base::requireNamespace("future", [18:01:39.339] quietly = TRUE) [18:01:39.339] if (has_future) { [18:01:39.339] ns <- base::getNamespace("future") [18:01:39.339] version <- ns[[".package"]][["version"]] [18:01:39.339] if (is.null(version)) [18:01:39.339] version <- utils::packageVersion("future") [18:01:39.339] } [18:01:39.339] else { [18:01:39.339] version <- NULL [18:01:39.339] } [18:01:39.339] if (!has_future || version < "1.8.0") { [18:01:39.339] info <- base::c(r_version = base::gsub("R version ", [18:01:39.339] "", base::R.version$version.string), [18:01:39.339] platform = base::sprintf("%s (%s-bit)", [18:01:39.339] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.339] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.339] "release", "version")], collapse = " "), [18:01:39.339] hostname = base::Sys.info()[["nodename"]]) [18:01:39.339] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.339] info) [18:01:39.339] info <- base::paste(info, collapse = "; ") [18:01:39.339] if (!has_future) { [18:01:39.339] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.339] info) [18:01:39.339] } [18:01:39.339] else { [18:01:39.339] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.339] info, version) [18:01:39.339] } [18:01:39.339] base::stop(msg) [18:01:39.339] } [18:01:39.339] }) [18:01:39.339] } [18:01:39.339] options(future.plan = NULL) [18:01:39.339] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.339] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.339] } [18:01:39.339] ...future.workdir <- getwd() [18:01:39.339] } [18:01:39.339] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.339] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.339] } [18:01:39.339] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.339] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.339] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.339] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.339] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.339] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.339] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.339] base::names(...future.oldOptions)) [18:01:39.339] } [18:01:39.339] if (FALSE) { [18:01:39.339] } [18:01:39.339] else { [18:01:39.339] if (TRUE) { [18:01:39.339] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.339] open = "w") [18:01:39.339] } [18:01:39.339] else { [18:01:39.339] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.339] windows = "NUL", "/dev/null"), open = "w") [18:01:39.339] } [18:01:39.339] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.339] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.339] base::sink(type = "output", split = FALSE) [18:01:39.339] base::close(...future.stdout) [18:01:39.339] }, add = TRUE) [18:01:39.339] } [18:01:39.339] ...future.frame <- base::sys.nframe() [18:01:39.339] ...future.conditions <- base::list() [18:01:39.339] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.339] if (FALSE) { [18:01:39.339] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.339] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.339] } [18:01:39.339] ...future.result <- base::tryCatch({ [18:01:39.339] base::withCallingHandlers({ [18:01:39.339] ...future.value <- base::withVisible(base::local({ [18:01:39.339] 4 [18:01:39.339] })) [18:01:39.339] future::FutureResult(value = ...future.value$value, [18:01:39.339] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.339] ...future.rng), globalenv = if (FALSE) [18:01:39.339] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.339] ...future.globalenv.names)) [18:01:39.339] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.339] }, condition = base::local({ [18:01:39.339] c <- base::c [18:01:39.339] inherits <- base::inherits [18:01:39.339] invokeRestart <- base::invokeRestart [18:01:39.339] length <- base::length [18:01:39.339] list <- base::list [18:01:39.339] seq.int <- base::seq.int [18:01:39.339] signalCondition <- base::signalCondition [18:01:39.339] sys.calls <- base::sys.calls [18:01:39.339] `[[` <- base::`[[` [18:01:39.339] `+` <- base::`+` [18:01:39.339] `<<-` <- base::`<<-` [18:01:39.339] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.339] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.339] 3L)] [18:01:39.339] } [18:01:39.339] function(cond) { [18:01:39.339] is_error <- inherits(cond, "error") [18:01:39.339] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.339] NULL) [18:01:39.339] if (is_error) { [18:01:39.339] sessionInformation <- function() { [18:01:39.339] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.339] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.339] search = base::search(), system = base::Sys.info()) [18:01:39.339] } [18:01:39.339] ...future.conditions[[length(...future.conditions) + [18:01:39.339] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.339] cond$call), session = sessionInformation(), [18:01:39.339] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.339] signalCondition(cond) [18:01:39.339] } [18:01:39.339] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.339] "immediateCondition"))) { [18:01:39.339] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.339] ...future.conditions[[length(...future.conditions) + [18:01:39.339] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.339] if (TRUE && !signal) { [18:01:39.339] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.339] { [18:01:39.339] inherits <- base::inherits [18:01:39.339] invokeRestart <- base::invokeRestart [18:01:39.339] is.null <- base::is.null [18:01:39.339] muffled <- FALSE [18:01:39.339] if (inherits(cond, "message")) { [18:01:39.339] muffled <- grepl(pattern, "muffleMessage") [18:01:39.339] if (muffled) [18:01:39.339] invokeRestart("muffleMessage") [18:01:39.339] } [18:01:39.339] else if (inherits(cond, "warning")) { [18:01:39.339] muffled <- grepl(pattern, "muffleWarning") [18:01:39.339] if (muffled) [18:01:39.339] invokeRestart("muffleWarning") [18:01:39.339] } [18:01:39.339] else if (inherits(cond, "condition")) { [18:01:39.339] if (!is.null(pattern)) { [18:01:39.339] computeRestarts <- base::computeRestarts [18:01:39.339] grepl <- base::grepl [18:01:39.339] restarts <- computeRestarts(cond) [18:01:39.339] for (restart in restarts) { [18:01:39.339] name <- restart$name [18:01:39.339] if (is.null(name)) [18:01:39.339] next [18:01:39.339] if (!grepl(pattern, name)) [18:01:39.339] next [18:01:39.339] invokeRestart(restart) [18:01:39.339] muffled <- TRUE [18:01:39.339] break [18:01:39.339] } [18:01:39.339] } [18:01:39.339] } [18:01:39.339] invisible(muffled) [18:01:39.339] } [18:01:39.339] muffleCondition(cond, pattern = "^muffle") [18:01:39.339] } [18:01:39.339] } [18:01:39.339] else { [18:01:39.339] if (TRUE) { [18:01:39.339] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.339] { [18:01:39.339] inherits <- base::inherits [18:01:39.339] invokeRestart <- base::invokeRestart [18:01:39.339] is.null <- base::is.null [18:01:39.339] muffled <- FALSE [18:01:39.339] if (inherits(cond, "message")) { [18:01:39.339] muffled <- grepl(pattern, "muffleMessage") [18:01:39.339] if (muffled) [18:01:39.339] invokeRestart("muffleMessage") [18:01:39.339] } [18:01:39.339] else if (inherits(cond, "warning")) { [18:01:39.339] muffled <- grepl(pattern, "muffleWarning") [18:01:39.339] if (muffled) [18:01:39.339] invokeRestart("muffleWarning") [18:01:39.339] } [18:01:39.339] else if (inherits(cond, "condition")) { [18:01:39.339] if (!is.null(pattern)) { [18:01:39.339] computeRestarts <- base::computeRestarts [18:01:39.339] grepl <- base::grepl [18:01:39.339] restarts <- computeRestarts(cond) [18:01:39.339] for (restart in restarts) { [18:01:39.339] name <- restart$name [18:01:39.339] if (is.null(name)) [18:01:39.339] next [18:01:39.339] if (!grepl(pattern, name)) [18:01:39.339] next [18:01:39.339] invokeRestart(restart) [18:01:39.339] muffled <- TRUE [18:01:39.339] break [18:01:39.339] } [18:01:39.339] } [18:01:39.339] } [18:01:39.339] invisible(muffled) [18:01:39.339] } [18:01:39.339] muffleCondition(cond, pattern = "^muffle") [18:01:39.339] } [18:01:39.339] } [18:01:39.339] } [18:01:39.339] })) [18:01:39.339] }, error = function(ex) { [18:01:39.339] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.339] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.339] ...future.rng), started = ...future.startTime, [18:01:39.339] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.339] version = "1.8"), class = "FutureResult") [18:01:39.339] }, finally = { [18:01:39.339] if (!identical(...future.workdir, getwd())) [18:01:39.339] setwd(...future.workdir) [18:01:39.339] { [18:01:39.339] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.339] ...future.oldOptions$nwarnings <- NULL [18:01:39.339] } [18:01:39.339] base::options(...future.oldOptions) [18:01:39.339] if (.Platform$OS.type == "windows") { [18:01:39.339] old_names <- names(...future.oldEnvVars) [18:01:39.339] envs <- base::Sys.getenv() [18:01:39.339] names <- names(envs) [18:01:39.339] common <- intersect(names, old_names) [18:01:39.339] added <- setdiff(names, old_names) [18:01:39.339] removed <- setdiff(old_names, names) [18:01:39.339] changed <- common[...future.oldEnvVars[common] != [18:01:39.339] envs[common]] [18:01:39.339] NAMES <- toupper(changed) [18:01:39.339] args <- list() [18:01:39.339] for (kk in seq_along(NAMES)) { [18:01:39.339] name <- changed[[kk]] [18:01:39.339] NAME <- NAMES[[kk]] [18:01:39.339] if (name != NAME && is.element(NAME, old_names)) [18:01:39.339] next [18:01:39.339] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.339] } [18:01:39.339] NAMES <- toupper(added) [18:01:39.339] for (kk in seq_along(NAMES)) { [18:01:39.339] name <- added[[kk]] [18:01:39.339] NAME <- NAMES[[kk]] [18:01:39.339] if (name != NAME && is.element(NAME, old_names)) [18:01:39.339] next [18:01:39.339] args[[name]] <- "" [18:01:39.339] } [18:01:39.339] NAMES <- toupper(removed) [18:01:39.339] for (kk in seq_along(NAMES)) { [18:01:39.339] name <- removed[[kk]] [18:01:39.339] NAME <- NAMES[[kk]] [18:01:39.339] if (name != NAME && is.element(NAME, old_names)) [18:01:39.339] next [18:01:39.339] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.339] } [18:01:39.339] if (length(args) > 0) [18:01:39.339] base::do.call(base::Sys.setenv, args = args) [18:01:39.339] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.339] } [18:01:39.339] else { [18:01:39.339] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.339] } [18:01:39.339] { [18:01:39.339] if (base::length(...future.futureOptionsAdded) > [18:01:39.339] 0L) { [18:01:39.339] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.339] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.339] base::options(opts) [18:01:39.339] } [18:01:39.339] { [18:01:39.339] { [18:01:39.339] NULL [18:01:39.339] RNGkind("Mersenne-Twister") [18:01:39.339] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.339] inherits = FALSE) [18:01:39.339] } [18:01:39.339] options(future.plan = NULL) [18:01:39.339] if (is.na(NA_character_)) [18:01:39.339] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.339] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.339] future::plan(list(function (..., envir = parent.frame()) [18:01:39.339] { [18:01:39.339] future <- SequentialFuture(..., envir = envir) [18:01:39.339] if (!future$lazy) [18:01:39.339] future <- run(future) [18:01:39.339] invisible(future) [18:01:39.339] }), .cleanup = FALSE, .init = FALSE) [18:01:39.339] } [18:01:39.339] } [18:01:39.339] } [18:01:39.339] }) [18:01:39.339] if (TRUE) { [18:01:39.339] base::sink(type = "output", split = FALSE) [18:01:39.339] if (TRUE) { [18:01:39.339] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.339] } [18:01:39.339] else { [18:01:39.339] ...future.result["stdout"] <- base::list(NULL) [18:01:39.339] } [18:01:39.339] base::close(...future.stdout) [18:01:39.339] ...future.stdout <- NULL [18:01:39.339] } [18:01:39.339] ...future.result$conditions <- ...future.conditions [18:01:39.339] ...future.result$finished <- base::Sys.time() [18:01:39.339] ...future.result [18:01:39.339] } [18:01:39.343] plan(): Setting new future strategy stack: [18:01:39.343] List of future strategies: [18:01:39.343] 1. sequential: [18:01:39.343] - args: function (..., envir = parent.frame()) [18:01:39.343] - tweaked: FALSE [18:01:39.343] - call: NULL [18:01:39.344] plan(): nbrOfWorkers() = 1 [18:01:39.345] plan(): Setting new future strategy stack: [18:01:39.345] List of future strategies: [18:01:39.345] 1. sequential: [18:01:39.345] - args: function (..., envir = parent.frame()) [18:01:39.345] - tweaked: FALSE [18:01:39.345] - call: plan(strategy) [18:01:39.346] plan(): nbrOfWorkers() = 1 [18:01:39.346] SequentialFuture started (and completed) [18:01:39.346] - Launch lazy future ... done [18:01:39.346] 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" [18:01:39.351] resolved() for 'SequentialFuture' ... [18:01:39.351] - state: 'finished' [18:01:39.351] - run: TRUE [18:01:39.351] - result: 'FutureResult' [18:01:39.351] resolved() for 'SequentialFuture' ... done [18:01:39.352] resolved() for 'SequentialFuture' ... [18:01:39.352] - state: 'finished' [18:01:39.352] - run: TRUE [18:01:39.352] - result: 'FutureResult' [18:01:39.352] resolved() for 'SequentialFuture' ... done [18:01:39.352] resolved() for 'SequentialFuture' ... [18:01:39.353] - state: 'finished' [18:01:39.353] - run: TRUE [18:01:39.353] - result: 'FutureResult' [18:01:39.353] 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" ... [18:01:39.356] resolve() on list environment ... [18:01:39.356] recursive: 0 [18:01:39.358] length: 6 [18:01:39.358] elements: 'a', 'b', 'c', 'd', '', '' [18:01:39.358] signalConditionsASAP(numeric, pos=1) ... [18:01:39.358] - nx: 6 [18:01:39.358] - relay: TRUE [18:01:39.358] - stdout: TRUE [18:01:39.358] - signal: TRUE [18:01:39.359] - resignal: FALSE [18:01:39.359] - force: TRUE [18:01:39.359] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.359] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.359] - until=2 [18:01:39.359] - relaying element #2 [18:01:39.360] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.360] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.360] signalConditionsASAP(NULL, pos=1) ... done [18:01:39.360] length: 5 (resolved future 1) [18:01:39.360] resolved() for 'SequentialFuture' ... [18:01:39.360] - state: 'finished' [18:01:39.361] - run: TRUE [18:01:39.361] - result: 'FutureResult' [18:01:39.361] resolved() for 'SequentialFuture' ... done [18:01:39.361] Future #2 [18:01:39.361] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:39.362] - nx: 6 [18:01:39.362] - relay: TRUE [18:01:39.362] - stdout: TRUE [18:01:39.362] - signal: TRUE [18:01:39.362] - resignal: FALSE [18:01:39.362] - force: TRUE [18:01:39.362] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.363] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.363] - until=2 [18:01:39.363] - relaying element #2 [18:01:39.363] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.363] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.364] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:39.364] length: 4 (resolved future 2) [18:01:39.364] resolved() for 'SequentialFuture' ... [18:01:39.364] - state: 'finished' [18:01:39.364] - run: TRUE [18:01:39.364] - result: 'FutureResult' [18:01:39.365] resolved() for 'SequentialFuture' ... done [18:01:39.365] Future #3 [18:01:39.365] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:39.365] - nx: 6 [18:01:39.365] - relay: TRUE [18:01:39.365] - stdout: TRUE [18:01:39.366] - signal: TRUE [18:01:39.366] - resignal: FALSE [18:01:39.366] - force: TRUE [18:01:39.366] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.366] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.366] - until=3 [18:01:39.367] - relaying element #3 [18:01:39.367] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.367] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.367] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:39.367] length: 3 (resolved future 3) [18:01:39.368] resolved() for 'SequentialFuture' ... [18:01:39.368] - state: 'finished' [18:01:39.368] - run: TRUE [18:01:39.368] - result: 'FutureResult' [18:01:39.368] resolved() for 'SequentialFuture' ... done [18:01:39.368] Future #4 [18:01:39.369] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:39.369] - nx: 6 [18:01:39.369] - relay: TRUE [18:01:39.369] - stdout: TRUE [18:01:39.369] - signal: TRUE [18:01:39.369] - resignal: FALSE [18:01:39.370] - force: TRUE [18:01:39.370] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.370] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.370] - until=4 [18:01:39.370] - relaying element #4 [18:01:39.370] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.371] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.371] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:39.371] length: 2 (resolved future 4) [18:01:39.371] signalConditionsASAP(NULL, pos=5) ... [18:01:39.371] - nx: 6 [18:01:39.371] - relay: TRUE [18:01:39.372] - stdout: TRUE [18:01:39.372] - signal: TRUE [18:01:39.372] - resignal: FALSE [18:01:39.372] - force: TRUE [18:01:39.372] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.372] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.372] - until=6 [18:01:39.373] - relaying element #6 [18:01:39.373] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.373] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.373] signalConditionsASAP(NULL, pos=5) ... done [18:01:39.373] length: 1 (resolved future 5) [18:01:39.373] signalConditionsASAP(numeric, pos=6) ... [18:01:39.374] - nx: 6 [18:01:39.375] - relay: TRUE [18:01:39.375] - stdout: TRUE [18:01:39.375] - signal: TRUE [18:01:39.375] - resignal: FALSE [18:01:39.375] - force: TRUE [18:01:39.375] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.375] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.376] - until=6 [18:01:39.376] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.376] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.376] signalConditionsASAP(numeric, pos=6) ... done [18:01:39.376] length: 0 (resolved future 6) [18:01:39.376] Relaying remaining futures [18:01:39.377] signalConditionsASAP(NULL, pos=0) ... [18:01:39.377] - nx: 6 [18:01:39.377] - relay: TRUE [18:01:39.377] - stdout: TRUE [18:01:39.377] - signal: TRUE [18:01:39.377] - resignal: FALSE [18:01:39.378] - force: TRUE [18:01:39.378] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.378] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:39.378] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.378] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.378] signalConditionsASAP(NULL, pos=0) ... done [18:01:39.379] 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) [18:01:39.381] getGlobalsAndPackages() ... [18:01:39.381] Searching for globals... [18:01:39.382] [18:01:39.382] Searching for globals ... DONE [18:01:39.382] - globals: [0] [18:01:39.382] getGlobalsAndPackages() ... DONE [18:01:39.383] run() for 'Future' ... [18:01:39.383] - state: 'created' [18:01:39.383] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.383] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.383] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.384] - Field: 'label' [18:01:39.384] - Field: 'local' [18:01:39.384] - Field: 'owner' [18:01:39.384] - Field: 'envir' [18:01:39.384] - Field: 'packages' [18:01:39.385] - Field: 'gc' [18:01:39.385] - Field: 'conditions' [18:01:39.385] - Field: 'expr' [18:01:39.385] - Field: 'uuid' [18:01:39.385] - Field: 'seed' [18:01:39.385] - Field: 'version' [18:01:39.386] - Field: 'result' [18:01:39.386] - Field: 'asynchronous' [18:01:39.386] - Field: 'calls' [18:01:39.386] - Field: 'globals' [18:01:39.386] - Field: 'stdout' [18:01:39.386] - Field: 'earlySignal' [18:01:39.387] - Field: 'lazy' [18:01:39.387] - Field: 'state' [18:01:39.387] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.387] - Launch lazy future ... [18:01:39.387] Packages needed by the future expression (n = 0): [18:01:39.388] Packages needed by future strategies (n = 0): [18:01:39.388] { [18:01:39.388] { [18:01:39.388] { [18:01:39.388] ...future.startTime <- base::Sys.time() [18:01:39.388] { [18:01:39.388] { [18:01:39.388] { [18:01:39.388] base::local({ [18:01:39.388] has_future <- base::requireNamespace("future", [18:01:39.388] quietly = TRUE) [18:01:39.388] if (has_future) { [18:01:39.388] ns <- base::getNamespace("future") [18:01:39.388] version <- ns[[".package"]][["version"]] [18:01:39.388] if (is.null(version)) [18:01:39.388] version <- utils::packageVersion("future") [18:01:39.388] } [18:01:39.388] else { [18:01:39.388] version <- NULL [18:01:39.388] } [18:01:39.388] if (!has_future || version < "1.8.0") { [18:01:39.388] info <- base::c(r_version = base::gsub("R version ", [18:01:39.388] "", base::R.version$version.string), [18:01:39.388] platform = base::sprintf("%s (%s-bit)", [18:01:39.388] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.388] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.388] "release", "version")], collapse = " "), [18:01:39.388] hostname = base::Sys.info()[["nodename"]]) [18:01:39.388] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.388] info) [18:01:39.388] info <- base::paste(info, collapse = "; ") [18:01:39.388] if (!has_future) { [18:01:39.388] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.388] info) [18:01:39.388] } [18:01:39.388] else { [18:01:39.388] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.388] info, version) [18:01:39.388] } [18:01:39.388] base::stop(msg) [18:01:39.388] } [18:01:39.388] }) [18:01:39.388] } [18:01:39.388] options(future.plan = NULL) [18:01:39.388] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.388] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.388] } [18:01:39.388] ...future.workdir <- getwd() [18:01:39.388] } [18:01:39.388] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.388] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.388] } [18:01:39.388] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.388] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.388] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.388] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.388] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.388] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.388] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.388] base::names(...future.oldOptions)) [18:01:39.388] } [18:01:39.388] if (FALSE) { [18:01:39.388] } [18:01:39.388] else { [18:01:39.388] if (TRUE) { [18:01:39.388] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.388] open = "w") [18:01:39.388] } [18:01:39.388] else { [18:01:39.388] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.388] windows = "NUL", "/dev/null"), open = "w") [18:01:39.388] } [18:01:39.388] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.388] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.388] base::sink(type = "output", split = FALSE) [18:01:39.388] base::close(...future.stdout) [18:01:39.388] }, add = TRUE) [18:01:39.388] } [18:01:39.388] ...future.frame <- base::sys.nframe() [18:01:39.388] ...future.conditions <- base::list() [18:01:39.388] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.388] if (FALSE) { [18:01:39.388] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.388] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.388] } [18:01:39.388] ...future.result <- base::tryCatch({ [18:01:39.388] base::withCallingHandlers({ [18:01:39.388] ...future.value <- base::withVisible(base::local(2)) [18:01:39.388] future::FutureResult(value = ...future.value$value, [18:01:39.388] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.388] ...future.rng), globalenv = if (FALSE) [18:01:39.388] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.388] ...future.globalenv.names)) [18:01:39.388] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.388] }, condition = base::local({ [18:01:39.388] c <- base::c [18:01:39.388] inherits <- base::inherits [18:01:39.388] invokeRestart <- base::invokeRestart [18:01:39.388] length <- base::length [18:01:39.388] list <- base::list [18:01:39.388] seq.int <- base::seq.int [18:01:39.388] signalCondition <- base::signalCondition [18:01:39.388] sys.calls <- base::sys.calls [18:01:39.388] `[[` <- base::`[[` [18:01:39.388] `+` <- base::`+` [18:01:39.388] `<<-` <- base::`<<-` [18:01:39.388] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.388] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.388] 3L)] [18:01:39.388] } [18:01:39.388] function(cond) { [18:01:39.388] is_error <- inherits(cond, "error") [18:01:39.388] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.388] NULL) [18:01:39.388] if (is_error) { [18:01:39.388] sessionInformation <- function() { [18:01:39.388] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.388] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.388] search = base::search(), system = base::Sys.info()) [18:01:39.388] } [18:01:39.388] ...future.conditions[[length(...future.conditions) + [18:01:39.388] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.388] cond$call), session = sessionInformation(), [18:01:39.388] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.388] signalCondition(cond) [18:01:39.388] } [18:01:39.388] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.388] "immediateCondition"))) { [18:01:39.388] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.388] ...future.conditions[[length(...future.conditions) + [18:01:39.388] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.388] if (TRUE && !signal) { [18:01:39.388] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.388] { [18:01:39.388] inherits <- base::inherits [18:01:39.388] invokeRestart <- base::invokeRestart [18:01:39.388] is.null <- base::is.null [18:01:39.388] muffled <- FALSE [18:01:39.388] if (inherits(cond, "message")) { [18:01:39.388] muffled <- grepl(pattern, "muffleMessage") [18:01:39.388] if (muffled) [18:01:39.388] invokeRestart("muffleMessage") [18:01:39.388] } [18:01:39.388] else if (inherits(cond, "warning")) { [18:01:39.388] muffled <- grepl(pattern, "muffleWarning") [18:01:39.388] if (muffled) [18:01:39.388] invokeRestart("muffleWarning") [18:01:39.388] } [18:01:39.388] else if (inherits(cond, "condition")) { [18:01:39.388] if (!is.null(pattern)) { [18:01:39.388] computeRestarts <- base::computeRestarts [18:01:39.388] grepl <- base::grepl [18:01:39.388] restarts <- computeRestarts(cond) [18:01:39.388] for (restart in restarts) { [18:01:39.388] name <- restart$name [18:01:39.388] if (is.null(name)) [18:01:39.388] next [18:01:39.388] if (!grepl(pattern, name)) [18:01:39.388] next [18:01:39.388] invokeRestart(restart) [18:01:39.388] muffled <- TRUE [18:01:39.388] break [18:01:39.388] } [18:01:39.388] } [18:01:39.388] } [18:01:39.388] invisible(muffled) [18:01:39.388] } [18:01:39.388] muffleCondition(cond, pattern = "^muffle") [18:01:39.388] } [18:01:39.388] } [18:01:39.388] else { [18:01:39.388] if (TRUE) { [18:01:39.388] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.388] { [18:01:39.388] inherits <- base::inherits [18:01:39.388] invokeRestart <- base::invokeRestart [18:01:39.388] is.null <- base::is.null [18:01:39.388] muffled <- FALSE [18:01:39.388] if (inherits(cond, "message")) { [18:01:39.388] muffled <- grepl(pattern, "muffleMessage") [18:01:39.388] if (muffled) [18:01:39.388] invokeRestart("muffleMessage") [18:01:39.388] } [18:01:39.388] else if (inherits(cond, "warning")) { [18:01:39.388] muffled <- grepl(pattern, "muffleWarning") [18:01:39.388] if (muffled) [18:01:39.388] invokeRestart("muffleWarning") [18:01:39.388] } [18:01:39.388] else if (inherits(cond, "condition")) { [18:01:39.388] if (!is.null(pattern)) { [18:01:39.388] computeRestarts <- base::computeRestarts [18:01:39.388] grepl <- base::grepl [18:01:39.388] restarts <- computeRestarts(cond) [18:01:39.388] for (restart in restarts) { [18:01:39.388] name <- restart$name [18:01:39.388] if (is.null(name)) [18:01:39.388] next [18:01:39.388] if (!grepl(pattern, name)) [18:01:39.388] next [18:01:39.388] invokeRestart(restart) [18:01:39.388] muffled <- TRUE [18:01:39.388] break [18:01:39.388] } [18:01:39.388] } [18:01:39.388] } [18:01:39.388] invisible(muffled) [18:01:39.388] } [18:01:39.388] muffleCondition(cond, pattern = "^muffle") [18:01:39.388] } [18:01:39.388] } [18:01:39.388] } [18:01:39.388] })) [18:01:39.388] }, error = function(ex) { [18:01:39.388] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.388] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.388] ...future.rng), started = ...future.startTime, [18:01:39.388] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.388] version = "1.8"), class = "FutureResult") [18:01:39.388] }, finally = { [18:01:39.388] if (!identical(...future.workdir, getwd())) [18:01:39.388] setwd(...future.workdir) [18:01:39.388] { [18:01:39.388] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.388] ...future.oldOptions$nwarnings <- NULL [18:01:39.388] } [18:01:39.388] base::options(...future.oldOptions) [18:01:39.388] if (.Platform$OS.type == "windows") { [18:01:39.388] old_names <- names(...future.oldEnvVars) [18:01:39.388] envs <- base::Sys.getenv() [18:01:39.388] names <- names(envs) [18:01:39.388] common <- intersect(names, old_names) [18:01:39.388] added <- setdiff(names, old_names) [18:01:39.388] removed <- setdiff(old_names, names) [18:01:39.388] changed <- common[...future.oldEnvVars[common] != [18:01:39.388] envs[common]] [18:01:39.388] NAMES <- toupper(changed) [18:01:39.388] args <- list() [18:01:39.388] for (kk in seq_along(NAMES)) { [18:01:39.388] name <- changed[[kk]] [18:01:39.388] NAME <- NAMES[[kk]] [18:01:39.388] if (name != NAME && is.element(NAME, old_names)) [18:01:39.388] next [18:01:39.388] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.388] } [18:01:39.388] NAMES <- toupper(added) [18:01:39.388] for (kk in seq_along(NAMES)) { [18:01:39.388] name <- added[[kk]] [18:01:39.388] NAME <- NAMES[[kk]] [18:01:39.388] if (name != NAME && is.element(NAME, old_names)) [18:01:39.388] next [18:01:39.388] args[[name]] <- "" [18:01:39.388] } [18:01:39.388] NAMES <- toupper(removed) [18:01:39.388] for (kk in seq_along(NAMES)) { [18:01:39.388] name <- removed[[kk]] [18:01:39.388] NAME <- NAMES[[kk]] [18:01:39.388] if (name != NAME && is.element(NAME, old_names)) [18:01:39.388] next [18:01:39.388] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.388] } [18:01:39.388] if (length(args) > 0) [18:01:39.388] base::do.call(base::Sys.setenv, args = args) [18:01:39.388] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.388] } [18:01:39.388] else { [18:01:39.388] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.388] } [18:01:39.388] { [18:01:39.388] if (base::length(...future.futureOptionsAdded) > [18:01:39.388] 0L) { [18:01:39.388] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.388] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.388] base::options(opts) [18:01:39.388] } [18:01:39.388] { [18:01:39.388] { [18:01:39.388] NULL [18:01:39.388] RNGkind("Mersenne-Twister") [18:01:39.388] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.388] inherits = FALSE) [18:01:39.388] } [18:01:39.388] options(future.plan = NULL) [18:01:39.388] if (is.na(NA_character_)) [18:01:39.388] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.388] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.388] future::plan(list(function (..., envir = parent.frame()) [18:01:39.388] { [18:01:39.388] future <- SequentialFuture(..., envir = envir) [18:01:39.388] if (!future$lazy) [18:01:39.388] future <- run(future) [18:01:39.388] invisible(future) [18:01:39.388] }), .cleanup = FALSE, .init = FALSE) [18:01:39.388] } [18:01:39.388] } [18:01:39.388] } [18:01:39.388] }) [18:01:39.388] if (TRUE) { [18:01:39.388] base::sink(type = "output", split = FALSE) [18:01:39.388] if (TRUE) { [18:01:39.388] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.388] } [18:01:39.388] else { [18:01:39.388] ...future.result["stdout"] <- base::list(NULL) [18:01:39.388] } [18:01:39.388] base::close(...future.stdout) [18:01:39.388] ...future.stdout <- NULL [18:01:39.388] } [18:01:39.388] ...future.result$conditions <- ...future.conditions [18:01:39.388] ...future.result$finished <- base::Sys.time() [18:01:39.388] ...future.result [18:01:39.388] } [18:01:39.392] plan(): Setting new future strategy stack: [18:01:39.392] List of future strategies: [18:01:39.392] 1. sequential: [18:01:39.392] - args: function (..., envir = parent.frame()) [18:01:39.392] - tweaked: FALSE [18:01:39.392] - call: NULL [18:01:39.393] plan(): nbrOfWorkers() = 1 [18:01:39.394] plan(): Setting new future strategy stack: [18:01:39.394] List of future strategies: [18:01:39.394] 1. sequential: [18:01:39.394] - args: function (..., envir = parent.frame()) [18:01:39.394] - tweaked: FALSE [18:01:39.394] - call: plan(strategy) [18:01:39.394] plan(): nbrOfWorkers() = 1 [18:01:39.395] SequentialFuture started (and completed) [18:01:39.395] - Launch lazy future ... done [18:01:39.395] run() for 'SequentialFuture' ... done [18:01:39.395] getGlobalsAndPackages() ... [18:01:39.395] Searching for globals... [18:01:39.396] [18:01:39.396] Searching for globals ... DONE [18:01:39.396] - globals: [0] [18:01:39.396] getGlobalsAndPackages() ... DONE [18:01:39.396] run() for 'Future' ... [18:01:39.397] - state: 'created' [18:01:39.397] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.397] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.397] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.398] - Field: 'label' [18:01:39.398] - Field: 'local' [18:01:39.398] - Field: 'owner' [18:01:39.398] - Field: 'envir' [18:01:39.398] - Field: 'packages' [18:01:39.398] - Field: 'gc' [18:01:39.399] - Field: 'conditions' [18:01:39.399] - Field: 'expr' [18:01:39.399] - Field: 'uuid' [18:01:39.399] - Field: 'seed' [18:01:39.399] - Field: 'version' [18:01:39.400] - Field: 'result' [18:01:39.400] - Field: 'asynchronous' [18:01:39.400] - Field: 'calls' [18:01:39.400] - Field: 'globals' [18:01:39.400] - Field: 'stdout' [18:01:39.400] - Field: 'earlySignal' [18:01:39.401] - Field: 'lazy' [18:01:39.401] - Field: 'state' [18:01:39.401] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.401] - Launch lazy future ... [18:01:39.401] Packages needed by the future expression (n = 0): [18:01:39.402] Packages needed by future strategies (n = 0): [18:01:39.402] { [18:01:39.402] { [18:01:39.402] { [18:01:39.402] ...future.startTime <- base::Sys.time() [18:01:39.402] { [18:01:39.402] { [18:01:39.402] { [18:01:39.402] base::local({ [18:01:39.402] has_future <- base::requireNamespace("future", [18:01:39.402] quietly = TRUE) [18:01:39.402] if (has_future) { [18:01:39.402] ns <- base::getNamespace("future") [18:01:39.402] version <- ns[[".package"]][["version"]] [18:01:39.402] if (is.null(version)) [18:01:39.402] version <- utils::packageVersion("future") [18:01:39.402] } [18:01:39.402] else { [18:01:39.402] version <- NULL [18:01:39.402] } [18:01:39.402] if (!has_future || version < "1.8.0") { [18:01:39.402] info <- base::c(r_version = base::gsub("R version ", [18:01:39.402] "", base::R.version$version.string), [18:01:39.402] platform = base::sprintf("%s (%s-bit)", [18:01:39.402] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.402] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.402] "release", "version")], collapse = " "), [18:01:39.402] hostname = base::Sys.info()[["nodename"]]) [18:01:39.402] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.402] info) [18:01:39.402] info <- base::paste(info, collapse = "; ") [18:01:39.402] if (!has_future) { [18:01:39.402] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.402] info) [18:01:39.402] } [18:01:39.402] else { [18:01:39.402] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.402] info, version) [18:01:39.402] } [18:01:39.402] base::stop(msg) [18:01:39.402] } [18:01:39.402] }) [18:01:39.402] } [18:01:39.402] options(future.plan = NULL) [18:01:39.402] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.402] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.402] } [18:01:39.402] ...future.workdir <- getwd() [18:01:39.402] } [18:01:39.402] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.402] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.402] } [18:01:39.402] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.402] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.402] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.402] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.402] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.402] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.402] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.402] base::names(...future.oldOptions)) [18:01:39.402] } [18:01:39.402] if (FALSE) { [18:01:39.402] } [18:01:39.402] else { [18:01:39.402] if (TRUE) { [18:01:39.402] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.402] open = "w") [18:01:39.402] } [18:01:39.402] else { [18:01:39.402] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.402] windows = "NUL", "/dev/null"), open = "w") [18:01:39.402] } [18:01:39.402] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.402] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.402] base::sink(type = "output", split = FALSE) [18:01:39.402] base::close(...future.stdout) [18:01:39.402] }, add = TRUE) [18:01:39.402] } [18:01:39.402] ...future.frame <- base::sys.nframe() [18:01:39.402] ...future.conditions <- base::list() [18:01:39.402] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.402] if (FALSE) { [18:01:39.402] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.402] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.402] } [18:01:39.402] ...future.result <- base::tryCatch({ [18:01:39.402] base::withCallingHandlers({ [18:01:39.402] ...future.value <- base::withVisible(base::local(NULL)) [18:01:39.402] future::FutureResult(value = ...future.value$value, [18:01:39.402] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.402] ...future.rng), globalenv = if (FALSE) [18:01:39.402] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.402] ...future.globalenv.names)) [18:01:39.402] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.402] }, condition = base::local({ [18:01:39.402] c <- base::c [18:01:39.402] inherits <- base::inherits [18:01:39.402] invokeRestart <- base::invokeRestart [18:01:39.402] length <- base::length [18:01:39.402] list <- base::list [18:01:39.402] seq.int <- base::seq.int [18:01:39.402] signalCondition <- base::signalCondition [18:01:39.402] sys.calls <- base::sys.calls [18:01:39.402] `[[` <- base::`[[` [18:01:39.402] `+` <- base::`+` [18:01:39.402] `<<-` <- base::`<<-` [18:01:39.402] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.402] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.402] 3L)] [18:01:39.402] } [18:01:39.402] function(cond) { [18:01:39.402] is_error <- inherits(cond, "error") [18:01:39.402] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.402] NULL) [18:01:39.402] if (is_error) { [18:01:39.402] sessionInformation <- function() { [18:01:39.402] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.402] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.402] search = base::search(), system = base::Sys.info()) [18:01:39.402] } [18:01:39.402] ...future.conditions[[length(...future.conditions) + [18:01:39.402] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.402] cond$call), session = sessionInformation(), [18:01:39.402] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.402] signalCondition(cond) [18:01:39.402] } [18:01:39.402] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.402] "immediateCondition"))) { [18:01:39.402] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.402] ...future.conditions[[length(...future.conditions) + [18:01:39.402] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.402] if (TRUE && !signal) { [18:01:39.402] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.402] { [18:01:39.402] inherits <- base::inherits [18:01:39.402] invokeRestart <- base::invokeRestart [18:01:39.402] is.null <- base::is.null [18:01:39.402] muffled <- FALSE [18:01:39.402] if (inherits(cond, "message")) { [18:01:39.402] muffled <- grepl(pattern, "muffleMessage") [18:01:39.402] if (muffled) [18:01:39.402] invokeRestart("muffleMessage") [18:01:39.402] } [18:01:39.402] else if (inherits(cond, "warning")) { [18:01:39.402] muffled <- grepl(pattern, "muffleWarning") [18:01:39.402] if (muffled) [18:01:39.402] invokeRestart("muffleWarning") [18:01:39.402] } [18:01:39.402] else if (inherits(cond, "condition")) { [18:01:39.402] if (!is.null(pattern)) { [18:01:39.402] computeRestarts <- base::computeRestarts [18:01:39.402] grepl <- base::grepl [18:01:39.402] restarts <- computeRestarts(cond) [18:01:39.402] for (restart in restarts) { [18:01:39.402] name <- restart$name [18:01:39.402] if (is.null(name)) [18:01:39.402] next [18:01:39.402] if (!grepl(pattern, name)) [18:01:39.402] next [18:01:39.402] invokeRestart(restart) [18:01:39.402] muffled <- TRUE [18:01:39.402] break [18:01:39.402] } [18:01:39.402] } [18:01:39.402] } [18:01:39.402] invisible(muffled) [18:01:39.402] } [18:01:39.402] muffleCondition(cond, pattern = "^muffle") [18:01:39.402] } [18:01:39.402] } [18:01:39.402] else { [18:01:39.402] if (TRUE) { [18:01:39.402] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.402] { [18:01:39.402] inherits <- base::inherits [18:01:39.402] invokeRestart <- base::invokeRestart [18:01:39.402] is.null <- base::is.null [18:01:39.402] muffled <- FALSE [18:01:39.402] if (inherits(cond, "message")) { [18:01:39.402] muffled <- grepl(pattern, "muffleMessage") [18:01:39.402] if (muffled) [18:01:39.402] invokeRestart("muffleMessage") [18:01:39.402] } [18:01:39.402] else if (inherits(cond, "warning")) { [18:01:39.402] muffled <- grepl(pattern, "muffleWarning") [18:01:39.402] if (muffled) [18:01:39.402] invokeRestart("muffleWarning") [18:01:39.402] } [18:01:39.402] else if (inherits(cond, "condition")) { [18:01:39.402] if (!is.null(pattern)) { [18:01:39.402] computeRestarts <- base::computeRestarts [18:01:39.402] grepl <- base::grepl [18:01:39.402] restarts <- computeRestarts(cond) [18:01:39.402] for (restart in restarts) { [18:01:39.402] name <- restart$name [18:01:39.402] if (is.null(name)) [18:01:39.402] next [18:01:39.402] if (!grepl(pattern, name)) [18:01:39.402] next [18:01:39.402] invokeRestart(restart) [18:01:39.402] muffled <- TRUE [18:01:39.402] break [18:01:39.402] } [18:01:39.402] } [18:01:39.402] } [18:01:39.402] invisible(muffled) [18:01:39.402] } [18:01:39.402] muffleCondition(cond, pattern = "^muffle") [18:01:39.402] } [18:01:39.402] } [18:01:39.402] } [18:01:39.402] })) [18:01:39.402] }, error = function(ex) { [18:01:39.402] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.402] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.402] ...future.rng), started = ...future.startTime, [18:01:39.402] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.402] version = "1.8"), class = "FutureResult") [18:01:39.402] }, finally = { [18:01:39.402] if (!identical(...future.workdir, getwd())) [18:01:39.402] setwd(...future.workdir) [18:01:39.402] { [18:01:39.402] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.402] ...future.oldOptions$nwarnings <- NULL [18:01:39.402] } [18:01:39.402] base::options(...future.oldOptions) [18:01:39.402] if (.Platform$OS.type == "windows") { [18:01:39.402] old_names <- names(...future.oldEnvVars) [18:01:39.402] envs <- base::Sys.getenv() [18:01:39.402] names <- names(envs) [18:01:39.402] common <- intersect(names, old_names) [18:01:39.402] added <- setdiff(names, old_names) [18:01:39.402] removed <- setdiff(old_names, names) [18:01:39.402] changed <- common[...future.oldEnvVars[common] != [18:01:39.402] envs[common]] [18:01:39.402] NAMES <- toupper(changed) [18:01:39.402] args <- list() [18:01:39.402] for (kk in seq_along(NAMES)) { [18:01:39.402] name <- changed[[kk]] [18:01:39.402] NAME <- NAMES[[kk]] [18:01:39.402] if (name != NAME && is.element(NAME, old_names)) [18:01:39.402] next [18:01:39.402] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.402] } [18:01:39.402] NAMES <- toupper(added) [18:01:39.402] for (kk in seq_along(NAMES)) { [18:01:39.402] name <- added[[kk]] [18:01:39.402] NAME <- NAMES[[kk]] [18:01:39.402] if (name != NAME && is.element(NAME, old_names)) [18:01:39.402] next [18:01:39.402] args[[name]] <- "" [18:01:39.402] } [18:01:39.402] NAMES <- toupper(removed) [18:01:39.402] for (kk in seq_along(NAMES)) { [18:01:39.402] name <- removed[[kk]] [18:01:39.402] NAME <- NAMES[[kk]] [18:01:39.402] if (name != NAME && is.element(NAME, old_names)) [18:01:39.402] next [18:01:39.402] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.402] } [18:01:39.402] if (length(args) > 0) [18:01:39.402] base::do.call(base::Sys.setenv, args = args) [18:01:39.402] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.402] } [18:01:39.402] else { [18:01:39.402] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.402] } [18:01:39.402] { [18:01:39.402] if (base::length(...future.futureOptionsAdded) > [18:01:39.402] 0L) { [18:01:39.402] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.402] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.402] base::options(opts) [18:01:39.402] } [18:01:39.402] { [18:01:39.402] { [18:01:39.402] NULL [18:01:39.402] RNGkind("Mersenne-Twister") [18:01:39.402] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.402] inherits = FALSE) [18:01:39.402] } [18:01:39.402] options(future.plan = NULL) [18:01:39.402] if (is.na(NA_character_)) [18:01:39.402] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.402] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.402] future::plan(list(function (..., envir = parent.frame()) [18:01:39.402] { [18:01:39.402] future <- SequentialFuture(..., envir = envir) [18:01:39.402] if (!future$lazy) [18:01:39.402] future <- run(future) [18:01:39.402] invisible(future) [18:01:39.402] }), .cleanup = FALSE, .init = FALSE) [18:01:39.402] } [18:01:39.402] } [18:01:39.402] } [18:01:39.402] }) [18:01:39.402] if (TRUE) { [18:01:39.402] base::sink(type = "output", split = FALSE) [18:01:39.402] if (TRUE) { [18:01:39.402] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.402] } [18:01:39.402] else { [18:01:39.402] ...future.result["stdout"] <- base::list(NULL) [18:01:39.402] } [18:01:39.402] base::close(...future.stdout) [18:01:39.402] ...future.stdout <- NULL [18:01:39.402] } [18:01:39.402] ...future.result$conditions <- ...future.conditions [18:01:39.402] ...future.result$finished <- base::Sys.time() [18:01:39.402] ...future.result [18:01:39.402] } [18:01:39.406] plan(): Setting new future strategy stack: [18:01:39.406] List of future strategies: [18:01:39.406] 1. sequential: [18:01:39.406] - args: function (..., envir = parent.frame()) [18:01:39.406] - tweaked: FALSE [18:01:39.406] - call: NULL [18:01:39.407] plan(): nbrOfWorkers() = 1 [18:01:39.408] plan(): Setting new future strategy stack: [18:01:39.408] List of future strategies: [18:01:39.408] 1. sequential: [18:01:39.408] - args: function (..., envir = parent.frame()) [18:01:39.408] - tweaked: FALSE [18:01:39.408] - call: plan(strategy) [18:01:39.409] plan(): nbrOfWorkers() = 1 [18:01:39.409] SequentialFuture started (and completed) [18:01:39.410] - Launch lazy future ... done [18:01:39.410] run() for 'SequentialFuture' ... done [18:01:39.410] getGlobalsAndPackages() ... [18:01:39.410] Searching for globals... [18:01:39.411] - globals found: [1] '{' [18:01:39.411] Searching for globals ... DONE [18:01:39.411] Resolving globals: FALSE [18:01:39.412] [18:01:39.412] [18:01:39.412] getGlobalsAndPackages() ... DONE [18:01:39.412] run() for 'Future' ... [18:01:39.413] - state: 'created' [18:01:39.413] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:01:39.413] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:01:39.413] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:01:39.414] - Field: 'label' [18:01:39.414] - Field: 'local' [18:01:39.414] - Field: 'owner' [18:01:39.414] - Field: 'envir' [18:01:39.414] - Field: 'packages' [18:01:39.414] - Field: 'gc' [18:01:39.415] - Field: 'conditions' [18:01:39.415] - Field: 'expr' [18:01:39.415] - Field: 'uuid' [18:01:39.415] - Field: 'seed' [18:01:39.415] - Field: 'version' [18:01:39.415] - Field: 'result' [18:01:39.416] - Field: 'asynchronous' [18:01:39.416] - Field: 'calls' [18:01:39.416] - Field: 'globals' [18:01:39.417] - Field: 'stdout' [18:01:39.417] - Field: 'earlySignal' [18:01:39.417] - Field: 'lazy' [18:01:39.418] - Field: 'state' [18:01:39.418] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:01:39.418] - Launch lazy future ... [18:01:39.418] Packages needed by the future expression (n = 0): [18:01:39.418] Packages needed by future strategies (n = 0): [18:01:39.419] { [18:01:39.419] { [18:01:39.419] { [18:01:39.419] ...future.startTime <- base::Sys.time() [18:01:39.419] { [18:01:39.419] { [18:01:39.419] { [18:01:39.419] base::local({ [18:01:39.419] has_future <- base::requireNamespace("future", [18:01:39.419] quietly = TRUE) [18:01:39.419] if (has_future) { [18:01:39.419] ns <- base::getNamespace("future") [18:01:39.419] version <- ns[[".package"]][["version"]] [18:01:39.419] if (is.null(version)) [18:01:39.419] version <- utils::packageVersion("future") [18:01:39.419] } [18:01:39.419] else { [18:01:39.419] version <- NULL [18:01:39.419] } [18:01:39.419] if (!has_future || version < "1.8.0") { [18:01:39.419] info <- base::c(r_version = base::gsub("R version ", [18:01:39.419] "", base::R.version$version.string), [18:01:39.419] platform = base::sprintf("%s (%s-bit)", [18:01:39.419] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:39.419] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:39.419] "release", "version")], collapse = " "), [18:01:39.419] hostname = base::Sys.info()[["nodename"]]) [18:01:39.419] info <- base::sprintf("%s: %s", base::names(info), [18:01:39.419] info) [18:01:39.419] info <- base::paste(info, collapse = "; ") [18:01:39.419] if (!has_future) { [18:01:39.419] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:39.419] info) [18:01:39.419] } [18:01:39.419] else { [18:01:39.419] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:39.419] info, version) [18:01:39.419] } [18:01:39.419] base::stop(msg) [18:01:39.419] } [18:01:39.419] }) [18:01:39.419] } [18:01:39.419] options(future.plan = NULL) [18:01:39.419] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.419] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:39.419] } [18:01:39.419] ...future.workdir <- getwd() [18:01:39.419] } [18:01:39.419] ...future.oldOptions <- base::as.list(base::.Options) [18:01:39.419] ...future.oldEnvVars <- base::Sys.getenv() [18:01:39.419] } [18:01:39.419] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:39.419] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:39.419] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:39.419] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:39.419] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:39.419] future.stdout.windows.reencode = NULL, width = 80L) [18:01:39.419] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:39.419] base::names(...future.oldOptions)) [18:01:39.419] } [18:01:39.419] if (FALSE) { [18:01:39.419] } [18:01:39.419] else { [18:01:39.419] if (TRUE) { [18:01:39.419] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:39.419] open = "w") [18:01:39.419] } [18:01:39.419] else { [18:01:39.419] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:39.419] windows = "NUL", "/dev/null"), open = "w") [18:01:39.419] } [18:01:39.419] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:39.419] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:39.419] base::sink(type = "output", split = FALSE) [18:01:39.419] base::close(...future.stdout) [18:01:39.419] }, add = TRUE) [18:01:39.419] } [18:01:39.419] ...future.frame <- base::sys.nframe() [18:01:39.419] ...future.conditions <- base::list() [18:01:39.419] ...future.rng <- base::globalenv()$.Random.seed [18:01:39.419] if (FALSE) { [18:01:39.419] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:39.419] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:39.419] } [18:01:39.419] ...future.result <- base::tryCatch({ [18:01:39.419] base::withCallingHandlers({ [18:01:39.419] ...future.value <- base::withVisible(base::local({ [18:01:39.419] 4 [18:01:39.419] })) [18:01:39.419] future::FutureResult(value = ...future.value$value, [18:01:39.419] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.419] ...future.rng), globalenv = if (FALSE) [18:01:39.419] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:39.419] ...future.globalenv.names)) [18:01:39.419] else NULL, started = ...future.startTime, version = "1.8") [18:01:39.419] }, condition = base::local({ [18:01:39.419] c <- base::c [18:01:39.419] inherits <- base::inherits [18:01:39.419] invokeRestart <- base::invokeRestart [18:01:39.419] length <- base::length [18:01:39.419] list <- base::list [18:01:39.419] seq.int <- base::seq.int [18:01:39.419] signalCondition <- base::signalCondition [18:01:39.419] sys.calls <- base::sys.calls [18:01:39.419] `[[` <- base::`[[` [18:01:39.419] `+` <- base::`+` [18:01:39.419] `<<-` <- base::`<<-` [18:01:39.419] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:39.419] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:39.419] 3L)] [18:01:39.419] } [18:01:39.419] function(cond) { [18:01:39.419] is_error <- inherits(cond, "error") [18:01:39.419] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:39.419] NULL) [18:01:39.419] if (is_error) { [18:01:39.419] sessionInformation <- function() { [18:01:39.419] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:39.419] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:39.419] search = base::search(), system = base::Sys.info()) [18:01:39.419] } [18:01:39.419] ...future.conditions[[length(...future.conditions) + [18:01:39.419] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:39.419] cond$call), session = sessionInformation(), [18:01:39.419] timestamp = base::Sys.time(), signaled = 0L) [18:01:39.419] signalCondition(cond) [18:01:39.419] } [18:01:39.419] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:39.419] "immediateCondition"))) { [18:01:39.419] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:39.419] ...future.conditions[[length(...future.conditions) + [18:01:39.419] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:39.419] if (TRUE && !signal) { [18:01:39.419] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.419] { [18:01:39.419] inherits <- base::inherits [18:01:39.419] invokeRestart <- base::invokeRestart [18:01:39.419] is.null <- base::is.null [18:01:39.419] muffled <- FALSE [18:01:39.419] if (inherits(cond, "message")) { [18:01:39.419] muffled <- grepl(pattern, "muffleMessage") [18:01:39.419] if (muffled) [18:01:39.419] invokeRestart("muffleMessage") [18:01:39.419] } [18:01:39.419] else if (inherits(cond, "warning")) { [18:01:39.419] muffled <- grepl(pattern, "muffleWarning") [18:01:39.419] if (muffled) [18:01:39.419] invokeRestart("muffleWarning") [18:01:39.419] } [18:01:39.419] else if (inherits(cond, "condition")) { [18:01:39.419] if (!is.null(pattern)) { [18:01:39.419] computeRestarts <- base::computeRestarts [18:01:39.419] grepl <- base::grepl [18:01:39.419] restarts <- computeRestarts(cond) [18:01:39.419] for (restart in restarts) { [18:01:39.419] name <- restart$name [18:01:39.419] if (is.null(name)) [18:01:39.419] next [18:01:39.419] if (!grepl(pattern, name)) [18:01:39.419] next [18:01:39.419] invokeRestart(restart) [18:01:39.419] muffled <- TRUE [18:01:39.419] break [18:01:39.419] } [18:01:39.419] } [18:01:39.419] } [18:01:39.419] invisible(muffled) [18:01:39.419] } [18:01:39.419] muffleCondition(cond, pattern = "^muffle") [18:01:39.419] } [18:01:39.419] } [18:01:39.419] else { [18:01:39.419] if (TRUE) { [18:01:39.419] muffleCondition <- function (cond, pattern = "^muffle") [18:01:39.419] { [18:01:39.419] inherits <- base::inherits [18:01:39.419] invokeRestart <- base::invokeRestart [18:01:39.419] is.null <- base::is.null [18:01:39.419] muffled <- FALSE [18:01:39.419] if (inherits(cond, "message")) { [18:01:39.419] muffled <- grepl(pattern, "muffleMessage") [18:01:39.419] if (muffled) [18:01:39.419] invokeRestart("muffleMessage") [18:01:39.419] } [18:01:39.419] else if (inherits(cond, "warning")) { [18:01:39.419] muffled <- grepl(pattern, "muffleWarning") [18:01:39.419] if (muffled) [18:01:39.419] invokeRestart("muffleWarning") [18:01:39.419] } [18:01:39.419] else if (inherits(cond, "condition")) { [18:01:39.419] if (!is.null(pattern)) { [18:01:39.419] computeRestarts <- base::computeRestarts [18:01:39.419] grepl <- base::grepl [18:01:39.419] restarts <- computeRestarts(cond) [18:01:39.419] for (restart in restarts) { [18:01:39.419] name <- restart$name [18:01:39.419] if (is.null(name)) [18:01:39.419] next [18:01:39.419] if (!grepl(pattern, name)) [18:01:39.419] next [18:01:39.419] invokeRestart(restart) [18:01:39.419] muffled <- TRUE [18:01:39.419] break [18:01:39.419] } [18:01:39.419] } [18:01:39.419] } [18:01:39.419] invisible(muffled) [18:01:39.419] } [18:01:39.419] muffleCondition(cond, pattern = "^muffle") [18:01:39.419] } [18:01:39.419] } [18:01:39.419] } [18:01:39.419] })) [18:01:39.419] }, error = function(ex) { [18:01:39.419] base::structure(base::list(value = NULL, visible = NULL, [18:01:39.419] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:39.419] ...future.rng), started = ...future.startTime, [18:01:39.419] finished = Sys.time(), session_uuid = NA_character_, [18:01:39.419] version = "1.8"), class = "FutureResult") [18:01:39.419] }, finally = { [18:01:39.419] if (!identical(...future.workdir, getwd())) [18:01:39.419] setwd(...future.workdir) [18:01:39.419] { [18:01:39.419] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:39.419] ...future.oldOptions$nwarnings <- NULL [18:01:39.419] } [18:01:39.419] base::options(...future.oldOptions) [18:01:39.419] if (.Platform$OS.type == "windows") { [18:01:39.419] old_names <- names(...future.oldEnvVars) [18:01:39.419] envs <- base::Sys.getenv() [18:01:39.419] names <- names(envs) [18:01:39.419] common <- intersect(names, old_names) [18:01:39.419] added <- setdiff(names, old_names) [18:01:39.419] removed <- setdiff(old_names, names) [18:01:39.419] changed <- common[...future.oldEnvVars[common] != [18:01:39.419] envs[common]] [18:01:39.419] NAMES <- toupper(changed) [18:01:39.419] args <- list() [18:01:39.419] for (kk in seq_along(NAMES)) { [18:01:39.419] name <- changed[[kk]] [18:01:39.419] NAME <- NAMES[[kk]] [18:01:39.419] if (name != NAME && is.element(NAME, old_names)) [18:01:39.419] next [18:01:39.419] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.419] } [18:01:39.419] NAMES <- toupper(added) [18:01:39.419] for (kk in seq_along(NAMES)) { [18:01:39.419] name <- added[[kk]] [18:01:39.419] NAME <- NAMES[[kk]] [18:01:39.419] if (name != NAME && is.element(NAME, old_names)) [18:01:39.419] next [18:01:39.419] args[[name]] <- "" [18:01:39.419] } [18:01:39.419] NAMES <- toupper(removed) [18:01:39.419] for (kk in seq_along(NAMES)) { [18:01:39.419] name <- removed[[kk]] [18:01:39.419] NAME <- NAMES[[kk]] [18:01:39.419] if (name != NAME && is.element(NAME, old_names)) [18:01:39.419] next [18:01:39.419] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:39.419] } [18:01:39.419] if (length(args) > 0) [18:01:39.419] base::do.call(base::Sys.setenv, args = args) [18:01:39.419] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:39.419] } [18:01:39.419] else { [18:01:39.419] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:39.419] } [18:01:39.419] { [18:01:39.419] if (base::length(...future.futureOptionsAdded) > [18:01:39.419] 0L) { [18:01:39.419] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:39.419] base::names(opts) <- ...future.futureOptionsAdded [18:01:39.419] base::options(opts) [18:01:39.419] } [18:01:39.419] { [18:01:39.419] { [18:01:39.419] NULL [18:01:39.419] RNGkind("Mersenne-Twister") [18:01:39.419] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:01:39.419] inherits = FALSE) [18:01:39.419] } [18:01:39.419] options(future.plan = NULL) [18:01:39.419] if (is.na(NA_character_)) [18:01:39.419] Sys.unsetenv("R_FUTURE_PLAN") [18:01:39.419] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:39.419] future::plan(list(function (..., envir = parent.frame()) [18:01:39.419] { [18:01:39.419] future <- SequentialFuture(..., envir = envir) [18:01:39.419] if (!future$lazy) [18:01:39.419] future <- run(future) [18:01:39.419] invisible(future) [18:01:39.419] }), .cleanup = FALSE, .init = FALSE) [18:01:39.419] } [18:01:39.419] } [18:01:39.419] } [18:01:39.419] }) [18:01:39.419] if (TRUE) { [18:01:39.419] base::sink(type = "output", split = FALSE) [18:01:39.419] if (TRUE) { [18:01:39.419] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:39.419] } [18:01:39.419] else { [18:01:39.419] ...future.result["stdout"] <- base::list(NULL) [18:01:39.419] } [18:01:39.419] base::close(...future.stdout) [18:01:39.419] ...future.stdout <- NULL [18:01:39.419] } [18:01:39.419] ...future.result$conditions <- ...future.conditions [18:01:39.419] ...future.result$finished <- base::Sys.time() [18:01:39.419] ...future.result [18:01:39.419] } [18:01:39.423] plan(): Setting new future strategy stack: [18:01:39.423] List of future strategies: [18:01:39.423] 1. sequential: [18:01:39.423] - args: function (..., envir = parent.frame()) [18:01:39.423] - tweaked: FALSE [18:01:39.423] - call: NULL [18:01:39.423] plan(): nbrOfWorkers() = 1 [18:01:39.425] plan(): Setting new future strategy stack: [18:01:39.425] List of future strategies: [18:01:39.425] 1. sequential: [18:01:39.425] - args: function (..., envir = parent.frame()) [18:01:39.425] - tweaked: FALSE [18:01:39.425] - call: plan(strategy) [18:01:39.425] plan(): nbrOfWorkers() = 1 [18:01:39.425] SequentialFuture started (and completed) [18:01:39.426] - Launch lazy future ... done [18:01:39.426] 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" [18:01:39.431] resolved() for 'SequentialFuture' ... [18:01:39.431] - state: 'finished' [18:01:39.431] - run: TRUE [18:01:39.431] - result: 'FutureResult' [18:01:39.431] resolved() for 'SequentialFuture' ... done [18:01:39.432] resolved() for 'SequentialFuture' ... [18:01:39.432] - state: 'finished' [18:01:39.432] - run: TRUE [18:01:39.432] - result: 'FutureResult' [18:01:39.432] resolved() for 'SequentialFuture' ... done [18:01:39.432] resolved() for 'SequentialFuture' ... [18:01:39.433] - state: 'finished' [18:01:39.433] - run: TRUE [18:01:39.433] - result: 'FutureResult' [18:01:39.433] 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" ... [18:01:39.436] resolve() on list environment ... [18:01:39.437] recursive: 0 [18:01:39.438] length: 6 [18:01:39.438] elements: 'a', 'b', 'c', 'd', '', '' [18:01:39.438] signalConditionsASAP(numeric, pos=1) ... [18:01:39.438] - nx: 6 [18:01:39.438] - relay: TRUE [18:01:39.439] - stdout: TRUE [18:01:39.439] - signal: TRUE [18:01:39.439] - resignal: FALSE [18:01:39.439] - force: TRUE [18:01:39.439] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.439] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.440] - until=2 [18:01:39.440] - relaying element #2 [18:01:39.440] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.440] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.440] signalConditionsASAP(NULL, pos=1) ... done [18:01:39.440] length: 5 (resolved future 1) [18:01:39.441] resolved() for 'SequentialFuture' ... [18:01:39.441] - state: 'finished' [18:01:39.441] - run: TRUE [18:01:39.441] - result: 'FutureResult' [18:01:39.441] resolved() for 'SequentialFuture' ... done [18:01:39.441] Future #2 [18:01:39.442] signalConditionsASAP(SequentialFuture, pos=2) ... [18:01:39.442] - nx: 6 [18:01:39.442] - relay: TRUE [18:01:39.442] - stdout: TRUE [18:01:39.442] - signal: TRUE [18:01:39.442] - resignal: FALSE [18:01:39.443] - force: TRUE [18:01:39.443] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.443] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:39.443] - until=2 [18:01:39.443] - relaying element #2 [18:01:39.443] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.444] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.444] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:01:39.444] length: 4 (resolved future 2) [18:01:39.444] resolved() for 'SequentialFuture' ... [18:01:39.444] - state: 'finished' [18:01:39.444] - run: TRUE [18:01:39.445] - result: 'FutureResult' [18:01:39.445] resolved() for 'SequentialFuture' ... done [18:01:39.445] Future #3 [18:01:39.445] signalConditionsASAP(SequentialFuture, pos=3) ... [18:01:39.445] - nx: 6 [18:01:39.446] - relay: TRUE [18:01:39.446] - stdout: TRUE [18:01:39.446] - signal: TRUE [18:01:39.446] - resignal: FALSE [18:01:39.446] - force: TRUE [18:01:39.446] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.446] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:39.447] - until=3 [18:01:39.447] - relaying element #3 [18:01:39.447] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.447] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.447] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:01:39.448] length: 3 (resolved future 3) [18:01:39.448] resolved() for 'SequentialFuture' ... [18:01:39.448] - state: 'finished' [18:01:39.448] - run: TRUE [18:01:39.448] - result: 'FutureResult' [18:01:39.448] resolved() for 'SequentialFuture' ... done [18:01:39.449] Future #4 [18:01:39.449] signalConditionsASAP(SequentialFuture, pos=4) ... [18:01:39.449] - nx: 6 [18:01:39.449] - relay: TRUE [18:01:39.449] - stdout: TRUE [18:01:39.449] - signal: TRUE [18:01:39.450] - resignal: FALSE [18:01:39.450] - force: TRUE [18:01:39.450] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.450] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:39.450] - until=4 [18:01:39.450] - relaying element #4 [18:01:39.451] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.452] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.452] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:01:39.452] length: 2 (resolved future 4) [18:01:39.452] signalConditionsASAP(NULL, pos=5) ... [18:01:39.452] - nx: 6 [18:01:39.452] - relay: TRUE [18:01:39.453] - stdout: TRUE [18:01:39.453] - signal: TRUE [18:01:39.453] - resignal: FALSE [18:01:39.453] - force: TRUE [18:01:39.453] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.453] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.454] - until=6 [18:01:39.454] - relaying element #6 [18:01:39.454] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.454] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.454] signalConditionsASAP(NULL, pos=5) ... done [18:01:39.454] length: 1 (resolved future 5) [18:01:39.455] signalConditionsASAP(numeric, pos=6) ... [18:01:39.455] - nx: 6 [18:01:39.455] - relay: TRUE [18:01:39.455] - stdout: TRUE [18:01:39.455] - signal: TRUE [18:01:39.455] - resignal: FALSE [18:01:39.455] - force: TRUE [18:01:39.456] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:39.456] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.456] - until=6 [18:01:39.456] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.456] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.456] signalConditionsASAP(numeric, pos=6) ... done [18:01:39.457] length: 0 (resolved future 6) [18:01:39.457] Relaying remaining futures [18:01:39.457] signalConditionsASAP(NULL, pos=0) ... [18:01:39.457] - nx: 6 [18:01:39.457] - relay: TRUE [18:01:39.457] - stdout: TRUE [18:01:39.457] - signal: TRUE [18:01:39.458] - resignal: FALSE [18:01:39.458] - force: TRUE [18:01:39.458] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.458] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:39.458] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:39.458] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:39.459] signalConditionsASAP(NULL, pos=0) ... done [18:01:39.459] 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 [18:01:39.462] plan(): Setting new future strategy stack: [18:01:39.462] List of future strategies: [18:01:39.462] 1. multisession: [18:01:39.462] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:39.462] - tweaked: FALSE [18:01:39.462] - call: plan(strategy) [18:01:39.463] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:01:39.463] multisession: [18:01:39.463] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:39.463] - tweaked: FALSE [18:01:39.463] - call: plan(strategy) [18:01:39.468] getGlobalsAndPackages() ... [18:01:39.468] Not searching for globals [18:01:39.468] - globals: [0] [18:01:39.468] getGlobalsAndPackages() ... DONE [18:01:39.469] [local output] makeClusterPSOCK() ... [18:01:39.499] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:01:39.506] [local output] Base port: 29064 [18:01:39.507] [local output] Getting setup options for 2 cluster nodes ... [18:01:39.507] [local output] - Node 1 of 2 ... [18:01:39.507] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:39.509] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187cf7a7244.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187cf7a7244.pid\")"' [18:01:39.955] - Possible to infer worker's PID: TRUE [18:01:39.955] [local output] Rscript port: 29064 [18:01:39.956] [local output] - Node 2 of 2 ... [18:01:39.956] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:39.957] [local output] Rscript port: 29064 [18:01:39.958] [local output] Getting setup options for 2 cluster nodes ... done [18:01:39.958] [local output] - Parallel setup requested for some PSOCK nodes [18:01:39.959] [local output] Setting up PSOCK nodes in parallel [18:01:39.959] List of 36 [18:01:39.959] $ worker : chr "localhost" [18:01:39.959] ..- attr(*, "localhost")= logi TRUE [18:01:39.959] $ master : chr "localhost" [18:01:39.959] $ port : int 29064 [18:01:39.959] $ connectTimeout : num 120 [18:01:39.959] $ timeout : num 120 [18:01:39.959] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:01:39.959] $ homogeneous : logi TRUE [18:01:39.959] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=futures.R:202876:CRANWIN3:CRAN\""| __truncated__ [18:01:39.959] $ rscript_envs : NULL [18:01:39.959] $ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:39.959] $ rscript_startup : NULL [18:01:39.959] $ rscript_sh : chr "cmd" [18:01:39.959] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:39.959] $ methods : logi TRUE [18:01:39.959] $ socketOptions : chr "no-delay" [18:01:39.959] $ useXDR : logi FALSE [18:01:39.959] $ outfile : chr "/dev/null" [18:01:39.959] $ renice : int NA [18:01:39.959] $ rshcmd : NULL [18:01:39.959] $ user : chr(0) [18:01:39.959] $ revtunnel : logi FALSE [18:01:39.959] $ rshlogfile : NULL [18:01:39.959] $ rshopts : chr(0) [18:01:39.959] $ rank : int 1 [18:01:39.959] $ manual : logi FALSE [18:01:39.959] $ dryrun : logi FALSE [18:01:39.959] $ quiet : logi FALSE [18:01:39.959] $ setup_strategy : chr "parallel" [18:01:39.959] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:39.959] $ pidfile : chr "D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187cf7a7244.pid" [18:01:39.959] $ rshcmd_label : NULL [18:01:39.959] $ rsh_call : NULL [18:01:39.959] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:39.959] $ localMachine : logi TRUE [18:01:39.959] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:01:39.959] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:01:39.959] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:01:39.959] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:01:39.959] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:01:39.959] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [18:01:39.959] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:01:39.959] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:01:39.959] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:01:39.959] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:01:39.959] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:01:39.959] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:01:39.959] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:01:39.959] $ arguments :List of 28 [18:01:39.959] ..$ worker : chr "localhost" [18:01:39.959] ..$ master : NULL [18:01:39.959] ..$ port : int 29064 [18:01:39.959] ..$ connectTimeout : num 120 [18:01:39.959] ..$ timeout : num 120 [18:01:39.959] ..$ rscript : NULL [18:01:39.959] ..$ homogeneous : NULL [18:01:39.959] ..$ rscript_args : NULL [18:01:39.959] ..$ rscript_envs : NULL [18:01:39.959] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:39.959] ..$ rscript_startup : NULL [18:01:39.959] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [18:01:39.959] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:39.959] ..$ methods : logi TRUE [18:01:39.959] ..$ socketOptions : chr "no-delay" [18:01:39.959] ..$ useXDR : logi FALSE [18:01:39.959] ..$ outfile : chr "/dev/null" [18:01:39.959] ..$ renice : int NA [18:01:39.959] ..$ rshcmd : NULL [18:01:39.959] ..$ user : NULL [18:01:39.959] ..$ revtunnel : logi NA [18:01:39.959] ..$ rshlogfile : NULL [18:01:39.959] ..$ rshopts : NULL [18:01:39.959] ..$ rank : int 1 [18:01:39.959] ..$ manual : logi FALSE [18:01:39.959] ..$ dryrun : logi FALSE [18:01:39.959] ..$ quiet : logi FALSE [18:01:39.959] ..$ setup_strategy : chr "parallel" [18:01:39.959] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:01:39.980] [local output] System call to launch all workers: [18:01:39.980] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=futures.R:202876:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187cf7a7244.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=29064 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:01:39.981] [local output] Starting PSOCK main server [18:01:39.989] [local output] Workers launched [18:01:39.989] [local output] Waiting for workers to connect back [18:01:39.989] - [local output] 0 workers out of 2 ready [18:01:40.160] - [local output] 0 workers out of 2 ready [18:01:40.160] - [local output] 1 workers out of 2 ready [18:01:40.161] - [local output] 1 workers out of 2 ready [18:01:40.162] - [local output] 2 workers out of 2 ready [18:01:40.162] [local output] Launching of workers completed [18:01:40.162] [local output] Collecting session information from workers [18:01:40.163] [local output] - Worker #1 of 2 [18:01:40.164] [local output] - Worker #2 of 2 [18:01:40.164] [local output] makeClusterPSOCK() ... done [18:01:40.177] Packages needed by the future expression (n = 0): [18:01:40.177] Packages needed by future strategies (n = 0): [18:01:40.178] { [18:01:40.178] { [18:01:40.178] { [18:01:40.178] ...future.startTime <- base::Sys.time() [18:01:40.178] { [18:01:40.178] { [18:01:40.178] { [18:01:40.178] { [18:01:40.178] base::local({ [18:01:40.178] has_future <- base::requireNamespace("future", [18:01:40.178] quietly = TRUE) [18:01:40.178] if (has_future) { [18:01:40.178] ns <- base::getNamespace("future") [18:01:40.178] version <- ns[[".package"]][["version"]] [18:01:40.178] if (is.null(version)) [18:01:40.178] version <- utils::packageVersion("future") [18:01:40.178] } [18:01:40.178] else { [18:01:40.178] version <- NULL [18:01:40.178] } [18:01:40.178] if (!has_future || version < "1.8.0") { [18:01:40.178] info <- base::c(r_version = base::gsub("R version ", [18:01:40.178] "", base::R.version$version.string), [18:01:40.178] platform = base::sprintf("%s (%s-bit)", [18:01:40.178] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.178] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.178] "release", "version")], collapse = " "), [18:01:40.178] hostname = base::Sys.info()[["nodename"]]) [18:01:40.178] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.178] info) [18:01:40.178] info <- base::paste(info, collapse = "; ") [18:01:40.178] if (!has_future) { [18:01:40.178] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.178] info) [18:01:40.178] } [18:01:40.178] else { [18:01:40.178] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.178] info, version) [18:01:40.178] } [18:01:40.178] base::stop(msg) [18:01:40.178] } [18:01:40.178] }) [18:01:40.178] } [18:01:40.178] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.178] base::options(mc.cores = 1L) [18:01:40.178] } [18:01:40.178] options(future.plan = NULL) [18:01:40.178] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.178] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.178] } [18:01:40.178] ...future.workdir <- getwd() [18:01:40.178] } [18:01:40.178] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.178] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.178] } [18:01:40.178] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.178] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.178] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.178] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.178] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.178] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.178] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.178] base::names(...future.oldOptions)) [18:01:40.178] } [18:01:40.178] if (FALSE) { [18:01:40.178] } [18:01:40.178] else { [18:01:40.178] if (TRUE) { [18:01:40.178] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.178] open = "w") [18:01:40.178] } [18:01:40.178] else { [18:01:40.178] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.178] windows = "NUL", "/dev/null"), open = "w") [18:01:40.178] } [18:01:40.178] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.178] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.178] base::sink(type = "output", split = FALSE) [18:01:40.178] base::close(...future.stdout) [18:01:40.178] }, add = TRUE) [18:01:40.178] } [18:01:40.178] ...future.frame <- base::sys.nframe() [18:01:40.178] ...future.conditions <- base::list() [18:01:40.178] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.178] if (FALSE) { [18:01:40.178] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.178] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.178] } [18:01:40.178] ...future.result <- base::tryCatch({ [18:01:40.178] base::withCallingHandlers({ [18:01:40.178] ...future.value <- base::withVisible(base::local({ [18:01:40.178] ...future.makeSendCondition <- local({ [18:01:40.178] sendCondition <- NULL [18:01:40.178] function(frame = 1L) { [18:01:40.178] if (is.function(sendCondition)) [18:01:40.178] return(sendCondition) [18:01:40.178] ns <- getNamespace("parallel") [18:01:40.178] if (exists("sendData", mode = "function", [18:01:40.178] envir = ns)) { [18:01:40.178] parallel_sendData <- get("sendData", mode = "function", [18:01:40.178] envir = ns) [18:01:40.178] envir <- sys.frame(frame) [18:01:40.178] master <- NULL [18:01:40.178] while (!identical(envir, .GlobalEnv) && [18:01:40.178] !identical(envir, emptyenv())) { [18:01:40.178] if (exists("master", mode = "list", envir = envir, [18:01:40.178] inherits = FALSE)) { [18:01:40.178] master <- get("master", mode = "list", [18:01:40.178] envir = envir, inherits = FALSE) [18:01:40.178] if (inherits(master, c("SOCKnode", [18:01:40.178] "SOCK0node"))) { [18:01:40.178] sendCondition <<- function(cond) { [18:01:40.178] data <- list(type = "VALUE", value = cond, [18:01:40.178] success = TRUE) [18:01:40.178] parallel_sendData(master, data) [18:01:40.178] } [18:01:40.178] return(sendCondition) [18:01:40.178] } [18:01:40.178] } [18:01:40.178] frame <- frame + 1L [18:01:40.178] envir <- sys.frame(frame) [18:01:40.178] } [18:01:40.178] } [18:01:40.178] sendCondition <<- function(cond) NULL [18:01:40.178] } [18:01:40.178] }) [18:01:40.178] withCallingHandlers({ [18:01:40.178] NA [18:01:40.178] }, immediateCondition = function(cond) { [18:01:40.178] sendCondition <- ...future.makeSendCondition() [18:01:40.178] sendCondition(cond) [18:01:40.178] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.178] { [18:01:40.178] inherits <- base::inherits [18:01:40.178] invokeRestart <- base::invokeRestart [18:01:40.178] is.null <- base::is.null [18:01:40.178] muffled <- FALSE [18:01:40.178] if (inherits(cond, "message")) { [18:01:40.178] muffled <- grepl(pattern, "muffleMessage") [18:01:40.178] if (muffled) [18:01:40.178] invokeRestart("muffleMessage") [18:01:40.178] } [18:01:40.178] else if (inherits(cond, "warning")) { [18:01:40.178] muffled <- grepl(pattern, "muffleWarning") [18:01:40.178] if (muffled) [18:01:40.178] invokeRestart("muffleWarning") [18:01:40.178] } [18:01:40.178] else if (inherits(cond, "condition")) { [18:01:40.178] if (!is.null(pattern)) { [18:01:40.178] computeRestarts <- base::computeRestarts [18:01:40.178] grepl <- base::grepl [18:01:40.178] restarts <- computeRestarts(cond) [18:01:40.178] for (restart in restarts) { [18:01:40.178] name <- restart$name [18:01:40.178] if (is.null(name)) [18:01:40.178] next [18:01:40.178] if (!grepl(pattern, name)) [18:01:40.178] next [18:01:40.178] invokeRestart(restart) [18:01:40.178] muffled <- TRUE [18:01:40.178] break [18:01:40.178] } [18:01:40.178] } [18:01:40.178] } [18:01:40.178] invisible(muffled) [18:01:40.178] } [18:01:40.178] muffleCondition(cond) [18:01:40.178] }) [18:01:40.178] })) [18:01:40.178] future::FutureResult(value = ...future.value$value, [18:01:40.178] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.178] ...future.rng), globalenv = if (FALSE) [18:01:40.178] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.178] ...future.globalenv.names)) [18:01:40.178] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.178] }, condition = base::local({ [18:01:40.178] c <- base::c [18:01:40.178] inherits <- base::inherits [18:01:40.178] invokeRestart <- base::invokeRestart [18:01:40.178] length <- base::length [18:01:40.178] list <- base::list [18:01:40.178] seq.int <- base::seq.int [18:01:40.178] signalCondition <- base::signalCondition [18:01:40.178] sys.calls <- base::sys.calls [18:01:40.178] `[[` <- base::`[[` [18:01:40.178] `+` <- base::`+` [18:01:40.178] `<<-` <- base::`<<-` [18:01:40.178] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.178] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.178] 3L)] [18:01:40.178] } [18:01:40.178] function(cond) { [18:01:40.178] is_error <- inherits(cond, "error") [18:01:40.178] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.178] NULL) [18:01:40.178] if (is_error) { [18:01:40.178] sessionInformation <- function() { [18:01:40.178] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.178] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.178] search = base::search(), system = base::Sys.info()) [18:01:40.178] } [18:01:40.178] ...future.conditions[[length(...future.conditions) + [18:01:40.178] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.178] cond$call), session = sessionInformation(), [18:01:40.178] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.178] signalCondition(cond) [18:01:40.178] } [18:01:40.178] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.178] "immediateCondition"))) { [18:01:40.178] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.178] ...future.conditions[[length(...future.conditions) + [18:01:40.178] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.178] if (TRUE && !signal) { [18:01:40.178] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.178] { [18:01:40.178] inherits <- base::inherits [18:01:40.178] invokeRestart <- base::invokeRestart [18:01:40.178] is.null <- base::is.null [18:01:40.178] muffled <- FALSE [18:01:40.178] if (inherits(cond, "message")) { [18:01:40.178] muffled <- grepl(pattern, "muffleMessage") [18:01:40.178] if (muffled) [18:01:40.178] invokeRestart("muffleMessage") [18:01:40.178] } [18:01:40.178] else if (inherits(cond, "warning")) { [18:01:40.178] muffled <- grepl(pattern, "muffleWarning") [18:01:40.178] if (muffled) [18:01:40.178] invokeRestart("muffleWarning") [18:01:40.178] } [18:01:40.178] else if (inherits(cond, "condition")) { [18:01:40.178] if (!is.null(pattern)) { [18:01:40.178] computeRestarts <- base::computeRestarts [18:01:40.178] grepl <- base::grepl [18:01:40.178] restarts <- computeRestarts(cond) [18:01:40.178] for (restart in restarts) { [18:01:40.178] name <- restart$name [18:01:40.178] if (is.null(name)) [18:01:40.178] next [18:01:40.178] if (!grepl(pattern, name)) [18:01:40.178] next [18:01:40.178] invokeRestart(restart) [18:01:40.178] muffled <- TRUE [18:01:40.178] break [18:01:40.178] } [18:01:40.178] } [18:01:40.178] } [18:01:40.178] invisible(muffled) [18:01:40.178] } [18:01:40.178] muffleCondition(cond, pattern = "^muffle") [18:01:40.178] } [18:01:40.178] } [18:01:40.178] else { [18:01:40.178] if (TRUE) { [18:01:40.178] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.178] { [18:01:40.178] inherits <- base::inherits [18:01:40.178] invokeRestart <- base::invokeRestart [18:01:40.178] is.null <- base::is.null [18:01:40.178] muffled <- FALSE [18:01:40.178] if (inherits(cond, "message")) { [18:01:40.178] muffled <- grepl(pattern, "muffleMessage") [18:01:40.178] if (muffled) [18:01:40.178] invokeRestart("muffleMessage") [18:01:40.178] } [18:01:40.178] else if (inherits(cond, "warning")) { [18:01:40.178] muffled <- grepl(pattern, "muffleWarning") [18:01:40.178] if (muffled) [18:01:40.178] invokeRestart("muffleWarning") [18:01:40.178] } [18:01:40.178] else if (inherits(cond, "condition")) { [18:01:40.178] if (!is.null(pattern)) { [18:01:40.178] computeRestarts <- base::computeRestarts [18:01:40.178] grepl <- base::grepl [18:01:40.178] restarts <- computeRestarts(cond) [18:01:40.178] for (restart in restarts) { [18:01:40.178] name <- restart$name [18:01:40.178] if (is.null(name)) [18:01:40.178] next [18:01:40.178] if (!grepl(pattern, name)) [18:01:40.178] next [18:01:40.178] invokeRestart(restart) [18:01:40.178] muffled <- TRUE [18:01:40.178] break [18:01:40.178] } [18:01:40.178] } [18:01:40.178] } [18:01:40.178] invisible(muffled) [18:01:40.178] } [18:01:40.178] muffleCondition(cond, pattern = "^muffle") [18:01:40.178] } [18:01:40.178] } [18:01:40.178] } [18:01:40.178] })) [18:01:40.178] }, error = function(ex) { [18:01:40.178] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.178] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.178] ...future.rng), started = ...future.startTime, [18:01:40.178] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.178] version = "1.8"), class = "FutureResult") [18:01:40.178] }, finally = { [18:01:40.178] if (!identical(...future.workdir, getwd())) [18:01:40.178] setwd(...future.workdir) [18:01:40.178] { [18:01:40.178] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.178] ...future.oldOptions$nwarnings <- NULL [18:01:40.178] } [18:01:40.178] base::options(...future.oldOptions) [18:01:40.178] if (.Platform$OS.type == "windows") { [18:01:40.178] old_names <- names(...future.oldEnvVars) [18:01:40.178] envs <- base::Sys.getenv() [18:01:40.178] names <- names(envs) [18:01:40.178] common <- intersect(names, old_names) [18:01:40.178] added <- setdiff(names, old_names) [18:01:40.178] removed <- setdiff(old_names, names) [18:01:40.178] changed <- common[...future.oldEnvVars[common] != [18:01:40.178] envs[common]] [18:01:40.178] NAMES <- toupper(changed) [18:01:40.178] args <- list() [18:01:40.178] for (kk in seq_along(NAMES)) { [18:01:40.178] name <- changed[[kk]] [18:01:40.178] NAME <- NAMES[[kk]] [18:01:40.178] if (name != NAME && is.element(NAME, old_names)) [18:01:40.178] next [18:01:40.178] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.178] } [18:01:40.178] NAMES <- toupper(added) [18:01:40.178] for (kk in seq_along(NAMES)) { [18:01:40.178] name <- added[[kk]] [18:01:40.178] NAME <- NAMES[[kk]] [18:01:40.178] if (name != NAME && is.element(NAME, old_names)) [18:01:40.178] next [18:01:40.178] args[[name]] <- "" [18:01:40.178] } [18:01:40.178] NAMES <- toupper(removed) [18:01:40.178] for (kk in seq_along(NAMES)) { [18:01:40.178] name <- removed[[kk]] [18:01:40.178] NAME <- NAMES[[kk]] [18:01:40.178] if (name != NAME && is.element(NAME, old_names)) [18:01:40.178] next [18:01:40.178] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.178] } [18:01:40.178] if (length(args) > 0) [18:01:40.178] base::do.call(base::Sys.setenv, args = args) [18:01:40.178] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.178] } [18:01:40.178] else { [18:01:40.178] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.178] } [18:01:40.178] { [18:01:40.178] if (base::length(...future.futureOptionsAdded) > [18:01:40.178] 0L) { [18:01:40.178] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.178] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.178] base::options(opts) [18:01:40.178] } [18:01:40.178] { [18:01:40.178] { [18:01:40.178] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.178] NULL [18:01:40.178] } [18:01:40.178] options(future.plan = NULL) [18:01:40.178] if (is.na(NA_character_)) [18:01:40.178] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.178] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.178] future::plan(list(function (..., workers = availableCores(), [18:01:40.178] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.178] envir = parent.frame()) [18:01:40.178] { [18:01:40.178] if (is.function(workers)) [18:01:40.178] workers <- workers() [18:01:40.178] workers <- structure(as.integer(workers), [18:01:40.178] class = class(workers)) [18:01:40.178] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.178] workers >= 1) [18:01:40.178] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.178] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.178] } [18:01:40.178] future <- MultisessionFuture(..., workers = workers, [18:01:40.178] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.178] envir = envir) [18:01:40.178] if (!future$lazy) [18:01:40.178] future <- run(future) [18:01:40.178] invisible(future) [18:01:40.178] }), .cleanup = FALSE, .init = FALSE) [18:01:40.178] } [18:01:40.178] } [18:01:40.178] } [18:01:40.178] }) [18:01:40.178] if (TRUE) { [18:01:40.178] base::sink(type = "output", split = FALSE) [18:01:40.178] if (TRUE) { [18:01:40.178] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.178] } [18:01:40.178] else { [18:01:40.178] ...future.result["stdout"] <- base::list(NULL) [18:01:40.178] } [18:01:40.178] base::close(...future.stdout) [18:01:40.178] ...future.stdout <- NULL [18:01:40.178] } [18:01:40.178] ...future.result$conditions <- ...future.conditions [18:01:40.178] ...future.result$finished <- base::Sys.time() [18:01:40.178] ...future.result [18:01:40.178] } [18:01:40.262] MultisessionFuture started [18:01:40.262] result() for ClusterFuture ... [18:01:40.263] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.263] - Validating connection of MultisessionFuture [18:01:40.320] - received message: FutureResult [18:01:40.320] - Received FutureResult [18:01:40.324] - Erased future from FutureRegistry [18:01:40.324] result() for ClusterFuture ... [18:01:40.324] - result already collected: FutureResult [18:01:40.325] result() for ClusterFuture ... done [18:01:40.325] receiveMessageFromWorker() for ClusterFuture ... done [18:01:40.325] result() for ClusterFuture ... done [18:01:40.325] result() for ClusterFuture ... [18:01:40.325] - result already collected: FutureResult [18:01:40.326] result() for ClusterFuture ... done [18:01:40.326] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:01:40.329] plan(): nbrOfWorkers() = 2 Dimensions: NULL [18:01:40.329] getGlobalsAndPackages() ... [18:01:40.329] Searching for globals... [18:01:40.330] [18:01:40.330] Searching for globals ... DONE [18:01:40.330] - globals: [0] [18:01:40.330] getGlobalsAndPackages() ... DONE [18:01:40.331] run() for 'Future' ... [18:01:40.331] - state: 'created' [18:01:40.331] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.345] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.346] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.346] - Field: 'node' [18:01:40.346] - Field: 'label' [18:01:40.346] - Field: 'local' [18:01:40.347] - Field: 'owner' [18:01:40.347] - Field: 'envir' [18:01:40.347] - Field: 'workers' [18:01:40.347] - Field: 'packages' [18:01:40.347] - Field: 'gc' [18:01:40.347] - Field: 'conditions' [18:01:40.348] - Field: 'persistent' [18:01:40.348] - Field: 'expr' [18:01:40.348] - Field: 'uuid' [18:01:40.348] - Field: 'seed' [18:01:40.348] - Field: 'version' [18:01:40.349] - Field: 'result' [18:01:40.349] - Field: 'asynchronous' [18:01:40.349] - Field: 'calls' [18:01:40.349] - Field: 'globals' [18:01:40.349] - Field: 'stdout' [18:01:40.350] - Field: 'earlySignal' [18:01:40.350] - Field: 'lazy' [18:01:40.350] - Field: 'state' [18:01:40.350] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.350] - Launch lazy future ... [18:01:40.351] Packages needed by the future expression (n = 0): [18:01:40.351] Packages needed by future strategies (n = 0): [18:01:40.352] { [18:01:40.352] { [18:01:40.352] { [18:01:40.352] ...future.startTime <- base::Sys.time() [18:01:40.352] { [18:01:40.352] { [18:01:40.352] { [18:01:40.352] { [18:01:40.352] base::local({ [18:01:40.352] has_future <- base::requireNamespace("future", [18:01:40.352] quietly = TRUE) [18:01:40.352] if (has_future) { [18:01:40.352] ns <- base::getNamespace("future") [18:01:40.352] version <- ns[[".package"]][["version"]] [18:01:40.352] if (is.null(version)) [18:01:40.352] version <- utils::packageVersion("future") [18:01:40.352] } [18:01:40.352] else { [18:01:40.352] version <- NULL [18:01:40.352] } [18:01:40.352] if (!has_future || version < "1.8.0") { [18:01:40.352] info <- base::c(r_version = base::gsub("R version ", [18:01:40.352] "", base::R.version$version.string), [18:01:40.352] platform = base::sprintf("%s (%s-bit)", [18:01:40.352] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.352] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.352] "release", "version")], collapse = " "), [18:01:40.352] hostname = base::Sys.info()[["nodename"]]) [18:01:40.352] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.352] info) [18:01:40.352] info <- base::paste(info, collapse = "; ") [18:01:40.352] if (!has_future) { [18:01:40.352] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.352] info) [18:01:40.352] } [18:01:40.352] else { [18:01:40.352] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.352] info, version) [18:01:40.352] } [18:01:40.352] base::stop(msg) [18:01:40.352] } [18:01:40.352] }) [18:01:40.352] } [18:01:40.352] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.352] base::options(mc.cores = 1L) [18:01:40.352] } [18:01:40.352] options(future.plan = NULL) [18:01:40.352] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.352] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.352] } [18:01:40.352] ...future.workdir <- getwd() [18:01:40.352] } [18:01:40.352] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.352] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.352] } [18:01:40.352] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.352] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.352] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.352] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.352] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.352] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.352] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.352] base::names(...future.oldOptions)) [18:01:40.352] } [18:01:40.352] if (FALSE) { [18:01:40.352] } [18:01:40.352] else { [18:01:40.352] if (TRUE) { [18:01:40.352] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.352] open = "w") [18:01:40.352] } [18:01:40.352] else { [18:01:40.352] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.352] windows = "NUL", "/dev/null"), open = "w") [18:01:40.352] } [18:01:40.352] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.352] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.352] base::sink(type = "output", split = FALSE) [18:01:40.352] base::close(...future.stdout) [18:01:40.352] }, add = TRUE) [18:01:40.352] } [18:01:40.352] ...future.frame <- base::sys.nframe() [18:01:40.352] ...future.conditions <- base::list() [18:01:40.352] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.352] if (FALSE) { [18:01:40.352] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.352] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.352] } [18:01:40.352] ...future.result <- base::tryCatch({ [18:01:40.352] base::withCallingHandlers({ [18:01:40.352] ...future.value <- base::withVisible(base::local({ [18:01:40.352] ...future.makeSendCondition <- local({ [18:01:40.352] sendCondition <- NULL [18:01:40.352] function(frame = 1L) { [18:01:40.352] if (is.function(sendCondition)) [18:01:40.352] return(sendCondition) [18:01:40.352] ns <- getNamespace("parallel") [18:01:40.352] if (exists("sendData", mode = "function", [18:01:40.352] envir = ns)) { [18:01:40.352] parallel_sendData <- get("sendData", mode = "function", [18:01:40.352] envir = ns) [18:01:40.352] envir <- sys.frame(frame) [18:01:40.352] master <- NULL [18:01:40.352] while (!identical(envir, .GlobalEnv) && [18:01:40.352] !identical(envir, emptyenv())) { [18:01:40.352] if (exists("master", mode = "list", envir = envir, [18:01:40.352] inherits = FALSE)) { [18:01:40.352] master <- get("master", mode = "list", [18:01:40.352] envir = envir, inherits = FALSE) [18:01:40.352] if (inherits(master, c("SOCKnode", [18:01:40.352] "SOCK0node"))) { [18:01:40.352] sendCondition <<- function(cond) { [18:01:40.352] data <- list(type = "VALUE", value = cond, [18:01:40.352] success = TRUE) [18:01:40.352] parallel_sendData(master, data) [18:01:40.352] } [18:01:40.352] return(sendCondition) [18:01:40.352] } [18:01:40.352] } [18:01:40.352] frame <- frame + 1L [18:01:40.352] envir <- sys.frame(frame) [18:01:40.352] } [18:01:40.352] } [18:01:40.352] sendCondition <<- function(cond) NULL [18:01:40.352] } [18:01:40.352] }) [18:01:40.352] withCallingHandlers({ [18:01:40.352] 2 [18:01:40.352] }, immediateCondition = function(cond) { [18:01:40.352] sendCondition <- ...future.makeSendCondition() [18:01:40.352] sendCondition(cond) [18:01:40.352] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.352] { [18:01:40.352] inherits <- base::inherits [18:01:40.352] invokeRestart <- base::invokeRestart [18:01:40.352] is.null <- base::is.null [18:01:40.352] muffled <- FALSE [18:01:40.352] if (inherits(cond, "message")) { [18:01:40.352] muffled <- grepl(pattern, "muffleMessage") [18:01:40.352] if (muffled) [18:01:40.352] invokeRestart("muffleMessage") [18:01:40.352] } [18:01:40.352] else if (inherits(cond, "warning")) { [18:01:40.352] muffled <- grepl(pattern, "muffleWarning") [18:01:40.352] if (muffled) [18:01:40.352] invokeRestart("muffleWarning") [18:01:40.352] } [18:01:40.352] else if (inherits(cond, "condition")) { [18:01:40.352] if (!is.null(pattern)) { [18:01:40.352] computeRestarts <- base::computeRestarts [18:01:40.352] grepl <- base::grepl [18:01:40.352] restarts <- computeRestarts(cond) [18:01:40.352] for (restart in restarts) { [18:01:40.352] name <- restart$name [18:01:40.352] if (is.null(name)) [18:01:40.352] next [18:01:40.352] if (!grepl(pattern, name)) [18:01:40.352] next [18:01:40.352] invokeRestart(restart) [18:01:40.352] muffled <- TRUE [18:01:40.352] break [18:01:40.352] } [18:01:40.352] } [18:01:40.352] } [18:01:40.352] invisible(muffled) [18:01:40.352] } [18:01:40.352] muffleCondition(cond) [18:01:40.352] }) [18:01:40.352] })) [18:01:40.352] future::FutureResult(value = ...future.value$value, [18:01:40.352] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.352] ...future.rng), globalenv = if (FALSE) [18:01:40.352] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.352] ...future.globalenv.names)) [18:01:40.352] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.352] }, condition = base::local({ [18:01:40.352] c <- base::c [18:01:40.352] inherits <- base::inherits [18:01:40.352] invokeRestart <- base::invokeRestart [18:01:40.352] length <- base::length [18:01:40.352] list <- base::list [18:01:40.352] seq.int <- base::seq.int [18:01:40.352] signalCondition <- base::signalCondition [18:01:40.352] sys.calls <- base::sys.calls [18:01:40.352] `[[` <- base::`[[` [18:01:40.352] `+` <- base::`+` [18:01:40.352] `<<-` <- base::`<<-` [18:01:40.352] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.352] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.352] 3L)] [18:01:40.352] } [18:01:40.352] function(cond) { [18:01:40.352] is_error <- inherits(cond, "error") [18:01:40.352] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.352] NULL) [18:01:40.352] if (is_error) { [18:01:40.352] sessionInformation <- function() { [18:01:40.352] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.352] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.352] search = base::search(), system = base::Sys.info()) [18:01:40.352] } [18:01:40.352] ...future.conditions[[length(...future.conditions) + [18:01:40.352] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.352] cond$call), session = sessionInformation(), [18:01:40.352] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.352] signalCondition(cond) [18:01:40.352] } [18:01:40.352] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.352] "immediateCondition"))) { [18:01:40.352] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.352] ...future.conditions[[length(...future.conditions) + [18:01:40.352] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.352] if (TRUE && !signal) { [18:01:40.352] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.352] { [18:01:40.352] inherits <- base::inherits [18:01:40.352] invokeRestart <- base::invokeRestart [18:01:40.352] is.null <- base::is.null [18:01:40.352] muffled <- FALSE [18:01:40.352] if (inherits(cond, "message")) { [18:01:40.352] muffled <- grepl(pattern, "muffleMessage") [18:01:40.352] if (muffled) [18:01:40.352] invokeRestart("muffleMessage") [18:01:40.352] } [18:01:40.352] else if (inherits(cond, "warning")) { [18:01:40.352] muffled <- grepl(pattern, "muffleWarning") [18:01:40.352] if (muffled) [18:01:40.352] invokeRestart("muffleWarning") [18:01:40.352] } [18:01:40.352] else if (inherits(cond, "condition")) { [18:01:40.352] if (!is.null(pattern)) { [18:01:40.352] computeRestarts <- base::computeRestarts [18:01:40.352] grepl <- base::grepl [18:01:40.352] restarts <- computeRestarts(cond) [18:01:40.352] for (restart in restarts) { [18:01:40.352] name <- restart$name [18:01:40.352] if (is.null(name)) [18:01:40.352] next [18:01:40.352] if (!grepl(pattern, name)) [18:01:40.352] next [18:01:40.352] invokeRestart(restart) [18:01:40.352] muffled <- TRUE [18:01:40.352] break [18:01:40.352] } [18:01:40.352] } [18:01:40.352] } [18:01:40.352] invisible(muffled) [18:01:40.352] } [18:01:40.352] muffleCondition(cond, pattern = "^muffle") [18:01:40.352] } [18:01:40.352] } [18:01:40.352] else { [18:01:40.352] if (TRUE) { [18:01:40.352] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.352] { [18:01:40.352] inherits <- base::inherits [18:01:40.352] invokeRestart <- base::invokeRestart [18:01:40.352] is.null <- base::is.null [18:01:40.352] muffled <- FALSE [18:01:40.352] if (inherits(cond, "message")) { [18:01:40.352] muffled <- grepl(pattern, "muffleMessage") [18:01:40.352] if (muffled) [18:01:40.352] invokeRestart("muffleMessage") [18:01:40.352] } [18:01:40.352] else if (inherits(cond, "warning")) { [18:01:40.352] muffled <- grepl(pattern, "muffleWarning") [18:01:40.352] if (muffled) [18:01:40.352] invokeRestart("muffleWarning") [18:01:40.352] } [18:01:40.352] else if (inherits(cond, "condition")) { [18:01:40.352] if (!is.null(pattern)) { [18:01:40.352] computeRestarts <- base::computeRestarts [18:01:40.352] grepl <- base::grepl [18:01:40.352] restarts <- computeRestarts(cond) [18:01:40.352] for (restart in restarts) { [18:01:40.352] name <- restart$name [18:01:40.352] if (is.null(name)) [18:01:40.352] next [18:01:40.352] if (!grepl(pattern, name)) [18:01:40.352] next [18:01:40.352] invokeRestart(restart) [18:01:40.352] muffled <- TRUE [18:01:40.352] break [18:01:40.352] } [18:01:40.352] } [18:01:40.352] } [18:01:40.352] invisible(muffled) [18:01:40.352] } [18:01:40.352] muffleCondition(cond, pattern = "^muffle") [18:01:40.352] } [18:01:40.352] } [18:01:40.352] } [18:01:40.352] })) [18:01:40.352] }, error = function(ex) { [18:01:40.352] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.352] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.352] ...future.rng), started = ...future.startTime, [18:01:40.352] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.352] version = "1.8"), class = "FutureResult") [18:01:40.352] }, finally = { [18:01:40.352] if (!identical(...future.workdir, getwd())) [18:01:40.352] setwd(...future.workdir) [18:01:40.352] { [18:01:40.352] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.352] ...future.oldOptions$nwarnings <- NULL [18:01:40.352] } [18:01:40.352] base::options(...future.oldOptions) [18:01:40.352] if (.Platform$OS.type == "windows") { [18:01:40.352] old_names <- names(...future.oldEnvVars) [18:01:40.352] envs <- base::Sys.getenv() [18:01:40.352] names <- names(envs) [18:01:40.352] common <- intersect(names, old_names) [18:01:40.352] added <- setdiff(names, old_names) [18:01:40.352] removed <- setdiff(old_names, names) [18:01:40.352] changed <- common[...future.oldEnvVars[common] != [18:01:40.352] envs[common]] [18:01:40.352] NAMES <- toupper(changed) [18:01:40.352] args <- list() [18:01:40.352] for (kk in seq_along(NAMES)) { [18:01:40.352] name <- changed[[kk]] [18:01:40.352] NAME <- NAMES[[kk]] [18:01:40.352] if (name != NAME && is.element(NAME, old_names)) [18:01:40.352] next [18:01:40.352] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.352] } [18:01:40.352] NAMES <- toupper(added) [18:01:40.352] for (kk in seq_along(NAMES)) { [18:01:40.352] name <- added[[kk]] [18:01:40.352] NAME <- NAMES[[kk]] [18:01:40.352] if (name != NAME && is.element(NAME, old_names)) [18:01:40.352] next [18:01:40.352] args[[name]] <- "" [18:01:40.352] } [18:01:40.352] NAMES <- toupper(removed) [18:01:40.352] for (kk in seq_along(NAMES)) { [18:01:40.352] name <- removed[[kk]] [18:01:40.352] NAME <- NAMES[[kk]] [18:01:40.352] if (name != NAME && is.element(NAME, old_names)) [18:01:40.352] next [18:01:40.352] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.352] } [18:01:40.352] if (length(args) > 0) [18:01:40.352] base::do.call(base::Sys.setenv, args = args) [18:01:40.352] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.352] } [18:01:40.352] else { [18:01:40.352] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.352] } [18:01:40.352] { [18:01:40.352] if (base::length(...future.futureOptionsAdded) > [18:01:40.352] 0L) { [18:01:40.352] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.352] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.352] base::options(opts) [18:01:40.352] } [18:01:40.352] { [18:01:40.352] { [18:01:40.352] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.352] NULL [18:01:40.352] } [18:01:40.352] options(future.plan = NULL) [18:01:40.352] if (is.na(NA_character_)) [18:01:40.352] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.352] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.352] future::plan(list(function (..., workers = availableCores(), [18:01:40.352] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.352] envir = parent.frame()) [18:01:40.352] { [18:01:40.352] if (is.function(workers)) [18:01:40.352] workers <- workers() [18:01:40.352] workers <- structure(as.integer(workers), [18:01:40.352] class = class(workers)) [18:01:40.352] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.352] workers >= 1) [18:01:40.352] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.352] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.352] } [18:01:40.352] future <- MultisessionFuture(..., workers = workers, [18:01:40.352] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.352] envir = envir) [18:01:40.352] if (!future$lazy) [18:01:40.352] future <- run(future) [18:01:40.352] invisible(future) [18:01:40.352] }), .cleanup = FALSE, .init = FALSE) [18:01:40.352] } [18:01:40.352] } [18:01:40.352] } [18:01:40.352] }) [18:01:40.352] if (TRUE) { [18:01:40.352] base::sink(type = "output", split = FALSE) [18:01:40.352] if (TRUE) { [18:01:40.352] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.352] } [18:01:40.352] else { [18:01:40.352] ...future.result["stdout"] <- base::list(NULL) [18:01:40.352] } [18:01:40.352] base::close(...future.stdout) [18:01:40.352] ...future.stdout <- NULL [18:01:40.352] } [18:01:40.352] ...future.result$conditions <- ...future.conditions [18:01:40.352] ...future.result$finished <- base::Sys.time() [18:01:40.352] ...future.result [18:01:40.352] } [18:01:40.358] MultisessionFuture started [18:01:40.358] - Launch lazy future ... done [18:01:40.358] run() for 'MultisessionFuture' ... done [18:01:40.358] getGlobalsAndPackages() ... [18:01:40.359] Searching for globals... [18:01:40.359] [18:01:40.359] Searching for globals ... DONE [18:01:40.359] - globals: [0] [18:01:40.360] getGlobalsAndPackages() ... DONE [18:01:40.360] run() for 'Future' ... [18:01:40.360] - state: 'created' [18:01:40.360] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.375] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.375] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.375] - Field: 'node' [18:01:40.376] - Field: 'label' [18:01:40.376] - Field: 'local' [18:01:40.376] - Field: 'owner' [18:01:40.376] - Field: 'envir' [18:01:40.376] - Field: 'workers' [18:01:40.377] - Field: 'packages' [18:01:40.377] - Field: 'gc' [18:01:40.377] - Field: 'conditions' [18:01:40.377] - Field: 'persistent' [18:01:40.377] - Field: 'expr' [18:01:40.378] - Field: 'uuid' [18:01:40.378] - Field: 'seed' [18:01:40.378] - Field: 'version' [18:01:40.378] - Field: 'result' [18:01:40.378] - Field: 'asynchronous' [18:01:40.378] - Field: 'calls' [18:01:40.379] - Field: 'globals' [18:01:40.379] - Field: 'stdout' [18:01:40.379] - Field: 'earlySignal' [18:01:40.379] - Field: 'lazy' [18:01:40.379] - Field: 'state' [18:01:40.380] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.380] - Launch lazy future ... [18:01:40.380] Packages needed by the future expression (n = 0): [18:01:40.380] Packages needed by future strategies (n = 0): [18:01:40.381] { [18:01:40.381] { [18:01:40.381] { [18:01:40.381] ...future.startTime <- base::Sys.time() [18:01:40.381] { [18:01:40.381] { [18:01:40.381] { [18:01:40.381] { [18:01:40.381] base::local({ [18:01:40.381] has_future <- base::requireNamespace("future", [18:01:40.381] quietly = TRUE) [18:01:40.381] if (has_future) { [18:01:40.381] ns <- base::getNamespace("future") [18:01:40.381] version <- ns[[".package"]][["version"]] [18:01:40.381] if (is.null(version)) [18:01:40.381] version <- utils::packageVersion("future") [18:01:40.381] } [18:01:40.381] else { [18:01:40.381] version <- NULL [18:01:40.381] } [18:01:40.381] if (!has_future || version < "1.8.0") { [18:01:40.381] info <- base::c(r_version = base::gsub("R version ", [18:01:40.381] "", base::R.version$version.string), [18:01:40.381] platform = base::sprintf("%s (%s-bit)", [18:01:40.381] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.381] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.381] "release", "version")], collapse = " "), [18:01:40.381] hostname = base::Sys.info()[["nodename"]]) [18:01:40.381] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.381] info) [18:01:40.381] info <- base::paste(info, collapse = "; ") [18:01:40.381] if (!has_future) { [18:01:40.381] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.381] info) [18:01:40.381] } [18:01:40.381] else { [18:01:40.381] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.381] info, version) [18:01:40.381] } [18:01:40.381] base::stop(msg) [18:01:40.381] } [18:01:40.381] }) [18:01:40.381] } [18:01:40.381] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.381] base::options(mc.cores = 1L) [18:01:40.381] } [18:01:40.381] options(future.plan = NULL) [18:01:40.381] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.381] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.381] } [18:01:40.381] ...future.workdir <- getwd() [18:01:40.381] } [18:01:40.381] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.381] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.381] } [18:01:40.381] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.381] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.381] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.381] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.381] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.381] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.381] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.381] base::names(...future.oldOptions)) [18:01:40.381] } [18:01:40.381] if (FALSE) { [18:01:40.381] } [18:01:40.381] else { [18:01:40.381] if (TRUE) { [18:01:40.381] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.381] open = "w") [18:01:40.381] } [18:01:40.381] else { [18:01:40.381] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.381] windows = "NUL", "/dev/null"), open = "w") [18:01:40.381] } [18:01:40.381] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.381] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.381] base::sink(type = "output", split = FALSE) [18:01:40.381] base::close(...future.stdout) [18:01:40.381] }, add = TRUE) [18:01:40.381] } [18:01:40.381] ...future.frame <- base::sys.nframe() [18:01:40.381] ...future.conditions <- base::list() [18:01:40.381] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.381] if (FALSE) { [18:01:40.381] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.381] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.381] } [18:01:40.381] ...future.result <- base::tryCatch({ [18:01:40.381] base::withCallingHandlers({ [18:01:40.381] ...future.value <- base::withVisible(base::local({ [18:01:40.381] ...future.makeSendCondition <- local({ [18:01:40.381] sendCondition <- NULL [18:01:40.381] function(frame = 1L) { [18:01:40.381] if (is.function(sendCondition)) [18:01:40.381] return(sendCondition) [18:01:40.381] ns <- getNamespace("parallel") [18:01:40.381] if (exists("sendData", mode = "function", [18:01:40.381] envir = ns)) { [18:01:40.381] parallel_sendData <- get("sendData", mode = "function", [18:01:40.381] envir = ns) [18:01:40.381] envir <- sys.frame(frame) [18:01:40.381] master <- NULL [18:01:40.381] while (!identical(envir, .GlobalEnv) && [18:01:40.381] !identical(envir, emptyenv())) { [18:01:40.381] if (exists("master", mode = "list", envir = envir, [18:01:40.381] inherits = FALSE)) { [18:01:40.381] master <- get("master", mode = "list", [18:01:40.381] envir = envir, inherits = FALSE) [18:01:40.381] if (inherits(master, c("SOCKnode", [18:01:40.381] "SOCK0node"))) { [18:01:40.381] sendCondition <<- function(cond) { [18:01:40.381] data <- list(type = "VALUE", value = cond, [18:01:40.381] success = TRUE) [18:01:40.381] parallel_sendData(master, data) [18:01:40.381] } [18:01:40.381] return(sendCondition) [18:01:40.381] } [18:01:40.381] } [18:01:40.381] frame <- frame + 1L [18:01:40.381] envir <- sys.frame(frame) [18:01:40.381] } [18:01:40.381] } [18:01:40.381] sendCondition <<- function(cond) NULL [18:01:40.381] } [18:01:40.381] }) [18:01:40.381] withCallingHandlers({ [18:01:40.381] NULL [18:01:40.381] }, immediateCondition = function(cond) { [18:01:40.381] sendCondition <- ...future.makeSendCondition() [18:01:40.381] sendCondition(cond) [18:01:40.381] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.381] { [18:01:40.381] inherits <- base::inherits [18:01:40.381] invokeRestart <- base::invokeRestart [18:01:40.381] is.null <- base::is.null [18:01:40.381] muffled <- FALSE [18:01:40.381] if (inherits(cond, "message")) { [18:01:40.381] muffled <- grepl(pattern, "muffleMessage") [18:01:40.381] if (muffled) [18:01:40.381] invokeRestart("muffleMessage") [18:01:40.381] } [18:01:40.381] else if (inherits(cond, "warning")) { [18:01:40.381] muffled <- grepl(pattern, "muffleWarning") [18:01:40.381] if (muffled) [18:01:40.381] invokeRestart("muffleWarning") [18:01:40.381] } [18:01:40.381] else if (inherits(cond, "condition")) { [18:01:40.381] if (!is.null(pattern)) { [18:01:40.381] computeRestarts <- base::computeRestarts [18:01:40.381] grepl <- base::grepl [18:01:40.381] restarts <- computeRestarts(cond) [18:01:40.381] for (restart in restarts) { [18:01:40.381] name <- restart$name [18:01:40.381] if (is.null(name)) [18:01:40.381] next [18:01:40.381] if (!grepl(pattern, name)) [18:01:40.381] next [18:01:40.381] invokeRestart(restart) [18:01:40.381] muffled <- TRUE [18:01:40.381] break [18:01:40.381] } [18:01:40.381] } [18:01:40.381] } [18:01:40.381] invisible(muffled) [18:01:40.381] } [18:01:40.381] muffleCondition(cond) [18:01:40.381] }) [18:01:40.381] })) [18:01:40.381] future::FutureResult(value = ...future.value$value, [18:01:40.381] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.381] ...future.rng), globalenv = if (FALSE) [18:01:40.381] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.381] ...future.globalenv.names)) [18:01:40.381] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.381] }, condition = base::local({ [18:01:40.381] c <- base::c [18:01:40.381] inherits <- base::inherits [18:01:40.381] invokeRestart <- base::invokeRestart [18:01:40.381] length <- base::length [18:01:40.381] list <- base::list [18:01:40.381] seq.int <- base::seq.int [18:01:40.381] signalCondition <- base::signalCondition [18:01:40.381] sys.calls <- base::sys.calls [18:01:40.381] `[[` <- base::`[[` [18:01:40.381] `+` <- base::`+` [18:01:40.381] `<<-` <- base::`<<-` [18:01:40.381] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.381] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.381] 3L)] [18:01:40.381] } [18:01:40.381] function(cond) { [18:01:40.381] is_error <- inherits(cond, "error") [18:01:40.381] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.381] NULL) [18:01:40.381] if (is_error) { [18:01:40.381] sessionInformation <- function() { [18:01:40.381] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.381] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.381] search = base::search(), system = base::Sys.info()) [18:01:40.381] } [18:01:40.381] ...future.conditions[[length(...future.conditions) + [18:01:40.381] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.381] cond$call), session = sessionInformation(), [18:01:40.381] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.381] signalCondition(cond) [18:01:40.381] } [18:01:40.381] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.381] "immediateCondition"))) { [18:01:40.381] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.381] ...future.conditions[[length(...future.conditions) + [18:01:40.381] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.381] if (TRUE && !signal) { [18:01:40.381] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.381] { [18:01:40.381] inherits <- base::inherits [18:01:40.381] invokeRestart <- base::invokeRestart [18:01:40.381] is.null <- base::is.null [18:01:40.381] muffled <- FALSE [18:01:40.381] if (inherits(cond, "message")) { [18:01:40.381] muffled <- grepl(pattern, "muffleMessage") [18:01:40.381] if (muffled) [18:01:40.381] invokeRestart("muffleMessage") [18:01:40.381] } [18:01:40.381] else if (inherits(cond, "warning")) { [18:01:40.381] muffled <- grepl(pattern, "muffleWarning") [18:01:40.381] if (muffled) [18:01:40.381] invokeRestart("muffleWarning") [18:01:40.381] } [18:01:40.381] else if (inherits(cond, "condition")) { [18:01:40.381] if (!is.null(pattern)) { [18:01:40.381] computeRestarts <- base::computeRestarts [18:01:40.381] grepl <- base::grepl [18:01:40.381] restarts <- computeRestarts(cond) [18:01:40.381] for (restart in restarts) { [18:01:40.381] name <- restart$name [18:01:40.381] if (is.null(name)) [18:01:40.381] next [18:01:40.381] if (!grepl(pattern, name)) [18:01:40.381] next [18:01:40.381] invokeRestart(restart) [18:01:40.381] muffled <- TRUE [18:01:40.381] break [18:01:40.381] } [18:01:40.381] } [18:01:40.381] } [18:01:40.381] invisible(muffled) [18:01:40.381] } [18:01:40.381] muffleCondition(cond, pattern = "^muffle") [18:01:40.381] } [18:01:40.381] } [18:01:40.381] else { [18:01:40.381] if (TRUE) { [18:01:40.381] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.381] { [18:01:40.381] inherits <- base::inherits [18:01:40.381] invokeRestart <- base::invokeRestart [18:01:40.381] is.null <- base::is.null [18:01:40.381] muffled <- FALSE [18:01:40.381] if (inherits(cond, "message")) { [18:01:40.381] muffled <- grepl(pattern, "muffleMessage") [18:01:40.381] if (muffled) [18:01:40.381] invokeRestart("muffleMessage") [18:01:40.381] } [18:01:40.381] else if (inherits(cond, "warning")) { [18:01:40.381] muffled <- grepl(pattern, "muffleWarning") [18:01:40.381] if (muffled) [18:01:40.381] invokeRestart("muffleWarning") [18:01:40.381] } [18:01:40.381] else if (inherits(cond, "condition")) { [18:01:40.381] if (!is.null(pattern)) { [18:01:40.381] computeRestarts <- base::computeRestarts [18:01:40.381] grepl <- base::grepl [18:01:40.381] restarts <- computeRestarts(cond) [18:01:40.381] for (restart in restarts) { [18:01:40.381] name <- restart$name [18:01:40.381] if (is.null(name)) [18:01:40.381] next [18:01:40.381] if (!grepl(pattern, name)) [18:01:40.381] next [18:01:40.381] invokeRestart(restart) [18:01:40.381] muffled <- TRUE [18:01:40.381] break [18:01:40.381] } [18:01:40.381] } [18:01:40.381] } [18:01:40.381] invisible(muffled) [18:01:40.381] } [18:01:40.381] muffleCondition(cond, pattern = "^muffle") [18:01:40.381] } [18:01:40.381] } [18:01:40.381] } [18:01:40.381] })) [18:01:40.381] }, error = function(ex) { [18:01:40.381] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.381] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.381] ...future.rng), started = ...future.startTime, [18:01:40.381] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.381] version = "1.8"), class = "FutureResult") [18:01:40.381] }, finally = { [18:01:40.381] if (!identical(...future.workdir, getwd())) [18:01:40.381] setwd(...future.workdir) [18:01:40.381] { [18:01:40.381] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.381] ...future.oldOptions$nwarnings <- NULL [18:01:40.381] } [18:01:40.381] base::options(...future.oldOptions) [18:01:40.381] if (.Platform$OS.type == "windows") { [18:01:40.381] old_names <- names(...future.oldEnvVars) [18:01:40.381] envs <- base::Sys.getenv() [18:01:40.381] names <- names(envs) [18:01:40.381] common <- intersect(names, old_names) [18:01:40.381] added <- setdiff(names, old_names) [18:01:40.381] removed <- setdiff(old_names, names) [18:01:40.381] changed <- common[...future.oldEnvVars[common] != [18:01:40.381] envs[common]] [18:01:40.381] NAMES <- toupper(changed) [18:01:40.381] args <- list() [18:01:40.381] for (kk in seq_along(NAMES)) { [18:01:40.381] name <- changed[[kk]] [18:01:40.381] NAME <- NAMES[[kk]] [18:01:40.381] if (name != NAME && is.element(NAME, old_names)) [18:01:40.381] next [18:01:40.381] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.381] } [18:01:40.381] NAMES <- toupper(added) [18:01:40.381] for (kk in seq_along(NAMES)) { [18:01:40.381] name <- added[[kk]] [18:01:40.381] NAME <- NAMES[[kk]] [18:01:40.381] if (name != NAME && is.element(NAME, old_names)) [18:01:40.381] next [18:01:40.381] args[[name]] <- "" [18:01:40.381] } [18:01:40.381] NAMES <- toupper(removed) [18:01:40.381] for (kk in seq_along(NAMES)) { [18:01:40.381] name <- removed[[kk]] [18:01:40.381] NAME <- NAMES[[kk]] [18:01:40.381] if (name != NAME && is.element(NAME, old_names)) [18:01:40.381] next [18:01:40.381] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.381] } [18:01:40.381] if (length(args) > 0) [18:01:40.381] base::do.call(base::Sys.setenv, args = args) [18:01:40.381] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.381] } [18:01:40.381] else { [18:01:40.381] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.381] } [18:01:40.381] { [18:01:40.381] if (base::length(...future.futureOptionsAdded) > [18:01:40.381] 0L) { [18:01:40.381] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.381] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.381] base::options(opts) [18:01:40.381] } [18:01:40.381] { [18:01:40.381] { [18:01:40.381] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.381] NULL [18:01:40.381] } [18:01:40.381] options(future.plan = NULL) [18:01:40.381] if (is.na(NA_character_)) [18:01:40.381] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.381] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.381] future::plan(list(function (..., workers = availableCores(), [18:01:40.381] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.381] envir = parent.frame()) [18:01:40.381] { [18:01:40.381] if (is.function(workers)) [18:01:40.381] workers <- workers() [18:01:40.381] workers <- structure(as.integer(workers), [18:01:40.381] class = class(workers)) [18:01:40.381] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.381] workers >= 1) [18:01:40.381] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.381] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.381] } [18:01:40.381] future <- MultisessionFuture(..., workers = workers, [18:01:40.381] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.381] envir = envir) [18:01:40.381] if (!future$lazy) [18:01:40.381] future <- run(future) [18:01:40.381] invisible(future) [18:01:40.381] }), .cleanup = FALSE, .init = FALSE) [18:01:40.381] } [18:01:40.381] } [18:01:40.381] } [18:01:40.381] }) [18:01:40.381] if (TRUE) { [18:01:40.381] base::sink(type = "output", split = FALSE) [18:01:40.381] if (TRUE) { [18:01:40.381] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.381] } [18:01:40.381] else { [18:01:40.381] ...future.result["stdout"] <- base::list(NULL) [18:01:40.381] } [18:01:40.381] base::close(...future.stdout) [18:01:40.381] ...future.stdout <- NULL [18:01:40.381] } [18:01:40.381] ...future.result$conditions <- ...future.conditions [18:01:40.381] ...future.result$finished <- base::Sys.time() [18:01:40.381] ...future.result [18:01:40.381] } [18:01:40.463] MultisessionFuture started [18:01:40.464] - Launch lazy future ... done [18:01:40.464] 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 [18:01:40.471] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.471] - Validating connection of MultisessionFuture [18:01:40.471] - received message: FutureResult [18:01:40.471] - Received FutureResult [18:01:40.472] - Erased future from FutureRegistry [18:01:40.472] result() for ClusterFuture ... [18:01:40.472] - result already collected: FutureResult [18:01:40.472] result() for ClusterFuture ... done [18:01:40.472] receiveMessageFromWorker() for ClusterFuture ... done [18:01:40.521] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.521] - Validating connection of MultisessionFuture [18:01:40.522] - received message: FutureResult [18:01:40.522] - Received FutureResult [18:01:40.522] - Erased future from FutureRegistry [18:01:40.522] result() for ClusterFuture ... [18:01:40.523] - result already collected: FutureResult [18:01:40.523] result() for ClusterFuture ... done [18:01:40.523] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "" ... [18:01:40.524] resolve() on list ... [18:01:40.524] recursive: 0 [18:01:40.524] length: 6 [18:01:40.525] elements: 'a', 'b', 'c', '', '', '' [18:01:40.525] signalConditionsASAP(numeric, pos=1) ... [18:01:40.525] - nx: 6 [18:01:40.525] - relay: TRUE [18:01:40.525] - stdout: TRUE [18:01:40.526] - signal: TRUE [18:01:40.526] - resignal: FALSE [18:01:40.526] - force: TRUE [18:01:40.526] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.526] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.527] - until=2 [18:01:40.527] - relaying element #2 [18:01:40.527] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.527] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.527] signalConditionsASAP(NULL, pos=1) ... done [18:01:40.528] length: 5 (resolved future 1) [18:01:40.528] Future #2 [18:01:40.528] result() for ClusterFuture ... [18:01:40.528] - result already collected: FutureResult [18:01:40.528] result() for ClusterFuture ... done [18:01:40.529] result() for ClusterFuture ... [18:01:40.529] - result already collected: FutureResult [18:01:40.529] result() for ClusterFuture ... done [18:01:40.529] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:40.529] - nx: 6 [18:01:40.530] - relay: TRUE [18:01:40.530] - stdout: TRUE [18:01:40.530] - signal: TRUE [18:01:40.530] - resignal: FALSE [18:01:40.530] - force: TRUE [18:01:40.530] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.531] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.531] - until=2 [18:01:40.531] - relaying element #2 [18:01:40.531] result() for ClusterFuture ... [18:01:40.531] - result already collected: FutureResult [18:01:40.532] result() for ClusterFuture ... done [18:01:40.532] result() for ClusterFuture ... [18:01:40.532] - result already collected: FutureResult [18:01:40.532] result() for ClusterFuture ... done [18:01:40.532] result() for ClusterFuture ... [18:01:40.533] - result already collected: FutureResult [18:01:40.533] result() for ClusterFuture ... done [18:01:40.533] result() for ClusterFuture ... [18:01:40.533] - result already collected: FutureResult [18:01:40.533] result() for ClusterFuture ... done [18:01:40.533] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.534] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.534] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:40.534] length: 4 (resolved future 2) [18:01:40.534] Future #3 [18:01:40.534] result() for ClusterFuture ... [18:01:40.535] - result already collected: FutureResult [18:01:40.535] result() for ClusterFuture ... done [18:01:40.535] result() for ClusterFuture ... [18:01:40.535] - result already collected: FutureResult [18:01:40.535] result() for ClusterFuture ... done [18:01:40.535] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:40.536] - nx: 6 [18:01:40.536] - relay: TRUE [18:01:40.536] - stdout: TRUE [18:01:40.536] - signal: TRUE [18:01:40.536] - resignal: FALSE [18:01:40.536] - force: TRUE [18:01:40.537] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.537] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.537] - until=3 [18:01:40.537] - relaying element #3 [18:01:40.537] result() for ClusterFuture ... [18:01:40.538] - result already collected: FutureResult [18:01:40.538] result() for ClusterFuture ... done [18:01:40.538] result() for ClusterFuture ... [18:01:40.538] - result already collected: FutureResult [18:01:40.538] result() for ClusterFuture ... done [18:01:40.538] result() for ClusterFuture ... [18:01:40.539] - result already collected: FutureResult [18:01:40.539] result() for ClusterFuture ... done [18:01:40.539] result() for ClusterFuture ... [18:01:40.539] - result already collected: FutureResult [18:01:40.539] result() for ClusterFuture ... done [18:01:40.539] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.540] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.540] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:40.540] length: 3 (resolved future 3) [18:01:40.540] signalConditionsASAP(NULL, pos=4) ... [18:01:40.540] - nx: 6 [18:01:40.541] - relay: TRUE [18:01:40.541] - stdout: TRUE [18:01:40.541] - signal: TRUE [18:01:40.541] - resignal: FALSE [18:01:40.541] - force: TRUE [18:01:40.541] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.542] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.542] - until=5 [18:01:40.542] - relaying element #5 [18:01:40.542] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.542] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.542] signalConditionsASAP(NULL, pos=4) ... done [18:01:40.543] length: 2 (resolved future 4) [18:01:40.545] signalConditionsASAP(NULL, pos=5) ... [18:01:40.546] - nx: 6 [18:01:40.546] - relay: TRUE [18:01:40.546] - stdout: TRUE [18:01:40.546] - signal: TRUE [18:01:40.546] - resignal: FALSE [18:01:40.546] - force: TRUE [18:01:40.546] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.547] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.547] - until=6 [18:01:40.547] - relaying element #6 [18:01:40.547] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.547] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.547] signalConditionsASAP(NULL, pos=5) ... done [18:01:40.548] length: 1 (resolved future 5) [18:01:40.548] signalConditionsASAP(numeric, pos=6) ... [18:01:40.548] - nx: 6 [18:01:40.548] - relay: TRUE [18:01:40.548] - stdout: TRUE [18:01:40.548] - signal: TRUE [18:01:40.549] - resignal: FALSE [18:01:40.549] - force: TRUE [18:01:40.549] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.549] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.549] - until=6 [18:01:40.549] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.550] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.550] signalConditionsASAP(numeric, pos=6) ... done [18:01:40.550] length: 0 (resolved future 6) [18:01:40.550] Relaying remaining futures [18:01:40.550] signalConditionsASAP(NULL, pos=0) ... [18:01:40.551] - nx: 6 [18:01:40.551] - relay: TRUE [18:01:40.551] - stdout: TRUE [18:01:40.551] - signal: TRUE [18:01:40.551] - resignal: FALSE [18:01:40.551] - force: TRUE [18:01:40.551] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.552] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:40.552] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.552] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.552] signalConditionsASAP(NULL, pos=0) ... done [18:01:40.552] resolve() on list ... DONE [18:01:40.553] result() for ClusterFuture ... [18:01:40.553] - result already collected: FutureResult [18:01:40.553] result() for ClusterFuture ... done [18:01:40.553] result() for ClusterFuture ... [18:01:40.553] - result already collected: FutureResult [18:01:40.553] result() for ClusterFuture ... done [18:01:40.554] result() for ClusterFuture ... [18:01:40.554] - result already collected: FutureResult [18:01:40.554] result() for ClusterFuture ... done [18:01:40.554] result() for ClusterFuture ... [18:01:40.554] - result already collected: FutureResult [18:01:40.554] result() for ClusterFuture ... done List of 6 $ a: num 1 $ b: num 2 $ c: NULL $ : NULL $ : NULL $ : num 6 Dimensions: c(1, 6) [18:01:40.557] getGlobalsAndPackages() ... [18:01:40.557] Searching for globals... [18:01:40.557] [18:01:40.558] Searching for globals ... DONE [18:01:40.558] - globals: [0] [18:01:40.558] getGlobalsAndPackages() ... DONE [18:01:40.558] run() for 'Future' ... [18:01:40.558] - state: 'created' [18:01:40.559] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.572] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.572] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.573] - Field: 'node' [18:01:40.573] - Field: 'label' [18:01:40.573] - Field: 'local' [18:01:40.573] - Field: 'owner' [18:01:40.573] - Field: 'envir' [18:01:40.574] - Field: 'workers' [18:01:40.574] - Field: 'packages' [18:01:40.574] - Field: 'gc' [18:01:40.574] - Field: 'conditions' [18:01:40.574] - Field: 'persistent' [18:01:40.574] - Field: 'expr' [18:01:40.575] - Field: 'uuid' [18:01:40.575] - Field: 'seed' [18:01:40.575] - Field: 'version' [18:01:40.575] - Field: 'result' [18:01:40.575] - Field: 'asynchronous' [18:01:40.575] - Field: 'calls' [18:01:40.576] - Field: 'globals' [18:01:40.576] - Field: 'stdout' [18:01:40.576] - Field: 'earlySignal' [18:01:40.576] - Field: 'lazy' [18:01:40.576] - Field: 'state' [18:01:40.577] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.577] - Launch lazy future ... [18:01:40.577] Packages needed by the future expression (n = 0): [18:01:40.577] Packages needed by future strategies (n = 0): [18:01:40.578] { [18:01:40.578] { [18:01:40.578] { [18:01:40.578] ...future.startTime <- base::Sys.time() [18:01:40.578] { [18:01:40.578] { [18:01:40.578] { [18:01:40.578] { [18:01:40.578] base::local({ [18:01:40.578] has_future <- base::requireNamespace("future", [18:01:40.578] quietly = TRUE) [18:01:40.578] if (has_future) { [18:01:40.578] ns <- base::getNamespace("future") [18:01:40.578] version <- ns[[".package"]][["version"]] [18:01:40.578] if (is.null(version)) [18:01:40.578] version <- utils::packageVersion("future") [18:01:40.578] } [18:01:40.578] else { [18:01:40.578] version <- NULL [18:01:40.578] } [18:01:40.578] if (!has_future || version < "1.8.0") { [18:01:40.578] info <- base::c(r_version = base::gsub("R version ", [18:01:40.578] "", base::R.version$version.string), [18:01:40.578] platform = base::sprintf("%s (%s-bit)", [18:01:40.578] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.578] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.578] "release", "version")], collapse = " "), [18:01:40.578] hostname = base::Sys.info()[["nodename"]]) [18:01:40.578] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.578] info) [18:01:40.578] info <- base::paste(info, collapse = "; ") [18:01:40.578] if (!has_future) { [18:01:40.578] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.578] info) [18:01:40.578] } [18:01:40.578] else { [18:01:40.578] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.578] info, version) [18:01:40.578] } [18:01:40.578] base::stop(msg) [18:01:40.578] } [18:01:40.578] }) [18:01:40.578] } [18:01:40.578] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.578] base::options(mc.cores = 1L) [18:01:40.578] } [18:01:40.578] options(future.plan = NULL) [18:01:40.578] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.578] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.578] } [18:01:40.578] ...future.workdir <- getwd() [18:01:40.578] } [18:01:40.578] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.578] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.578] } [18:01:40.578] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.578] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.578] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.578] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.578] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.578] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.578] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.578] base::names(...future.oldOptions)) [18:01:40.578] } [18:01:40.578] if (FALSE) { [18:01:40.578] } [18:01:40.578] else { [18:01:40.578] if (TRUE) { [18:01:40.578] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.578] open = "w") [18:01:40.578] } [18:01:40.578] else { [18:01:40.578] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.578] windows = "NUL", "/dev/null"), open = "w") [18:01:40.578] } [18:01:40.578] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.578] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.578] base::sink(type = "output", split = FALSE) [18:01:40.578] base::close(...future.stdout) [18:01:40.578] }, add = TRUE) [18:01:40.578] } [18:01:40.578] ...future.frame <- base::sys.nframe() [18:01:40.578] ...future.conditions <- base::list() [18:01:40.578] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.578] if (FALSE) { [18:01:40.578] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.578] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.578] } [18:01:40.578] ...future.result <- base::tryCatch({ [18:01:40.578] base::withCallingHandlers({ [18:01:40.578] ...future.value <- base::withVisible(base::local({ [18:01:40.578] ...future.makeSendCondition <- local({ [18:01:40.578] sendCondition <- NULL [18:01:40.578] function(frame = 1L) { [18:01:40.578] if (is.function(sendCondition)) [18:01:40.578] return(sendCondition) [18:01:40.578] ns <- getNamespace("parallel") [18:01:40.578] if (exists("sendData", mode = "function", [18:01:40.578] envir = ns)) { [18:01:40.578] parallel_sendData <- get("sendData", mode = "function", [18:01:40.578] envir = ns) [18:01:40.578] envir <- sys.frame(frame) [18:01:40.578] master <- NULL [18:01:40.578] while (!identical(envir, .GlobalEnv) && [18:01:40.578] !identical(envir, emptyenv())) { [18:01:40.578] if (exists("master", mode = "list", envir = envir, [18:01:40.578] inherits = FALSE)) { [18:01:40.578] master <- get("master", mode = "list", [18:01:40.578] envir = envir, inherits = FALSE) [18:01:40.578] if (inherits(master, c("SOCKnode", [18:01:40.578] "SOCK0node"))) { [18:01:40.578] sendCondition <<- function(cond) { [18:01:40.578] data <- list(type = "VALUE", value = cond, [18:01:40.578] success = TRUE) [18:01:40.578] parallel_sendData(master, data) [18:01:40.578] } [18:01:40.578] return(sendCondition) [18:01:40.578] } [18:01:40.578] } [18:01:40.578] frame <- frame + 1L [18:01:40.578] envir <- sys.frame(frame) [18:01:40.578] } [18:01:40.578] } [18:01:40.578] sendCondition <<- function(cond) NULL [18:01:40.578] } [18:01:40.578] }) [18:01:40.578] withCallingHandlers({ [18:01:40.578] 2 [18:01:40.578] }, immediateCondition = function(cond) { [18:01:40.578] sendCondition <- ...future.makeSendCondition() [18:01:40.578] sendCondition(cond) [18:01:40.578] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.578] { [18:01:40.578] inherits <- base::inherits [18:01:40.578] invokeRestart <- base::invokeRestart [18:01:40.578] is.null <- base::is.null [18:01:40.578] muffled <- FALSE [18:01:40.578] if (inherits(cond, "message")) { [18:01:40.578] muffled <- grepl(pattern, "muffleMessage") [18:01:40.578] if (muffled) [18:01:40.578] invokeRestart("muffleMessage") [18:01:40.578] } [18:01:40.578] else if (inherits(cond, "warning")) { [18:01:40.578] muffled <- grepl(pattern, "muffleWarning") [18:01:40.578] if (muffled) [18:01:40.578] invokeRestart("muffleWarning") [18:01:40.578] } [18:01:40.578] else if (inherits(cond, "condition")) { [18:01:40.578] if (!is.null(pattern)) { [18:01:40.578] computeRestarts <- base::computeRestarts [18:01:40.578] grepl <- base::grepl [18:01:40.578] restarts <- computeRestarts(cond) [18:01:40.578] for (restart in restarts) { [18:01:40.578] name <- restart$name [18:01:40.578] if (is.null(name)) [18:01:40.578] next [18:01:40.578] if (!grepl(pattern, name)) [18:01:40.578] next [18:01:40.578] invokeRestart(restart) [18:01:40.578] muffled <- TRUE [18:01:40.578] break [18:01:40.578] } [18:01:40.578] } [18:01:40.578] } [18:01:40.578] invisible(muffled) [18:01:40.578] } [18:01:40.578] muffleCondition(cond) [18:01:40.578] }) [18:01:40.578] })) [18:01:40.578] future::FutureResult(value = ...future.value$value, [18:01:40.578] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.578] ...future.rng), globalenv = if (FALSE) [18:01:40.578] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.578] ...future.globalenv.names)) [18:01:40.578] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.578] }, condition = base::local({ [18:01:40.578] c <- base::c [18:01:40.578] inherits <- base::inherits [18:01:40.578] invokeRestart <- base::invokeRestart [18:01:40.578] length <- base::length [18:01:40.578] list <- base::list [18:01:40.578] seq.int <- base::seq.int [18:01:40.578] signalCondition <- base::signalCondition [18:01:40.578] sys.calls <- base::sys.calls [18:01:40.578] `[[` <- base::`[[` [18:01:40.578] `+` <- base::`+` [18:01:40.578] `<<-` <- base::`<<-` [18:01:40.578] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.578] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.578] 3L)] [18:01:40.578] } [18:01:40.578] function(cond) { [18:01:40.578] is_error <- inherits(cond, "error") [18:01:40.578] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.578] NULL) [18:01:40.578] if (is_error) { [18:01:40.578] sessionInformation <- function() { [18:01:40.578] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.578] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.578] search = base::search(), system = base::Sys.info()) [18:01:40.578] } [18:01:40.578] ...future.conditions[[length(...future.conditions) + [18:01:40.578] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.578] cond$call), session = sessionInformation(), [18:01:40.578] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.578] signalCondition(cond) [18:01:40.578] } [18:01:40.578] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.578] "immediateCondition"))) { [18:01:40.578] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.578] ...future.conditions[[length(...future.conditions) + [18:01:40.578] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.578] if (TRUE && !signal) { [18:01:40.578] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.578] { [18:01:40.578] inherits <- base::inherits [18:01:40.578] invokeRestart <- base::invokeRestart [18:01:40.578] is.null <- base::is.null [18:01:40.578] muffled <- FALSE [18:01:40.578] if (inherits(cond, "message")) { [18:01:40.578] muffled <- grepl(pattern, "muffleMessage") [18:01:40.578] if (muffled) [18:01:40.578] invokeRestart("muffleMessage") [18:01:40.578] } [18:01:40.578] else if (inherits(cond, "warning")) { [18:01:40.578] muffled <- grepl(pattern, "muffleWarning") [18:01:40.578] if (muffled) [18:01:40.578] invokeRestart("muffleWarning") [18:01:40.578] } [18:01:40.578] else if (inherits(cond, "condition")) { [18:01:40.578] if (!is.null(pattern)) { [18:01:40.578] computeRestarts <- base::computeRestarts [18:01:40.578] grepl <- base::grepl [18:01:40.578] restarts <- computeRestarts(cond) [18:01:40.578] for (restart in restarts) { [18:01:40.578] name <- restart$name [18:01:40.578] if (is.null(name)) [18:01:40.578] next [18:01:40.578] if (!grepl(pattern, name)) [18:01:40.578] next [18:01:40.578] invokeRestart(restart) [18:01:40.578] muffled <- TRUE [18:01:40.578] break [18:01:40.578] } [18:01:40.578] } [18:01:40.578] } [18:01:40.578] invisible(muffled) [18:01:40.578] } [18:01:40.578] muffleCondition(cond, pattern = "^muffle") [18:01:40.578] } [18:01:40.578] } [18:01:40.578] else { [18:01:40.578] if (TRUE) { [18:01:40.578] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.578] { [18:01:40.578] inherits <- base::inherits [18:01:40.578] invokeRestart <- base::invokeRestart [18:01:40.578] is.null <- base::is.null [18:01:40.578] muffled <- FALSE [18:01:40.578] if (inherits(cond, "message")) { [18:01:40.578] muffled <- grepl(pattern, "muffleMessage") [18:01:40.578] if (muffled) [18:01:40.578] invokeRestart("muffleMessage") [18:01:40.578] } [18:01:40.578] else if (inherits(cond, "warning")) { [18:01:40.578] muffled <- grepl(pattern, "muffleWarning") [18:01:40.578] if (muffled) [18:01:40.578] invokeRestart("muffleWarning") [18:01:40.578] } [18:01:40.578] else if (inherits(cond, "condition")) { [18:01:40.578] if (!is.null(pattern)) { [18:01:40.578] computeRestarts <- base::computeRestarts [18:01:40.578] grepl <- base::grepl [18:01:40.578] restarts <- computeRestarts(cond) [18:01:40.578] for (restart in restarts) { [18:01:40.578] name <- restart$name [18:01:40.578] if (is.null(name)) [18:01:40.578] next [18:01:40.578] if (!grepl(pattern, name)) [18:01:40.578] next [18:01:40.578] invokeRestart(restart) [18:01:40.578] muffled <- TRUE [18:01:40.578] break [18:01:40.578] } [18:01:40.578] } [18:01:40.578] } [18:01:40.578] invisible(muffled) [18:01:40.578] } [18:01:40.578] muffleCondition(cond, pattern = "^muffle") [18:01:40.578] } [18:01:40.578] } [18:01:40.578] } [18:01:40.578] })) [18:01:40.578] }, error = function(ex) { [18:01:40.578] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.578] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.578] ...future.rng), started = ...future.startTime, [18:01:40.578] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.578] version = "1.8"), class = "FutureResult") [18:01:40.578] }, finally = { [18:01:40.578] if (!identical(...future.workdir, getwd())) [18:01:40.578] setwd(...future.workdir) [18:01:40.578] { [18:01:40.578] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.578] ...future.oldOptions$nwarnings <- NULL [18:01:40.578] } [18:01:40.578] base::options(...future.oldOptions) [18:01:40.578] if (.Platform$OS.type == "windows") { [18:01:40.578] old_names <- names(...future.oldEnvVars) [18:01:40.578] envs <- base::Sys.getenv() [18:01:40.578] names <- names(envs) [18:01:40.578] common <- intersect(names, old_names) [18:01:40.578] added <- setdiff(names, old_names) [18:01:40.578] removed <- setdiff(old_names, names) [18:01:40.578] changed <- common[...future.oldEnvVars[common] != [18:01:40.578] envs[common]] [18:01:40.578] NAMES <- toupper(changed) [18:01:40.578] args <- list() [18:01:40.578] for (kk in seq_along(NAMES)) { [18:01:40.578] name <- changed[[kk]] [18:01:40.578] NAME <- NAMES[[kk]] [18:01:40.578] if (name != NAME && is.element(NAME, old_names)) [18:01:40.578] next [18:01:40.578] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.578] } [18:01:40.578] NAMES <- toupper(added) [18:01:40.578] for (kk in seq_along(NAMES)) { [18:01:40.578] name <- added[[kk]] [18:01:40.578] NAME <- NAMES[[kk]] [18:01:40.578] if (name != NAME && is.element(NAME, old_names)) [18:01:40.578] next [18:01:40.578] args[[name]] <- "" [18:01:40.578] } [18:01:40.578] NAMES <- toupper(removed) [18:01:40.578] for (kk in seq_along(NAMES)) { [18:01:40.578] name <- removed[[kk]] [18:01:40.578] NAME <- NAMES[[kk]] [18:01:40.578] if (name != NAME && is.element(NAME, old_names)) [18:01:40.578] next [18:01:40.578] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.578] } [18:01:40.578] if (length(args) > 0) [18:01:40.578] base::do.call(base::Sys.setenv, args = args) [18:01:40.578] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.578] } [18:01:40.578] else { [18:01:40.578] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.578] } [18:01:40.578] { [18:01:40.578] if (base::length(...future.futureOptionsAdded) > [18:01:40.578] 0L) { [18:01:40.578] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.578] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.578] base::options(opts) [18:01:40.578] } [18:01:40.578] { [18:01:40.578] { [18:01:40.578] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.578] NULL [18:01:40.578] } [18:01:40.578] options(future.plan = NULL) [18:01:40.578] if (is.na(NA_character_)) [18:01:40.578] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.578] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.578] future::plan(list(function (..., workers = availableCores(), [18:01:40.578] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.578] envir = parent.frame()) [18:01:40.578] { [18:01:40.578] if (is.function(workers)) [18:01:40.578] workers <- workers() [18:01:40.578] workers <- structure(as.integer(workers), [18:01:40.578] class = class(workers)) [18:01:40.578] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.578] workers >= 1) [18:01:40.578] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.578] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.578] } [18:01:40.578] future <- MultisessionFuture(..., workers = workers, [18:01:40.578] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.578] envir = envir) [18:01:40.578] if (!future$lazy) [18:01:40.578] future <- run(future) [18:01:40.578] invisible(future) [18:01:40.578] }), .cleanup = FALSE, .init = FALSE) [18:01:40.578] } [18:01:40.578] } [18:01:40.578] } [18:01:40.578] }) [18:01:40.578] if (TRUE) { [18:01:40.578] base::sink(type = "output", split = FALSE) [18:01:40.578] if (TRUE) { [18:01:40.578] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.578] } [18:01:40.578] else { [18:01:40.578] ...future.result["stdout"] <- base::list(NULL) [18:01:40.578] } [18:01:40.578] base::close(...future.stdout) [18:01:40.578] ...future.stdout <- NULL [18:01:40.578] } [18:01:40.578] ...future.result$conditions <- ...future.conditions [18:01:40.578] ...future.result$finished <- base::Sys.time() [18:01:40.578] ...future.result [18:01:40.578] } [18:01:40.584] MultisessionFuture started [18:01:40.584] - Launch lazy future ... done [18:01:40.584] run() for 'MultisessionFuture' ... done [18:01:40.584] getGlobalsAndPackages() ... [18:01:40.584] Searching for globals... [18:01:40.585] [18:01:40.585] Searching for globals ... DONE [18:01:40.585] - globals: [0] [18:01:40.585] getGlobalsAndPackages() ... DONE [18:01:40.585] run() for 'Future' ... [18:01:40.586] - state: 'created' [18:01:40.586] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.601] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.601] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.601] - Field: 'node' [18:01:40.601] - Field: 'label' [18:01:40.602] - Field: 'local' [18:01:40.602] - Field: 'owner' [18:01:40.602] - Field: 'envir' [18:01:40.602] - Field: 'workers' [18:01:40.602] - Field: 'packages' [18:01:40.602] - Field: 'gc' [18:01:40.603] - Field: 'conditions' [18:01:40.603] - Field: 'persistent' [18:01:40.603] - Field: 'expr' [18:01:40.603] - Field: 'uuid' [18:01:40.603] - Field: 'seed' [18:01:40.603] - Field: 'version' [18:01:40.604] - Field: 'result' [18:01:40.604] - Field: 'asynchronous' [18:01:40.604] - Field: 'calls' [18:01:40.604] - Field: 'globals' [18:01:40.604] - Field: 'stdout' [18:01:40.605] - Field: 'earlySignal' [18:01:40.605] - Field: 'lazy' [18:01:40.605] - Field: 'state' [18:01:40.605] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.605] - Launch lazy future ... [18:01:40.606] Packages needed by the future expression (n = 0): [18:01:40.606] Packages needed by future strategies (n = 0): [18:01:40.606] { [18:01:40.606] { [18:01:40.606] { [18:01:40.606] ...future.startTime <- base::Sys.time() [18:01:40.606] { [18:01:40.606] { [18:01:40.606] { [18:01:40.606] { [18:01:40.606] base::local({ [18:01:40.606] has_future <- base::requireNamespace("future", [18:01:40.606] quietly = TRUE) [18:01:40.606] if (has_future) { [18:01:40.606] ns <- base::getNamespace("future") [18:01:40.606] version <- ns[[".package"]][["version"]] [18:01:40.606] if (is.null(version)) [18:01:40.606] version <- utils::packageVersion("future") [18:01:40.606] } [18:01:40.606] else { [18:01:40.606] version <- NULL [18:01:40.606] } [18:01:40.606] if (!has_future || version < "1.8.0") { [18:01:40.606] info <- base::c(r_version = base::gsub("R version ", [18:01:40.606] "", base::R.version$version.string), [18:01:40.606] platform = base::sprintf("%s (%s-bit)", [18:01:40.606] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.606] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.606] "release", "version")], collapse = " "), [18:01:40.606] hostname = base::Sys.info()[["nodename"]]) [18:01:40.606] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.606] info) [18:01:40.606] info <- base::paste(info, collapse = "; ") [18:01:40.606] if (!has_future) { [18:01:40.606] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.606] info) [18:01:40.606] } [18:01:40.606] else { [18:01:40.606] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.606] info, version) [18:01:40.606] } [18:01:40.606] base::stop(msg) [18:01:40.606] } [18:01:40.606] }) [18:01:40.606] } [18:01:40.606] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.606] base::options(mc.cores = 1L) [18:01:40.606] } [18:01:40.606] options(future.plan = NULL) [18:01:40.606] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.606] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.606] } [18:01:40.606] ...future.workdir <- getwd() [18:01:40.606] } [18:01:40.606] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.606] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.606] } [18:01:40.606] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.606] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.606] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.606] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.606] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.606] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.606] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.606] base::names(...future.oldOptions)) [18:01:40.606] } [18:01:40.606] if (FALSE) { [18:01:40.606] } [18:01:40.606] else { [18:01:40.606] if (TRUE) { [18:01:40.606] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.606] open = "w") [18:01:40.606] } [18:01:40.606] else { [18:01:40.606] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.606] windows = "NUL", "/dev/null"), open = "w") [18:01:40.606] } [18:01:40.606] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.606] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.606] base::sink(type = "output", split = FALSE) [18:01:40.606] base::close(...future.stdout) [18:01:40.606] }, add = TRUE) [18:01:40.606] } [18:01:40.606] ...future.frame <- base::sys.nframe() [18:01:40.606] ...future.conditions <- base::list() [18:01:40.606] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.606] if (FALSE) { [18:01:40.606] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.606] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.606] } [18:01:40.606] ...future.result <- base::tryCatch({ [18:01:40.606] base::withCallingHandlers({ [18:01:40.606] ...future.value <- base::withVisible(base::local({ [18:01:40.606] ...future.makeSendCondition <- local({ [18:01:40.606] sendCondition <- NULL [18:01:40.606] function(frame = 1L) { [18:01:40.606] if (is.function(sendCondition)) [18:01:40.606] return(sendCondition) [18:01:40.606] ns <- getNamespace("parallel") [18:01:40.606] if (exists("sendData", mode = "function", [18:01:40.606] envir = ns)) { [18:01:40.606] parallel_sendData <- get("sendData", mode = "function", [18:01:40.606] envir = ns) [18:01:40.606] envir <- sys.frame(frame) [18:01:40.606] master <- NULL [18:01:40.606] while (!identical(envir, .GlobalEnv) && [18:01:40.606] !identical(envir, emptyenv())) { [18:01:40.606] if (exists("master", mode = "list", envir = envir, [18:01:40.606] inherits = FALSE)) { [18:01:40.606] master <- get("master", mode = "list", [18:01:40.606] envir = envir, inherits = FALSE) [18:01:40.606] if (inherits(master, c("SOCKnode", [18:01:40.606] "SOCK0node"))) { [18:01:40.606] sendCondition <<- function(cond) { [18:01:40.606] data <- list(type = "VALUE", value = cond, [18:01:40.606] success = TRUE) [18:01:40.606] parallel_sendData(master, data) [18:01:40.606] } [18:01:40.606] return(sendCondition) [18:01:40.606] } [18:01:40.606] } [18:01:40.606] frame <- frame + 1L [18:01:40.606] envir <- sys.frame(frame) [18:01:40.606] } [18:01:40.606] } [18:01:40.606] sendCondition <<- function(cond) NULL [18:01:40.606] } [18:01:40.606] }) [18:01:40.606] withCallingHandlers({ [18:01:40.606] NULL [18:01:40.606] }, immediateCondition = function(cond) { [18:01:40.606] sendCondition <- ...future.makeSendCondition() [18:01:40.606] sendCondition(cond) [18:01:40.606] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.606] { [18:01:40.606] inherits <- base::inherits [18:01:40.606] invokeRestart <- base::invokeRestart [18:01:40.606] is.null <- base::is.null [18:01:40.606] muffled <- FALSE [18:01:40.606] if (inherits(cond, "message")) { [18:01:40.606] muffled <- grepl(pattern, "muffleMessage") [18:01:40.606] if (muffled) [18:01:40.606] invokeRestart("muffleMessage") [18:01:40.606] } [18:01:40.606] else if (inherits(cond, "warning")) { [18:01:40.606] muffled <- grepl(pattern, "muffleWarning") [18:01:40.606] if (muffled) [18:01:40.606] invokeRestart("muffleWarning") [18:01:40.606] } [18:01:40.606] else if (inherits(cond, "condition")) { [18:01:40.606] if (!is.null(pattern)) { [18:01:40.606] computeRestarts <- base::computeRestarts [18:01:40.606] grepl <- base::grepl [18:01:40.606] restarts <- computeRestarts(cond) [18:01:40.606] for (restart in restarts) { [18:01:40.606] name <- restart$name [18:01:40.606] if (is.null(name)) [18:01:40.606] next [18:01:40.606] if (!grepl(pattern, name)) [18:01:40.606] next [18:01:40.606] invokeRestart(restart) [18:01:40.606] muffled <- TRUE [18:01:40.606] break [18:01:40.606] } [18:01:40.606] } [18:01:40.606] } [18:01:40.606] invisible(muffled) [18:01:40.606] } [18:01:40.606] muffleCondition(cond) [18:01:40.606] }) [18:01:40.606] })) [18:01:40.606] future::FutureResult(value = ...future.value$value, [18:01:40.606] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.606] ...future.rng), globalenv = if (FALSE) [18:01:40.606] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.606] ...future.globalenv.names)) [18:01:40.606] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.606] }, condition = base::local({ [18:01:40.606] c <- base::c [18:01:40.606] inherits <- base::inherits [18:01:40.606] invokeRestart <- base::invokeRestart [18:01:40.606] length <- base::length [18:01:40.606] list <- base::list [18:01:40.606] seq.int <- base::seq.int [18:01:40.606] signalCondition <- base::signalCondition [18:01:40.606] sys.calls <- base::sys.calls [18:01:40.606] `[[` <- base::`[[` [18:01:40.606] `+` <- base::`+` [18:01:40.606] `<<-` <- base::`<<-` [18:01:40.606] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.606] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.606] 3L)] [18:01:40.606] } [18:01:40.606] function(cond) { [18:01:40.606] is_error <- inherits(cond, "error") [18:01:40.606] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.606] NULL) [18:01:40.606] if (is_error) { [18:01:40.606] sessionInformation <- function() { [18:01:40.606] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.606] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.606] search = base::search(), system = base::Sys.info()) [18:01:40.606] } [18:01:40.606] ...future.conditions[[length(...future.conditions) + [18:01:40.606] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.606] cond$call), session = sessionInformation(), [18:01:40.606] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.606] signalCondition(cond) [18:01:40.606] } [18:01:40.606] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.606] "immediateCondition"))) { [18:01:40.606] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.606] ...future.conditions[[length(...future.conditions) + [18:01:40.606] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.606] if (TRUE && !signal) { [18:01:40.606] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.606] { [18:01:40.606] inherits <- base::inherits [18:01:40.606] invokeRestart <- base::invokeRestart [18:01:40.606] is.null <- base::is.null [18:01:40.606] muffled <- FALSE [18:01:40.606] if (inherits(cond, "message")) { [18:01:40.606] muffled <- grepl(pattern, "muffleMessage") [18:01:40.606] if (muffled) [18:01:40.606] invokeRestart("muffleMessage") [18:01:40.606] } [18:01:40.606] else if (inherits(cond, "warning")) { [18:01:40.606] muffled <- grepl(pattern, "muffleWarning") [18:01:40.606] if (muffled) [18:01:40.606] invokeRestart("muffleWarning") [18:01:40.606] } [18:01:40.606] else if (inherits(cond, "condition")) { [18:01:40.606] if (!is.null(pattern)) { [18:01:40.606] computeRestarts <- base::computeRestarts [18:01:40.606] grepl <- base::grepl [18:01:40.606] restarts <- computeRestarts(cond) [18:01:40.606] for (restart in restarts) { [18:01:40.606] name <- restart$name [18:01:40.606] if (is.null(name)) [18:01:40.606] next [18:01:40.606] if (!grepl(pattern, name)) [18:01:40.606] next [18:01:40.606] invokeRestart(restart) [18:01:40.606] muffled <- TRUE [18:01:40.606] break [18:01:40.606] } [18:01:40.606] } [18:01:40.606] } [18:01:40.606] invisible(muffled) [18:01:40.606] } [18:01:40.606] muffleCondition(cond, pattern = "^muffle") [18:01:40.606] } [18:01:40.606] } [18:01:40.606] else { [18:01:40.606] if (TRUE) { [18:01:40.606] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.606] { [18:01:40.606] inherits <- base::inherits [18:01:40.606] invokeRestart <- base::invokeRestart [18:01:40.606] is.null <- base::is.null [18:01:40.606] muffled <- FALSE [18:01:40.606] if (inherits(cond, "message")) { [18:01:40.606] muffled <- grepl(pattern, "muffleMessage") [18:01:40.606] if (muffled) [18:01:40.606] invokeRestart("muffleMessage") [18:01:40.606] } [18:01:40.606] else if (inherits(cond, "warning")) { [18:01:40.606] muffled <- grepl(pattern, "muffleWarning") [18:01:40.606] if (muffled) [18:01:40.606] invokeRestart("muffleWarning") [18:01:40.606] } [18:01:40.606] else if (inherits(cond, "condition")) { [18:01:40.606] if (!is.null(pattern)) { [18:01:40.606] computeRestarts <- base::computeRestarts [18:01:40.606] grepl <- base::grepl [18:01:40.606] restarts <- computeRestarts(cond) [18:01:40.606] for (restart in restarts) { [18:01:40.606] name <- restart$name [18:01:40.606] if (is.null(name)) [18:01:40.606] next [18:01:40.606] if (!grepl(pattern, name)) [18:01:40.606] next [18:01:40.606] invokeRestart(restart) [18:01:40.606] muffled <- TRUE [18:01:40.606] break [18:01:40.606] } [18:01:40.606] } [18:01:40.606] } [18:01:40.606] invisible(muffled) [18:01:40.606] } [18:01:40.606] muffleCondition(cond, pattern = "^muffle") [18:01:40.606] } [18:01:40.606] } [18:01:40.606] } [18:01:40.606] })) [18:01:40.606] }, error = function(ex) { [18:01:40.606] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.606] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.606] ...future.rng), started = ...future.startTime, [18:01:40.606] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.606] version = "1.8"), class = "FutureResult") [18:01:40.606] }, finally = { [18:01:40.606] if (!identical(...future.workdir, getwd())) [18:01:40.606] setwd(...future.workdir) [18:01:40.606] { [18:01:40.606] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.606] ...future.oldOptions$nwarnings <- NULL [18:01:40.606] } [18:01:40.606] base::options(...future.oldOptions) [18:01:40.606] if (.Platform$OS.type == "windows") { [18:01:40.606] old_names <- names(...future.oldEnvVars) [18:01:40.606] envs <- base::Sys.getenv() [18:01:40.606] names <- names(envs) [18:01:40.606] common <- intersect(names, old_names) [18:01:40.606] added <- setdiff(names, old_names) [18:01:40.606] removed <- setdiff(old_names, names) [18:01:40.606] changed <- common[...future.oldEnvVars[common] != [18:01:40.606] envs[common]] [18:01:40.606] NAMES <- toupper(changed) [18:01:40.606] args <- list() [18:01:40.606] for (kk in seq_along(NAMES)) { [18:01:40.606] name <- changed[[kk]] [18:01:40.606] NAME <- NAMES[[kk]] [18:01:40.606] if (name != NAME && is.element(NAME, old_names)) [18:01:40.606] next [18:01:40.606] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.606] } [18:01:40.606] NAMES <- toupper(added) [18:01:40.606] for (kk in seq_along(NAMES)) { [18:01:40.606] name <- added[[kk]] [18:01:40.606] NAME <- NAMES[[kk]] [18:01:40.606] if (name != NAME && is.element(NAME, old_names)) [18:01:40.606] next [18:01:40.606] args[[name]] <- "" [18:01:40.606] } [18:01:40.606] NAMES <- toupper(removed) [18:01:40.606] for (kk in seq_along(NAMES)) { [18:01:40.606] name <- removed[[kk]] [18:01:40.606] NAME <- NAMES[[kk]] [18:01:40.606] if (name != NAME && is.element(NAME, old_names)) [18:01:40.606] next [18:01:40.606] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.606] } [18:01:40.606] if (length(args) > 0) [18:01:40.606] base::do.call(base::Sys.setenv, args = args) [18:01:40.606] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.606] } [18:01:40.606] else { [18:01:40.606] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.606] } [18:01:40.606] { [18:01:40.606] if (base::length(...future.futureOptionsAdded) > [18:01:40.606] 0L) { [18:01:40.606] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.606] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.606] base::options(opts) [18:01:40.606] } [18:01:40.606] { [18:01:40.606] { [18:01:40.606] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.606] NULL [18:01:40.606] } [18:01:40.606] options(future.plan = NULL) [18:01:40.606] if (is.na(NA_character_)) [18:01:40.606] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.606] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.606] future::plan(list(function (..., workers = availableCores(), [18:01:40.606] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.606] envir = parent.frame()) [18:01:40.606] { [18:01:40.606] if (is.function(workers)) [18:01:40.606] workers <- workers() [18:01:40.606] workers <- structure(as.integer(workers), [18:01:40.606] class = class(workers)) [18:01:40.606] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.606] workers >= 1) [18:01:40.606] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.606] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.606] } [18:01:40.606] future <- MultisessionFuture(..., workers = workers, [18:01:40.606] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.606] envir = envir) [18:01:40.606] if (!future$lazy) [18:01:40.606] future <- run(future) [18:01:40.606] invisible(future) [18:01:40.606] }), .cleanup = FALSE, .init = FALSE) [18:01:40.606] } [18:01:40.606] } [18:01:40.606] } [18:01:40.606] }) [18:01:40.606] if (TRUE) { [18:01:40.606] base::sink(type = "output", split = FALSE) [18:01:40.606] if (TRUE) { [18:01:40.606] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.606] } [18:01:40.606] else { [18:01:40.606] ...future.result["stdout"] <- base::list(NULL) [18:01:40.606] } [18:01:40.606] base::close(...future.stdout) [18:01:40.606] ...future.stdout <- NULL [18:01:40.606] } [18:01:40.606] ...future.result$conditions <- ...future.conditions [18:01:40.606] ...future.result$finished <- base::Sys.time() [18:01:40.606] ...future.result [18:01:40.606] } [18:01:40.612] MultisessionFuture started [18:01:40.612] - Launch lazy future ... done [18:01:40.613] 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" ... [18:01:40.619] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.619] - Validating connection of MultisessionFuture [18:01:40.619] - received message: FutureResult [18:01:40.620] - Received FutureResult [18:01:40.620] - Erased future from FutureRegistry [18:01:40.620] result() for ClusterFuture ... [18:01:40.620] - result already collected: FutureResult [18:01:40.620] result() for ClusterFuture ... done [18:01:40.620] receiveMessageFromWorker() for ClusterFuture ... done [18:01:40.629] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.630] - Validating connection of MultisessionFuture [18:01:40.630] - received message: FutureResult [18:01:40.630] - Received FutureResult [18:01:40.630] - Erased future from FutureRegistry [18:01:40.630] result() for ClusterFuture ... [18:01:40.631] - result already collected: FutureResult [18:01:40.631] result() for ClusterFuture ... done [18:01:40.631] 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" "" ... [18:01:40.633] resolve() on list ... [18:01:40.633] recursive: 0 [18:01:40.633] length: 6 [18:01:40.633] elements: 'a', 'b', 'c', '', '', '' [18:01:40.634] signalConditionsASAP(numeric, pos=1) ... [18:01:40.634] - nx: 6 [18:01:40.634] - relay: TRUE [18:01:40.634] - stdout: TRUE [18:01:40.634] - signal: TRUE [18:01:40.634] - resignal: FALSE [18:01:40.635] - force: TRUE [18:01:40.635] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.635] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.635] - until=2 [18:01:40.635] - relaying element #2 [18:01:40.635] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.635] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.636] signalConditionsASAP(NULL, pos=1) ... done [18:01:40.636] length: 5 (resolved future 1) [18:01:40.636] Future #2 [18:01:40.636] result() for ClusterFuture ... [18:01:40.636] - result already collected: FutureResult [18:01:40.636] result() for ClusterFuture ... done [18:01:40.637] result() for ClusterFuture ... [18:01:40.637] - result already collected: FutureResult [18:01:40.637] result() for ClusterFuture ... done [18:01:40.637] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:40.637] - nx: 6 [18:01:40.637] - relay: TRUE [18:01:40.638] - stdout: TRUE [18:01:40.638] - signal: TRUE [18:01:40.638] - resignal: FALSE [18:01:40.638] - force: TRUE [18:01:40.638] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.638] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.639] - until=2 [18:01:40.639] - relaying element #2 [18:01:40.639] result() for ClusterFuture ... [18:01:40.639] - result already collected: FutureResult [18:01:40.639] result() for ClusterFuture ... done [18:01:40.639] result() for ClusterFuture ... [18:01:40.640] - result already collected: FutureResult [18:01:40.640] result() for ClusterFuture ... done [18:01:40.640] result() for ClusterFuture ... [18:01:40.640] - result already collected: FutureResult [18:01:40.640] result() for ClusterFuture ... done [18:01:40.640] result() for ClusterFuture ... [18:01:40.640] - result already collected: FutureResult [18:01:40.641] result() for ClusterFuture ... done [18:01:40.641] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.641] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.641] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:40.641] length: 4 (resolved future 2) [18:01:40.641] Future #3 [18:01:40.642] result() for ClusterFuture ... [18:01:40.642] - result already collected: FutureResult [18:01:40.642] result() for ClusterFuture ... done [18:01:40.642] result() for ClusterFuture ... [18:01:40.642] - result already collected: FutureResult [18:01:40.642] result() for ClusterFuture ... done [18:01:40.643] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:40.643] - nx: 6 [18:01:40.643] - relay: TRUE [18:01:40.643] - stdout: TRUE [18:01:40.643] - signal: TRUE [18:01:40.643] - resignal: FALSE [18:01:40.644] - force: TRUE [18:01:40.644] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.644] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.644] - until=3 [18:01:40.644] - relaying element #3 [18:01:40.644] result() for ClusterFuture ... [18:01:40.645] - result already collected: FutureResult [18:01:40.645] result() for ClusterFuture ... done [18:01:40.645] result() for ClusterFuture ... [18:01:40.645] - result already collected: FutureResult [18:01:40.645] result() for ClusterFuture ... done [18:01:40.645] result() for ClusterFuture ... [18:01:40.645] - result already collected: FutureResult [18:01:40.646] result() for ClusterFuture ... done [18:01:40.646] result() for ClusterFuture ... [18:01:40.646] - result already collected: FutureResult [18:01:40.646] result() for ClusterFuture ... done [18:01:40.646] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.646] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.647] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:40.647] length: 3 (resolved future 3) [18:01:40.647] signalConditionsASAP(NULL, pos=4) ... [18:01:40.647] - nx: 6 [18:01:40.647] - relay: TRUE [18:01:40.647] - stdout: TRUE [18:01:40.648] - signal: TRUE [18:01:40.648] - resignal: FALSE [18:01:40.648] - force: TRUE [18:01:40.648] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.648] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.648] - until=5 [18:01:40.649] - relaying element #5 [18:01:40.649] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.649] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.649] signalConditionsASAP(NULL, pos=4) ... done [18:01:40.649] length: 2 (resolved future 4) [18:01:40.649] signalConditionsASAP(NULL, pos=5) ... [18:01:40.649] - nx: 6 [18:01:40.650] - relay: TRUE [18:01:40.650] - stdout: TRUE [18:01:40.650] - signal: TRUE [18:01:40.650] - resignal: FALSE [18:01:40.650] - force: TRUE [18:01:40.650] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.651] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.651] - until=6 [18:01:40.651] - relaying element #6 [18:01:40.651] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.651] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.651] signalConditionsASAP(NULL, pos=5) ... done [18:01:40.652] length: 1 (resolved future 5) [18:01:40.652] signalConditionsASAP(numeric, pos=6) ... [18:01:40.652] - nx: 6 [18:01:40.652] - relay: TRUE [18:01:40.652] - stdout: TRUE [18:01:40.652] - signal: TRUE [18:01:40.652] - resignal: FALSE [18:01:40.653] - force: TRUE [18:01:40.653] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.653] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.653] - until=6 [18:01:40.653] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.653] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.654] signalConditionsASAP(numeric, pos=6) ... done [18:01:40.654] length: 0 (resolved future 6) [18:01:40.654] Relaying remaining futures [18:01:40.654] signalConditionsASAP(NULL, pos=0) ... [18:01:40.654] - nx: 6 [18:01:40.654] - relay: TRUE [18:01:40.654] - stdout: TRUE [18:01:40.655] - signal: TRUE [18:01:40.655] - resignal: FALSE [18:01:40.655] - force: TRUE [18:01:40.655] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.655] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:40.656] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.656] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.656] signalConditionsASAP(NULL, pos=0) ... done [18:01:40.656] resolve() on list ... DONE [18:01:40.656] result() for ClusterFuture ... [18:01:40.656] - result already collected: FutureResult [18:01:40.656] result() for ClusterFuture ... done [18:01:40.657] result() for ClusterFuture ... [18:01:40.657] - result already collected: FutureResult [18:01:40.657] result() for ClusterFuture ... done [18:01:40.657] result() for ClusterFuture ... [18:01:40.657] - result already collected: FutureResult [18:01:40.658] result() for ClusterFuture ... done [18:01:40.658] result() for ClusterFuture ... [18:01:40.658] - result already collected: FutureResult [18:01:40.658] 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) [18:01:40.662] getGlobalsAndPackages() ... [18:01:40.662] Searching for globals... [18:01:40.663] [18:01:40.663] Searching for globals ... DONE [18:01:40.663] - globals: [0] [18:01:40.663] getGlobalsAndPackages() ... DONE [18:01:40.663] run() for 'Future' ... [18:01:40.664] - state: 'created' [18:01:40.664] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.677] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.678] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.678] - Field: 'node' [18:01:40.678] - Field: 'label' [18:01:40.678] - Field: 'local' [18:01:40.678] - Field: 'owner' [18:01:40.678] - Field: 'envir' [18:01:40.679] - Field: 'workers' [18:01:40.679] - Field: 'packages' [18:01:40.679] - Field: 'gc' [18:01:40.679] - Field: 'conditions' [18:01:40.680] - Field: 'persistent' [18:01:40.680] - Field: 'expr' [18:01:40.680] - Field: 'uuid' [18:01:40.680] - Field: 'seed' [18:01:40.680] - Field: 'version' [18:01:40.680] - Field: 'result' [18:01:40.681] - Field: 'asynchronous' [18:01:40.681] - Field: 'calls' [18:01:40.681] - Field: 'globals' [18:01:40.681] - Field: 'stdout' [18:01:40.681] - Field: 'earlySignal' [18:01:40.681] - Field: 'lazy' [18:01:40.682] - Field: 'state' [18:01:40.682] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.682] - Launch lazy future ... [18:01:40.682] Packages needed by the future expression (n = 0): [18:01:40.683] Packages needed by future strategies (n = 0): [18:01:40.683] { [18:01:40.683] { [18:01:40.683] { [18:01:40.683] ...future.startTime <- base::Sys.time() [18:01:40.683] { [18:01:40.683] { [18:01:40.683] { [18:01:40.683] { [18:01:40.683] base::local({ [18:01:40.683] has_future <- base::requireNamespace("future", [18:01:40.683] quietly = TRUE) [18:01:40.683] if (has_future) { [18:01:40.683] ns <- base::getNamespace("future") [18:01:40.683] version <- ns[[".package"]][["version"]] [18:01:40.683] if (is.null(version)) [18:01:40.683] version <- utils::packageVersion("future") [18:01:40.683] } [18:01:40.683] else { [18:01:40.683] version <- NULL [18:01:40.683] } [18:01:40.683] if (!has_future || version < "1.8.0") { [18:01:40.683] info <- base::c(r_version = base::gsub("R version ", [18:01:40.683] "", base::R.version$version.string), [18:01:40.683] platform = base::sprintf("%s (%s-bit)", [18:01:40.683] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.683] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.683] "release", "version")], collapse = " "), [18:01:40.683] hostname = base::Sys.info()[["nodename"]]) [18:01:40.683] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.683] info) [18:01:40.683] info <- base::paste(info, collapse = "; ") [18:01:40.683] if (!has_future) { [18:01:40.683] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.683] info) [18:01:40.683] } [18:01:40.683] else { [18:01:40.683] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.683] info, version) [18:01:40.683] } [18:01:40.683] base::stop(msg) [18:01:40.683] } [18:01:40.683] }) [18:01:40.683] } [18:01:40.683] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.683] base::options(mc.cores = 1L) [18:01:40.683] } [18:01:40.683] options(future.plan = NULL) [18:01:40.683] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.683] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.683] } [18:01:40.683] ...future.workdir <- getwd() [18:01:40.683] } [18:01:40.683] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.683] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.683] } [18:01:40.683] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.683] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.683] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.683] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.683] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.683] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.683] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.683] base::names(...future.oldOptions)) [18:01:40.683] } [18:01:40.683] if (FALSE) { [18:01:40.683] } [18:01:40.683] else { [18:01:40.683] if (TRUE) { [18:01:40.683] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.683] open = "w") [18:01:40.683] } [18:01:40.683] else { [18:01:40.683] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.683] windows = "NUL", "/dev/null"), open = "w") [18:01:40.683] } [18:01:40.683] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.683] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.683] base::sink(type = "output", split = FALSE) [18:01:40.683] base::close(...future.stdout) [18:01:40.683] }, add = TRUE) [18:01:40.683] } [18:01:40.683] ...future.frame <- base::sys.nframe() [18:01:40.683] ...future.conditions <- base::list() [18:01:40.683] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.683] if (FALSE) { [18:01:40.683] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.683] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.683] } [18:01:40.683] ...future.result <- base::tryCatch({ [18:01:40.683] base::withCallingHandlers({ [18:01:40.683] ...future.value <- base::withVisible(base::local({ [18:01:40.683] ...future.makeSendCondition <- local({ [18:01:40.683] sendCondition <- NULL [18:01:40.683] function(frame = 1L) { [18:01:40.683] if (is.function(sendCondition)) [18:01:40.683] return(sendCondition) [18:01:40.683] ns <- getNamespace("parallel") [18:01:40.683] if (exists("sendData", mode = "function", [18:01:40.683] envir = ns)) { [18:01:40.683] parallel_sendData <- get("sendData", mode = "function", [18:01:40.683] envir = ns) [18:01:40.683] envir <- sys.frame(frame) [18:01:40.683] master <- NULL [18:01:40.683] while (!identical(envir, .GlobalEnv) && [18:01:40.683] !identical(envir, emptyenv())) { [18:01:40.683] if (exists("master", mode = "list", envir = envir, [18:01:40.683] inherits = FALSE)) { [18:01:40.683] master <- get("master", mode = "list", [18:01:40.683] envir = envir, inherits = FALSE) [18:01:40.683] if (inherits(master, c("SOCKnode", [18:01:40.683] "SOCK0node"))) { [18:01:40.683] sendCondition <<- function(cond) { [18:01:40.683] data <- list(type = "VALUE", value = cond, [18:01:40.683] success = TRUE) [18:01:40.683] parallel_sendData(master, data) [18:01:40.683] } [18:01:40.683] return(sendCondition) [18:01:40.683] } [18:01:40.683] } [18:01:40.683] frame <- frame + 1L [18:01:40.683] envir <- sys.frame(frame) [18:01:40.683] } [18:01:40.683] } [18:01:40.683] sendCondition <<- function(cond) NULL [18:01:40.683] } [18:01:40.683] }) [18:01:40.683] withCallingHandlers({ [18:01:40.683] 2 [18:01:40.683] }, immediateCondition = function(cond) { [18:01:40.683] sendCondition <- ...future.makeSendCondition() [18:01:40.683] sendCondition(cond) [18:01:40.683] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.683] { [18:01:40.683] inherits <- base::inherits [18:01:40.683] invokeRestart <- base::invokeRestart [18:01:40.683] is.null <- base::is.null [18:01:40.683] muffled <- FALSE [18:01:40.683] if (inherits(cond, "message")) { [18:01:40.683] muffled <- grepl(pattern, "muffleMessage") [18:01:40.683] if (muffled) [18:01:40.683] invokeRestart("muffleMessage") [18:01:40.683] } [18:01:40.683] else if (inherits(cond, "warning")) { [18:01:40.683] muffled <- grepl(pattern, "muffleWarning") [18:01:40.683] if (muffled) [18:01:40.683] invokeRestart("muffleWarning") [18:01:40.683] } [18:01:40.683] else if (inherits(cond, "condition")) { [18:01:40.683] if (!is.null(pattern)) { [18:01:40.683] computeRestarts <- base::computeRestarts [18:01:40.683] grepl <- base::grepl [18:01:40.683] restarts <- computeRestarts(cond) [18:01:40.683] for (restart in restarts) { [18:01:40.683] name <- restart$name [18:01:40.683] if (is.null(name)) [18:01:40.683] next [18:01:40.683] if (!grepl(pattern, name)) [18:01:40.683] next [18:01:40.683] invokeRestart(restart) [18:01:40.683] muffled <- TRUE [18:01:40.683] break [18:01:40.683] } [18:01:40.683] } [18:01:40.683] } [18:01:40.683] invisible(muffled) [18:01:40.683] } [18:01:40.683] muffleCondition(cond) [18:01:40.683] }) [18:01:40.683] })) [18:01:40.683] future::FutureResult(value = ...future.value$value, [18:01:40.683] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.683] ...future.rng), globalenv = if (FALSE) [18:01:40.683] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.683] ...future.globalenv.names)) [18:01:40.683] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.683] }, condition = base::local({ [18:01:40.683] c <- base::c [18:01:40.683] inherits <- base::inherits [18:01:40.683] invokeRestart <- base::invokeRestart [18:01:40.683] length <- base::length [18:01:40.683] list <- base::list [18:01:40.683] seq.int <- base::seq.int [18:01:40.683] signalCondition <- base::signalCondition [18:01:40.683] sys.calls <- base::sys.calls [18:01:40.683] `[[` <- base::`[[` [18:01:40.683] `+` <- base::`+` [18:01:40.683] `<<-` <- base::`<<-` [18:01:40.683] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.683] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.683] 3L)] [18:01:40.683] } [18:01:40.683] function(cond) { [18:01:40.683] is_error <- inherits(cond, "error") [18:01:40.683] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.683] NULL) [18:01:40.683] if (is_error) { [18:01:40.683] sessionInformation <- function() { [18:01:40.683] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.683] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.683] search = base::search(), system = base::Sys.info()) [18:01:40.683] } [18:01:40.683] ...future.conditions[[length(...future.conditions) + [18:01:40.683] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.683] cond$call), session = sessionInformation(), [18:01:40.683] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.683] signalCondition(cond) [18:01:40.683] } [18:01:40.683] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.683] "immediateCondition"))) { [18:01:40.683] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.683] ...future.conditions[[length(...future.conditions) + [18:01:40.683] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.683] if (TRUE && !signal) { [18:01:40.683] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.683] { [18:01:40.683] inherits <- base::inherits [18:01:40.683] invokeRestart <- base::invokeRestart [18:01:40.683] is.null <- base::is.null [18:01:40.683] muffled <- FALSE [18:01:40.683] if (inherits(cond, "message")) { [18:01:40.683] muffled <- grepl(pattern, "muffleMessage") [18:01:40.683] if (muffled) [18:01:40.683] invokeRestart("muffleMessage") [18:01:40.683] } [18:01:40.683] else if (inherits(cond, "warning")) { [18:01:40.683] muffled <- grepl(pattern, "muffleWarning") [18:01:40.683] if (muffled) [18:01:40.683] invokeRestart("muffleWarning") [18:01:40.683] } [18:01:40.683] else if (inherits(cond, "condition")) { [18:01:40.683] if (!is.null(pattern)) { [18:01:40.683] computeRestarts <- base::computeRestarts [18:01:40.683] grepl <- base::grepl [18:01:40.683] restarts <- computeRestarts(cond) [18:01:40.683] for (restart in restarts) { [18:01:40.683] name <- restart$name [18:01:40.683] if (is.null(name)) [18:01:40.683] next [18:01:40.683] if (!grepl(pattern, name)) [18:01:40.683] next [18:01:40.683] invokeRestart(restart) [18:01:40.683] muffled <- TRUE [18:01:40.683] break [18:01:40.683] } [18:01:40.683] } [18:01:40.683] } [18:01:40.683] invisible(muffled) [18:01:40.683] } [18:01:40.683] muffleCondition(cond, pattern = "^muffle") [18:01:40.683] } [18:01:40.683] } [18:01:40.683] else { [18:01:40.683] if (TRUE) { [18:01:40.683] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.683] { [18:01:40.683] inherits <- base::inherits [18:01:40.683] invokeRestart <- base::invokeRestart [18:01:40.683] is.null <- base::is.null [18:01:40.683] muffled <- FALSE [18:01:40.683] if (inherits(cond, "message")) { [18:01:40.683] muffled <- grepl(pattern, "muffleMessage") [18:01:40.683] if (muffled) [18:01:40.683] invokeRestart("muffleMessage") [18:01:40.683] } [18:01:40.683] else if (inherits(cond, "warning")) { [18:01:40.683] muffled <- grepl(pattern, "muffleWarning") [18:01:40.683] if (muffled) [18:01:40.683] invokeRestart("muffleWarning") [18:01:40.683] } [18:01:40.683] else if (inherits(cond, "condition")) { [18:01:40.683] if (!is.null(pattern)) { [18:01:40.683] computeRestarts <- base::computeRestarts [18:01:40.683] grepl <- base::grepl [18:01:40.683] restarts <- computeRestarts(cond) [18:01:40.683] for (restart in restarts) { [18:01:40.683] name <- restart$name [18:01:40.683] if (is.null(name)) [18:01:40.683] next [18:01:40.683] if (!grepl(pattern, name)) [18:01:40.683] next [18:01:40.683] invokeRestart(restart) [18:01:40.683] muffled <- TRUE [18:01:40.683] break [18:01:40.683] } [18:01:40.683] } [18:01:40.683] } [18:01:40.683] invisible(muffled) [18:01:40.683] } [18:01:40.683] muffleCondition(cond, pattern = "^muffle") [18:01:40.683] } [18:01:40.683] } [18:01:40.683] } [18:01:40.683] })) [18:01:40.683] }, error = function(ex) { [18:01:40.683] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.683] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.683] ...future.rng), started = ...future.startTime, [18:01:40.683] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.683] version = "1.8"), class = "FutureResult") [18:01:40.683] }, finally = { [18:01:40.683] if (!identical(...future.workdir, getwd())) [18:01:40.683] setwd(...future.workdir) [18:01:40.683] { [18:01:40.683] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.683] ...future.oldOptions$nwarnings <- NULL [18:01:40.683] } [18:01:40.683] base::options(...future.oldOptions) [18:01:40.683] if (.Platform$OS.type == "windows") { [18:01:40.683] old_names <- names(...future.oldEnvVars) [18:01:40.683] envs <- base::Sys.getenv() [18:01:40.683] names <- names(envs) [18:01:40.683] common <- intersect(names, old_names) [18:01:40.683] added <- setdiff(names, old_names) [18:01:40.683] removed <- setdiff(old_names, names) [18:01:40.683] changed <- common[...future.oldEnvVars[common] != [18:01:40.683] envs[common]] [18:01:40.683] NAMES <- toupper(changed) [18:01:40.683] args <- list() [18:01:40.683] for (kk in seq_along(NAMES)) { [18:01:40.683] name <- changed[[kk]] [18:01:40.683] NAME <- NAMES[[kk]] [18:01:40.683] if (name != NAME && is.element(NAME, old_names)) [18:01:40.683] next [18:01:40.683] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.683] } [18:01:40.683] NAMES <- toupper(added) [18:01:40.683] for (kk in seq_along(NAMES)) { [18:01:40.683] name <- added[[kk]] [18:01:40.683] NAME <- NAMES[[kk]] [18:01:40.683] if (name != NAME && is.element(NAME, old_names)) [18:01:40.683] next [18:01:40.683] args[[name]] <- "" [18:01:40.683] } [18:01:40.683] NAMES <- toupper(removed) [18:01:40.683] for (kk in seq_along(NAMES)) { [18:01:40.683] name <- removed[[kk]] [18:01:40.683] NAME <- NAMES[[kk]] [18:01:40.683] if (name != NAME && is.element(NAME, old_names)) [18:01:40.683] next [18:01:40.683] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.683] } [18:01:40.683] if (length(args) > 0) [18:01:40.683] base::do.call(base::Sys.setenv, args = args) [18:01:40.683] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.683] } [18:01:40.683] else { [18:01:40.683] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.683] } [18:01:40.683] { [18:01:40.683] if (base::length(...future.futureOptionsAdded) > [18:01:40.683] 0L) { [18:01:40.683] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.683] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.683] base::options(opts) [18:01:40.683] } [18:01:40.683] { [18:01:40.683] { [18:01:40.683] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.683] NULL [18:01:40.683] } [18:01:40.683] options(future.plan = NULL) [18:01:40.683] if (is.na(NA_character_)) [18:01:40.683] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.683] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.683] future::plan(list(function (..., workers = availableCores(), [18:01:40.683] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.683] envir = parent.frame()) [18:01:40.683] { [18:01:40.683] if (is.function(workers)) [18:01:40.683] workers <- workers() [18:01:40.683] workers <- structure(as.integer(workers), [18:01:40.683] class = class(workers)) [18:01:40.683] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.683] workers >= 1) [18:01:40.683] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.683] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.683] } [18:01:40.683] future <- MultisessionFuture(..., workers = workers, [18:01:40.683] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.683] envir = envir) [18:01:40.683] if (!future$lazy) [18:01:40.683] future <- run(future) [18:01:40.683] invisible(future) [18:01:40.683] }), .cleanup = FALSE, .init = FALSE) [18:01:40.683] } [18:01:40.683] } [18:01:40.683] } [18:01:40.683] }) [18:01:40.683] if (TRUE) { [18:01:40.683] base::sink(type = "output", split = FALSE) [18:01:40.683] if (TRUE) { [18:01:40.683] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.683] } [18:01:40.683] else { [18:01:40.683] ...future.result["stdout"] <- base::list(NULL) [18:01:40.683] } [18:01:40.683] base::close(...future.stdout) [18:01:40.683] ...future.stdout <- NULL [18:01:40.683] } [18:01:40.683] ...future.result$conditions <- ...future.conditions [18:01:40.683] ...future.result$finished <- base::Sys.time() [18:01:40.683] ...future.result [18:01:40.683] } [18:01:40.689] MultisessionFuture started [18:01:40.689] - Launch lazy future ... done [18:01:40.689] run() for 'MultisessionFuture' ... done [18:01:40.689] getGlobalsAndPackages() ... [18:01:40.690] Searching for globals... [18:01:40.690] [18:01:40.690] Searching for globals ... DONE [18:01:40.690] - globals: [0] [18:01:40.690] getGlobalsAndPackages() ... DONE [18:01:40.691] run() for 'Future' ... [18:01:40.691] - state: 'created' [18:01:40.691] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.705] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.705] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.705] - Field: 'node' [18:01:40.705] - Field: 'label' [18:01:40.706] - Field: 'local' [18:01:40.706] - Field: 'owner' [18:01:40.706] - Field: 'envir' [18:01:40.706] - Field: 'workers' [18:01:40.706] - Field: 'packages' [18:01:40.706] - Field: 'gc' [18:01:40.707] - Field: 'conditions' [18:01:40.707] - Field: 'persistent' [18:01:40.707] - Field: 'expr' [18:01:40.707] - Field: 'uuid' [18:01:40.707] - Field: 'seed' [18:01:40.708] - Field: 'version' [18:01:40.708] - Field: 'result' [18:01:40.708] - Field: 'asynchronous' [18:01:40.708] - Field: 'calls' [18:01:40.708] - Field: 'globals' [18:01:40.708] - Field: 'stdout' [18:01:40.709] - Field: 'earlySignal' [18:01:40.709] - Field: 'lazy' [18:01:40.709] - Field: 'state' [18:01:40.709] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.709] - Launch lazy future ... [18:01:40.710] Packages needed by the future expression (n = 0): [18:01:40.710] Packages needed by future strategies (n = 0): [18:01:40.711] { [18:01:40.711] { [18:01:40.711] { [18:01:40.711] ...future.startTime <- base::Sys.time() [18:01:40.711] { [18:01:40.711] { [18:01:40.711] { [18:01:40.711] { [18:01:40.711] base::local({ [18:01:40.711] has_future <- base::requireNamespace("future", [18:01:40.711] quietly = TRUE) [18:01:40.711] if (has_future) { [18:01:40.711] ns <- base::getNamespace("future") [18:01:40.711] version <- ns[[".package"]][["version"]] [18:01:40.711] if (is.null(version)) [18:01:40.711] version <- utils::packageVersion("future") [18:01:40.711] } [18:01:40.711] else { [18:01:40.711] version <- NULL [18:01:40.711] } [18:01:40.711] if (!has_future || version < "1.8.0") { [18:01:40.711] info <- base::c(r_version = base::gsub("R version ", [18:01:40.711] "", base::R.version$version.string), [18:01:40.711] platform = base::sprintf("%s (%s-bit)", [18:01:40.711] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.711] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.711] "release", "version")], collapse = " "), [18:01:40.711] hostname = base::Sys.info()[["nodename"]]) [18:01:40.711] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.711] info) [18:01:40.711] info <- base::paste(info, collapse = "; ") [18:01:40.711] if (!has_future) { [18:01:40.711] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.711] info) [18:01:40.711] } [18:01:40.711] else { [18:01:40.711] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.711] info, version) [18:01:40.711] } [18:01:40.711] base::stop(msg) [18:01:40.711] } [18:01:40.711] }) [18:01:40.711] } [18:01:40.711] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.711] base::options(mc.cores = 1L) [18:01:40.711] } [18:01:40.711] options(future.plan = NULL) [18:01:40.711] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.711] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.711] } [18:01:40.711] ...future.workdir <- getwd() [18:01:40.711] } [18:01:40.711] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.711] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.711] } [18:01:40.711] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.711] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.711] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.711] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.711] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.711] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.711] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.711] base::names(...future.oldOptions)) [18:01:40.711] } [18:01:40.711] if (FALSE) { [18:01:40.711] } [18:01:40.711] else { [18:01:40.711] if (TRUE) { [18:01:40.711] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.711] open = "w") [18:01:40.711] } [18:01:40.711] else { [18:01:40.711] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.711] windows = "NUL", "/dev/null"), open = "w") [18:01:40.711] } [18:01:40.711] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.711] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.711] base::sink(type = "output", split = FALSE) [18:01:40.711] base::close(...future.stdout) [18:01:40.711] }, add = TRUE) [18:01:40.711] } [18:01:40.711] ...future.frame <- base::sys.nframe() [18:01:40.711] ...future.conditions <- base::list() [18:01:40.711] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.711] if (FALSE) { [18:01:40.711] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.711] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.711] } [18:01:40.711] ...future.result <- base::tryCatch({ [18:01:40.711] base::withCallingHandlers({ [18:01:40.711] ...future.value <- base::withVisible(base::local({ [18:01:40.711] ...future.makeSendCondition <- local({ [18:01:40.711] sendCondition <- NULL [18:01:40.711] function(frame = 1L) { [18:01:40.711] if (is.function(sendCondition)) [18:01:40.711] return(sendCondition) [18:01:40.711] ns <- getNamespace("parallel") [18:01:40.711] if (exists("sendData", mode = "function", [18:01:40.711] envir = ns)) { [18:01:40.711] parallel_sendData <- get("sendData", mode = "function", [18:01:40.711] envir = ns) [18:01:40.711] envir <- sys.frame(frame) [18:01:40.711] master <- NULL [18:01:40.711] while (!identical(envir, .GlobalEnv) && [18:01:40.711] !identical(envir, emptyenv())) { [18:01:40.711] if (exists("master", mode = "list", envir = envir, [18:01:40.711] inherits = FALSE)) { [18:01:40.711] master <- get("master", mode = "list", [18:01:40.711] envir = envir, inherits = FALSE) [18:01:40.711] if (inherits(master, c("SOCKnode", [18:01:40.711] "SOCK0node"))) { [18:01:40.711] sendCondition <<- function(cond) { [18:01:40.711] data <- list(type = "VALUE", value = cond, [18:01:40.711] success = TRUE) [18:01:40.711] parallel_sendData(master, data) [18:01:40.711] } [18:01:40.711] return(sendCondition) [18:01:40.711] } [18:01:40.711] } [18:01:40.711] frame <- frame + 1L [18:01:40.711] envir <- sys.frame(frame) [18:01:40.711] } [18:01:40.711] } [18:01:40.711] sendCondition <<- function(cond) NULL [18:01:40.711] } [18:01:40.711] }) [18:01:40.711] withCallingHandlers({ [18:01:40.711] NULL [18:01:40.711] }, immediateCondition = function(cond) { [18:01:40.711] sendCondition <- ...future.makeSendCondition() [18:01:40.711] sendCondition(cond) [18:01:40.711] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.711] { [18:01:40.711] inherits <- base::inherits [18:01:40.711] invokeRestart <- base::invokeRestart [18:01:40.711] is.null <- base::is.null [18:01:40.711] muffled <- FALSE [18:01:40.711] if (inherits(cond, "message")) { [18:01:40.711] muffled <- grepl(pattern, "muffleMessage") [18:01:40.711] if (muffled) [18:01:40.711] invokeRestart("muffleMessage") [18:01:40.711] } [18:01:40.711] else if (inherits(cond, "warning")) { [18:01:40.711] muffled <- grepl(pattern, "muffleWarning") [18:01:40.711] if (muffled) [18:01:40.711] invokeRestart("muffleWarning") [18:01:40.711] } [18:01:40.711] else if (inherits(cond, "condition")) { [18:01:40.711] if (!is.null(pattern)) { [18:01:40.711] computeRestarts <- base::computeRestarts [18:01:40.711] grepl <- base::grepl [18:01:40.711] restarts <- computeRestarts(cond) [18:01:40.711] for (restart in restarts) { [18:01:40.711] name <- restart$name [18:01:40.711] if (is.null(name)) [18:01:40.711] next [18:01:40.711] if (!grepl(pattern, name)) [18:01:40.711] next [18:01:40.711] invokeRestart(restart) [18:01:40.711] muffled <- TRUE [18:01:40.711] break [18:01:40.711] } [18:01:40.711] } [18:01:40.711] } [18:01:40.711] invisible(muffled) [18:01:40.711] } [18:01:40.711] muffleCondition(cond) [18:01:40.711] }) [18:01:40.711] })) [18:01:40.711] future::FutureResult(value = ...future.value$value, [18:01:40.711] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.711] ...future.rng), globalenv = if (FALSE) [18:01:40.711] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.711] ...future.globalenv.names)) [18:01:40.711] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.711] }, condition = base::local({ [18:01:40.711] c <- base::c [18:01:40.711] inherits <- base::inherits [18:01:40.711] invokeRestart <- base::invokeRestart [18:01:40.711] length <- base::length [18:01:40.711] list <- base::list [18:01:40.711] seq.int <- base::seq.int [18:01:40.711] signalCondition <- base::signalCondition [18:01:40.711] sys.calls <- base::sys.calls [18:01:40.711] `[[` <- base::`[[` [18:01:40.711] `+` <- base::`+` [18:01:40.711] `<<-` <- base::`<<-` [18:01:40.711] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.711] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.711] 3L)] [18:01:40.711] } [18:01:40.711] function(cond) { [18:01:40.711] is_error <- inherits(cond, "error") [18:01:40.711] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.711] NULL) [18:01:40.711] if (is_error) { [18:01:40.711] sessionInformation <- function() { [18:01:40.711] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.711] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.711] search = base::search(), system = base::Sys.info()) [18:01:40.711] } [18:01:40.711] ...future.conditions[[length(...future.conditions) + [18:01:40.711] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.711] cond$call), session = sessionInformation(), [18:01:40.711] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.711] signalCondition(cond) [18:01:40.711] } [18:01:40.711] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.711] "immediateCondition"))) { [18:01:40.711] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.711] ...future.conditions[[length(...future.conditions) + [18:01:40.711] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.711] if (TRUE && !signal) { [18:01:40.711] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.711] { [18:01:40.711] inherits <- base::inherits [18:01:40.711] invokeRestart <- base::invokeRestart [18:01:40.711] is.null <- base::is.null [18:01:40.711] muffled <- FALSE [18:01:40.711] if (inherits(cond, "message")) { [18:01:40.711] muffled <- grepl(pattern, "muffleMessage") [18:01:40.711] if (muffled) [18:01:40.711] invokeRestart("muffleMessage") [18:01:40.711] } [18:01:40.711] else if (inherits(cond, "warning")) { [18:01:40.711] muffled <- grepl(pattern, "muffleWarning") [18:01:40.711] if (muffled) [18:01:40.711] invokeRestart("muffleWarning") [18:01:40.711] } [18:01:40.711] else if (inherits(cond, "condition")) { [18:01:40.711] if (!is.null(pattern)) { [18:01:40.711] computeRestarts <- base::computeRestarts [18:01:40.711] grepl <- base::grepl [18:01:40.711] restarts <- computeRestarts(cond) [18:01:40.711] for (restart in restarts) { [18:01:40.711] name <- restart$name [18:01:40.711] if (is.null(name)) [18:01:40.711] next [18:01:40.711] if (!grepl(pattern, name)) [18:01:40.711] next [18:01:40.711] invokeRestart(restart) [18:01:40.711] muffled <- TRUE [18:01:40.711] break [18:01:40.711] } [18:01:40.711] } [18:01:40.711] } [18:01:40.711] invisible(muffled) [18:01:40.711] } [18:01:40.711] muffleCondition(cond, pattern = "^muffle") [18:01:40.711] } [18:01:40.711] } [18:01:40.711] else { [18:01:40.711] if (TRUE) { [18:01:40.711] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.711] { [18:01:40.711] inherits <- base::inherits [18:01:40.711] invokeRestart <- base::invokeRestart [18:01:40.711] is.null <- base::is.null [18:01:40.711] muffled <- FALSE [18:01:40.711] if (inherits(cond, "message")) { [18:01:40.711] muffled <- grepl(pattern, "muffleMessage") [18:01:40.711] if (muffled) [18:01:40.711] invokeRestart("muffleMessage") [18:01:40.711] } [18:01:40.711] else if (inherits(cond, "warning")) { [18:01:40.711] muffled <- grepl(pattern, "muffleWarning") [18:01:40.711] if (muffled) [18:01:40.711] invokeRestart("muffleWarning") [18:01:40.711] } [18:01:40.711] else if (inherits(cond, "condition")) { [18:01:40.711] if (!is.null(pattern)) { [18:01:40.711] computeRestarts <- base::computeRestarts [18:01:40.711] grepl <- base::grepl [18:01:40.711] restarts <- computeRestarts(cond) [18:01:40.711] for (restart in restarts) { [18:01:40.711] name <- restart$name [18:01:40.711] if (is.null(name)) [18:01:40.711] next [18:01:40.711] if (!grepl(pattern, name)) [18:01:40.711] next [18:01:40.711] invokeRestart(restart) [18:01:40.711] muffled <- TRUE [18:01:40.711] break [18:01:40.711] } [18:01:40.711] } [18:01:40.711] } [18:01:40.711] invisible(muffled) [18:01:40.711] } [18:01:40.711] muffleCondition(cond, pattern = "^muffle") [18:01:40.711] } [18:01:40.711] } [18:01:40.711] } [18:01:40.711] })) [18:01:40.711] }, error = function(ex) { [18:01:40.711] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.711] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.711] ...future.rng), started = ...future.startTime, [18:01:40.711] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.711] version = "1.8"), class = "FutureResult") [18:01:40.711] }, finally = { [18:01:40.711] if (!identical(...future.workdir, getwd())) [18:01:40.711] setwd(...future.workdir) [18:01:40.711] { [18:01:40.711] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.711] ...future.oldOptions$nwarnings <- NULL [18:01:40.711] } [18:01:40.711] base::options(...future.oldOptions) [18:01:40.711] if (.Platform$OS.type == "windows") { [18:01:40.711] old_names <- names(...future.oldEnvVars) [18:01:40.711] envs <- base::Sys.getenv() [18:01:40.711] names <- names(envs) [18:01:40.711] common <- intersect(names, old_names) [18:01:40.711] added <- setdiff(names, old_names) [18:01:40.711] removed <- setdiff(old_names, names) [18:01:40.711] changed <- common[...future.oldEnvVars[common] != [18:01:40.711] envs[common]] [18:01:40.711] NAMES <- toupper(changed) [18:01:40.711] args <- list() [18:01:40.711] for (kk in seq_along(NAMES)) { [18:01:40.711] name <- changed[[kk]] [18:01:40.711] NAME <- NAMES[[kk]] [18:01:40.711] if (name != NAME && is.element(NAME, old_names)) [18:01:40.711] next [18:01:40.711] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.711] } [18:01:40.711] NAMES <- toupper(added) [18:01:40.711] for (kk in seq_along(NAMES)) { [18:01:40.711] name <- added[[kk]] [18:01:40.711] NAME <- NAMES[[kk]] [18:01:40.711] if (name != NAME && is.element(NAME, old_names)) [18:01:40.711] next [18:01:40.711] args[[name]] <- "" [18:01:40.711] } [18:01:40.711] NAMES <- toupper(removed) [18:01:40.711] for (kk in seq_along(NAMES)) { [18:01:40.711] name <- removed[[kk]] [18:01:40.711] NAME <- NAMES[[kk]] [18:01:40.711] if (name != NAME && is.element(NAME, old_names)) [18:01:40.711] next [18:01:40.711] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.711] } [18:01:40.711] if (length(args) > 0) [18:01:40.711] base::do.call(base::Sys.setenv, args = args) [18:01:40.711] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.711] } [18:01:40.711] else { [18:01:40.711] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.711] } [18:01:40.711] { [18:01:40.711] if (base::length(...future.futureOptionsAdded) > [18:01:40.711] 0L) { [18:01:40.711] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.711] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.711] base::options(opts) [18:01:40.711] } [18:01:40.711] { [18:01:40.711] { [18:01:40.711] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.711] NULL [18:01:40.711] } [18:01:40.711] options(future.plan = NULL) [18:01:40.711] if (is.na(NA_character_)) [18:01:40.711] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.711] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.711] future::plan(list(function (..., workers = availableCores(), [18:01:40.711] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.711] envir = parent.frame()) [18:01:40.711] { [18:01:40.711] if (is.function(workers)) [18:01:40.711] workers <- workers() [18:01:40.711] workers <- structure(as.integer(workers), [18:01:40.711] class = class(workers)) [18:01:40.711] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.711] workers >= 1) [18:01:40.711] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.711] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.711] } [18:01:40.711] future <- MultisessionFuture(..., workers = workers, [18:01:40.711] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.711] envir = envir) [18:01:40.711] if (!future$lazy) [18:01:40.711] future <- run(future) [18:01:40.711] invisible(future) [18:01:40.711] }), .cleanup = FALSE, .init = FALSE) [18:01:40.711] } [18:01:40.711] } [18:01:40.711] } [18:01:40.711] }) [18:01:40.711] if (TRUE) { [18:01:40.711] base::sink(type = "output", split = FALSE) [18:01:40.711] if (TRUE) { [18:01:40.711] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.711] } [18:01:40.711] else { [18:01:40.711] ...future.result["stdout"] <- base::list(NULL) [18:01:40.711] } [18:01:40.711] base::close(...future.stdout) [18:01:40.711] ...future.stdout <- NULL [18:01:40.711] } [18:01:40.711] ...future.result$conditions <- ...future.conditions [18:01:40.711] ...future.result$finished <- base::Sys.time() [18:01:40.711] ...future.result [18:01:40.711] } [18:01:40.716] MultisessionFuture started [18:01:40.716] - Launch lazy future ... done [18:01:40.717] 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" [18:01:40.725] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.725] - Validating connection of MultisessionFuture [18:01:40.725] - received message: FutureResult [18:01:40.726] - Received FutureResult [18:01:40.726] - Erased future from FutureRegistry [18:01:40.726] result() for ClusterFuture ... [18:01:40.726] - result already collected: FutureResult [18:01:40.726] result() for ClusterFuture ... done [18:01:40.726] receiveMessageFromWorker() for ClusterFuture ... done [18:01:40.732] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.732] - Validating connection of MultisessionFuture [18:01:40.732] - received message: FutureResult [18:01:40.733] - Received FutureResult [18:01:40.733] - Erased future from FutureRegistry [18:01:40.733] result() for ClusterFuture ... [18:01:40.733] - result already collected: FutureResult [18:01:40.733] result() for ClusterFuture ... done [18:01:40.733] 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" "" ... [18:01:40.735] resolve() on list ... [18:01:40.735] recursive: 0 [18:01:40.736] length: 6 [18:01:40.736] elements: 'a', 'b', 'c', '', '', '' [18:01:40.736] signalConditionsASAP(numeric, pos=1) ... [18:01:40.736] - nx: 6 [18:01:40.736] - relay: TRUE [18:01:40.736] - stdout: TRUE [18:01:40.737] - signal: TRUE [18:01:40.737] - resignal: FALSE [18:01:40.737] - force: TRUE [18:01:40.737] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.737] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.737] - until=2 [18:01:40.738] - relaying element #2 [18:01:40.738] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.738] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.738] signalConditionsASAP(NULL, pos=1) ... done [18:01:40.738] length: 5 (resolved future 1) [18:01:40.738] Future #2 [18:01:40.739] result() for ClusterFuture ... [18:01:40.739] - result already collected: FutureResult [18:01:40.739] result() for ClusterFuture ... done [18:01:40.739] result() for ClusterFuture ... [18:01:40.739] - result already collected: FutureResult [18:01:40.739] result() for ClusterFuture ... done [18:01:40.739] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:40.740] - nx: 6 [18:01:40.740] - relay: TRUE [18:01:40.740] - stdout: TRUE [18:01:40.740] - signal: TRUE [18:01:40.740] - resignal: FALSE [18:01:40.740] - force: TRUE [18:01:40.741] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.741] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.741] - until=2 [18:01:40.741] - relaying element #2 [18:01:40.741] result() for ClusterFuture ... [18:01:40.741] - result already collected: FutureResult [18:01:40.741] result() for ClusterFuture ... done [18:01:40.742] result() for ClusterFuture ... [18:01:40.742] - result already collected: FutureResult [18:01:40.742] result() for ClusterFuture ... done [18:01:40.742] result() for ClusterFuture ... [18:01:40.742] - result already collected: FutureResult [18:01:40.742] result() for ClusterFuture ... done [18:01:40.743] result() for ClusterFuture ... [18:01:40.743] - result already collected: FutureResult [18:01:40.743] result() for ClusterFuture ... done [18:01:40.743] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.743] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.743] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:40.744] length: 4 (resolved future 2) [18:01:40.744] Future #3 [18:01:40.744] result() for ClusterFuture ... [18:01:40.744] - result already collected: FutureResult [18:01:40.744] result() for ClusterFuture ... done [18:01:40.744] result() for ClusterFuture ... [18:01:40.745] - result already collected: FutureResult [18:01:40.745] result() for ClusterFuture ... done [18:01:40.745] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:40.745] - nx: 6 [18:01:40.745] - relay: TRUE [18:01:40.745] - stdout: TRUE [18:01:40.746] - signal: TRUE [18:01:40.746] - resignal: FALSE [18:01:40.746] - force: TRUE [18:01:40.746] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.746] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.746] - until=3 [18:01:40.746] - relaying element #3 [18:01:40.747] result() for ClusterFuture ... [18:01:40.747] - result already collected: FutureResult [18:01:40.747] result() for ClusterFuture ... done [18:01:40.747] result() for ClusterFuture ... [18:01:40.747] - result already collected: FutureResult [18:01:40.747] result() for ClusterFuture ... done [18:01:40.748] result() for ClusterFuture ... [18:01:40.748] - result already collected: FutureResult [18:01:40.748] result() for ClusterFuture ... done [18:01:40.748] result() for ClusterFuture ... [18:01:40.748] - result already collected: FutureResult [18:01:40.748] result() for ClusterFuture ... done [18:01:40.749] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.749] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.749] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:40.749] length: 3 (resolved future 3) [18:01:40.749] signalConditionsASAP(NULL, pos=4) ... [18:01:40.749] - nx: 6 [18:01:40.750] - relay: TRUE [18:01:40.750] - stdout: TRUE [18:01:40.750] - signal: TRUE [18:01:40.750] - resignal: FALSE [18:01:40.750] - force: TRUE [18:01:40.750] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.750] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.751] - until=5 [18:01:40.751] - relaying element #5 [18:01:40.751] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.751] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.751] signalConditionsASAP(NULL, pos=4) ... done [18:01:40.751] length: 2 (resolved future 4) [18:01:40.752] signalConditionsASAP(NULL, pos=5) ... [18:01:40.752] - nx: 6 [18:01:40.752] - relay: TRUE [18:01:40.752] - stdout: TRUE [18:01:40.752] - signal: TRUE [18:01:40.752] - resignal: FALSE [18:01:40.752] - force: TRUE [18:01:40.753] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.753] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.753] - until=6 [18:01:40.753] - relaying element #6 [18:01:40.753] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.753] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.754] signalConditionsASAP(NULL, pos=5) ... done [18:01:40.754] length: 1 (resolved future 5) [18:01:40.754] signalConditionsASAP(numeric, pos=6) ... [18:01:40.754] - nx: 6 [18:01:40.754] - relay: TRUE [18:01:40.754] - stdout: TRUE [18:01:40.755] - signal: TRUE [18:01:40.755] - resignal: FALSE [18:01:40.755] - force: TRUE [18:01:40.755] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.755] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.755] - until=6 [18:01:40.755] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.756] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.756] signalConditionsASAP(numeric, pos=6) ... done [18:01:40.756] length: 0 (resolved future 6) [18:01:40.756] Relaying remaining futures [18:01:40.756] signalConditionsASAP(NULL, pos=0) ... [18:01:40.756] - nx: 6 [18:01:40.757] - relay: TRUE [18:01:40.757] - stdout: TRUE [18:01:40.757] - signal: TRUE [18:01:40.757] - resignal: FALSE [18:01:40.757] - force: TRUE [18:01:40.757] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.757] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:40.758] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.758] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.758] signalConditionsASAP(NULL, pos=0) ... done [18:01:40.758] resolve() on list ... DONE [18:01:40.758] result() for ClusterFuture ... [18:01:40.759] - result already collected: FutureResult [18:01:40.759] result() for ClusterFuture ... done [18:01:40.759] result() for ClusterFuture ... [18:01:40.759] - result already collected: FutureResult [18:01:40.759] result() for ClusterFuture ... done [18:01:40.759] result() for ClusterFuture ... [18:01:40.760] - result already collected: FutureResult [18:01:40.760] result() for ClusterFuture ... done [18:01:40.760] result() for ClusterFuture ... [18:01:40.760] - result already collected: FutureResult [18:01:40.760] 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) [18:01:40.764] getGlobalsAndPackages() ... [18:01:40.764] Searching for globals... [18:01:40.765] [18:01:40.765] Searching for globals ... DONE [18:01:40.765] - globals: [0] [18:01:40.765] getGlobalsAndPackages() ... DONE [18:01:40.765] run() for 'Future' ... [18:01:40.766] - state: 'created' [18:01:40.766] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.779] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.780] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.780] - Field: 'node' [18:01:40.780] - Field: 'label' [18:01:40.780] - Field: 'local' [18:01:40.780] - Field: 'owner' [18:01:40.781] - Field: 'envir' [18:01:40.781] - Field: 'workers' [18:01:40.781] - Field: 'packages' [18:01:40.781] - Field: 'gc' [18:01:40.781] - Field: 'conditions' [18:01:40.781] - Field: 'persistent' [18:01:40.782] - Field: 'expr' [18:01:40.782] - Field: 'uuid' [18:01:40.782] - Field: 'seed' [18:01:40.782] - Field: 'version' [18:01:40.782] - Field: 'result' [18:01:40.783] - Field: 'asynchronous' [18:01:40.783] - Field: 'calls' [18:01:40.783] - Field: 'globals' [18:01:40.783] - Field: 'stdout' [18:01:40.783] - Field: 'earlySignal' [18:01:40.783] - Field: 'lazy' [18:01:40.784] - Field: 'state' [18:01:40.784] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.784] - Launch lazy future ... [18:01:40.784] Packages needed by the future expression (n = 0): [18:01:40.784] Packages needed by future strategies (n = 0): [18:01:40.785] { [18:01:40.785] { [18:01:40.785] { [18:01:40.785] ...future.startTime <- base::Sys.time() [18:01:40.785] { [18:01:40.785] { [18:01:40.785] { [18:01:40.785] { [18:01:40.785] base::local({ [18:01:40.785] has_future <- base::requireNamespace("future", [18:01:40.785] quietly = TRUE) [18:01:40.785] if (has_future) { [18:01:40.785] ns <- base::getNamespace("future") [18:01:40.785] version <- ns[[".package"]][["version"]] [18:01:40.785] if (is.null(version)) [18:01:40.785] version <- utils::packageVersion("future") [18:01:40.785] } [18:01:40.785] else { [18:01:40.785] version <- NULL [18:01:40.785] } [18:01:40.785] if (!has_future || version < "1.8.0") { [18:01:40.785] info <- base::c(r_version = base::gsub("R version ", [18:01:40.785] "", base::R.version$version.string), [18:01:40.785] platform = base::sprintf("%s (%s-bit)", [18:01:40.785] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.785] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.785] "release", "version")], collapse = " "), [18:01:40.785] hostname = base::Sys.info()[["nodename"]]) [18:01:40.785] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.785] info) [18:01:40.785] info <- base::paste(info, collapse = "; ") [18:01:40.785] if (!has_future) { [18:01:40.785] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.785] info) [18:01:40.785] } [18:01:40.785] else { [18:01:40.785] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.785] info, version) [18:01:40.785] } [18:01:40.785] base::stop(msg) [18:01:40.785] } [18:01:40.785] }) [18:01:40.785] } [18:01:40.785] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.785] base::options(mc.cores = 1L) [18:01:40.785] } [18:01:40.785] options(future.plan = NULL) [18:01:40.785] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.785] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.785] } [18:01:40.785] ...future.workdir <- getwd() [18:01:40.785] } [18:01:40.785] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.785] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.785] } [18:01:40.785] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.785] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.785] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.785] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.785] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.785] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.785] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.785] base::names(...future.oldOptions)) [18:01:40.785] } [18:01:40.785] if (FALSE) { [18:01:40.785] } [18:01:40.785] else { [18:01:40.785] if (TRUE) { [18:01:40.785] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.785] open = "w") [18:01:40.785] } [18:01:40.785] else { [18:01:40.785] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.785] windows = "NUL", "/dev/null"), open = "w") [18:01:40.785] } [18:01:40.785] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.785] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.785] base::sink(type = "output", split = FALSE) [18:01:40.785] base::close(...future.stdout) [18:01:40.785] }, add = TRUE) [18:01:40.785] } [18:01:40.785] ...future.frame <- base::sys.nframe() [18:01:40.785] ...future.conditions <- base::list() [18:01:40.785] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.785] if (FALSE) { [18:01:40.785] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.785] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.785] } [18:01:40.785] ...future.result <- base::tryCatch({ [18:01:40.785] base::withCallingHandlers({ [18:01:40.785] ...future.value <- base::withVisible(base::local({ [18:01:40.785] ...future.makeSendCondition <- local({ [18:01:40.785] sendCondition <- NULL [18:01:40.785] function(frame = 1L) { [18:01:40.785] if (is.function(sendCondition)) [18:01:40.785] return(sendCondition) [18:01:40.785] ns <- getNamespace("parallel") [18:01:40.785] if (exists("sendData", mode = "function", [18:01:40.785] envir = ns)) { [18:01:40.785] parallel_sendData <- get("sendData", mode = "function", [18:01:40.785] envir = ns) [18:01:40.785] envir <- sys.frame(frame) [18:01:40.785] master <- NULL [18:01:40.785] while (!identical(envir, .GlobalEnv) && [18:01:40.785] !identical(envir, emptyenv())) { [18:01:40.785] if (exists("master", mode = "list", envir = envir, [18:01:40.785] inherits = FALSE)) { [18:01:40.785] master <- get("master", mode = "list", [18:01:40.785] envir = envir, inherits = FALSE) [18:01:40.785] if (inherits(master, c("SOCKnode", [18:01:40.785] "SOCK0node"))) { [18:01:40.785] sendCondition <<- function(cond) { [18:01:40.785] data <- list(type = "VALUE", value = cond, [18:01:40.785] success = TRUE) [18:01:40.785] parallel_sendData(master, data) [18:01:40.785] } [18:01:40.785] return(sendCondition) [18:01:40.785] } [18:01:40.785] } [18:01:40.785] frame <- frame + 1L [18:01:40.785] envir <- sys.frame(frame) [18:01:40.785] } [18:01:40.785] } [18:01:40.785] sendCondition <<- function(cond) NULL [18:01:40.785] } [18:01:40.785] }) [18:01:40.785] withCallingHandlers({ [18:01:40.785] 2 [18:01:40.785] }, immediateCondition = function(cond) { [18:01:40.785] sendCondition <- ...future.makeSendCondition() [18:01:40.785] sendCondition(cond) [18:01:40.785] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.785] { [18:01:40.785] inherits <- base::inherits [18:01:40.785] invokeRestart <- base::invokeRestart [18:01:40.785] is.null <- base::is.null [18:01:40.785] muffled <- FALSE [18:01:40.785] if (inherits(cond, "message")) { [18:01:40.785] muffled <- grepl(pattern, "muffleMessage") [18:01:40.785] if (muffled) [18:01:40.785] invokeRestart("muffleMessage") [18:01:40.785] } [18:01:40.785] else if (inherits(cond, "warning")) { [18:01:40.785] muffled <- grepl(pattern, "muffleWarning") [18:01:40.785] if (muffled) [18:01:40.785] invokeRestart("muffleWarning") [18:01:40.785] } [18:01:40.785] else if (inherits(cond, "condition")) { [18:01:40.785] if (!is.null(pattern)) { [18:01:40.785] computeRestarts <- base::computeRestarts [18:01:40.785] grepl <- base::grepl [18:01:40.785] restarts <- computeRestarts(cond) [18:01:40.785] for (restart in restarts) { [18:01:40.785] name <- restart$name [18:01:40.785] if (is.null(name)) [18:01:40.785] next [18:01:40.785] if (!grepl(pattern, name)) [18:01:40.785] next [18:01:40.785] invokeRestart(restart) [18:01:40.785] muffled <- TRUE [18:01:40.785] break [18:01:40.785] } [18:01:40.785] } [18:01:40.785] } [18:01:40.785] invisible(muffled) [18:01:40.785] } [18:01:40.785] muffleCondition(cond) [18:01:40.785] }) [18:01:40.785] })) [18:01:40.785] future::FutureResult(value = ...future.value$value, [18:01:40.785] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.785] ...future.rng), globalenv = if (FALSE) [18:01:40.785] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.785] ...future.globalenv.names)) [18:01:40.785] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.785] }, condition = base::local({ [18:01:40.785] c <- base::c [18:01:40.785] inherits <- base::inherits [18:01:40.785] invokeRestart <- base::invokeRestart [18:01:40.785] length <- base::length [18:01:40.785] list <- base::list [18:01:40.785] seq.int <- base::seq.int [18:01:40.785] signalCondition <- base::signalCondition [18:01:40.785] sys.calls <- base::sys.calls [18:01:40.785] `[[` <- base::`[[` [18:01:40.785] `+` <- base::`+` [18:01:40.785] `<<-` <- base::`<<-` [18:01:40.785] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.785] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.785] 3L)] [18:01:40.785] } [18:01:40.785] function(cond) { [18:01:40.785] is_error <- inherits(cond, "error") [18:01:40.785] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.785] NULL) [18:01:40.785] if (is_error) { [18:01:40.785] sessionInformation <- function() { [18:01:40.785] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.785] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.785] search = base::search(), system = base::Sys.info()) [18:01:40.785] } [18:01:40.785] ...future.conditions[[length(...future.conditions) + [18:01:40.785] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.785] cond$call), session = sessionInformation(), [18:01:40.785] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.785] signalCondition(cond) [18:01:40.785] } [18:01:40.785] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.785] "immediateCondition"))) { [18:01:40.785] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.785] ...future.conditions[[length(...future.conditions) + [18:01:40.785] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.785] if (TRUE && !signal) { [18:01:40.785] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.785] { [18:01:40.785] inherits <- base::inherits [18:01:40.785] invokeRestart <- base::invokeRestart [18:01:40.785] is.null <- base::is.null [18:01:40.785] muffled <- FALSE [18:01:40.785] if (inherits(cond, "message")) { [18:01:40.785] muffled <- grepl(pattern, "muffleMessage") [18:01:40.785] if (muffled) [18:01:40.785] invokeRestart("muffleMessage") [18:01:40.785] } [18:01:40.785] else if (inherits(cond, "warning")) { [18:01:40.785] muffled <- grepl(pattern, "muffleWarning") [18:01:40.785] if (muffled) [18:01:40.785] invokeRestart("muffleWarning") [18:01:40.785] } [18:01:40.785] else if (inherits(cond, "condition")) { [18:01:40.785] if (!is.null(pattern)) { [18:01:40.785] computeRestarts <- base::computeRestarts [18:01:40.785] grepl <- base::grepl [18:01:40.785] restarts <- computeRestarts(cond) [18:01:40.785] for (restart in restarts) { [18:01:40.785] name <- restart$name [18:01:40.785] if (is.null(name)) [18:01:40.785] next [18:01:40.785] if (!grepl(pattern, name)) [18:01:40.785] next [18:01:40.785] invokeRestart(restart) [18:01:40.785] muffled <- TRUE [18:01:40.785] break [18:01:40.785] } [18:01:40.785] } [18:01:40.785] } [18:01:40.785] invisible(muffled) [18:01:40.785] } [18:01:40.785] muffleCondition(cond, pattern = "^muffle") [18:01:40.785] } [18:01:40.785] } [18:01:40.785] else { [18:01:40.785] if (TRUE) { [18:01:40.785] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.785] { [18:01:40.785] inherits <- base::inherits [18:01:40.785] invokeRestart <- base::invokeRestart [18:01:40.785] is.null <- base::is.null [18:01:40.785] muffled <- FALSE [18:01:40.785] if (inherits(cond, "message")) { [18:01:40.785] muffled <- grepl(pattern, "muffleMessage") [18:01:40.785] if (muffled) [18:01:40.785] invokeRestart("muffleMessage") [18:01:40.785] } [18:01:40.785] else if (inherits(cond, "warning")) { [18:01:40.785] muffled <- grepl(pattern, "muffleWarning") [18:01:40.785] if (muffled) [18:01:40.785] invokeRestart("muffleWarning") [18:01:40.785] } [18:01:40.785] else if (inherits(cond, "condition")) { [18:01:40.785] if (!is.null(pattern)) { [18:01:40.785] computeRestarts <- base::computeRestarts [18:01:40.785] grepl <- base::grepl [18:01:40.785] restarts <- computeRestarts(cond) [18:01:40.785] for (restart in restarts) { [18:01:40.785] name <- restart$name [18:01:40.785] if (is.null(name)) [18:01:40.785] next [18:01:40.785] if (!grepl(pattern, name)) [18:01:40.785] next [18:01:40.785] invokeRestart(restart) [18:01:40.785] muffled <- TRUE [18:01:40.785] break [18:01:40.785] } [18:01:40.785] } [18:01:40.785] } [18:01:40.785] invisible(muffled) [18:01:40.785] } [18:01:40.785] muffleCondition(cond, pattern = "^muffle") [18:01:40.785] } [18:01:40.785] } [18:01:40.785] } [18:01:40.785] })) [18:01:40.785] }, error = function(ex) { [18:01:40.785] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.785] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.785] ...future.rng), started = ...future.startTime, [18:01:40.785] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.785] version = "1.8"), class = "FutureResult") [18:01:40.785] }, finally = { [18:01:40.785] if (!identical(...future.workdir, getwd())) [18:01:40.785] setwd(...future.workdir) [18:01:40.785] { [18:01:40.785] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.785] ...future.oldOptions$nwarnings <- NULL [18:01:40.785] } [18:01:40.785] base::options(...future.oldOptions) [18:01:40.785] if (.Platform$OS.type == "windows") { [18:01:40.785] old_names <- names(...future.oldEnvVars) [18:01:40.785] envs <- base::Sys.getenv() [18:01:40.785] names <- names(envs) [18:01:40.785] common <- intersect(names, old_names) [18:01:40.785] added <- setdiff(names, old_names) [18:01:40.785] removed <- setdiff(old_names, names) [18:01:40.785] changed <- common[...future.oldEnvVars[common] != [18:01:40.785] envs[common]] [18:01:40.785] NAMES <- toupper(changed) [18:01:40.785] args <- list() [18:01:40.785] for (kk in seq_along(NAMES)) { [18:01:40.785] name <- changed[[kk]] [18:01:40.785] NAME <- NAMES[[kk]] [18:01:40.785] if (name != NAME && is.element(NAME, old_names)) [18:01:40.785] next [18:01:40.785] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.785] } [18:01:40.785] NAMES <- toupper(added) [18:01:40.785] for (kk in seq_along(NAMES)) { [18:01:40.785] name <- added[[kk]] [18:01:40.785] NAME <- NAMES[[kk]] [18:01:40.785] if (name != NAME && is.element(NAME, old_names)) [18:01:40.785] next [18:01:40.785] args[[name]] <- "" [18:01:40.785] } [18:01:40.785] NAMES <- toupper(removed) [18:01:40.785] for (kk in seq_along(NAMES)) { [18:01:40.785] name <- removed[[kk]] [18:01:40.785] NAME <- NAMES[[kk]] [18:01:40.785] if (name != NAME && is.element(NAME, old_names)) [18:01:40.785] next [18:01:40.785] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.785] } [18:01:40.785] if (length(args) > 0) [18:01:40.785] base::do.call(base::Sys.setenv, args = args) [18:01:40.785] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.785] } [18:01:40.785] else { [18:01:40.785] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.785] } [18:01:40.785] { [18:01:40.785] if (base::length(...future.futureOptionsAdded) > [18:01:40.785] 0L) { [18:01:40.785] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.785] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.785] base::options(opts) [18:01:40.785] } [18:01:40.785] { [18:01:40.785] { [18:01:40.785] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.785] NULL [18:01:40.785] } [18:01:40.785] options(future.plan = NULL) [18:01:40.785] if (is.na(NA_character_)) [18:01:40.785] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.785] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.785] future::plan(list(function (..., workers = availableCores(), [18:01:40.785] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.785] envir = parent.frame()) [18:01:40.785] { [18:01:40.785] if (is.function(workers)) [18:01:40.785] workers <- workers() [18:01:40.785] workers <- structure(as.integer(workers), [18:01:40.785] class = class(workers)) [18:01:40.785] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.785] workers >= 1) [18:01:40.785] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.785] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.785] } [18:01:40.785] future <- MultisessionFuture(..., workers = workers, [18:01:40.785] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.785] envir = envir) [18:01:40.785] if (!future$lazy) [18:01:40.785] future <- run(future) [18:01:40.785] invisible(future) [18:01:40.785] }), .cleanup = FALSE, .init = FALSE) [18:01:40.785] } [18:01:40.785] } [18:01:40.785] } [18:01:40.785] }) [18:01:40.785] if (TRUE) { [18:01:40.785] base::sink(type = "output", split = FALSE) [18:01:40.785] if (TRUE) { [18:01:40.785] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.785] } [18:01:40.785] else { [18:01:40.785] ...future.result["stdout"] <- base::list(NULL) [18:01:40.785] } [18:01:40.785] base::close(...future.stdout) [18:01:40.785] ...future.stdout <- NULL [18:01:40.785] } [18:01:40.785] ...future.result$conditions <- ...future.conditions [18:01:40.785] ...future.result$finished <- base::Sys.time() [18:01:40.785] ...future.result [18:01:40.785] } [18:01:40.791] MultisessionFuture started [18:01:40.791] - Launch lazy future ... done [18:01:40.791] run() for 'MultisessionFuture' ... done [18:01:40.791] getGlobalsAndPackages() ... [18:01:40.792] Searching for globals... [18:01:40.792] [18:01:40.792] Searching for globals ... DONE [18:01:40.792] - globals: [0] [18:01:40.792] getGlobalsAndPackages() ... DONE [18:01:40.793] run() for 'Future' ... [18:01:40.793] - state: 'created' [18:01:40.793] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.806] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.807] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.807] - Field: 'node' [18:01:40.807] - Field: 'label' [18:01:40.807] - Field: 'local' [18:01:40.807] - Field: 'owner' [18:01:40.808] - Field: 'envir' [18:01:40.808] - Field: 'workers' [18:01:40.808] - Field: 'packages' [18:01:40.808] - Field: 'gc' [18:01:40.808] - Field: 'conditions' [18:01:40.808] - Field: 'persistent' [18:01:40.809] - Field: 'expr' [18:01:40.809] - Field: 'uuid' [18:01:40.809] - Field: 'seed' [18:01:40.809] - Field: 'version' [18:01:40.809] - Field: 'result' [18:01:40.810] - Field: 'asynchronous' [18:01:40.810] - Field: 'calls' [18:01:40.810] - Field: 'globals' [18:01:40.810] - Field: 'stdout' [18:01:40.810] - Field: 'earlySignal' [18:01:40.810] - Field: 'lazy' [18:01:40.811] - Field: 'state' [18:01:40.811] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.811] - Launch lazy future ... [18:01:40.811] Packages needed by the future expression (n = 0): [18:01:40.811] Packages needed by future strategies (n = 0): [18:01:40.812] { [18:01:40.812] { [18:01:40.812] { [18:01:40.812] ...future.startTime <- base::Sys.time() [18:01:40.812] { [18:01:40.812] { [18:01:40.812] { [18:01:40.812] { [18:01:40.812] base::local({ [18:01:40.812] has_future <- base::requireNamespace("future", [18:01:40.812] quietly = TRUE) [18:01:40.812] if (has_future) { [18:01:40.812] ns <- base::getNamespace("future") [18:01:40.812] version <- ns[[".package"]][["version"]] [18:01:40.812] if (is.null(version)) [18:01:40.812] version <- utils::packageVersion("future") [18:01:40.812] } [18:01:40.812] else { [18:01:40.812] version <- NULL [18:01:40.812] } [18:01:40.812] if (!has_future || version < "1.8.0") { [18:01:40.812] info <- base::c(r_version = base::gsub("R version ", [18:01:40.812] "", base::R.version$version.string), [18:01:40.812] platform = base::sprintf("%s (%s-bit)", [18:01:40.812] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.812] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.812] "release", "version")], collapse = " "), [18:01:40.812] hostname = base::Sys.info()[["nodename"]]) [18:01:40.812] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.812] info) [18:01:40.812] info <- base::paste(info, collapse = "; ") [18:01:40.812] if (!has_future) { [18:01:40.812] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.812] info) [18:01:40.812] } [18:01:40.812] else { [18:01:40.812] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.812] info, version) [18:01:40.812] } [18:01:40.812] base::stop(msg) [18:01:40.812] } [18:01:40.812] }) [18:01:40.812] } [18:01:40.812] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.812] base::options(mc.cores = 1L) [18:01:40.812] } [18:01:40.812] options(future.plan = NULL) [18:01:40.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.812] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.812] } [18:01:40.812] ...future.workdir <- getwd() [18:01:40.812] } [18:01:40.812] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.812] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.812] } [18:01:40.812] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.812] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.812] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.812] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.812] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.812] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.812] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.812] base::names(...future.oldOptions)) [18:01:40.812] } [18:01:40.812] if (FALSE) { [18:01:40.812] } [18:01:40.812] else { [18:01:40.812] if (TRUE) { [18:01:40.812] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.812] open = "w") [18:01:40.812] } [18:01:40.812] else { [18:01:40.812] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.812] windows = "NUL", "/dev/null"), open = "w") [18:01:40.812] } [18:01:40.812] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.812] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.812] base::sink(type = "output", split = FALSE) [18:01:40.812] base::close(...future.stdout) [18:01:40.812] }, add = TRUE) [18:01:40.812] } [18:01:40.812] ...future.frame <- base::sys.nframe() [18:01:40.812] ...future.conditions <- base::list() [18:01:40.812] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.812] if (FALSE) { [18:01:40.812] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.812] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.812] } [18:01:40.812] ...future.result <- base::tryCatch({ [18:01:40.812] base::withCallingHandlers({ [18:01:40.812] ...future.value <- base::withVisible(base::local({ [18:01:40.812] ...future.makeSendCondition <- local({ [18:01:40.812] sendCondition <- NULL [18:01:40.812] function(frame = 1L) { [18:01:40.812] if (is.function(sendCondition)) [18:01:40.812] return(sendCondition) [18:01:40.812] ns <- getNamespace("parallel") [18:01:40.812] if (exists("sendData", mode = "function", [18:01:40.812] envir = ns)) { [18:01:40.812] parallel_sendData <- get("sendData", mode = "function", [18:01:40.812] envir = ns) [18:01:40.812] envir <- sys.frame(frame) [18:01:40.812] master <- NULL [18:01:40.812] while (!identical(envir, .GlobalEnv) && [18:01:40.812] !identical(envir, emptyenv())) { [18:01:40.812] if (exists("master", mode = "list", envir = envir, [18:01:40.812] inherits = FALSE)) { [18:01:40.812] master <- get("master", mode = "list", [18:01:40.812] envir = envir, inherits = FALSE) [18:01:40.812] if (inherits(master, c("SOCKnode", [18:01:40.812] "SOCK0node"))) { [18:01:40.812] sendCondition <<- function(cond) { [18:01:40.812] data <- list(type = "VALUE", value = cond, [18:01:40.812] success = TRUE) [18:01:40.812] parallel_sendData(master, data) [18:01:40.812] } [18:01:40.812] return(sendCondition) [18:01:40.812] } [18:01:40.812] } [18:01:40.812] frame <- frame + 1L [18:01:40.812] envir <- sys.frame(frame) [18:01:40.812] } [18:01:40.812] } [18:01:40.812] sendCondition <<- function(cond) NULL [18:01:40.812] } [18:01:40.812] }) [18:01:40.812] withCallingHandlers({ [18:01:40.812] NULL [18:01:40.812] }, immediateCondition = function(cond) { [18:01:40.812] sendCondition <- ...future.makeSendCondition() [18:01:40.812] sendCondition(cond) [18:01:40.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.812] { [18:01:40.812] inherits <- base::inherits [18:01:40.812] invokeRestart <- base::invokeRestart [18:01:40.812] is.null <- base::is.null [18:01:40.812] muffled <- FALSE [18:01:40.812] if (inherits(cond, "message")) { [18:01:40.812] muffled <- grepl(pattern, "muffleMessage") [18:01:40.812] if (muffled) [18:01:40.812] invokeRestart("muffleMessage") [18:01:40.812] } [18:01:40.812] else if (inherits(cond, "warning")) { [18:01:40.812] muffled <- grepl(pattern, "muffleWarning") [18:01:40.812] if (muffled) [18:01:40.812] invokeRestart("muffleWarning") [18:01:40.812] } [18:01:40.812] else if (inherits(cond, "condition")) { [18:01:40.812] if (!is.null(pattern)) { [18:01:40.812] computeRestarts <- base::computeRestarts [18:01:40.812] grepl <- base::grepl [18:01:40.812] restarts <- computeRestarts(cond) [18:01:40.812] for (restart in restarts) { [18:01:40.812] name <- restart$name [18:01:40.812] if (is.null(name)) [18:01:40.812] next [18:01:40.812] if (!grepl(pattern, name)) [18:01:40.812] next [18:01:40.812] invokeRestart(restart) [18:01:40.812] muffled <- TRUE [18:01:40.812] break [18:01:40.812] } [18:01:40.812] } [18:01:40.812] } [18:01:40.812] invisible(muffled) [18:01:40.812] } [18:01:40.812] muffleCondition(cond) [18:01:40.812] }) [18:01:40.812] })) [18:01:40.812] future::FutureResult(value = ...future.value$value, [18:01:40.812] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.812] ...future.rng), globalenv = if (FALSE) [18:01:40.812] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.812] ...future.globalenv.names)) [18:01:40.812] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.812] }, condition = base::local({ [18:01:40.812] c <- base::c [18:01:40.812] inherits <- base::inherits [18:01:40.812] invokeRestart <- base::invokeRestart [18:01:40.812] length <- base::length [18:01:40.812] list <- base::list [18:01:40.812] seq.int <- base::seq.int [18:01:40.812] signalCondition <- base::signalCondition [18:01:40.812] sys.calls <- base::sys.calls [18:01:40.812] `[[` <- base::`[[` [18:01:40.812] `+` <- base::`+` [18:01:40.812] `<<-` <- base::`<<-` [18:01:40.812] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.812] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.812] 3L)] [18:01:40.812] } [18:01:40.812] function(cond) { [18:01:40.812] is_error <- inherits(cond, "error") [18:01:40.812] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.812] NULL) [18:01:40.812] if (is_error) { [18:01:40.812] sessionInformation <- function() { [18:01:40.812] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.812] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.812] search = base::search(), system = base::Sys.info()) [18:01:40.812] } [18:01:40.812] ...future.conditions[[length(...future.conditions) + [18:01:40.812] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.812] cond$call), session = sessionInformation(), [18:01:40.812] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.812] signalCondition(cond) [18:01:40.812] } [18:01:40.812] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.812] "immediateCondition"))) { [18:01:40.812] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.812] ...future.conditions[[length(...future.conditions) + [18:01:40.812] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.812] if (TRUE && !signal) { [18:01:40.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.812] { [18:01:40.812] inherits <- base::inherits [18:01:40.812] invokeRestart <- base::invokeRestart [18:01:40.812] is.null <- base::is.null [18:01:40.812] muffled <- FALSE [18:01:40.812] if (inherits(cond, "message")) { [18:01:40.812] muffled <- grepl(pattern, "muffleMessage") [18:01:40.812] if (muffled) [18:01:40.812] invokeRestart("muffleMessage") [18:01:40.812] } [18:01:40.812] else if (inherits(cond, "warning")) { [18:01:40.812] muffled <- grepl(pattern, "muffleWarning") [18:01:40.812] if (muffled) [18:01:40.812] invokeRestart("muffleWarning") [18:01:40.812] } [18:01:40.812] else if (inherits(cond, "condition")) { [18:01:40.812] if (!is.null(pattern)) { [18:01:40.812] computeRestarts <- base::computeRestarts [18:01:40.812] grepl <- base::grepl [18:01:40.812] restarts <- computeRestarts(cond) [18:01:40.812] for (restart in restarts) { [18:01:40.812] name <- restart$name [18:01:40.812] if (is.null(name)) [18:01:40.812] next [18:01:40.812] if (!grepl(pattern, name)) [18:01:40.812] next [18:01:40.812] invokeRestart(restart) [18:01:40.812] muffled <- TRUE [18:01:40.812] break [18:01:40.812] } [18:01:40.812] } [18:01:40.812] } [18:01:40.812] invisible(muffled) [18:01:40.812] } [18:01:40.812] muffleCondition(cond, pattern = "^muffle") [18:01:40.812] } [18:01:40.812] } [18:01:40.812] else { [18:01:40.812] if (TRUE) { [18:01:40.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.812] { [18:01:40.812] inherits <- base::inherits [18:01:40.812] invokeRestart <- base::invokeRestart [18:01:40.812] is.null <- base::is.null [18:01:40.812] muffled <- FALSE [18:01:40.812] if (inherits(cond, "message")) { [18:01:40.812] muffled <- grepl(pattern, "muffleMessage") [18:01:40.812] if (muffled) [18:01:40.812] invokeRestart("muffleMessage") [18:01:40.812] } [18:01:40.812] else if (inherits(cond, "warning")) { [18:01:40.812] muffled <- grepl(pattern, "muffleWarning") [18:01:40.812] if (muffled) [18:01:40.812] invokeRestart("muffleWarning") [18:01:40.812] } [18:01:40.812] else if (inherits(cond, "condition")) { [18:01:40.812] if (!is.null(pattern)) { [18:01:40.812] computeRestarts <- base::computeRestarts [18:01:40.812] grepl <- base::grepl [18:01:40.812] restarts <- computeRestarts(cond) [18:01:40.812] for (restart in restarts) { [18:01:40.812] name <- restart$name [18:01:40.812] if (is.null(name)) [18:01:40.812] next [18:01:40.812] if (!grepl(pattern, name)) [18:01:40.812] next [18:01:40.812] invokeRestart(restart) [18:01:40.812] muffled <- TRUE [18:01:40.812] break [18:01:40.812] } [18:01:40.812] } [18:01:40.812] } [18:01:40.812] invisible(muffled) [18:01:40.812] } [18:01:40.812] muffleCondition(cond, pattern = "^muffle") [18:01:40.812] } [18:01:40.812] } [18:01:40.812] } [18:01:40.812] })) [18:01:40.812] }, error = function(ex) { [18:01:40.812] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.812] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.812] ...future.rng), started = ...future.startTime, [18:01:40.812] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.812] version = "1.8"), class = "FutureResult") [18:01:40.812] }, finally = { [18:01:40.812] if (!identical(...future.workdir, getwd())) [18:01:40.812] setwd(...future.workdir) [18:01:40.812] { [18:01:40.812] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.812] ...future.oldOptions$nwarnings <- NULL [18:01:40.812] } [18:01:40.812] base::options(...future.oldOptions) [18:01:40.812] if (.Platform$OS.type == "windows") { [18:01:40.812] old_names <- names(...future.oldEnvVars) [18:01:40.812] envs <- base::Sys.getenv() [18:01:40.812] names <- names(envs) [18:01:40.812] common <- intersect(names, old_names) [18:01:40.812] added <- setdiff(names, old_names) [18:01:40.812] removed <- setdiff(old_names, names) [18:01:40.812] changed <- common[...future.oldEnvVars[common] != [18:01:40.812] envs[common]] [18:01:40.812] NAMES <- toupper(changed) [18:01:40.812] args <- list() [18:01:40.812] for (kk in seq_along(NAMES)) { [18:01:40.812] name <- changed[[kk]] [18:01:40.812] NAME <- NAMES[[kk]] [18:01:40.812] if (name != NAME && is.element(NAME, old_names)) [18:01:40.812] next [18:01:40.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.812] } [18:01:40.812] NAMES <- toupper(added) [18:01:40.812] for (kk in seq_along(NAMES)) { [18:01:40.812] name <- added[[kk]] [18:01:40.812] NAME <- NAMES[[kk]] [18:01:40.812] if (name != NAME && is.element(NAME, old_names)) [18:01:40.812] next [18:01:40.812] args[[name]] <- "" [18:01:40.812] } [18:01:40.812] NAMES <- toupper(removed) [18:01:40.812] for (kk in seq_along(NAMES)) { [18:01:40.812] name <- removed[[kk]] [18:01:40.812] NAME <- NAMES[[kk]] [18:01:40.812] if (name != NAME && is.element(NAME, old_names)) [18:01:40.812] next [18:01:40.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.812] } [18:01:40.812] if (length(args) > 0) [18:01:40.812] base::do.call(base::Sys.setenv, args = args) [18:01:40.812] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.812] } [18:01:40.812] else { [18:01:40.812] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.812] } [18:01:40.812] { [18:01:40.812] if (base::length(...future.futureOptionsAdded) > [18:01:40.812] 0L) { [18:01:40.812] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.812] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.812] base::options(opts) [18:01:40.812] } [18:01:40.812] { [18:01:40.812] { [18:01:40.812] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.812] NULL [18:01:40.812] } [18:01:40.812] options(future.plan = NULL) [18:01:40.812] if (is.na(NA_character_)) [18:01:40.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.812] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.812] future::plan(list(function (..., workers = availableCores(), [18:01:40.812] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.812] envir = parent.frame()) [18:01:40.812] { [18:01:40.812] if (is.function(workers)) [18:01:40.812] workers <- workers() [18:01:40.812] workers <- structure(as.integer(workers), [18:01:40.812] class = class(workers)) [18:01:40.812] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.812] workers >= 1) [18:01:40.812] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.812] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.812] } [18:01:40.812] future <- MultisessionFuture(..., workers = workers, [18:01:40.812] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.812] envir = envir) [18:01:40.812] if (!future$lazy) [18:01:40.812] future <- run(future) [18:01:40.812] invisible(future) [18:01:40.812] }), .cleanup = FALSE, .init = FALSE) [18:01:40.812] } [18:01:40.812] } [18:01:40.812] } [18:01:40.812] }) [18:01:40.812] if (TRUE) { [18:01:40.812] base::sink(type = "output", split = FALSE) [18:01:40.812] if (TRUE) { [18:01:40.812] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.812] } [18:01:40.812] else { [18:01:40.812] ...future.result["stdout"] <- base::list(NULL) [18:01:40.812] } [18:01:40.812] base::close(...future.stdout) [18:01:40.812] ...future.stdout <- NULL [18:01:40.812] } [18:01:40.812] ...future.result$conditions <- ...future.conditions [18:01:40.812] ...future.result$finished <- base::Sys.time() [18:01:40.812] ...future.result [18:01:40.812] } [18:01:40.818] MultisessionFuture started [18:01:40.818] - Launch lazy future ... done [18:01:40.818] 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" [18:01:40.825] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.825] - Validating connection of MultisessionFuture [18:01:40.825] - received message: FutureResult [18:01:40.825] - Received FutureResult [18:01:40.826] - Erased future from FutureRegistry [18:01:40.826] result() for ClusterFuture ... [18:01:40.826] - result already collected: FutureResult [18:01:40.826] result() for ClusterFuture ... done [18:01:40.826] receiveMessageFromWorker() for ClusterFuture ... done [18:01:40.835] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.835] - Validating connection of MultisessionFuture [18:01:40.835] - received message: FutureResult [18:01:40.835] - Received FutureResult [18:01:40.835] - Erased future from FutureRegistry [18:01:40.836] result() for ClusterFuture ... [18:01:40.836] - result already collected: FutureResult [18:01:40.836] result() for ClusterFuture ... done [18:01:40.836] 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" "" ... [18:01:40.838] resolve() on list ... [18:01:40.838] recursive: 0 [18:01:40.839] length: 6 [18:01:40.839] elements: 'a', 'b', 'c', '', '', '' [18:01:40.839] signalConditionsASAP(numeric, pos=1) ... [18:01:40.839] - nx: 6 [18:01:40.839] - relay: TRUE [18:01:40.839] - stdout: TRUE [18:01:40.840] - signal: TRUE [18:01:40.840] - resignal: FALSE [18:01:40.840] - force: TRUE [18:01:40.840] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.840] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.840] - until=2 [18:01:40.841] - relaying element #2 [18:01:40.841] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.841] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.841] signalConditionsASAP(NULL, pos=1) ... done [18:01:40.841] length: 5 (resolved future 1) [18:01:40.841] Future #2 [18:01:40.842] result() for ClusterFuture ... [18:01:40.842] - result already collected: FutureResult [18:01:40.842] result() for ClusterFuture ... done [18:01:40.842] result() for ClusterFuture ... [18:01:40.842] - result already collected: FutureResult [18:01:40.842] result() for ClusterFuture ... done [18:01:40.842] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:40.843] - nx: 6 [18:01:40.843] - relay: TRUE [18:01:40.843] - stdout: TRUE [18:01:40.843] - signal: TRUE [18:01:40.843] - resignal: FALSE [18:01:40.843] - force: TRUE [18:01:40.844] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.844] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.844] - until=2 [18:01:40.844] - relaying element #2 [18:01:40.844] result() for ClusterFuture ... [18:01:40.844] - result already collected: FutureResult [18:01:40.845] result() for ClusterFuture ... done [18:01:40.845] result() for ClusterFuture ... [18:01:40.845] - result already collected: FutureResult [18:01:40.845] result() for ClusterFuture ... done [18:01:40.845] result() for ClusterFuture ... [18:01:40.845] - result already collected: FutureResult [18:01:40.846] result() for ClusterFuture ... done [18:01:40.846] result() for ClusterFuture ... [18:01:40.846] - result already collected: FutureResult [18:01:40.846] result() for ClusterFuture ... done [18:01:40.846] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.846] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.846] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:40.847] length: 4 (resolved future 2) [18:01:40.847] Future #3 [18:01:40.847] result() for ClusterFuture ... [18:01:40.847] - result already collected: FutureResult [18:01:40.847] result() for ClusterFuture ... done [18:01:40.848] result() for ClusterFuture ... [18:01:40.848] - result already collected: FutureResult [18:01:40.848] result() for ClusterFuture ... done [18:01:40.848] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:40.848] - nx: 6 [18:01:40.848] - relay: TRUE [18:01:40.848] - stdout: TRUE [18:01:40.849] - signal: TRUE [18:01:40.849] - resignal: FALSE [18:01:40.849] - force: TRUE [18:01:40.849] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.849] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.849] - until=3 [18:01:40.850] - relaying element #3 [18:01:40.850] result() for ClusterFuture ... [18:01:40.850] - result already collected: FutureResult [18:01:40.850] result() for ClusterFuture ... done [18:01:40.850] result() for ClusterFuture ... [18:01:40.850] - result already collected: FutureResult [18:01:40.851] result() for ClusterFuture ... done [18:01:40.851] result() for ClusterFuture ... [18:01:40.851] - result already collected: FutureResult [18:01:40.851] result() for ClusterFuture ... done [18:01:40.851] result() for ClusterFuture ... [18:01:40.851] - result already collected: FutureResult [18:01:40.851] result() for ClusterFuture ... done [18:01:40.852] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.852] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.852] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:40.852] length: 3 (resolved future 3) [18:01:40.852] signalConditionsASAP(NULL, pos=4) ... [18:01:40.852] - nx: 6 [18:01:40.853] - relay: TRUE [18:01:40.853] - stdout: TRUE [18:01:40.853] - signal: TRUE [18:01:40.853] - resignal: FALSE [18:01:40.853] - force: TRUE [18:01:40.853] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.854] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.854] - until=5 [18:01:40.854] - relaying element #5 [18:01:40.854] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.854] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.854] signalConditionsASAP(NULL, pos=4) ... done [18:01:40.855] length: 2 (resolved future 4) [18:01:40.855] signalConditionsASAP(NULL, pos=5) ... [18:01:40.855] - nx: 6 [18:01:40.855] - relay: TRUE [18:01:40.855] - stdout: TRUE [18:01:40.855] - signal: TRUE [18:01:40.855] - resignal: FALSE [18:01:40.856] - force: TRUE [18:01:40.856] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.856] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.856] - until=6 [18:01:40.856] - relaying element #6 [18:01:40.856] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.857] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.857] signalConditionsASAP(NULL, pos=5) ... done [18:01:40.857] length: 1 (resolved future 5) [18:01:40.857] signalConditionsASAP(numeric, pos=6) ... [18:01:40.857] - nx: 6 [18:01:40.857] - relay: TRUE [18:01:40.857] - stdout: TRUE [18:01:40.858] - signal: TRUE [18:01:40.858] - resignal: FALSE [18:01:40.858] - force: TRUE [18:01:40.858] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.858] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.858] - until=6 [18:01:40.859] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.859] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.859] signalConditionsASAP(numeric, pos=6) ... done [18:01:40.859] length: 0 (resolved future 6) [18:01:40.859] Relaying remaining futures [18:01:40.859] signalConditionsASAP(NULL, pos=0) ... [18:01:40.860] - nx: 6 [18:01:40.860] - relay: TRUE [18:01:40.860] - stdout: TRUE [18:01:40.860] - signal: TRUE [18:01:40.860] - resignal: FALSE [18:01:40.860] - force: TRUE [18:01:40.860] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.861] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:40.861] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.861] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.861] signalConditionsASAP(NULL, pos=0) ... done [18:01:40.861] resolve() on list ... DONE [18:01:40.862] result() for ClusterFuture ... [18:01:40.862] - result already collected: FutureResult [18:01:40.862] result() for ClusterFuture ... done [18:01:40.862] result() for ClusterFuture ... [18:01:40.862] - result already collected: FutureResult [18:01:40.862] result() for ClusterFuture ... done [18:01:40.863] result() for ClusterFuture ... [18:01:40.863] - result already collected: FutureResult [18:01:40.863] result() for ClusterFuture ... done [18:01:40.863] result() for ClusterFuture ... [18:01:40.863] - result already collected: FutureResult [18:01:40.863] 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) [18:01:40.869] getGlobalsAndPackages() ... [18:01:40.869] Searching for globals... [18:01:40.870] [18:01:40.870] Searching for globals ... DONE [18:01:40.870] - globals: [0] [18:01:40.870] getGlobalsAndPackages() ... DONE [18:01:40.871] run() for 'Future' ... [18:01:40.871] - state: 'created' [18:01:40.871] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.885] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.885] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.885] - Field: 'node' [18:01:40.886] - Field: 'label' [18:01:40.886] - Field: 'local' [18:01:40.886] - Field: 'owner' [18:01:40.886] - Field: 'envir' [18:01:40.886] - Field: 'workers' [18:01:40.886] - Field: 'packages' [18:01:40.887] - Field: 'gc' [18:01:40.887] - Field: 'conditions' [18:01:40.887] - Field: 'persistent' [18:01:40.887] - Field: 'expr' [18:01:40.887] - Field: 'uuid' [18:01:40.888] - Field: 'seed' [18:01:40.888] - Field: 'version' [18:01:40.888] - Field: 'result' [18:01:40.888] - Field: 'asynchronous' [18:01:40.888] - Field: 'calls' [18:01:40.888] - Field: 'globals' [18:01:40.889] - Field: 'stdout' [18:01:40.889] - Field: 'earlySignal' [18:01:40.889] - Field: 'lazy' [18:01:40.889] - Field: 'state' [18:01:40.889] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.889] - Launch lazy future ... [18:01:40.890] Packages needed by the future expression (n = 0): [18:01:40.890] Packages needed by future strategies (n = 0): [18:01:40.891] { [18:01:40.891] { [18:01:40.891] { [18:01:40.891] ...future.startTime <- base::Sys.time() [18:01:40.891] { [18:01:40.891] { [18:01:40.891] { [18:01:40.891] { [18:01:40.891] base::local({ [18:01:40.891] has_future <- base::requireNamespace("future", [18:01:40.891] quietly = TRUE) [18:01:40.891] if (has_future) { [18:01:40.891] ns <- base::getNamespace("future") [18:01:40.891] version <- ns[[".package"]][["version"]] [18:01:40.891] if (is.null(version)) [18:01:40.891] version <- utils::packageVersion("future") [18:01:40.891] } [18:01:40.891] else { [18:01:40.891] version <- NULL [18:01:40.891] } [18:01:40.891] if (!has_future || version < "1.8.0") { [18:01:40.891] info <- base::c(r_version = base::gsub("R version ", [18:01:40.891] "", base::R.version$version.string), [18:01:40.891] platform = base::sprintf("%s (%s-bit)", [18:01:40.891] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.891] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.891] "release", "version")], collapse = " "), [18:01:40.891] hostname = base::Sys.info()[["nodename"]]) [18:01:40.891] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.891] info) [18:01:40.891] info <- base::paste(info, collapse = "; ") [18:01:40.891] if (!has_future) { [18:01:40.891] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.891] info) [18:01:40.891] } [18:01:40.891] else { [18:01:40.891] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.891] info, version) [18:01:40.891] } [18:01:40.891] base::stop(msg) [18:01:40.891] } [18:01:40.891] }) [18:01:40.891] } [18:01:40.891] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.891] base::options(mc.cores = 1L) [18:01:40.891] } [18:01:40.891] options(future.plan = NULL) [18:01:40.891] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.891] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.891] } [18:01:40.891] ...future.workdir <- getwd() [18:01:40.891] } [18:01:40.891] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.891] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.891] } [18:01:40.891] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.891] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.891] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.891] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.891] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.891] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.891] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.891] base::names(...future.oldOptions)) [18:01:40.891] } [18:01:40.891] if (FALSE) { [18:01:40.891] } [18:01:40.891] else { [18:01:40.891] if (TRUE) { [18:01:40.891] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.891] open = "w") [18:01:40.891] } [18:01:40.891] else { [18:01:40.891] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.891] windows = "NUL", "/dev/null"), open = "w") [18:01:40.891] } [18:01:40.891] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.891] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.891] base::sink(type = "output", split = FALSE) [18:01:40.891] base::close(...future.stdout) [18:01:40.891] }, add = TRUE) [18:01:40.891] } [18:01:40.891] ...future.frame <- base::sys.nframe() [18:01:40.891] ...future.conditions <- base::list() [18:01:40.891] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.891] if (FALSE) { [18:01:40.891] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.891] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.891] } [18:01:40.891] ...future.result <- base::tryCatch({ [18:01:40.891] base::withCallingHandlers({ [18:01:40.891] ...future.value <- base::withVisible(base::local({ [18:01:40.891] ...future.makeSendCondition <- local({ [18:01:40.891] sendCondition <- NULL [18:01:40.891] function(frame = 1L) { [18:01:40.891] if (is.function(sendCondition)) [18:01:40.891] return(sendCondition) [18:01:40.891] ns <- getNamespace("parallel") [18:01:40.891] if (exists("sendData", mode = "function", [18:01:40.891] envir = ns)) { [18:01:40.891] parallel_sendData <- get("sendData", mode = "function", [18:01:40.891] envir = ns) [18:01:40.891] envir <- sys.frame(frame) [18:01:40.891] master <- NULL [18:01:40.891] while (!identical(envir, .GlobalEnv) && [18:01:40.891] !identical(envir, emptyenv())) { [18:01:40.891] if (exists("master", mode = "list", envir = envir, [18:01:40.891] inherits = FALSE)) { [18:01:40.891] master <- get("master", mode = "list", [18:01:40.891] envir = envir, inherits = FALSE) [18:01:40.891] if (inherits(master, c("SOCKnode", [18:01:40.891] "SOCK0node"))) { [18:01:40.891] sendCondition <<- function(cond) { [18:01:40.891] data <- list(type = "VALUE", value = cond, [18:01:40.891] success = TRUE) [18:01:40.891] parallel_sendData(master, data) [18:01:40.891] } [18:01:40.891] return(sendCondition) [18:01:40.891] } [18:01:40.891] } [18:01:40.891] frame <- frame + 1L [18:01:40.891] envir <- sys.frame(frame) [18:01:40.891] } [18:01:40.891] } [18:01:40.891] sendCondition <<- function(cond) NULL [18:01:40.891] } [18:01:40.891] }) [18:01:40.891] withCallingHandlers({ [18:01:40.891] 2 [18:01:40.891] }, immediateCondition = function(cond) { [18:01:40.891] sendCondition <- ...future.makeSendCondition() [18:01:40.891] sendCondition(cond) [18:01:40.891] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.891] { [18:01:40.891] inherits <- base::inherits [18:01:40.891] invokeRestart <- base::invokeRestart [18:01:40.891] is.null <- base::is.null [18:01:40.891] muffled <- FALSE [18:01:40.891] if (inherits(cond, "message")) { [18:01:40.891] muffled <- grepl(pattern, "muffleMessage") [18:01:40.891] if (muffled) [18:01:40.891] invokeRestart("muffleMessage") [18:01:40.891] } [18:01:40.891] else if (inherits(cond, "warning")) { [18:01:40.891] muffled <- grepl(pattern, "muffleWarning") [18:01:40.891] if (muffled) [18:01:40.891] invokeRestart("muffleWarning") [18:01:40.891] } [18:01:40.891] else if (inherits(cond, "condition")) { [18:01:40.891] if (!is.null(pattern)) { [18:01:40.891] computeRestarts <- base::computeRestarts [18:01:40.891] grepl <- base::grepl [18:01:40.891] restarts <- computeRestarts(cond) [18:01:40.891] for (restart in restarts) { [18:01:40.891] name <- restart$name [18:01:40.891] if (is.null(name)) [18:01:40.891] next [18:01:40.891] if (!grepl(pattern, name)) [18:01:40.891] next [18:01:40.891] invokeRestart(restart) [18:01:40.891] muffled <- TRUE [18:01:40.891] break [18:01:40.891] } [18:01:40.891] } [18:01:40.891] } [18:01:40.891] invisible(muffled) [18:01:40.891] } [18:01:40.891] muffleCondition(cond) [18:01:40.891] }) [18:01:40.891] })) [18:01:40.891] future::FutureResult(value = ...future.value$value, [18:01:40.891] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.891] ...future.rng), globalenv = if (FALSE) [18:01:40.891] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.891] ...future.globalenv.names)) [18:01:40.891] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.891] }, condition = base::local({ [18:01:40.891] c <- base::c [18:01:40.891] inherits <- base::inherits [18:01:40.891] invokeRestart <- base::invokeRestart [18:01:40.891] length <- base::length [18:01:40.891] list <- base::list [18:01:40.891] seq.int <- base::seq.int [18:01:40.891] signalCondition <- base::signalCondition [18:01:40.891] sys.calls <- base::sys.calls [18:01:40.891] `[[` <- base::`[[` [18:01:40.891] `+` <- base::`+` [18:01:40.891] `<<-` <- base::`<<-` [18:01:40.891] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.891] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.891] 3L)] [18:01:40.891] } [18:01:40.891] function(cond) { [18:01:40.891] is_error <- inherits(cond, "error") [18:01:40.891] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.891] NULL) [18:01:40.891] if (is_error) { [18:01:40.891] sessionInformation <- function() { [18:01:40.891] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.891] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.891] search = base::search(), system = base::Sys.info()) [18:01:40.891] } [18:01:40.891] ...future.conditions[[length(...future.conditions) + [18:01:40.891] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.891] cond$call), session = sessionInformation(), [18:01:40.891] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.891] signalCondition(cond) [18:01:40.891] } [18:01:40.891] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.891] "immediateCondition"))) { [18:01:40.891] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.891] ...future.conditions[[length(...future.conditions) + [18:01:40.891] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.891] if (TRUE && !signal) { [18:01:40.891] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.891] { [18:01:40.891] inherits <- base::inherits [18:01:40.891] invokeRestart <- base::invokeRestart [18:01:40.891] is.null <- base::is.null [18:01:40.891] muffled <- FALSE [18:01:40.891] if (inherits(cond, "message")) { [18:01:40.891] muffled <- grepl(pattern, "muffleMessage") [18:01:40.891] if (muffled) [18:01:40.891] invokeRestart("muffleMessage") [18:01:40.891] } [18:01:40.891] else if (inherits(cond, "warning")) { [18:01:40.891] muffled <- grepl(pattern, "muffleWarning") [18:01:40.891] if (muffled) [18:01:40.891] invokeRestart("muffleWarning") [18:01:40.891] } [18:01:40.891] else if (inherits(cond, "condition")) { [18:01:40.891] if (!is.null(pattern)) { [18:01:40.891] computeRestarts <- base::computeRestarts [18:01:40.891] grepl <- base::grepl [18:01:40.891] restarts <- computeRestarts(cond) [18:01:40.891] for (restart in restarts) { [18:01:40.891] name <- restart$name [18:01:40.891] if (is.null(name)) [18:01:40.891] next [18:01:40.891] if (!grepl(pattern, name)) [18:01:40.891] next [18:01:40.891] invokeRestart(restart) [18:01:40.891] muffled <- TRUE [18:01:40.891] break [18:01:40.891] } [18:01:40.891] } [18:01:40.891] } [18:01:40.891] invisible(muffled) [18:01:40.891] } [18:01:40.891] muffleCondition(cond, pattern = "^muffle") [18:01:40.891] } [18:01:40.891] } [18:01:40.891] else { [18:01:40.891] if (TRUE) { [18:01:40.891] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.891] { [18:01:40.891] inherits <- base::inherits [18:01:40.891] invokeRestart <- base::invokeRestart [18:01:40.891] is.null <- base::is.null [18:01:40.891] muffled <- FALSE [18:01:40.891] if (inherits(cond, "message")) { [18:01:40.891] muffled <- grepl(pattern, "muffleMessage") [18:01:40.891] if (muffled) [18:01:40.891] invokeRestart("muffleMessage") [18:01:40.891] } [18:01:40.891] else if (inherits(cond, "warning")) { [18:01:40.891] muffled <- grepl(pattern, "muffleWarning") [18:01:40.891] if (muffled) [18:01:40.891] invokeRestart("muffleWarning") [18:01:40.891] } [18:01:40.891] else if (inherits(cond, "condition")) { [18:01:40.891] if (!is.null(pattern)) { [18:01:40.891] computeRestarts <- base::computeRestarts [18:01:40.891] grepl <- base::grepl [18:01:40.891] restarts <- computeRestarts(cond) [18:01:40.891] for (restart in restarts) { [18:01:40.891] name <- restart$name [18:01:40.891] if (is.null(name)) [18:01:40.891] next [18:01:40.891] if (!grepl(pattern, name)) [18:01:40.891] next [18:01:40.891] invokeRestart(restart) [18:01:40.891] muffled <- TRUE [18:01:40.891] break [18:01:40.891] } [18:01:40.891] } [18:01:40.891] } [18:01:40.891] invisible(muffled) [18:01:40.891] } [18:01:40.891] muffleCondition(cond, pattern = "^muffle") [18:01:40.891] } [18:01:40.891] } [18:01:40.891] } [18:01:40.891] })) [18:01:40.891] }, error = function(ex) { [18:01:40.891] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.891] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.891] ...future.rng), started = ...future.startTime, [18:01:40.891] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.891] version = "1.8"), class = "FutureResult") [18:01:40.891] }, finally = { [18:01:40.891] if (!identical(...future.workdir, getwd())) [18:01:40.891] setwd(...future.workdir) [18:01:40.891] { [18:01:40.891] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.891] ...future.oldOptions$nwarnings <- NULL [18:01:40.891] } [18:01:40.891] base::options(...future.oldOptions) [18:01:40.891] if (.Platform$OS.type == "windows") { [18:01:40.891] old_names <- names(...future.oldEnvVars) [18:01:40.891] envs <- base::Sys.getenv() [18:01:40.891] names <- names(envs) [18:01:40.891] common <- intersect(names, old_names) [18:01:40.891] added <- setdiff(names, old_names) [18:01:40.891] removed <- setdiff(old_names, names) [18:01:40.891] changed <- common[...future.oldEnvVars[common] != [18:01:40.891] envs[common]] [18:01:40.891] NAMES <- toupper(changed) [18:01:40.891] args <- list() [18:01:40.891] for (kk in seq_along(NAMES)) { [18:01:40.891] name <- changed[[kk]] [18:01:40.891] NAME <- NAMES[[kk]] [18:01:40.891] if (name != NAME && is.element(NAME, old_names)) [18:01:40.891] next [18:01:40.891] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.891] } [18:01:40.891] NAMES <- toupper(added) [18:01:40.891] for (kk in seq_along(NAMES)) { [18:01:40.891] name <- added[[kk]] [18:01:40.891] NAME <- NAMES[[kk]] [18:01:40.891] if (name != NAME && is.element(NAME, old_names)) [18:01:40.891] next [18:01:40.891] args[[name]] <- "" [18:01:40.891] } [18:01:40.891] NAMES <- toupper(removed) [18:01:40.891] for (kk in seq_along(NAMES)) { [18:01:40.891] name <- removed[[kk]] [18:01:40.891] NAME <- NAMES[[kk]] [18:01:40.891] if (name != NAME && is.element(NAME, old_names)) [18:01:40.891] next [18:01:40.891] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.891] } [18:01:40.891] if (length(args) > 0) [18:01:40.891] base::do.call(base::Sys.setenv, args = args) [18:01:40.891] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.891] } [18:01:40.891] else { [18:01:40.891] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.891] } [18:01:40.891] { [18:01:40.891] if (base::length(...future.futureOptionsAdded) > [18:01:40.891] 0L) { [18:01:40.891] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.891] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.891] base::options(opts) [18:01:40.891] } [18:01:40.891] { [18:01:40.891] { [18:01:40.891] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.891] NULL [18:01:40.891] } [18:01:40.891] options(future.plan = NULL) [18:01:40.891] if (is.na(NA_character_)) [18:01:40.891] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.891] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.891] future::plan(list(function (..., workers = availableCores(), [18:01:40.891] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.891] envir = parent.frame()) [18:01:40.891] { [18:01:40.891] if (is.function(workers)) [18:01:40.891] workers <- workers() [18:01:40.891] workers <- structure(as.integer(workers), [18:01:40.891] class = class(workers)) [18:01:40.891] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.891] workers >= 1) [18:01:40.891] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.891] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.891] } [18:01:40.891] future <- MultisessionFuture(..., workers = workers, [18:01:40.891] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.891] envir = envir) [18:01:40.891] if (!future$lazy) [18:01:40.891] future <- run(future) [18:01:40.891] invisible(future) [18:01:40.891] }), .cleanup = FALSE, .init = FALSE) [18:01:40.891] } [18:01:40.891] } [18:01:40.891] } [18:01:40.891] }) [18:01:40.891] if (TRUE) { [18:01:40.891] base::sink(type = "output", split = FALSE) [18:01:40.891] if (TRUE) { [18:01:40.891] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.891] } [18:01:40.891] else { [18:01:40.891] ...future.result["stdout"] <- base::list(NULL) [18:01:40.891] } [18:01:40.891] base::close(...future.stdout) [18:01:40.891] ...future.stdout <- NULL [18:01:40.891] } [18:01:40.891] ...future.result$conditions <- ...future.conditions [18:01:40.891] ...future.result$finished <- base::Sys.time() [18:01:40.891] ...future.result [18:01:40.891] } [18:01:40.896] MultisessionFuture started [18:01:40.897] - Launch lazy future ... done [18:01:40.897] run() for 'MultisessionFuture' ... done [18:01:40.897] getGlobalsAndPackages() ... [18:01:40.897] Searching for globals... [18:01:40.898] [18:01:40.898] Searching for globals ... DONE [18:01:40.898] - globals: [0] [18:01:40.898] getGlobalsAndPackages() ... DONE [18:01:40.898] run() for 'Future' ... [18:01:40.899] - state: 'created' [18:01:40.899] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:40.913] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:40.913] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:40.913] - Field: 'node' [18:01:40.913] - Field: 'label' [18:01:40.913] - Field: 'local' [18:01:40.914] - Field: 'owner' [18:01:40.914] - Field: 'envir' [18:01:40.914] - Field: 'workers' [18:01:40.914] - Field: 'packages' [18:01:40.914] - Field: 'gc' [18:01:40.915] - Field: 'conditions' [18:01:40.915] - Field: 'persistent' [18:01:40.915] - Field: 'expr' [18:01:40.915] - Field: 'uuid' [18:01:40.915] - Field: 'seed' [18:01:40.916] - Field: 'version' [18:01:40.916] - Field: 'result' [18:01:40.916] - Field: 'asynchronous' [18:01:40.916] - Field: 'calls' [18:01:40.916] - Field: 'globals' [18:01:40.917] - Field: 'stdout' [18:01:40.917] - Field: 'earlySignal' [18:01:40.917] - Field: 'lazy' [18:01:40.917] - Field: 'state' [18:01:40.917] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:40.918] - Launch lazy future ... [18:01:40.918] Packages needed by the future expression (n = 0): [18:01:40.918] Packages needed by future strategies (n = 0): [18:01:40.919] { [18:01:40.919] { [18:01:40.919] { [18:01:40.919] ...future.startTime <- base::Sys.time() [18:01:40.919] { [18:01:40.919] { [18:01:40.919] { [18:01:40.919] { [18:01:40.919] base::local({ [18:01:40.919] has_future <- base::requireNamespace("future", [18:01:40.919] quietly = TRUE) [18:01:40.919] if (has_future) { [18:01:40.919] ns <- base::getNamespace("future") [18:01:40.919] version <- ns[[".package"]][["version"]] [18:01:40.919] if (is.null(version)) [18:01:40.919] version <- utils::packageVersion("future") [18:01:40.919] } [18:01:40.919] else { [18:01:40.919] version <- NULL [18:01:40.919] } [18:01:40.919] if (!has_future || version < "1.8.0") { [18:01:40.919] info <- base::c(r_version = base::gsub("R version ", [18:01:40.919] "", base::R.version$version.string), [18:01:40.919] platform = base::sprintf("%s (%s-bit)", [18:01:40.919] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:40.919] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:40.919] "release", "version")], collapse = " "), [18:01:40.919] hostname = base::Sys.info()[["nodename"]]) [18:01:40.919] info <- base::sprintf("%s: %s", base::names(info), [18:01:40.919] info) [18:01:40.919] info <- base::paste(info, collapse = "; ") [18:01:40.919] if (!has_future) { [18:01:40.919] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:40.919] info) [18:01:40.919] } [18:01:40.919] else { [18:01:40.919] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:40.919] info, version) [18:01:40.919] } [18:01:40.919] base::stop(msg) [18:01:40.919] } [18:01:40.919] }) [18:01:40.919] } [18:01:40.919] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:40.919] base::options(mc.cores = 1L) [18:01:40.919] } [18:01:40.919] options(future.plan = NULL) [18:01:40.919] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.919] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:40.919] } [18:01:40.919] ...future.workdir <- getwd() [18:01:40.919] } [18:01:40.919] ...future.oldOptions <- base::as.list(base::.Options) [18:01:40.919] ...future.oldEnvVars <- base::Sys.getenv() [18:01:40.919] } [18:01:40.919] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:40.919] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:40.919] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:40.919] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:40.919] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:40.919] future.stdout.windows.reencode = NULL, width = 80L) [18:01:40.919] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:40.919] base::names(...future.oldOptions)) [18:01:40.919] } [18:01:40.919] if (FALSE) { [18:01:40.919] } [18:01:40.919] else { [18:01:40.919] if (TRUE) { [18:01:40.919] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:40.919] open = "w") [18:01:40.919] } [18:01:40.919] else { [18:01:40.919] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:40.919] windows = "NUL", "/dev/null"), open = "w") [18:01:40.919] } [18:01:40.919] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:40.919] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:40.919] base::sink(type = "output", split = FALSE) [18:01:40.919] base::close(...future.stdout) [18:01:40.919] }, add = TRUE) [18:01:40.919] } [18:01:40.919] ...future.frame <- base::sys.nframe() [18:01:40.919] ...future.conditions <- base::list() [18:01:40.919] ...future.rng <- base::globalenv()$.Random.seed [18:01:40.919] if (FALSE) { [18:01:40.919] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:40.919] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:40.919] } [18:01:40.919] ...future.result <- base::tryCatch({ [18:01:40.919] base::withCallingHandlers({ [18:01:40.919] ...future.value <- base::withVisible(base::local({ [18:01:40.919] ...future.makeSendCondition <- local({ [18:01:40.919] sendCondition <- NULL [18:01:40.919] function(frame = 1L) { [18:01:40.919] if (is.function(sendCondition)) [18:01:40.919] return(sendCondition) [18:01:40.919] ns <- getNamespace("parallel") [18:01:40.919] if (exists("sendData", mode = "function", [18:01:40.919] envir = ns)) { [18:01:40.919] parallel_sendData <- get("sendData", mode = "function", [18:01:40.919] envir = ns) [18:01:40.919] envir <- sys.frame(frame) [18:01:40.919] master <- NULL [18:01:40.919] while (!identical(envir, .GlobalEnv) && [18:01:40.919] !identical(envir, emptyenv())) { [18:01:40.919] if (exists("master", mode = "list", envir = envir, [18:01:40.919] inherits = FALSE)) { [18:01:40.919] master <- get("master", mode = "list", [18:01:40.919] envir = envir, inherits = FALSE) [18:01:40.919] if (inherits(master, c("SOCKnode", [18:01:40.919] "SOCK0node"))) { [18:01:40.919] sendCondition <<- function(cond) { [18:01:40.919] data <- list(type = "VALUE", value = cond, [18:01:40.919] success = TRUE) [18:01:40.919] parallel_sendData(master, data) [18:01:40.919] } [18:01:40.919] return(sendCondition) [18:01:40.919] } [18:01:40.919] } [18:01:40.919] frame <- frame + 1L [18:01:40.919] envir <- sys.frame(frame) [18:01:40.919] } [18:01:40.919] } [18:01:40.919] sendCondition <<- function(cond) NULL [18:01:40.919] } [18:01:40.919] }) [18:01:40.919] withCallingHandlers({ [18:01:40.919] NULL [18:01:40.919] }, immediateCondition = function(cond) { [18:01:40.919] sendCondition <- ...future.makeSendCondition() [18:01:40.919] sendCondition(cond) [18:01:40.919] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.919] { [18:01:40.919] inherits <- base::inherits [18:01:40.919] invokeRestart <- base::invokeRestart [18:01:40.919] is.null <- base::is.null [18:01:40.919] muffled <- FALSE [18:01:40.919] if (inherits(cond, "message")) { [18:01:40.919] muffled <- grepl(pattern, "muffleMessage") [18:01:40.919] if (muffled) [18:01:40.919] invokeRestart("muffleMessage") [18:01:40.919] } [18:01:40.919] else if (inherits(cond, "warning")) { [18:01:40.919] muffled <- grepl(pattern, "muffleWarning") [18:01:40.919] if (muffled) [18:01:40.919] invokeRestart("muffleWarning") [18:01:40.919] } [18:01:40.919] else if (inherits(cond, "condition")) { [18:01:40.919] if (!is.null(pattern)) { [18:01:40.919] computeRestarts <- base::computeRestarts [18:01:40.919] grepl <- base::grepl [18:01:40.919] restarts <- computeRestarts(cond) [18:01:40.919] for (restart in restarts) { [18:01:40.919] name <- restart$name [18:01:40.919] if (is.null(name)) [18:01:40.919] next [18:01:40.919] if (!grepl(pattern, name)) [18:01:40.919] next [18:01:40.919] invokeRestart(restart) [18:01:40.919] muffled <- TRUE [18:01:40.919] break [18:01:40.919] } [18:01:40.919] } [18:01:40.919] } [18:01:40.919] invisible(muffled) [18:01:40.919] } [18:01:40.919] muffleCondition(cond) [18:01:40.919] }) [18:01:40.919] })) [18:01:40.919] future::FutureResult(value = ...future.value$value, [18:01:40.919] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.919] ...future.rng), globalenv = if (FALSE) [18:01:40.919] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:40.919] ...future.globalenv.names)) [18:01:40.919] else NULL, started = ...future.startTime, version = "1.8") [18:01:40.919] }, condition = base::local({ [18:01:40.919] c <- base::c [18:01:40.919] inherits <- base::inherits [18:01:40.919] invokeRestart <- base::invokeRestart [18:01:40.919] length <- base::length [18:01:40.919] list <- base::list [18:01:40.919] seq.int <- base::seq.int [18:01:40.919] signalCondition <- base::signalCondition [18:01:40.919] sys.calls <- base::sys.calls [18:01:40.919] `[[` <- base::`[[` [18:01:40.919] `+` <- base::`+` [18:01:40.919] `<<-` <- base::`<<-` [18:01:40.919] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:40.919] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:40.919] 3L)] [18:01:40.919] } [18:01:40.919] function(cond) { [18:01:40.919] is_error <- inherits(cond, "error") [18:01:40.919] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:40.919] NULL) [18:01:40.919] if (is_error) { [18:01:40.919] sessionInformation <- function() { [18:01:40.919] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:40.919] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:40.919] search = base::search(), system = base::Sys.info()) [18:01:40.919] } [18:01:40.919] ...future.conditions[[length(...future.conditions) + [18:01:40.919] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:40.919] cond$call), session = sessionInformation(), [18:01:40.919] timestamp = base::Sys.time(), signaled = 0L) [18:01:40.919] signalCondition(cond) [18:01:40.919] } [18:01:40.919] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:40.919] "immediateCondition"))) { [18:01:40.919] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:40.919] ...future.conditions[[length(...future.conditions) + [18:01:40.919] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:40.919] if (TRUE && !signal) { [18:01:40.919] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.919] { [18:01:40.919] inherits <- base::inherits [18:01:40.919] invokeRestart <- base::invokeRestart [18:01:40.919] is.null <- base::is.null [18:01:40.919] muffled <- FALSE [18:01:40.919] if (inherits(cond, "message")) { [18:01:40.919] muffled <- grepl(pattern, "muffleMessage") [18:01:40.919] if (muffled) [18:01:40.919] invokeRestart("muffleMessage") [18:01:40.919] } [18:01:40.919] else if (inherits(cond, "warning")) { [18:01:40.919] muffled <- grepl(pattern, "muffleWarning") [18:01:40.919] if (muffled) [18:01:40.919] invokeRestart("muffleWarning") [18:01:40.919] } [18:01:40.919] else if (inherits(cond, "condition")) { [18:01:40.919] if (!is.null(pattern)) { [18:01:40.919] computeRestarts <- base::computeRestarts [18:01:40.919] grepl <- base::grepl [18:01:40.919] restarts <- computeRestarts(cond) [18:01:40.919] for (restart in restarts) { [18:01:40.919] name <- restart$name [18:01:40.919] if (is.null(name)) [18:01:40.919] next [18:01:40.919] if (!grepl(pattern, name)) [18:01:40.919] next [18:01:40.919] invokeRestart(restart) [18:01:40.919] muffled <- TRUE [18:01:40.919] break [18:01:40.919] } [18:01:40.919] } [18:01:40.919] } [18:01:40.919] invisible(muffled) [18:01:40.919] } [18:01:40.919] muffleCondition(cond, pattern = "^muffle") [18:01:40.919] } [18:01:40.919] } [18:01:40.919] else { [18:01:40.919] if (TRUE) { [18:01:40.919] muffleCondition <- function (cond, pattern = "^muffle") [18:01:40.919] { [18:01:40.919] inherits <- base::inherits [18:01:40.919] invokeRestart <- base::invokeRestart [18:01:40.919] is.null <- base::is.null [18:01:40.919] muffled <- FALSE [18:01:40.919] if (inherits(cond, "message")) { [18:01:40.919] muffled <- grepl(pattern, "muffleMessage") [18:01:40.919] if (muffled) [18:01:40.919] invokeRestart("muffleMessage") [18:01:40.919] } [18:01:40.919] else if (inherits(cond, "warning")) { [18:01:40.919] muffled <- grepl(pattern, "muffleWarning") [18:01:40.919] if (muffled) [18:01:40.919] invokeRestart("muffleWarning") [18:01:40.919] } [18:01:40.919] else if (inherits(cond, "condition")) { [18:01:40.919] if (!is.null(pattern)) { [18:01:40.919] computeRestarts <- base::computeRestarts [18:01:40.919] grepl <- base::grepl [18:01:40.919] restarts <- computeRestarts(cond) [18:01:40.919] for (restart in restarts) { [18:01:40.919] name <- restart$name [18:01:40.919] if (is.null(name)) [18:01:40.919] next [18:01:40.919] if (!grepl(pattern, name)) [18:01:40.919] next [18:01:40.919] invokeRestart(restart) [18:01:40.919] muffled <- TRUE [18:01:40.919] break [18:01:40.919] } [18:01:40.919] } [18:01:40.919] } [18:01:40.919] invisible(muffled) [18:01:40.919] } [18:01:40.919] muffleCondition(cond, pattern = "^muffle") [18:01:40.919] } [18:01:40.919] } [18:01:40.919] } [18:01:40.919] })) [18:01:40.919] }, error = function(ex) { [18:01:40.919] base::structure(base::list(value = NULL, visible = NULL, [18:01:40.919] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:40.919] ...future.rng), started = ...future.startTime, [18:01:40.919] finished = Sys.time(), session_uuid = NA_character_, [18:01:40.919] version = "1.8"), class = "FutureResult") [18:01:40.919] }, finally = { [18:01:40.919] if (!identical(...future.workdir, getwd())) [18:01:40.919] setwd(...future.workdir) [18:01:40.919] { [18:01:40.919] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:40.919] ...future.oldOptions$nwarnings <- NULL [18:01:40.919] } [18:01:40.919] base::options(...future.oldOptions) [18:01:40.919] if (.Platform$OS.type == "windows") { [18:01:40.919] old_names <- names(...future.oldEnvVars) [18:01:40.919] envs <- base::Sys.getenv() [18:01:40.919] names <- names(envs) [18:01:40.919] common <- intersect(names, old_names) [18:01:40.919] added <- setdiff(names, old_names) [18:01:40.919] removed <- setdiff(old_names, names) [18:01:40.919] changed <- common[...future.oldEnvVars[common] != [18:01:40.919] envs[common]] [18:01:40.919] NAMES <- toupper(changed) [18:01:40.919] args <- list() [18:01:40.919] for (kk in seq_along(NAMES)) { [18:01:40.919] name <- changed[[kk]] [18:01:40.919] NAME <- NAMES[[kk]] [18:01:40.919] if (name != NAME && is.element(NAME, old_names)) [18:01:40.919] next [18:01:40.919] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.919] } [18:01:40.919] NAMES <- toupper(added) [18:01:40.919] for (kk in seq_along(NAMES)) { [18:01:40.919] name <- added[[kk]] [18:01:40.919] NAME <- NAMES[[kk]] [18:01:40.919] if (name != NAME && is.element(NAME, old_names)) [18:01:40.919] next [18:01:40.919] args[[name]] <- "" [18:01:40.919] } [18:01:40.919] NAMES <- toupper(removed) [18:01:40.919] for (kk in seq_along(NAMES)) { [18:01:40.919] name <- removed[[kk]] [18:01:40.919] NAME <- NAMES[[kk]] [18:01:40.919] if (name != NAME && is.element(NAME, old_names)) [18:01:40.919] next [18:01:40.919] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:40.919] } [18:01:40.919] if (length(args) > 0) [18:01:40.919] base::do.call(base::Sys.setenv, args = args) [18:01:40.919] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:40.919] } [18:01:40.919] else { [18:01:40.919] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:40.919] } [18:01:40.919] { [18:01:40.919] if (base::length(...future.futureOptionsAdded) > [18:01:40.919] 0L) { [18:01:40.919] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:40.919] base::names(opts) <- ...future.futureOptionsAdded [18:01:40.919] base::options(opts) [18:01:40.919] } [18:01:40.919] { [18:01:40.919] { [18:01:40.919] base::options(mc.cores = ...future.mc.cores.old) [18:01:40.919] NULL [18:01:40.919] } [18:01:40.919] options(future.plan = NULL) [18:01:40.919] if (is.na(NA_character_)) [18:01:40.919] Sys.unsetenv("R_FUTURE_PLAN") [18:01:40.919] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:40.919] future::plan(list(function (..., workers = availableCores(), [18:01:40.919] lazy = FALSE, rscript_libs = .libPaths(), [18:01:40.919] envir = parent.frame()) [18:01:40.919] { [18:01:40.919] if (is.function(workers)) [18:01:40.919] workers <- workers() [18:01:40.919] workers <- structure(as.integer(workers), [18:01:40.919] class = class(workers)) [18:01:40.919] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:40.919] workers >= 1) [18:01:40.919] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:40.919] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:40.919] } [18:01:40.919] future <- MultisessionFuture(..., workers = workers, [18:01:40.919] lazy = lazy, rscript_libs = rscript_libs, [18:01:40.919] envir = envir) [18:01:40.919] if (!future$lazy) [18:01:40.919] future <- run(future) [18:01:40.919] invisible(future) [18:01:40.919] }), .cleanup = FALSE, .init = FALSE) [18:01:40.919] } [18:01:40.919] } [18:01:40.919] } [18:01:40.919] }) [18:01:40.919] if (TRUE) { [18:01:40.919] base::sink(type = "output", split = FALSE) [18:01:40.919] if (TRUE) { [18:01:40.919] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:40.919] } [18:01:40.919] else { [18:01:40.919] ...future.result["stdout"] <- base::list(NULL) [18:01:40.919] } [18:01:40.919] base::close(...future.stdout) [18:01:40.919] ...future.stdout <- NULL [18:01:40.919] } [18:01:40.919] ...future.result$conditions <- ...future.conditions [18:01:40.919] ...future.result$finished <- base::Sys.time() [18:01:40.919] ...future.result [18:01:40.919] } [18:01:40.925] MultisessionFuture started [18:01:40.925] - Launch lazy future ... done [18:01:40.925] 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" [18:01:40.932] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.932] - Validating connection of MultisessionFuture [18:01:40.933] - received message: FutureResult [18:01:40.933] - Received FutureResult [18:01:40.933] - Erased future from FutureRegistry [18:01:40.933] result() for ClusterFuture ... [18:01:40.933] - result already collected: FutureResult [18:01:40.933] result() for ClusterFuture ... done [18:01:40.934] receiveMessageFromWorker() for ClusterFuture ... done [18:01:40.940] receiveMessageFromWorker() for ClusterFuture ... [18:01:40.941] - Validating connection of MultisessionFuture [18:01:40.941] - received message: FutureResult [18:01:40.941] - Received FutureResult [18:01:40.941] - Erased future from FutureRegistry [18:01:40.941] result() for ClusterFuture ... [18:01:40.942] - result already collected: FutureResult [18:01:40.942] result() for ClusterFuture ... done [18:01:40.942] 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" "" ... [18:01:40.944] resolve() on list ... [18:01:40.945] recursive: 0 [18:01:40.945] length: 6 [18:01:40.945] elements: 'a', 'b', 'c', '', '', '' [18:01:40.945] signalConditionsASAP(numeric, pos=1) ... [18:01:40.945] - nx: 6 [18:01:40.945] - relay: TRUE [18:01:40.946] - stdout: TRUE [18:01:40.946] - signal: TRUE [18:01:40.946] - resignal: FALSE [18:01:40.946] - force: TRUE [18:01:40.946] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.946] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.947] - until=2 [18:01:40.947] - relaying element #2 [18:01:40.947] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.947] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.947] signalConditionsASAP(NULL, pos=1) ... done [18:01:40.947] length: 5 (resolved future 1) [18:01:40.948] Future #2 [18:01:40.948] result() for ClusterFuture ... [18:01:40.948] - result already collected: FutureResult [18:01:40.948] result() for ClusterFuture ... done [18:01:40.948] result() for ClusterFuture ... [18:01:40.948] - result already collected: FutureResult [18:01:40.949] result() for ClusterFuture ... done [18:01:40.949] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:40.949] - nx: 6 [18:01:40.949] - relay: TRUE [18:01:40.949] - stdout: TRUE [18:01:40.949] - signal: TRUE [18:01:40.949] - resignal: FALSE [18:01:40.950] - force: TRUE [18:01:40.950] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.950] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:40.950] - until=2 [18:01:40.950] - relaying element #2 [18:01:40.950] result() for ClusterFuture ... [18:01:40.951] - result already collected: FutureResult [18:01:40.951] result() for ClusterFuture ... done [18:01:40.951] result() for ClusterFuture ... [18:01:40.951] - result already collected: FutureResult [18:01:40.951] result() for ClusterFuture ... done [18:01:40.951] result() for ClusterFuture ... [18:01:40.952] - result already collected: FutureResult [18:01:40.952] result() for ClusterFuture ... done [18:01:40.952] result() for ClusterFuture ... [18:01:40.952] - result already collected: FutureResult [18:01:40.952] result() for ClusterFuture ... done [18:01:40.952] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.953] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.953] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:40.953] length: 4 (resolved future 2) [18:01:40.953] Future #3 [18:01:40.953] result() for ClusterFuture ... [18:01:40.953] - result already collected: FutureResult [18:01:40.954] result() for ClusterFuture ... done [18:01:40.954] result() for ClusterFuture ... [18:01:40.954] - result already collected: FutureResult [18:01:40.954] result() for ClusterFuture ... done [18:01:40.954] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:40.954] - nx: 6 [18:01:40.955] - relay: TRUE [18:01:40.955] - stdout: TRUE [18:01:40.955] - signal: TRUE [18:01:40.955] - resignal: FALSE [18:01:40.955] - force: TRUE [18:01:40.955] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.955] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:40.956] - until=3 [18:01:40.956] - relaying element #3 [18:01:40.956] result() for ClusterFuture ... [18:01:40.956] - result already collected: FutureResult [18:01:40.956] result() for ClusterFuture ... done [18:01:40.956] result() for ClusterFuture ... [18:01:40.957] - result already collected: FutureResult [18:01:40.957] result() for ClusterFuture ... done [18:01:40.957] result() for ClusterFuture ... [18:01:40.957] - result already collected: FutureResult [18:01:40.957] result() for ClusterFuture ... done [18:01:40.957] result() for ClusterFuture ... [18:01:40.958] - result already collected: FutureResult [18:01:40.958] result() for ClusterFuture ... done [18:01:40.958] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.958] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.958] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:40.958] length: 3 (resolved future 3) [18:01:40.959] signalConditionsASAP(NULL, pos=4) ... [18:01:40.959] - nx: 6 [18:01:40.959] - relay: TRUE [18:01:40.959] - stdout: TRUE [18:01:40.959] - signal: TRUE [18:01:40.959] - resignal: FALSE [18:01:40.959] - force: TRUE [18:01:40.960] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.960] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.960] - until=5 [18:01:40.960] - relaying element #5 [18:01:40.960] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.960] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.961] signalConditionsASAP(NULL, pos=4) ... done [18:01:40.961] length: 2 (resolved future 4) [18:01:40.961] signalConditionsASAP(NULL, pos=5) ... [18:01:40.961] - nx: 6 [18:01:40.961] - relay: TRUE [18:01:40.961] - stdout: TRUE [18:01:40.962] - signal: TRUE [18:01:40.962] - resignal: FALSE [18:01:40.962] - force: TRUE [18:01:40.962] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:40.962] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.962] - until=6 [18:01:40.962] - relaying element #6 [18:01:40.963] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.963] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.963] signalConditionsASAP(NULL, pos=5) ... done [18:01:40.963] length: 1 (resolved future 5) [18:01:40.963] signalConditionsASAP(numeric, pos=6) ... [18:01:40.963] - nx: 6 [18:01:40.964] - relay: TRUE [18:01:40.964] - stdout: TRUE [18:01:40.964] - signal: TRUE [18:01:40.964] - resignal: FALSE [18:01:40.964] - force: TRUE [18:01:40.964] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:40.964] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.965] - until=6 [18:01:40.965] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.965] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.965] signalConditionsASAP(numeric, pos=6) ... done [18:01:40.965] length: 0 (resolved future 6) [18:01:40.965] Relaying remaining futures [18:01:40.966] signalConditionsASAP(NULL, pos=0) ... [18:01:40.966] - nx: 6 [18:01:40.966] - relay: TRUE [18:01:40.966] - stdout: TRUE [18:01:40.966] - signal: TRUE [18:01:40.966] - resignal: FALSE [18:01:40.966] - force: TRUE [18:01:40.967] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.967] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE - flush all [18:01:40.967] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:40.967] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:40.967] signalConditionsASAP(NULL, pos=0) ... done [18:01:40.968] resolve() on list ... DONE [18:01:40.968] result() for ClusterFuture ... [18:01:40.968] - result already collected: FutureResult [18:01:40.968] result() for ClusterFuture ... done [18:01:40.968] result() for ClusterFuture ... [18:01:40.968] - result already collected: FutureResult [18:01:40.968] result() for ClusterFuture ... done [18:01:40.969] result() for ClusterFuture ... [18:01:40.969] - result already collected: FutureResult [18:01:40.969] result() for ClusterFuture ... done [18:01:40.969] result() for ClusterFuture ... [18:01:40.969] - result already collected: FutureResult [18:01:40.969] 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 [18:01:40.974] plan(): Setting new future strategy stack: [18:01:40.974] List of future strategies: [18:01:40.974] 1. multisession: [18:01:40.974] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:40.974] - tweaked: FALSE [18:01:40.974] - call: plan(strategy) [18:01:40.975] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:01:40.975] multisession: [18:01:40.975] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:40.975] - tweaked: FALSE [18:01:40.975] - call: plan(strategy) [18:01:40.978] getGlobalsAndPackages() ... [18:01:40.978] Not searching for globals [18:01:40.978] - globals: [0] [18:01:40.978] getGlobalsAndPackages() ... DONE [18:01:40.979] [local output] makeClusterPSOCK() ... [18:01:40.979] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:01:40.982] [local output] Base port: 35654 [18:01:40.982] [local output] Getting setup options for 2 cluster nodes ... [18:01:40.982] [local output] - Node 1 of 2 ... [18:01:40.983] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:40.984] [local output] Rscript port: 35654 [18:01:40.985] [local output] - Node 2 of 2 ... [18:01:40.985] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:40.987] [local output] Rscript port: 35654 [18:01:40.987] [local output] Getting setup options for 2 cluster nodes ... done [18:01:40.987] [local output] - Parallel setup requested for some PSOCK nodes [18:01:40.988] [local output] Setting up PSOCK nodes in parallel [18:01:40.988] List of 36 [18:01:40.988] $ worker : chr "localhost" [18:01:40.988] ..- attr(*, "localhost")= logi TRUE [18:01:40.988] $ master : chr "localhost" [18:01:40.988] $ port : int 35654 [18:01:40.988] $ connectTimeout : num 120 [18:01:40.988] $ timeout : num 120 [18:01:40.988] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:01:40.988] $ homogeneous : logi TRUE [18:01:40.988] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=futures.R:202876:CRANWIN3:CRAN\""| __truncated__ [18:01:40.988] $ rscript_envs : NULL [18:01:40.988] $ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:40.988] $ rscript_startup : NULL [18:01:40.988] $ rscript_sh : chr "cmd" [18:01:40.988] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:40.988] $ methods : logi TRUE [18:01:40.988] $ socketOptions : chr "no-delay" [18:01:40.988] $ useXDR : logi FALSE [18:01:40.988] $ outfile : chr "/dev/null" [18:01:40.988] $ renice : int NA [18:01:40.988] $ rshcmd : NULL [18:01:40.988] $ user : chr(0) [18:01:40.988] $ revtunnel : logi FALSE [18:01:40.988] $ rshlogfile : NULL [18:01:40.988] $ rshopts : chr(0) [18:01:40.988] $ rank : int 1 [18:01:40.988] $ manual : logi FALSE [18:01:40.988] $ dryrun : logi FALSE [18:01:40.988] $ quiet : logi FALSE [18:01:40.988] $ setup_strategy : chr "parallel" [18:01:40.988] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:40.988] $ pidfile : chr "D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187c2e5e77b1.pid" [18:01:40.988] $ rshcmd_label : NULL [18:01:40.988] $ rsh_call : NULL [18:01:40.988] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:40.988] $ localMachine : logi TRUE [18:01:40.988] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:01:40.988] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:01:40.988] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:01:40.988] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:01:40.988] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:01:40.988] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [18:01:40.988] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:01:40.988] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:01:40.988] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:01:40.988] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:01:40.988] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:01:40.988] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:01:40.988] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:01:40.988] $ arguments :List of 28 [18:01:40.988] ..$ worker : chr "localhost" [18:01:40.988] ..$ master : NULL [18:01:40.988] ..$ port : int 35654 [18:01:40.988] ..$ connectTimeout : num 120 [18:01:40.988] ..$ timeout : num 120 [18:01:40.988] ..$ rscript : NULL [18:01:40.988] ..$ homogeneous : NULL [18:01:40.988] ..$ rscript_args : NULL [18:01:40.988] ..$ rscript_envs : NULL [18:01:40.988] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:40.988] ..$ rscript_startup : NULL [18:01:40.988] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [18:01:40.988] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:40.988] ..$ methods : logi TRUE [18:01:40.988] ..$ socketOptions : chr "no-delay" [18:01:40.988] ..$ useXDR : logi FALSE [18:01:40.988] ..$ outfile : chr "/dev/null" [18:01:40.988] ..$ renice : int NA [18:01:40.988] ..$ rshcmd : NULL [18:01:40.988] ..$ user : NULL [18:01:40.988] ..$ revtunnel : logi NA [18:01:40.988] ..$ rshlogfile : NULL [18:01:40.988] ..$ rshopts : NULL [18:01:40.988] ..$ rank : int 1 [18:01:40.988] ..$ manual : logi FALSE [18:01:40.988] ..$ dryrun : logi FALSE [18:01:40.988] ..$ quiet : logi FALSE [18:01:40.988] ..$ setup_strategy : chr "parallel" [18:01:40.988] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:01:41.011] [local output] System call to launch all workers: [18:01:41.011] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=futures.R:202876:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187c2e5e77b1.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=35654 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:01:41.011] [local output] Starting PSOCK main server [18:01:41.020] [local output] Workers launched [18:01:41.020] [local output] Waiting for workers to connect back [18:01:41.020] - [local output] 0 workers out of 2 ready [18:01:41.190] - [local output] 0 workers out of 2 ready [18:01:41.191] - [local output] 1 workers out of 2 ready [18:01:41.191] - [local output] 2 workers out of 2 ready [18:01:41.191] [local output] Launching of workers completed [18:01:41.192] [local output] Collecting session information from workers [18:01:41.192] [local output] - Worker #1 of 2 [18:01:41.193] [local output] - Worker #2 of 2 [18:01:41.193] [local output] makeClusterPSOCK() ... done [18:01:41.205] Packages needed by the future expression (n = 0): [18:01:41.206] Packages needed by future strategies (n = 0): [18:01:41.206] { [18:01:41.206] { [18:01:41.206] { [18:01:41.206] ...future.startTime <- base::Sys.time() [18:01:41.206] { [18:01:41.206] { [18:01:41.206] { [18:01:41.206] { [18:01:41.206] base::local({ [18:01:41.206] has_future <- base::requireNamespace("future", [18:01:41.206] quietly = TRUE) [18:01:41.206] if (has_future) { [18:01:41.206] ns <- base::getNamespace("future") [18:01:41.206] version <- ns[[".package"]][["version"]] [18:01:41.206] if (is.null(version)) [18:01:41.206] version <- utils::packageVersion("future") [18:01:41.206] } [18:01:41.206] else { [18:01:41.206] version <- NULL [18:01:41.206] } [18:01:41.206] if (!has_future || version < "1.8.0") { [18:01:41.206] info <- base::c(r_version = base::gsub("R version ", [18:01:41.206] "", base::R.version$version.string), [18:01:41.206] platform = base::sprintf("%s (%s-bit)", [18:01:41.206] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.206] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.206] "release", "version")], collapse = " "), [18:01:41.206] hostname = base::Sys.info()[["nodename"]]) [18:01:41.206] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.206] info) [18:01:41.206] info <- base::paste(info, collapse = "; ") [18:01:41.206] if (!has_future) { [18:01:41.206] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.206] info) [18:01:41.206] } [18:01:41.206] else { [18:01:41.206] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.206] info, version) [18:01:41.206] } [18:01:41.206] base::stop(msg) [18:01:41.206] } [18:01:41.206] }) [18:01:41.206] } [18:01:41.206] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.206] base::options(mc.cores = 1L) [18:01:41.206] } [18:01:41.206] options(future.plan = NULL) [18:01:41.206] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.206] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.206] } [18:01:41.206] ...future.workdir <- getwd() [18:01:41.206] } [18:01:41.206] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.206] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.206] } [18:01:41.206] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.206] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.206] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.206] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.206] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.206] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.206] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.206] base::names(...future.oldOptions)) [18:01:41.206] } [18:01:41.206] if (FALSE) { [18:01:41.206] } [18:01:41.206] else { [18:01:41.206] if (TRUE) { [18:01:41.206] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.206] open = "w") [18:01:41.206] } [18:01:41.206] else { [18:01:41.206] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.206] windows = "NUL", "/dev/null"), open = "w") [18:01:41.206] } [18:01:41.206] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.206] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.206] base::sink(type = "output", split = FALSE) [18:01:41.206] base::close(...future.stdout) [18:01:41.206] }, add = TRUE) [18:01:41.206] } [18:01:41.206] ...future.frame <- base::sys.nframe() [18:01:41.206] ...future.conditions <- base::list() [18:01:41.206] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.206] if (FALSE) { [18:01:41.206] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.206] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.206] } [18:01:41.206] ...future.result <- base::tryCatch({ [18:01:41.206] base::withCallingHandlers({ [18:01:41.206] ...future.value <- base::withVisible(base::local({ [18:01:41.206] ...future.makeSendCondition <- local({ [18:01:41.206] sendCondition <- NULL [18:01:41.206] function(frame = 1L) { [18:01:41.206] if (is.function(sendCondition)) [18:01:41.206] return(sendCondition) [18:01:41.206] ns <- getNamespace("parallel") [18:01:41.206] if (exists("sendData", mode = "function", [18:01:41.206] envir = ns)) { [18:01:41.206] parallel_sendData <- get("sendData", mode = "function", [18:01:41.206] envir = ns) [18:01:41.206] envir <- sys.frame(frame) [18:01:41.206] master <- NULL [18:01:41.206] while (!identical(envir, .GlobalEnv) && [18:01:41.206] !identical(envir, emptyenv())) { [18:01:41.206] if (exists("master", mode = "list", envir = envir, [18:01:41.206] inherits = FALSE)) { [18:01:41.206] master <- get("master", mode = "list", [18:01:41.206] envir = envir, inherits = FALSE) [18:01:41.206] if (inherits(master, c("SOCKnode", [18:01:41.206] "SOCK0node"))) { [18:01:41.206] sendCondition <<- function(cond) { [18:01:41.206] data <- list(type = "VALUE", value = cond, [18:01:41.206] success = TRUE) [18:01:41.206] parallel_sendData(master, data) [18:01:41.206] } [18:01:41.206] return(sendCondition) [18:01:41.206] } [18:01:41.206] } [18:01:41.206] frame <- frame + 1L [18:01:41.206] envir <- sys.frame(frame) [18:01:41.206] } [18:01:41.206] } [18:01:41.206] sendCondition <<- function(cond) NULL [18:01:41.206] } [18:01:41.206] }) [18:01:41.206] withCallingHandlers({ [18:01:41.206] NA [18:01:41.206] }, immediateCondition = function(cond) { [18:01:41.206] sendCondition <- ...future.makeSendCondition() [18:01:41.206] sendCondition(cond) [18:01:41.206] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.206] { [18:01:41.206] inherits <- base::inherits [18:01:41.206] invokeRestart <- base::invokeRestart [18:01:41.206] is.null <- base::is.null [18:01:41.206] muffled <- FALSE [18:01:41.206] if (inherits(cond, "message")) { [18:01:41.206] muffled <- grepl(pattern, "muffleMessage") [18:01:41.206] if (muffled) [18:01:41.206] invokeRestart("muffleMessage") [18:01:41.206] } [18:01:41.206] else if (inherits(cond, "warning")) { [18:01:41.206] muffled <- grepl(pattern, "muffleWarning") [18:01:41.206] if (muffled) [18:01:41.206] invokeRestart("muffleWarning") [18:01:41.206] } [18:01:41.206] else if (inherits(cond, "condition")) { [18:01:41.206] if (!is.null(pattern)) { [18:01:41.206] computeRestarts <- base::computeRestarts [18:01:41.206] grepl <- base::grepl [18:01:41.206] restarts <- computeRestarts(cond) [18:01:41.206] for (restart in restarts) { [18:01:41.206] name <- restart$name [18:01:41.206] if (is.null(name)) [18:01:41.206] next [18:01:41.206] if (!grepl(pattern, name)) [18:01:41.206] next [18:01:41.206] invokeRestart(restart) [18:01:41.206] muffled <- TRUE [18:01:41.206] break [18:01:41.206] } [18:01:41.206] } [18:01:41.206] } [18:01:41.206] invisible(muffled) [18:01:41.206] } [18:01:41.206] muffleCondition(cond) [18:01:41.206] }) [18:01:41.206] })) [18:01:41.206] future::FutureResult(value = ...future.value$value, [18:01:41.206] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.206] ...future.rng), globalenv = if (FALSE) [18:01:41.206] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.206] ...future.globalenv.names)) [18:01:41.206] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.206] }, condition = base::local({ [18:01:41.206] c <- base::c [18:01:41.206] inherits <- base::inherits [18:01:41.206] invokeRestart <- base::invokeRestart [18:01:41.206] length <- base::length [18:01:41.206] list <- base::list [18:01:41.206] seq.int <- base::seq.int [18:01:41.206] signalCondition <- base::signalCondition [18:01:41.206] sys.calls <- base::sys.calls [18:01:41.206] `[[` <- base::`[[` [18:01:41.206] `+` <- base::`+` [18:01:41.206] `<<-` <- base::`<<-` [18:01:41.206] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.206] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.206] 3L)] [18:01:41.206] } [18:01:41.206] function(cond) { [18:01:41.206] is_error <- inherits(cond, "error") [18:01:41.206] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.206] NULL) [18:01:41.206] if (is_error) { [18:01:41.206] sessionInformation <- function() { [18:01:41.206] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.206] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.206] search = base::search(), system = base::Sys.info()) [18:01:41.206] } [18:01:41.206] ...future.conditions[[length(...future.conditions) + [18:01:41.206] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.206] cond$call), session = sessionInformation(), [18:01:41.206] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.206] signalCondition(cond) [18:01:41.206] } [18:01:41.206] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.206] "immediateCondition"))) { [18:01:41.206] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.206] ...future.conditions[[length(...future.conditions) + [18:01:41.206] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.206] if (TRUE && !signal) { [18:01:41.206] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.206] { [18:01:41.206] inherits <- base::inherits [18:01:41.206] invokeRestart <- base::invokeRestart [18:01:41.206] is.null <- base::is.null [18:01:41.206] muffled <- FALSE [18:01:41.206] if (inherits(cond, "message")) { [18:01:41.206] muffled <- grepl(pattern, "muffleMessage") [18:01:41.206] if (muffled) [18:01:41.206] invokeRestart("muffleMessage") [18:01:41.206] } [18:01:41.206] else if (inherits(cond, "warning")) { [18:01:41.206] muffled <- grepl(pattern, "muffleWarning") [18:01:41.206] if (muffled) [18:01:41.206] invokeRestart("muffleWarning") [18:01:41.206] } [18:01:41.206] else if (inherits(cond, "condition")) { [18:01:41.206] if (!is.null(pattern)) { [18:01:41.206] computeRestarts <- base::computeRestarts [18:01:41.206] grepl <- base::grepl [18:01:41.206] restarts <- computeRestarts(cond) [18:01:41.206] for (restart in restarts) { [18:01:41.206] name <- restart$name [18:01:41.206] if (is.null(name)) [18:01:41.206] next [18:01:41.206] if (!grepl(pattern, name)) [18:01:41.206] next [18:01:41.206] invokeRestart(restart) [18:01:41.206] muffled <- TRUE [18:01:41.206] break [18:01:41.206] } [18:01:41.206] } [18:01:41.206] } [18:01:41.206] invisible(muffled) [18:01:41.206] } [18:01:41.206] muffleCondition(cond, pattern = "^muffle") [18:01:41.206] } [18:01:41.206] } [18:01:41.206] else { [18:01:41.206] if (TRUE) { [18:01:41.206] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.206] { [18:01:41.206] inherits <- base::inherits [18:01:41.206] invokeRestart <- base::invokeRestart [18:01:41.206] is.null <- base::is.null [18:01:41.206] muffled <- FALSE [18:01:41.206] if (inherits(cond, "message")) { [18:01:41.206] muffled <- grepl(pattern, "muffleMessage") [18:01:41.206] if (muffled) [18:01:41.206] invokeRestart("muffleMessage") [18:01:41.206] } [18:01:41.206] else if (inherits(cond, "warning")) { [18:01:41.206] muffled <- grepl(pattern, "muffleWarning") [18:01:41.206] if (muffled) [18:01:41.206] invokeRestart("muffleWarning") [18:01:41.206] } [18:01:41.206] else if (inherits(cond, "condition")) { [18:01:41.206] if (!is.null(pattern)) { [18:01:41.206] computeRestarts <- base::computeRestarts [18:01:41.206] grepl <- base::grepl [18:01:41.206] restarts <- computeRestarts(cond) [18:01:41.206] for (restart in restarts) { [18:01:41.206] name <- restart$name [18:01:41.206] if (is.null(name)) [18:01:41.206] next [18:01:41.206] if (!grepl(pattern, name)) [18:01:41.206] next [18:01:41.206] invokeRestart(restart) [18:01:41.206] muffled <- TRUE [18:01:41.206] break [18:01:41.206] } [18:01:41.206] } [18:01:41.206] } [18:01:41.206] invisible(muffled) [18:01:41.206] } [18:01:41.206] muffleCondition(cond, pattern = "^muffle") [18:01:41.206] } [18:01:41.206] } [18:01:41.206] } [18:01:41.206] })) [18:01:41.206] }, error = function(ex) { [18:01:41.206] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.206] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.206] ...future.rng), started = ...future.startTime, [18:01:41.206] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.206] version = "1.8"), class = "FutureResult") [18:01:41.206] }, finally = { [18:01:41.206] if (!identical(...future.workdir, getwd())) [18:01:41.206] setwd(...future.workdir) [18:01:41.206] { [18:01:41.206] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.206] ...future.oldOptions$nwarnings <- NULL [18:01:41.206] } [18:01:41.206] base::options(...future.oldOptions) [18:01:41.206] if (.Platform$OS.type == "windows") { [18:01:41.206] old_names <- names(...future.oldEnvVars) [18:01:41.206] envs <- base::Sys.getenv() [18:01:41.206] names <- names(envs) [18:01:41.206] common <- intersect(names, old_names) [18:01:41.206] added <- setdiff(names, old_names) [18:01:41.206] removed <- setdiff(old_names, names) [18:01:41.206] changed <- common[...future.oldEnvVars[common] != [18:01:41.206] envs[common]] [18:01:41.206] NAMES <- toupper(changed) [18:01:41.206] args <- list() [18:01:41.206] for (kk in seq_along(NAMES)) { [18:01:41.206] name <- changed[[kk]] [18:01:41.206] NAME <- NAMES[[kk]] [18:01:41.206] if (name != NAME && is.element(NAME, old_names)) [18:01:41.206] next [18:01:41.206] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.206] } [18:01:41.206] NAMES <- toupper(added) [18:01:41.206] for (kk in seq_along(NAMES)) { [18:01:41.206] name <- added[[kk]] [18:01:41.206] NAME <- NAMES[[kk]] [18:01:41.206] if (name != NAME && is.element(NAME, old_names)) [18:01:41.206] next [18:01:41.206] args[[name]] <- "" [18:01:41.206] } [18:01:41.206] NAMES <- toupper(removed) [18:01:41.206] for (kk in seq_along(NAMES)) { [18:01:41.206] name <- removed[[kk]] [18:01:41.206] NAME <- NAMES[[kk]] [18:01:41.206] if (name != NAME && is.element(NAME, old_names)) [18:01:41.206] next [18:01:41.206] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.206] } [18:01:41.206] if (length(args) > 0) [18:01:41.206] base::do.call(base::Sys.setenv, args = args) [18:01:41.206] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.206] } [18:01:41.206] else { [18:01:41.206] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.206] } [18:01:41.206] { [18:01:41.206] if (base::length(...future.futureOptionsAdded) > [18:01:41.206] 0L) { [18:01:41.206] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.206] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.206] base::options(opts) [18:01:41.206] } [18:01:41.206] { [18:01:41.206] { [18:01:41.206] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.206] NULL [18:01:41.206] } [18:01:41.206] options(future.plan = NULL) [18:01:41.206] if (is.na(NA_character_)) [18:01:41.206] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.206] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.206] future::plan(list(function (..., workers = availableCores(), [18:01:41.206] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.206] envir = parent.frame()) [18:01:41.206] { [18:01:41.206] if (is.function(workers)) [18:01:41.206] workers <- workers() [18:01:41.206] workers <- structure(as.integer(workers), [18:01:41.206] class = class(workers)) [18:01:41.206] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.206] workers >= 1) [18:01:41.206] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.206] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.206] } [18:01:41.206] future <- MultisessionFuture(..., workers = workers, [18:01:41.206] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.206] envir = envir) [18:01:41.206] if (!future$lazy) [18:01:41.206] future <- run(future) [18:01:41.206] invisible(future) [18:01:41.206] }), .cleanup = FALSE, .init = FALSE) [18:01:41.206] } [18:01:41.206] } [18:01:41.206] } [18:01:41.206] }) [18:01:41.206] if (TRUE) { [18:01:41.206] base::sink(type = "output", split = FALSE) [18:01:41.206] if (TRUE) { [18:01:41.206] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.206] } [18:01:41.206] else { [18:01:41.206] ...future.result["stdout"] <- base::list(NULL) [18:01:41.206] } [18:01:41.206] base::close(...future.stdout) [18:01:41.206] ...future.stdout <- NULL [18:01:41.206] } [18:01:41.206] ...future.result$conditions <- ...future.conditions [18:01:41.206] ...future.result$finished <- base::Sys.time() [18:01:41.206] ...future.result [18:01:41.206] } [18:01:41.292] MultisessionFuture started [18:01:41.292] result() for ClusterFuture ... [18:01:41.293] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.293] - Validating connection of MultisessionFuture [18:01:41.351] - received message: FutureResult [18:01:41.351] - Received FutureResult [18:01:41.352] - Erased future from FutureRegistry [18:01:41.352] result() for ClusterFuture ... [18:01:41.352] - result already collected: FutureResult [18:01:41.352] result() for ClusterFuture ... done [18:01:41.352] receiveMessageFromWorker() for ClusterFuture ... done [18:01:41.352] result() for ClusterFuture ... done [18:01:41.353] result() for ClusterFuture ... [18:01:41.353] - result already collected: FutureResult [18:01:41.353] result() for ClusterFuture ... done [18:01:41.353] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:01:41.356] plan(): nbrOfWorkers() = 2 Dimensions: NULL [18:01:41.356] getGlobalsAndPackages() ... [18:01:41.356] Searching for globals... [18:01:41.357] [18:01:41.357] Searching for globals ... DONE [18:01:41.357] - globals: [0] [18:01:41.357] getGlobalsAndPackages() ... DONE [18:01:41.358] run() for 'Future' ... [18:01:41.358] - state: 'created' [18:01:41.358] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.373] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.373] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.373] - Field: 'node' [18:01:41.373] - Field: 'label' [18:01:41.373] - Field: 'local' [18:01:41.374] - Field: 'owner' [18:01:41.374] - Field: 'envir' [18:01:41.374] - Field: 'workers' [18:01:41.374] - Field: 'packages' [18:01:41.374] - Field: 'gc' [18:01:41.374] - Field: 'conditions' [18:01:41.375] - Field: 'persistent' [18:01:41.375] - Field: 'expr' [18:01:41.375] - Field: 'uuid' [18:01:41.375] - Field: 'seed' [18:01:41.375] - Field: 'version' [18:01:41.376] - Field: 'result' [18:01:41.376] - Field: 'asynchronous' [18:01:41.376] - Field: 'calls' [18:01:41.376] - Field: 'globals' [18:01:41.376] - Field: 'stdout' [18:01:41.376] - Field: 'earlySignal' [18:01:41.377] - Field: 'lazy' [18:01:41.377] - Field: 'state' [18:01:41.377] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.377] - Launch lazy future ... [18:01:41.378] Packages needed by the future expression (n = 0): [18:01:41.378] Packages needed by future strategies (n = 0): [18:01:41.378] { [18:01:41.378] { [18:01:41.378] { [18:01:41.378] ...future.startTime <- base::Sys.time() [18:01:41.378] { [18:01:41.378] { [18:01:41.378] { [18:01:41.378] { [18:01:41.378] base::local({ [18:01:41.378] has_future <- base::requireNamespace("future", [18:01:41.378] quietly = TRUE) [18:01:41.378] if (has_future) { [18:01:41.378] ns <- base::getNamespace("future") [18:01:41.378] version <- ns[[".package"]][["version"]] [18:01:41.378] if (is.null(version)) [18:01:41.378] version <- utils::packageVersion("future") [18:01:41.378] } [18:01:41.378] else { [18:01:41.378] version <- NULL [18:01:41.378] } [18:01:41.378] if (!has_future || version < "1.8.0") { [18:01:41.378] info <- base::c(r_version = base::gsub("R version ", [18:01:41.378] "", base::R.version$version.string), [18:01:41.378] platform = base::sprintf("%s (%s-bit)", [18:01:41.378] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.378] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.378] "release", "version")], collapse = " "), [18:01:41.378] hostname = base::Sys.info()[["nodename"]]) [18:01:41.378] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.378] info) [18:01:41.378] info <- base::paste(info, collapse = "; ") [18:01:41.378] if (!has_future) { [18:01:41.378] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.378] info) [18:01:41.378] } [18:01:41.378] else { [18:01:41.378] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.378] info, version) [18:01:41.378] } [18:01:41.378] base::stop(msg) [18:01:41.378] } [18:01:41.378] }) [18:01:41.378] } [18:01:41.378] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.378] base::options(mc.cores = 1L) [18:01:41.378] } [18:01:41.378] options(future.plan = NULL) [18:01:41.378] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.378] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.378] } [18:01:41.378] ...future.workdir <- getwd() [18:01:41.378] } [18:01:41.378] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.378] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.378] } [18:01:41.378] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.378] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.378] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.378] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.378] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.378] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.378] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.378] base::names(...future.oldOptions)) [18:01:41.378] } [18:01:41.378] if (FALSE) { [18:01:41.378] } [18:01:41.378] else { [18:01:41.378] if (TRUE) { [18:01:41.378] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.378] open = "w") [18:01:41.378] } [18:01:41.378] else { [18:01:41.378] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.378] windows = "NUL", "/dev/null"), open = "w") [18:01:41.378] } [18:01:41.378] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.378] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.378] base::sink(type = "output", split = FALSE) [18:01:41.378] base::close(...future.stdout) [18:01:41.378] }, add = TRUE) [18:01:41.378] } [18:01:41.378] ...future.frame <- base::sys.nframe() [18:01:41.378] ...future.conditions <- base::list() [18:01:41.378] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.378] if (FALSE) { [18:01:41.378] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.378] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.378] } [18:01:41.378] ...future.result <- base::tryCatch({ [18:01:41.378] base::withCallingHandlers({ [18:01:41.378] ...future.value <- base::withVisible(base::local({ [18:01:41.378] ...future.makeSendCondition <- local({ [18:01:41.378] sendCondition <- NULL [18:01:41.378] function(frame = 1L) { [18:01:41.378] if (is.function(sendCondition)) [18:01:41.378] return(sendCondition) [18:01:41.378] ns <- getNamespace("parallel") [18:01:41.378] if (exists("sendData", mode = "function", [18:01:41.378] envir = ns)) { [18:01:41.378] parallel_sendData <- get("sendData", mode = "function", [18:01:41.378] envir = ns) [18:01:41.378] envir <- sys.frame(frame) [18:01:41.378] master <- NULL [18:01:41.378] while (!identical(envir, .GlobalEnv) && [18:01:41.378] !identical(envir, emptyenv())) { [18:01:41.378] if (exists("master", mode = "list", envir = envir, [18:01:41.378] inherits = FALSE)) { [18:01:41.378] master <- get("master", mode = "list", [18:01:41.378] envir = envir, inherits = FALSE) [18:01:41.378] if (inherits(master, c("SOCKnode", [18:01:41.378] "SOCK0node"))) { [18:01:41.378] sendCondition <<- function(cond) { [18:01:41.378] data <- list(type = "VALUE", value = cond, [18:01:41.378] success = TRUE) [18:01:41.378] parallel_sendData(master, data) [18:01:41.378] } [18:01:41.378] return(sendCondition) [18:01:41.378] } [18:01:41.378] } [18:01:41.378] frame <- frame + 1L [18:01:41.378] envir <- sys.frame(frame) [18:01:41.378] } [18:01:41.378] } [18:01:41.378] sendCondition <<- function(cond) NULL [18:01:41.378] } [18:01:41.378] }) [18:01:41.378] withCallingHandlers({ [18:01:41.378] 2 [18:01:41.378] }, immediateCondition = function(cond) { [18:01:41.378] sendCondition <- ...future.makeSendCondition() [18:01:41.378] sendCondition(cond) [18:01:41.378] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.378] { [18:01:41.378] inherits <- base::inherits [18:01:41.378] invokeRestart <- base::invokeRestart [18:01:41.378] is.null <- base::is.null [18:01:41.378] muffled <- FALSE [18:01:41.378] if (inherits(cond, "message")) { [18:01:41.378] muffled <- grepl(pattern, "muffleMessage") [18:01:41.378] if (muffled) [18:01:41.378] invokeRestart("muffleMessage") [18:01:41.378] } [18:01:41.378] else if (inherits(cond, "warning")) { [18:01:41.378] muffled <- grepl(pattern, "muffleWarning") [18:01:41.378] if (muffled) [18:01:41.378] invokeRestart("muffleWarning") [18:01:41.378] } [18:01:41.378] else if (inherits(cond, "condition")) { [18:01:41.378] if (!is.null(pattern)) { [18:01:41.378] computeRestarts <- base::computeRestarts [18:01:41.378] grepl <- base::grepl [18:01:41.378] restarts <- computeRestarts(cond) [18:01:41.378] for (restart in restarts) { [18:01:41.378] name <- restart$name [18:01:41.378] if (is.null(name)) [18:01:41.378] next [18:01:41.378] if (!grepl(pattern, name)) [18:01:41.378] next [18:01:41.378] invokeRestart(restart) [18:01:41.378] muffled <- TRUE [18:01:41.378] break [18:01:41.378] } [18:01:41.378] } [18:01:41.378] } [18:01:41.378] invisible(muffled) [18:01:41.378] } [18:01:41.378] muffleCondition(cond) [18:01:41.378] }) [18:01:41.378] })) [18:01:41.378] future::FutureResult(value = ...future.value$value, [18:01:41.378] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.378] ...future.rng), globalenv = if (FALSE) [18:01:41.378] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.378] ...future.globalenv.names)) [18:01:41.378] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.378] }, condition = base::local({ [18:01:41.378] c <- base::c [18:01:41.378] inherits <- base::inherits [18:01:41.378] invokeRestart <- base::invokeRestart [18:01:41.378] length <- base::length [18:01:41.378] list <- base::list [18:01:41.378] seq.int <- base::seq.int [18:01:41.378] signalCondition <- base::signalCondition [18:01:41.378] sys.calls <- base::sys.calls [18:01:41.378] `[[` <- base::`[[` [18:01:41.378] `+` <- base::`+` [18:01:41.378] `<<-` <- base::`<<-` [18:01:41.378] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.378] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.378] 3L)] [18:01:41.378] } [18:01:41.378] function(cond) { [18:01:41.378] is_error <- inherits(cond, "error") [18:01:41.378] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.378] NULL) [18:01:41.378] if (is_error) { [18:01:41.378] sessionInformation <- function() { [18:01:41.378] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.378] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.378] search = base::search(), system = base::Sys.info()) [18:01:41.378] } [18:01:41.378] ...future.conditions[[length(...future.conditions) + [18:01:41.378] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.378] cond$call), session = sessionInformation(), [18:01:41.378] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.378] signalCondition(cond) [18:01:41.378] } [18:01:41.378] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.378] "immediateCondition"))) { [18:01:41.378] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.378] ...future.conditions[[length(...future.conditions) + [18:01:41.378] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.378] if (TRUE && !signal) { [18:01:41.378] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.378] { [18:01:41.378] inherits <- base::inherits [18:01:41.378] invokeRestart <- base::invokeRestart [18:01:41.378] is.null <- base::is.null [18:01:41.378] muffled <- FALSE [18:01:41.378] if (inherits(cond, "message")) { [18:01:41.378] muffled <- grepl(pattern, "muffleMessage") [18:01:41.378] if (muffled) [18:01:41.378] invokeRestart("muffleMessage") [18:01:41.378] } [18:01:41.378] else if (inherits(cond, "warning")) { [18:01:41.378] muffled <- grepl(pattern, "muffleWarning") [18:01:41.378] if (muffled) [18:01:41.378] invokeRestart("muffleWarning") [18:01:41.378] } [18:01:41.378] else if (inherits(cond, "condition")) { [18:01:41.378] if (!is.null(pattern)) { [18:01:41.378] computeRestarts <- base::computeRestarts [18:01:41.378] grepl <- base::grepl [18:01:41.378] restarts <- computeRestarts(cond) [18:01:41.378] for (restart in restarts) { [18:01:41.378] name <- restart$name [18:01:41.378] if (is.null(name)) [18:01:41.378] next [18:01:41.378] if (!grepl(pattern, name)) [18:01:41.378] next [18:01:41.378] invokeRestart(restart) [18:01:41.378] muffled <- TRUE [18:01:41.378] break [18:01:41.378] } [18:01:41.378] } [18:01:41.378] } [18:01:41.378] invisible(muffled) [18:01:41.378] } [18:01:41.378] muffleCondition(cond, pattern = "^muffle") [18:01:41.378] } [18:01:41.378] } [18:01:41.378] else { [18:01:41.378] if (TRUE) { [18:01:41.378] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.378] { [18:01:41.378] inherits <- base::inherits [18:01:41.378] invokeRestart <- base::invokeRestart [18:01:41.378] is.null <- base::is.null [18:01:41.378] muffled <- FALSE [18:01:41.378] if (inherits(cond, "message")) { [18:01:41.378] muffled <- grepl(pattern, "muffleMessage") [18:01:41.378] if (muffled) [18:01:41.378] invokeRestart("muffleMessage") [18:01:41.378] } [18:01:41.378] else if (inherits(cond, "warning")) { [18:01:41.378] muffled <- grepl(pattern, "muffleWarning") [18:01:41.378] if (muffled) [18:01:41.378] invokeRestart("muffleWarning") [18:01:41.378] } [18:01:41.378] else if (inherits(cond, "condition")) { [18:01:41.378] if (!is.null(pattern)) { [18:01:41.378] computeRestarts <- base::computeRestarts [18:01:41.378] grepl <- base::grepl [18:01:41.378] restarts <- computeRestarts(cond) [18:01:41.378] for (restart in restarts) { [18:01:41.378] name <- restart$name [18:01:41.378] if (is.null(name)) [18:01:41.378] next [18:01:41.378] if (!grepl(pattern, name)) [18:01:41.378] next [18:01:41.378] invokeRestart(restart) [18:01:41.378] muffled <- TRUE [18:01:41.378] break [18:01:41.378] } [18:01:41.378] } [18:01:41.378] } [18:01:41.378] invisible(muffled) [18:01:41.378] } [18:01:41.378] muffleCondition(cond, pattern = "^muffle") [18:01:41.378] } [18:01:41.378] } [18:01:41.378] } [18:01:41.378] })) [18:01:41.378] }, error = function(ex) { [18:01:41.378] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.378] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.378] ...future.rng), started = ...future.startTime, [18:01:41.378] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.378] version = "1.8"), class = "FutureResult") [18:01:41.378] }, finally = { [18:01:41.378] if (!identical(...future.workdir, getwd())) [18:01:41.378] setwd(...future.workdir) [18:01:41.378] { [18:01:41.378] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.378] ...future.oldOptions$nwarnings <- NULL [18:01:41.378] } [18:01:41.378] base::options(...future.oldOptions) [18:01:41.378] if (.Platform$OS.type == "windows") { [18:01:41.378] old_names <- names(...future.oldEnvVars) [18:01:41.378] envs <- base::Sys.getenv() [18:01:41.378] names <- names(envs) [18:01:41.378] common <- intersect(names, old_names) [18:01:41.378] added <- setdiff(names, old_names) [18:01:41.378] removed <- setdiff(old_names, names) [18:01:41.378] changed <- common[...future.oldEnvVars[common] != [18:01:41.378] envs[common]] [18:01:41.378] NAMES <- toupper(changed) [18:01:41.378] args <- list() [18:01:41.378] for (kk in seq_along(NAMES)) { [18:01:41.378] name <- changed[[kk]] [18:01:41.378] NAME <- NAMES[[kk]] [18:01:41.378] if (name != NAME && is.element(NAME, old_names)) [18:01:41.378] next [18:01:41.378] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.378] } [18:01:41.378] NAMES <- toupper(added) [18:01:41.378] for (kk in seq_along(NAMES)) { [18:01:41.378] name <- added[[kk]] [18:01:41.378] NAME <- NAMES[[kk]] [18:01:41.378] if (name != NAME && is.element(NAME, old_names)) [18:01:41.378] next [18:01:41.378] args[[name]] <- "" [18:01:41.378] } [18:01:41.378] NAMES <- toupper(removed) [18:01:41.378] for (kk in seq_along(NAMES)) { [18:01:41.378] name <- removed[[kk]] [18:01:41.378] NAME <- NAMES[[kk]] [18:01:41.378] if (name != NAME && is.element(NAME, old_names)) [18:01:41.378] next [18:01:41.378] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.378] } [18:01:41.378] if (length(args) > 0) [18:01:41.378] base::do.call(base::Sys.setenv, args = args) [18:01:41.378] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.378] } [18:01:41.378] else { [18:01:41.378] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.378] } [18:01:41.378] { [18:01:41.378] if (base::length(...future.futureOptionsAdded) > [18:01:41.378] 0L) { [18:01:41.378] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.378] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.378] base::options(opts) [18:01:41.378] } [18:01:41.378] { [18:01:41.378] { [18:01:41.378] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.378] NULL [18:01:41.378] } [18:01:41.378] options(future.plan = NULL) [18:01:41.378] if (is.na(NA_character_)) [18:01:41.378] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.378] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.378] future::plan(list(function (..., workers = availableCores(), [18:01:41.378] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.378] envir = parent.frame()) [18:01:41.378] { [18:01:41.378] if (is.function(workers)) [18:01:41.378] workers <- workers() [18:01:41.378] workers <- structure(as.integer(workers), [18:01:41.378] class = class(workers)) [18:01:41.378] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.378] workers >= 1) [18:01:41.378] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.378] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.378] } [18:01:41.378] future <- MultisessionFuture(..., workers = workers, [18:01:41.378] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.378] envir = envir) [18:01:41.378] if (!future$lazy) [18:01:41.378] future <- run(future) [18:01:41.378] invisible(future) [18:01:41.378] }), .cleanup = FALSE, .init = FALSE) [18:01:41.378] } [18:01:41.378] } [18:01:41.378] } [18:01:41.378] }) [18:01:41.378] if (TRUE) { [18:01:41.378] base::sink(type = "output", split = FALSE) [18:01:41.378] if (TRUE) { [18:01:41.378] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.378] } [18:01:41.378] else { [18:01:41.378] ...future.result["stdout"] <- base::list(NULL) [18:01:41.378] } [18:01:41.378] base::close(...future.stdout) [18:01:41.378] ...future.stdout <- NULL [18:01:41.378] } [18:01:41.378] ...future.result$conditions <- ...future.conditions [18:01:41.378] ...future.result$finished <- base::Sys.time() [18:01:41.378] ...future.result [18:01:41.378] } [18:01:41.384] MultisessionFuture started [18:01:41.385] - Launch lazy future ... done [18:01:41.385] run() for 'MultisessionFuture' ... done [18:01:41.385] getGlobalsAndPackages() ... [18:01:41.385] Searching for globals... [18:01:41.386] [18:01:41.386] Searching for globals ... DONE [18:01:41.386] - globals: [0] [18:01:41.386] getGlobalsAndPackages() ... DONE [18:01:41.386] run() for 'Future' ... [18:01:41.387] - state: 'created' [18:01:41.387] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.403] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.403] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.404] - Field: 'node' [18:01:41.404] - Field: 'label' [18:01:41.404] - Field: 'local' [18:01:41.404] - Field: 'owner' [18:01:41.404] - Field: 'envir' [18:01:41.405] - Field: 'workers' [18:01:41.405] - Field: 'packages' [18:01:41.405] - Field: 'gc' [18:01:41.405] - Field: 'conditions' [18:01:41.405] - Field: 'persistent' [18:01:41.406] - Field: 'expr' [18:01:41.406] - Field: 'uuid' [18:01:41.406] - Field: 'seed' [18:01:41.406] - Field: 'version' [18:01:41.406] - Field: 'result' [18:01:41.406] - Field: 'asynchronous' [18:01:41.407] - Field: 'calls' [18:01:41.407] - Field: 'globals' [18:01:41.407] - Field: 'stdout' [18:01:41.407] - Field: 'earlySignal' [18:01:41.407] - Field: 'lazy' [18:01:41.408] - Field: 'state' [18:01:41.408] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.408] - Launch lazy future ... [18:01:41.408] Packages needed by the future expression (n = 0): [18:01:41.409] Packages needed by future strategies (n = 0): [18:01:41.409] { [18:01:41.409] { [18:01:41.409] { [18:01:41.409] ...future.startTime <- base::Sys.time() [18:01:41.409] { [18:01:41.409] { [18:01:41.409] { [18:01:41.409] { [18:01:41.409] base::local({ [18:01:41.409] has_future <- base::requireNamespace("future", [18:01:41.409] quietly = TRUE) [18:01:41.409] if (has_future) { [18:01:41.409] ns <- base::getNamespace("future") [18:01:41.409] version <- ns[[".package"]][["version"]] [18:01:41.409] if (is.null(version)) [18:01:41.409] version <- utils::packageVersion("future") [18:01:41.409] } [18:01:41.409] else { [18:01:41.409] version <- NULL [18:01:41.409] } [18:01:41.409] if (!has_future || version < "1.8.0") { [18:01:41.409] info <- base::c(r_version = base::gsub("R version ", [18:01:41.409] "", base::R.version$version.string), [18:01:41.409] platform = base::sprintf("%s (%s-bit)", [18:01:41.409] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.409] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.409] "release", "version")], collapse = " "), [18:01:41.409] hostname = base::Sys.info()[["nodename"]]) [18:01:41.409] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.409] info) [18:01:41.409] info <- base::paste(info, collapse = "; ") [18:01:41.409] if (!has_future) { [18:01:41.409] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.409] info) [18:01:41.409] } [18:01:41.409] else { [18:01:41.409] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.409] info, version) [18:01:41.409] } [18:01:41.409] base::stop(msg) [18:01:41.409] } [18:01:41.409] }) [18:01:41.409] } [18:01:41.409] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.409] base::options(mc.cores = 1L) [18:01:41.409] } [18:01:41.409] options(future.plan = NULL) [18:01:41.409] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.409] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.409] } [18:01:41.409] ...future.workdir <- getwd() [18:01:41.409] } [18:01:41.409] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.409] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.409] } [18:01:41.409] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.409] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.409] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.409] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.409] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.409] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.409] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.409] base::names(...future.oldOptions)) [18:01:41.409] } [18:01:41.409] if (FALSE) { [18:01:41.409] } [18:01:41.409] else { [18:01:41.409] if (TRUE) { [18:01:41.409] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.409] open = "w") [18:01:41.409] } [18:01:41.409] else { [18:01:41.409] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.409] windows = "NUL", "/dev/null"), open = "w") [18:01:41.409] } [18:01:41.409] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.409] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.409] base::sink(type = "output", split = FALSE) [18:01:41.409] base::close(...future.stdout) [18:01:41.409] }, add = TRUE) [18:01:41.409] } [18:01:41.409] ...future.frame <- base::sys.nframe() [18:01:41.409] ...future.conditions <- base::list() [18:01:41.409] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.409] if (FALSE) { [18:01:41.409] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.409] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.409] } [18:01:41.409] ...future.result <- base::tryCatch({ [18:01:41.409] base::withCallingHandlers({ [18:01:41.409] ...future.value <- base::withVisible(base::local({ [18:01:41.409] ...future.makeSendCondition <- local({ [18:01:41.409] sendCondition <- NULL [18:01:41.409] function(frame = 1L) { [18:01:41.409] if (is.function(sendCondition)) [18:01:41.409] return(sendCondition) [18:01:41.409] ns <- getNamespace("parallel") [18:01:41.409] if (exists("sendData", mode = "function", [18:01:41.409] envir = ns)) { [18:01:41.409] parallel_sendData <- get("sendData", mode = "function", [18:01:41.409] envir = ns) [18:01:41.409] envir <- sys.frame(frame) [18:01:41.409] master <- NULL [18:01:41.409] while (!identical(envir, .GlobalEnv) && [18:01:41.409] !identical(envir, emptyenv())) { [18:01:41.409] if (exists("master", mode = "list", envir = envir, [18:01:41.409] inherits = FALSE)) { [18:01:41.409] master <- get("master", mode = "list", [18:01:41.409] envir = envir, inherits = FALSE) [18:01:41.409] if (inherits(master, c("SOCKnode", [18:01:41.409] "SOCK0node"))) { [18:01:41.409] sendCondition <<- function(cond) { [18:01:41.409] data <- list(type = "VALUE", value = cond, [18:01:41.409] success = TRUE) [18:01:41.409] parallel_sendData(master, data) [18:01:41.409] } [18:01:41.409] return(sendCondition) [18:01:41.409] } [18:01:41.409] } [18:01:41.409] frame <- frame + 1L [18:01:41.409] envir <- sys.frame(frame) [18:01:41.409] } [18:01:41.409] } [18:01:41.409] sendCondition <<- function(cond) NULL [18:01:41.409] } [18:01:41.409] }) [18:01:41.409] withCallingHandlers({ [18:01:41.409] NULL [18:01:41.409] }, immediateCondition = function(cond) { [18:01:41.409] sendCondition <- ...future.makeSendCondition() [18:01:41.409] sendCondition(cond) [18:01:41.409] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.409] { [18:01:41.409] inherits <- base::inherits [18:01:41.409] invokeRestart <- base::invokeRestart [18:01:41.409] is.null <- base::is.null [18:01:41.409] muffled <- FALSE [18:01:41.409] if (inherits(cond, "message")) { [18:01:41.409] muffled <- grepl(pattern, "muffleMessage") [18:01:41.409] if (muffled) [18:01:41.409] invokeRestart("muffleMessage") [18:01:41.409] } [18:01:41.409] else if (inherits(cond, "warning")) { [18:01:41.409] muffled <- grepl(pattern, "muffleWarning") [18:01:41.409] if (muffled) [18:01:41.409] invokeRestart("muffleWarning") [18:01:41.409] } [18:01:41.409] else if (inherits(cond, "condition")) { [18:01:41.409] if (!is.null(pattern)) { [18:01:41.409] computeRestarts <- base::computeRestarts [18:01:41.409] grepl <- base::grepl [18:01:41.409] restarts <- computeRestarts(cond) [18:01:41.409] for (restart in restarts) { [18:01:41.409] name <- restart$name [18:01:41.409] if (is.null(name)) [18:01:41.409] next [18:01:41.409] if (!grepl(pattern, name)) [18:01:41.409] next [18:01:41.409] invokeRestart(restart) [18:01:41.409] muffled <- TRUE [18:01:41.409] break [18:01:41.409] } [18:01:41.409] } [18:01:41.409] } [18:01:41.409] invisible(muffled) [18:01:41.409] } [18:01:41.409] muffleCondition(cond) [18:01:41.409] }) [18:01:41.409] })) [18:01:41.409] future::FutureResult(value = ...future.value$value, [18:01:41.409] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.409] ...future.rng), globalenv = if (FALSE) [18:01:41.409] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.409] ...future.globalenv.names)) [18:01:41.409] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.409] }, condition = base::local({ [18:01:41.409] c <- base::c [18:01:41.409] inherits <- base::inherits [18:01:41.409] invokeRestart <- base::invokeRestart [18:01:41.409] length <- base::length [18:01:41.409] list <- base::list [18:01:41.409] seq.int <- base::seq.int [18:01:41.409] signalCondition <- base::signalCondition [18:01:41.409] sys.calls <- base::sys.calls [18:01:41.409] `[[` <- base::`[[` [18:01:41.409] `+` <- base::`+` [18:01:41.409] `<<-` <- base::`<<-` [18:01:41.409] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.409] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.409] 3L)] [18:01:41.409] } [18:01:41.409] function(cond) { [18:01:41.409] is_error <- inherits(cond, "error") [18:01:41.409] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.409] NULL) [18:01:41.409] if (is_error) { [18:01:41.409] sessionInformation <- function() { [18:01:41.409] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.409] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.409] search = base::search(), system = base::Sys.info()) [18:01:41.409] } [18:01:41.409] ...future.conditions[[length(...future.conditions) + [18:01:41.409] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.409] cond$call), session = sessionInformation(), [18:01:41.409] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.409] signalCondition(cond) [18:01:41.409] } [18:01:41.409] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.409] "immediateCondition"))) { [18:01:41.409] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.409] ...future.conditions[[length(...future.conditions) + [18:01:41.409] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.409] if (TRUE && !signal) { [18:01:41.409] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.409] { [18:01:41.409] inherits <- base::inherits [18:01:41.409] invokeRestart <- base::invokeRestart [18:01:41.409] is.null <- base::is.null [18:01:41.409] muffled <- FALSE [18:01:41.409] if (inherits(cond, "message")) { [18:01:41.409] muffled <- grepl(pattern, "muffleMessage") [18:01:41.409] if (muffled) [18:01:41.409] invokeRestart("muffleMessage") [18:01:41.409] } [18:01:41.409] else if (inherits(cond, "warning")) { [18:01:41.409] muffled <- grepl(pattern, "muffleWarning") [18:01:41.409] if (muffled) [18:01:41.409] invokeRestart("muffleWarning") [18:01:41.409] } [18:01:41.409] else if (inherits(cond, "condition")) { [18:01:41.409] if (!is.null(pattern)) { [18:01:41.409] computeRestarts <- base::computeRestarts [18:01:41.409] grepl <- base::grepl [18:01:41.409] restarts <- computeRestarts(cond) [18:01:41.409] for (restart in restarts) { [18:01:41.409] name <- restart$name [18:01:41.409] if (is.null(name)) [18:01:41.409] next [18:01:41.409] if (!grepl(pattern, name)) [18:01:41.409] next [18:01:41.409] invokeRestart(restart) [18:01:41.409] muffled <- TRUE [18:01:41.409] break [18:01:41.409] } [18:01:41.409] } [18:01:41.409] } [18:01:41.409] invisible(muffled) [18:01:41.409] } [18:01:41.409] muffleCondition(cond, pattern = "^muffle") [18:01:41.409] } [18:01:41.409] } [18:01:41.409] else { [18:01:41.409] if (TRUE) { [18:01:41.409] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.409] { [18:01:41.409] inherits <- base::inherits [18:01:41.409] invokeRestart <- base::invokeRestart [18:01:41.409] is.null <- base::is.null [18:01:41.409] muffled <- FALSE [18:01:41.409] if (inherits(cond, "message")) { [18:01:41.409] muffled <- grepl(pattern, "muffleMessage") [18:01:41.409] if (muffled) [18:01:41.409] invokeRestart("muffleMessage") [18:01:41.409] } [18:01:41.409] else if (inherits(cond, "warning")) { [18:01:41.409] muffled <- grepl(pattern, "muffleWarning") [18:01:41.409] if (muffled) [18:01:41.409] invokeRestart("muffleWarning") [18:01:41.409] } [18:01:41.409] else if (inherits(cond, "condition")) { [18:01:41.409] if (!is.null(pattern)) { [18:01:41.409] computeRestarts <- base::computeRestarts [18:01:41.409] grepl <- base::grepl [18:01:41.409] restarts <- computeRestarts(cond) [18:01:41.409] for (restart in restarts) { [18:01:41.409] name <- restart$name [18:01:41.409] if (is.null(name)) [18:01:41.409] next [18:01:41.409] if (!grepl(pattern, name)) [18:01:41.409] next [18:01:41.409] invokeRestart(restart) [18:01:41.409] muffled <- TRUE [18:01:41.409] break [18:01:41.409] } [18:01:41.409] } [18:01:41.409] } [18:01:41.409] invisible(muffled) [18:01:41.409] } [18:01:41.409] muffleCondition(cond, pattern = "^muffle") [18:01:41.409] } [18:01:41.409] } [18:01:41.409] } [18:01:41.409] })) [18:01:41.409] }, error = function(ex) { [18:01:41.409] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.409] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.409] ...future.rng), started = ...future.startTime, [18:01:41.409] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.409] version = "1.8"), class = "FutureResult") [18:01:41.409] }, finally = { [18:01:41.409] if (!identical(...future.workdir, getwd())) [18:01:41.409] setwd(...future.workdir) [18:01:41.409] { [18:01:41.409] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.409] ...future.oldOptions$nwarnings <- NULL [18:01:41.409] } [18:01:41.409] base::options(...future.oldOptions) [18:01:41.409] if (.Platform$OS.type == "windows") { [18:01:41.409] old_names <- names(...future.oldEnvVars) [18:01:41.409] envs <- base::Sys.getenv() [18:01:41.409] names <- names(envs) [18:01:41.409] common <- intersect(names, old_names) [18:01:41.409] added <- setdiff(names, old_names) [18:01:41.409] removed <- setdiff(old_names, names) [18:01:41.409] changed <- common[...future.oldEnvVars[common] != [18:01:41.409] envs[common]] [18:01:41.409] NAMES <- toupper(changed) [18:01:41.409] args <- list() [18:01:41.409] for (kk in seq_along(NAMES)) { [18:01:41.409] name <- changed[[kk]] [18:01:41.409] NAME <- NAMES[[kk]] [18:01:41.409] if (name != NAME && is.element(NAME, old_names)) [18:01:41.409] next [18:01:41.409] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.409] } [18:01:41.409] NAMES <- toupper(added) [18:01:41.409] for (kk in seq_along(NAMES)) { [18:01:41.409] name <- added[[kk]] [18:01:41.409] NAME <- NAMES[[kk]] [18:01:41.409] if (name != NAME && is.element(NAME, old_names)) [18:01:41.409] next [18:01:41.409] args[[name]] <- "" [18:01:41.409] } [18:01:41.409] NAMES <- toupper(removed) [18:01:41.409] for (kk in seq_along(NAMES)) { [18:01:41.409] name <- removed[[kk]] [18:01:41.409] NAME <- NAMES[[kk]] [18:01:41.409] if (name != NAME && is.element(NAME, old_names)) [18:01:41.409] next [18:01:41.409] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.409] } [18:01:41.409] if (length(args) > 0) [18:01:41.409] base::do.call(base::Sys.setenv, args = args) [18:01:41.409] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.409] } [18:01:41.409] else { [18:01:41.409] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.409] } [18:01:41.409] { [18:01:41.409] if (base::length(...future.futureOptionsAdded) > [18:01:41.409] 0L) { [18:01:41.409] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.409] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.409] base::options(opts) [18:01:41.409] } [18:01:41.409] { [18:01:41.409] { [18:01:41.409] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.409] NULL [18:01:41.409] } [18:01:41.409] options(future.plan = NULL) [18:01:41.409] if (is.na(NA_character_)) [18:01:41.409] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.409] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.409] future::plan(list(function (..., workers = availableCores(), [18:01:41.409] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.409] envir = parent.frame()) [18:01:41.409] { [18:01:41.409] if (is.function(workers)) [18:01:41.409] workers <- workers() [18:01:41.409] workers <- structure(as.integer(workers), [18:01:41.409] class = class(workers)) [18:01:41.409] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.409] workers >= 1) [18:01:41.409] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.409] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.409] } [18:01:41.409] future <- MultisessionFuture(..., workers = workers, [18:01:41.409] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.409] envir = envir) [18:01:41.409] if (!future$lazy) [18:01:41.409] future <- run(future) [18:01:41.409] invisible(future) [18:01:41.409] }), .cleanup = FALSE, .init = FALSE) [18:01:41.409] } [18:01:41.409] } [18:01:41.409] } [18:01:41.409] }) [18:01:41.409] if (TRUE) { [18:01:41.409] base::sink(type = "output", split = FALSE) [18:01:41.409] if (TRUE) { [18:01:41.409] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.409] } [18:01:41.409] else { [18:01:41.409] ...future.result["stdout"] <- base::list(NULL) [18:01:41.409] } [18:01:41.409] base::close(...future.stdout) [18:01:41.409] ...future.stdout <- NULL [18:01:41.409] } [18:01:41.409] ...future.result$conditions <- ...future.conditions [18:01:41.409] ...future.result$finished <- base::Sys.time() [18:01:41.409] ...future.result [18:01:41.409] } [18:01:41.499] MultisessionFuture started [18:01:41.499] - Launch lazy future ... done [18:01:41.499] run() for 'MultisessionFuture' ... done [18:01:41.500] getGlobalsAndPackages() ... [18:01:41.500] Searching for globals... [18:01:41.501] - globals found: [1] '{' [18:01:41.501] Searching for globals ... DONE [18:01:41.501] Resolving globals: FALSE [18:01:41.501] [18:01:41.502] [18:01:41.502] getGlobalsAndPackages() ... DONE [18:01:41.502] run() for 'Future' ... [18:01:41.502] - state: 'created' [18:01:41.502] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.516] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.517] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.517] - Field: 'node' [18:01:41.517] - Field: 'label' [18:01:41.517] - Field: 'local' [18:01:41.517] - Field: 'owner' [18:01:41.518] - Field: 'envir' [18:01:41.518] - Field: 'workers' [18:01:41.518] - Field: 'packages' [18:01:41.518] - Field: 'gc' [18:01:41.518] - Field: 'conditions' [18:01:41.518] - Field: 'persistent' [18:01:41.519] - Field: 'expr' [18:01:41.519] - Field: 'uuid' [18:01:41.519] - Field: 'seed' [18:01:41.519] - Field: 'version' [18:01:41.519] - Field: 'result' [18:01:41.520] - Field: 'asynchronous' [18:01:41.520] - Field: 'calls' [18:01:41.520] - Field: 'globals' [18:01:41.520] - Field: 'stdout' [18:01:41.520] - Field: 'earlySignal' [18:01:41.520] - Field: 'lazy' [18:01:41.521] - Field: 'state' [18:01:41.521] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.521] - Launch lazy future ... [18:01:41.521] Packages needed by the future expression (n = 0): [18:01:41.522] Packages needed by future strategies (n = 0): [18:01:41.522] { [18:01:41.522] { [18:01:41.522] { [18:01:41.522] ...future.startTime <- base::Sys.time() [18:01:41.522] { [18:01:41.522] { [18:01:41.522] { [18:01:41.522] { [18:01:41.522] base::local({ [18:01:41.522] has_future <- base::requireNamespace("future", [18:01:41.522] quietly = TRUE) [18:01:41.522] if (has_future) { [18:01:41.522] ns <- base::getNamespace("future") [18:01:41.522] version <- ns[[".package"]][["version"]] [18:01:41.522] if (is.null(version)) [18:01:41.522] version <- utils::packageVersion("future") [18:01:41.522] } [18:01:41.522] else { [18:01:41.522] version <- NULL [18:01:41.522] } [18:01:41.522] if (!has_future || version < "1.8.0") { [18:01:41.522] info <- base::c(r_version = base::gsub("R version ", [18:01:41.522] "", base::R.version$version.string), [18:01:41.522] platform = base::sprintf("%s (%s-bit)", [18:01:41.522] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.522] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.522] "release", "version")], collapse = " "), [18:01:41.522] hostname = base::Sys.info()[["nodename"]]) [18:01:41.522] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.522] info) [18:01:41.522] info <- base::paste(info, collapse = "; ") [18:01:41.522] if (!has_future) { [18:01:41.522] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.522] info) [18:01:41.522] } [18:01:41.522] else { [18:01:41.522] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.522] info, version) [18:01:41.522] } [18:01:41.522] base::stop(msg) [18:01:41.522] } [18:01:41.522] }) [18:01:41.522] } [18:01:41.522] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.522] base::options(mc.cores = 1L) [18:01:41.522] } [18:01:41.522] options(future.plan = NULL) [18:01:41.522] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.522] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.522] } [18:01:41.522] ...future.workdir <- getwd() [18:01:41.522] } [18:01:41.522] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.522] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.522] } [18:01:41.522] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.522] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.522] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.522] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.522] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.522] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.522] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.522] base::names(...future.oldOptions)) [18:01:41.522] } [18:01:41.522] if (FALSE) { [18:01:41.522] } [18:01:41.522] else { [18:01:41.522] if (TRUE) { [18:01:41.522] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.522] open = "w") [18:01:41.522] } [18:01:41.522] else { [18:01:41.522] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.522] windows = "NUL", "/dev/null"), open = "w") [18:01:41.522] } [18:01:41.522] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.522] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.522] base::sink(type = "output", split = FALSE) [18:01:41.522] base::close(...future.stdout) [18:01:41.522] }, add = TRUE) [18:01:41.522] } [18:01:41.522] ...future.frame <- base::sys.nframe() [18:01:41.522] ...future.conditions <- base::list() [18:01:41.522] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.522] if (FALSE) { [18:01:41.522] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.522] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.522] } [18:01:41.522] ...future.result <- base::tryCatch({ [18:01:41.522] base::withCallingHandlers({ [18:01:41.522] ...future.value <- base::withVisible(base::local({ [18:01:41.522] ...future.makeSendCondition <- local({ [18:01:41.522] sendCondition <- NULL [18:01:41.522] function(frame = 1L) { [18:01:41.522] if (is.function(sendCondition)) [18:01:41.522] return(sendCondition) [18:01:41.522] ns <- getNamespace("parallel") [18:01:41.522] if (exists("sendData", mode = "function", [18:01:41.522] envir = ns)) { [18:01:41.522] parallel_sendData <- get("sendData", mode = "function", [18:01:41.522] envir = ns) [18:01:41.522] envir <- sys.frame(frame) [18:01:41.522] master <- NULL [18:01:41.522] while (!identical(envir, .GlobalEnv) && [18:01:41.522] !identical(envir, emptyenv())) { [18:01:41.522] if (exists("master", mode = "list", envir = envir, [18:01:41.522] inherits = FALSE)) { [18:01:41.522] master <- get("master", mode = "list", [18:01:41.522] envir = envir, inherits = FALSE) [18:01:41.522] if (inherits(master, c("SOCKnode", [18:01:41.522] "SOCK0node"))) { [18:01:41.522] sendCondition <<- function(cond) { [18:01:41.522] data <- list(type = "VALUE", value = cond, [18:01:41.522] success = TRUE) [18:01:41.522] parallel_sendData(master, data) [18:01:41.522] } [18:01:41.522] return(sendCondition) [18:01:41.522] } [18:01:41.522] } [18:01:41.522] frame <- frame + 1L [18:01:41.522] envir <- sys.frame(frame) [18:01:41.522] } [18:01:41.522] } [18:01:41.522] sendCondition <<- function(cond) NULL [18:01:41.522] } [18:01:41.522] }) [18:01:41.522] withCallingHandlers({ [18:01:41.522] { [18:01:41.522] 4 [18:01:41.522] } [18:01:41.522] }, immediateCondition = function(cond) { [18:01:41.522] sendCondition <- ...future.makeSendCondition() [18:01:41.522] sendCondition(cond) [18:01:41.522] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.522] { [18:01:41.522] inherits <- base::inherits [18:01:41.522] invokeRestart <- base::invokeRestart [18:01:41.522] is.null <- base::is.null [18:01:41.522] muffled <- FALSE [18:01:41.522] if (inherits(cond, "message")) { [18:01:41.522] muffled <- grepl(pattern, "muffleMessage") [18:01:41.522] if (muffled) [18:01:41.522] invokeRestart("muffleMessage") [18:01:41.522] } [18:01:41.522] else if (inherits(cond, "warning")) { [18:01:41.522] muffled <- grepl(pattern, "muffleWarning") [18:01:41.522] if (muffled) [18:01:41.522] invokeRestart("muffleWarning") [18:01:41.522] } [18:01:41.522] else if (inherits(cond, "condition")) { [18:01:41.522] if (!is.null(pattern)) { [18:01:41.522] computeRestarts <- base::computeRestarts [18:01:41.522] grepl <- base::grepl [18:01:41.522] restarts <- computeRestarts(cond) [18:01:41.522] for (restart in restarts) { [18:01:41.522] name <- restart$name [18:01:41.522] if (is.null(name)) [18:01:41.522] next [18:01:41.522] if (!grepl(pattern, name)) [18:01:41.522] next [18:01:41.522] invokeRestart(restart) [18:01:41.522] muffled <- TRUE [18:01:41.522] break [18:01:41.522] } [18:01:41.522] } [18:01:41.522] } [18:01:41.522] invisible(muffled) [18:01:41.522] } [18:01:41.522] muffleCondition(cond) [18:01:41.522] }) [18:01:41.522] })) [18:01:41.522] future::FutureResult(value = ...future.value$value, [18:01:41.522] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.522] ...future.rng), globalenv = if (FALSE) [18:01:41.522] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.522] ...future.globalenv.names)) [18:01:41.522] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.522] }, condition = base::local({ [18:01:41.522] c <- base::c [18:01:41.522] inherits <- base::inherits [18:01:41.522] invokeRestart <- base::invokeRestart [18:01:41.522] length <- base::length [18:01:41.522] list <- base::list [18:01:41.522] seq.int <- base::seq.int [18:01:41.522] signalCondition <- base::signalCondition [18:01:41.522] sys.calls <- base::sys.calls [18:01:41.522] `[[` <- base::`[[` [18:01:41.522] `+` <- base::`+` [18:01:41.522] `<<-` <- base::`<<-` [18:01:41.522] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.522] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.522] 3L)] [18:01:41.522] } [18:01:41.522] function(cond) { [18:01:41.522] is_error <- inherits(cond, "error") [18:01:41.522] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.522] NULL) [18:01:41.522] if (is_error) { [18:01:41.522] sessionInformation <- function() { [18:01:41.522] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.522] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.522] search = base::search(), system = base::Sys.info()) [18:01:41.522] } [18:01:41.522] ...future.conditions[[length(...future.conditions) + [18:01:41.522] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.522] cond$call), session = sessionInformation(), [18:01:41.522] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.522] signalCondition(cond) [18:01:41.522] } [18:01:41.522] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.522] "immediateCondition"))) { [18:01:41.522] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.522] ...future.conditions[[length(...future.conditions) + [18:01:41.522] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.522] if (TRUE && !signal) { [18:01:41.522] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.522] { [18:01:41.522] inherits <- base::inherits [18:01:41.522] invokeRestart <- base::invokeRestart [18:01:41.522] is.null <- base::is.null [18:01:41.522] muffled <- FALSE [18:01:41.522] if (inherits(cond, "message")) { [18:01:41.522] muffled <- grepl(pattern, "muffleMessage") [18:01:41.522] if (muffled) [18:01:41.522] invokeRestart("muffleMessage") [18:01:41.522] } [18:01:41.522] else if (inherits(cond, "warning")) { [18:01:41.522] muffled <- grepl(pattern, "muffleWarning") [18:01:41.522] if (muffled) [18:01:41.522] invokeRestart("muffleWarning") [18:01:41.522] } [18:01:41.522] else if (inherits(cond, "condition")) { [18:01:41.522] if (!is.null(pattern)) { [18:01:41.522] computeRestarts <- base::computeRestarts [18:01:41.522] grepl <- base::grepl [18:01:41.522] restarts <- computeRestarts(cond) [18:01:41.522] for (restart in restarts) { [18:01:41.522] name <- restart$name [18:01:41.522] if (is.null(name)) [18:01:41.522] next [18:01:41.522] if (!grepl(pattern, name)) [18:01:41.522] next [18:01:41.522] invokeRestart(restart) [18:01:41.522] muffled <- TRUE [18:01:41.522] break [18:01:41.522] } [18:01:41.522] } [18:01:41.522] } [18:01:41.522] invisible(muffled) [18:01:41.522] } [18:01:41.522] muffleCondition(cond, pattern = "^muffle") [18:01:41.522] } [18:01:41.522] } [18:01:41.522] else { [18:01:41.522] if (TRUE) { [18:01:41.522] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.522] { [18:01:41.522] inherits <- base::inherits [18:01:41.522] invokeRestart <- base::invokeRestart [18:01:41.522] is.null <- base::is.null [18:01:41.522] muffled <- FALSE [18:01:41.522] if (inherits(cond, "message")) { [18:01:41.522] muffled <- grepl(pattern, "muffleMessage") [18:01:41.522] if (muffled) [18:01:41.522] invokeRestart("muffleMessage") [18:01:41.522] } [18:01:41.522] else if (inherits(cond, "warning")) { [18:01:41.522] muffled <- grepl(pattern, "muffleWarning") [18:01:41.522] if (muffled) [18:01:41.522] invokeRestart("muffleWarning") [18:01:41.522] } [18:01:41.522] else if (inherits(cond, "condition")) { [18:01:41.522] if (!is.null(pattern)) { [18:01:41.522] computeRestarts <- base::computeRestarts [18:01:41.522] grepl <- base::grepl [18:01:41.522] restarts <- computeRestarts(cond) [18:01:41.522] for (restart in restarts) { [18:01:41.522] name <- restart$name [18:01:41.522] if (is.null(name)) [18:01:41.522] next [18:01:41.522] if (!grepl(pattern, name)) [18:01:41.522] next [18:01:41.522] invokeRestart(restart) [18:01:41.522] muffled <- TRUE [18:01:41.522] break [18:01:41.522] } [18:01:41.522] } [18:01:41.522] } [18:01:41.522] invisible(muffled) [18:01:41.522] } [18:01:41.522] muffleCondition(cond, pattern = "^muffle") [18:01:41.522] } [18:01:41.522] } [18:01:41.522] } [18:01:41.522] })) [18:01:41.522] }, error = function(ex) { [18:01:41.522] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.522] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.522] ...future.rng), started = ...future.startTime, [18:01:41.522] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.522] version = "1.8"), class = "FutureResult") [18:01:41.522] }, finally = { [18:01:41.522] if (!identical(...future.workdir, getwd())) [18:01:41.522] setwd(...future.workdir) [18:01:41.522] { [18:01:41.522] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.522] ...future.oldOptions$nwarnings <- NULL [18:01:41.522] } [18:01:41.522] base::options(...future.oldOptions) [18:01:41.522] if (.Platform$OS.type == "windows") { [18:01:41.522] old_names <- names(...future.oldEnvVars) [18:01:41.522] envs <- base::Sys.getenv() [18:01:41.522] names <- names(envs) [18:01:41.522] common <- intersect(names, old_names) [18:01:41.522] added <- setdiff(names, old_names) [18:01:41.522] removed <- setdiff(old_names, names) [18:01:41.522] changed <- common[...future.oldEnvVars[common] != [18:01:41.522] envs[common]] [18:01:41.522] NAMES <- toupper(changed) [18:01:41.522] args <- list() [18:01:41.522] for (kk in seq_along(NAMES)) { [18:01:41.522] name <- changed[[kk]] [18:01:41.522] NAME <- NAMES[[kk]] [18:01:41.522] if (name != NAME && is.element(NAME, old_names)) [18:01:41.522] next [18:01:41.522] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.522] } [18:01:41.522] NAMES <- toupper(added) [18:01:41.522] for (kk in seq_along(NAMES)) { [18:01:41.522] name <- added[[kk]] [18:01:41.522] NAME <- NAMES[[kk]] [18:01:41.522] if (name != NAME && is.element(NAME, old_names)) [18:01:41.522] next [18:01:41.522] args[[name]] <- "" [18:01:41.522] } [18:01:41.522] NAMES <- toupper(removed) [18:01:41.522] for (kk in seq_along(NAMES)) { [18:01:41.522] name <- removed[[kk]] [18:01:41.522] NAME <- NAMES[[kk]] [18:01:41.522] if (name != NAME && is.element(NAME, old_names)) [18:01:41.522] next [18:01:41.522] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.522] } [18:01:41.522] if (length(args) > 0) [18:01:41.522] base::do.call(base::Sys.setenv, args = args) [18:01:41.522] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.522] } [18:01:41.522] else { [18:01:41.522] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.522] } [18:01:41.522] { [18:01:41.522] if (base::length(...future.futureOptionsAdded) > [18:01:41.522] 0L) { [18:01:41.522] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.522] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.522] base::options(opts) [18:01:41.522] } [18:01:41.522] { [18:01:41.522] { [18:01:41.522] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.522] NULL [18:01:41.522] } [18:01:41.522] options(future.plan = NULL) [18:01:41.522] if (is.na(NA_character_)) [18:01:41.522] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.522] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.522] future::plan(list(function (..., workers = availableCores(), [18:01:41.522] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.522] envir = parent.frame()) [18:01:41.522] { [18:01:41.522] if (is.function(workers)) [18:01:41.522] workers <- workers() [18:01:41.522] workers <- structure(as.integer(workers), [18:01:41.522] class = class(workers)) [18:01:41.522] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.522] workers >= 1) [18:01:41.522] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.522] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.522] } [18:01:41.522] future <- MultisessionFuture(..., workers = workers, [18:01:41.522] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.522] envir = envir) [18:01:41.522] if (!future$lazy) [18:01:41.522] future <- run(future) [18:01:41.522] invisible(future) [18:01:41.522] }), .cleanup = FALSE, .init = FALSE) [18:01:41.522] } [18:01:41.522] } [18:01:41.522] } [18:01:41.522] }) [18:01:41.522] if (TRUE) { [18:01:41.522] base::sink(type = "output", split = FALSE) [18:01:41.522] if (TRUE) { [18:01:41.522] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.522] } [18:01:41.522] else { [18:01:41.522] ...future.result["stdout"] <- base::list(NULL) [18:01:41.522] } [18:01:41.522] base::close(...future.stdout) [18:01:41.522] ...future.stdout <- NULL [18:01:41.522] } [18:01:41.522] ...future.result$conditions <- ...future.conditions [18:01:41.522] ...future.result$finished <- base::Sys.time() [18:01:41.522] ...future.result [18:01:41.522] } [18:01:41.527] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:41.548] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.549] - Validating connection of MultisessionFuture [18:01:41.549] - received message: FutureResult [18:01:41.549] - Received FutureResult [18:01:41.549] - Erased future from FutureRegistry [18:01:41.549] result() for ClusterFuture ... [18:01:41.550] - result already collected: FutureResult [18:01:41.550] result() for ClusterFuture ... done [18:01:41.550] receiveMessageFromWorker() for ClusterFuture ... done [18:01:41.550] result() for ClusterFuture ... [18:01:41.550] - result already collected: FutureResult [18:01:41.550] result() for ClusterFuture ... done [18:01:41.551] result() for ClusterFuture ... [18:01:41.551] - result already collected: FutureResult [18:01:41.551] result() for ClusterFuture ... done [18:01:41.552] MultisessionFuture started [18:01:41.553] - Launch lazy future ... done [18:01:41.553] run() for 'MultisessionFuture' ... done [18:01:41.558] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.559] - Validating connection of MultisessionFuture [18:01:41.559] - received message: FutureResult [18:01:41.559] - Received FutureResult [18:01:41.559] - Erased future from FutureRegistry [18:01:41.559] result() for ClusterFuture ... [18:01:41.560] - result already collected: FutureResult [18:01:41.560] result() for ClusterFuture ... done [18:01:41.560] receiveMessageFromWorker() for ClusterFuture ... done [18:01:41.570] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.570] - Validating connection of MultisessionFuture [18:01:41.570] - received message: FutureResult [18:01:41.570] - Received FutureResult [18:01:41.570] - Erased future from FutureRegistry [18:01:41.571] result() for ClusterFuture ... [18:01:41.571] - result already collected: FutureResult [18:01:41.571] result() for ClusterFuture ... done [18:01:41.571] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:41.573] resolve() on environment ... [18:01:41.573] recursive: 0 [18:01:41.573] elements: [4] 'a', 'b', 'c', 'd' [18:01:41.574] signalConditionsASAP(numeric, pos=1) ... [18:01:41.574] - nx: 4 [18:01:41.574] - relay: TRUE [18:01:41.574] - stdout: TRUE [18:01:41.574] - signal: TRUE [18:01:41.574] - resignal: FALSE [18:01:41.575] - force: TRUE [18:01:41.575] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.575] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.575] - until=2 [18:01:41.575] - relaying element #2 [18:01:41.575] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:41.576] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.576] signalConditionsASAP(NULL, pos=1) ... done [18:01:41.576] length: 3 (resolved future 1) [18:01:41.576] Future #2 [18:01:41.576] result() for ClusterFuture ... [18:01:41.576] - result already collected: FutureResult [18:01:41.577] result() for ClusterFuture ... done [18:01:41.577] result() for ClusterFuture ... [18:01:41.577] - result already collected: FutureResult [18:01:41.577] result() for ClusterFuture ... done [18:01:41.577] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:41.577] - nx: 4 [18:01:41.578] - relay: TRUE [18:01:41.578] - stdout: TRUE [18:01:41.578] - signal: TRUE [18:01:41.578] - resignal: FALSE [18:01:41.578] - force: TRUE [18:01:41.578] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:41.579] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.579] - until=2 [18:01:41.579] - relaying element #2 [18:01:41.579] result() for ClusterFuture ... [18:01:41.579] - result already collected: FutureResult [18:01:41.579] result() for ClusterFuture ... done [18:01:41.580] result() for ClusterFuture ... [18:01:41.580] - result already collected: FutureResult [18:01:41.580] result() for ClusterFuture ... done [18:01:41.580] result() for ClusterFuture ... [18:01:41.580] - result already collected: FutureResult [18:01:41.580] result() for ClusterFuture ... done [18:01:41.581] result() for ClusterFuture ... [18:01:41.581] - result already collected: FutureResult [18:01:41.581] result() for ClusterFuture ... done [18:01:41.581] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:41.581] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:41.581] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:41.582] length: 2 (resolved future 2) [18:01:41.582] Future #3 [18:01:41.582] result() for ClusterFuture ... [18:01:41.582] - result already collected: FutureResult [18:01:41.582] result() for ClusterFuture ... done [18:01:41.582] result() for ClusterFuture ... [18:01:41.583] - result already collected: FutureResult [18:01:41.583] result() for ClusterFuture ... done [18:01:41.583] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:41.583] - nx: 4 [18:01:41.583] - relay: TRUE [18:01:41.583] - stdout: TRUE [18:01:41.583] - signal: TRUE [18:01:41.584] - resignal: FALSE [18:01:41.584] - force: TRUE [18:01:41.584] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:41.584] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:41.584] - until=3 [18:01:41.584] - relaying element #3 [18:01:41.585] result() for ClusterFuture ... [18:01:41.585] - result already collected: FutureResult [18:01:41.585] result() for ClusterFuture ... done [18:01:41.585] result() for ClusterFuture ... [18:01:41.585] - result already collected: FutureResult [18:01:41.585] result() for ClusterFuture ... done [18:01:41.586] result() for ClusterFuture ... [18:01:41.586] - result already collected: FutureResult [18:01:41.586] result() for ClusterFuture ... done [18:01:41.586] result() for ClusterFuture ... [18:01:41.586] - result already collected: FutureResult [18:01:41.586] result() for ClusterFuture ... done [18:01:41.587] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:41.587] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:41.587] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:41.587] length: 1 (resolved future 3) [18:01:41.587] Future #4 [18:01:41.587] result() for ClusterFuture ... [18:01:41.588] - result already collected: FutureResult [18:01:41.588] result() for ClusterFuture ... done [18:01:41.588] result() for ClusterFuture ... [18:01:41.588] - result already collected: FutureResult [18:01:41.588] result() for ClusterFuture ... done [18:01:41.588] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:41.589] - nx: 4 [18:01:41.589] - relay: TRUE [18:01:41.589] - stdout: TRUE [18:01:41.589] - signal: TRUE [18:01:41.589] - resignal: FALSE [18:01:41.589] - force: TRUE [18:01:41.589] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:41.590] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:41.590] - until=4 [18:01:41.590] - relaying element #4 [18:01:41.590] result() for ClusterFuture ... [18:01:41.590] - result already collected: FutureResult [18:01:41.590] result() for ClusterFuture ... done [18:01:41.591] result() for ClusterFuture ... [18:01:41.591] - result already collected: FutureResult [18:01:41.591] result() for ClusterFuture ... done [18:01:41.591] result() for ClusterFuture ... [18:01:41.591] - result already collected: FutureResult [18:01:41.591] result() for ClusterFuture ... done [18:01:41.592] result() for ClusterFuture ... [18:01:41.592] - result already collected: FutureResult [18:01:41.592] result() for ClusterFuture ... done [18:01:41.592] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.592] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:41.592] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:41.593] length: 0 (resolved future 4) [18:01:41.593] Relaying remaining futures [18:01:41.593] signalConditionsASAP(NULL, pos=0) ... [18:01:41.593] - nx: 4 [18:01:41.593] - relay: TRUE [18:01:41.593] - stdout: TRUE [18:01:41.593] - signal: TRUE [18:01:41.594] - resignal: FALSE [18:01:41.594] - force: TRUE [18:01:41.594] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.594] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:41.594] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.595] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:41.595] signalConditionsASAP(NULL, pos=0) ... done [18:01:41.595] resolve() on environment ... DONE [18:01:41.595] result() for ClusterFuture ... [18:01:41.595] - result already collected: FutureResult [18:01:41.595] result() for ClusterFuture ... done [18:01:41.596] result() for ClusterFuture ... [18:01:41.596] - result already collected: FutureResult [18:01:41.596] result() for ClusterFuture ... done [18:01:41.596] result() for ClusterFuture ... [18:01:41.596] - result already collected: FutureResult [18:01:41.596] result() for ClusterFuture ... done [18:01:41.596] result() for ClusterFuture ... [18:01:41.597] - result already collected: FutureResult [18:01:41.597] result() for ClusterFuture ... done [18:01:41.597] result() for ClusterFuture ... [18:01:41.597] - result already collected: FutureResult [18:01:41.597] result() for ClusterFuture ... done [18:01:41.597] result() for ClusterFuture ... [18:01:41.598] - result already collected: FutureResult [18:01:41.598] result() for ClusterFuture ... done Dimensions: c(1, 6) [18:01:41.598] getGlobalsAndPackages() ... [18:01:41.598] Searching for globals... [18:01:41.599] [18:01:41.599] Searching for globals ... DONE [18:01:41.599] - globals: [0] [18:01:41.599] getGlobalsAndPackages() ... DONE [18:01:41.600] run() for 'Future' ... [18:01:41.600] - state: 'created' [18:01:41.600] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.614] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.614] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.615] - Field: 'node' [18:01:41.615] - Field: 'label' [18:01:41.615] - Field: 'local' [18:01:41.615] - Field: 'owner' [18:01:41.615] - Field: 'envir' [18:01:41.616] - Field: 'workers' [18:01:41.616] - Field: 'packages' [18:01:41.616] - Field: 'gc' [18:01:41.616] - Field: 'conditions' [18:01:41.616] - Field: 'persistent' [18:01:41.616] - Field: 'expr' [18:01:41.617] - Field: 'uuid' [18:01:41.617] - Field: 'seed' [18:01:41.617] - Field: 'version' [18:01:41.617] - Field: 'result' [18:01:41.617] - Field: 'asynchronous' [18:01:41.618] - Field: 'calls' [18:01:41.618] - Field: 'globals' [18:01:41.618] - Field: 'stdout' [18:01:41.618] - Field: 'earlySignal' [18:01:41.618] - Field: 'lazy' [18:01:41.618] - Field: 'state' [18:01:41.619] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.619] - Launch lazy future ... [18:01:41.619] Packages needed by the future expression (n = 0): [18:01:41.619] Packages needed by future strategies (n = 0): [18:01:41.620] { [18:01:41.620] { [18:01:41.620] { [18:01:41.620] ...future.startTime <- base::Sys.time() [18:01:41.620] { [18:01:41.620] { [18:01:41.620] { [18:01:41.620] { [18:01:41.620] base::local({ [18:01:41.620] has_future <- base::requireNamespace("future", [18:01:41.620] quietly = TRUE) [18:01:41.620] if (has_future) { [18:01:41.620] ns <- base::getNamespace("future") [18:01:41.620] version <- ns[[".package"]][["version"]] [18:01:41.620] if (is.null(version)) [18:01:41.620] version <- utils::packageVersion("future") [18:01:41.620] } [18:01:41.620] else { [18:01:41.620] version <- NULL [18:01:41.620] } [18:01:41.620] if (!has_future || version < "1.8.0") { [18:01:41.620] info <- base::c(r_version = base::gsub("R version ", [18:01:41.620] "", base::R.version$version.string), [18:01:41.620] platform = base::sprintf("%s (%s-bit)", [18:01:41.620] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.620] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.620] "release", "version")], collapse = " "), [18:01:41.620] hostname = base::Sys.info()[["nodename"]]) [18:01:41.620] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.620] info) [18:01:41.620] info <- base::paste(info, collapse = "; ") [18:01:41.620] if (!has_future) { [18:01:41.620] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.620] info) [18:01:41.620] } [18:01:41.620] else { [18:01:41.620] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.620] info, version) [18:01:41.620] } [18:01:41.620] base::stop(msg) [18:01:41.620] } [18:01:41.620] }) [18:01:41.620] } [18:01:41.620] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.620] base::options(mc.cores = 1L) [18:01:41.620] } [18:01:41.620] options(future.plan = NULL) [18:01:41.620] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.620] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.620] } [18:01:41.620] ...future.workdir <- getwd() [18:01:41.620] } [18:01:41.620] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.620] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.620] } [18:01:41.620] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.620] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.620] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.620] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.620] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.620] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.620] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.620] base::names(...future.oldOptions)) [18:01:41.620] } [18:01:41.620] if (FALSE) { [18:01:41.620] } [18:01:41.620] else { [18:01:41.620] if (TRUE) { [18:01:41.620] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.620] open = "w") [18:01:41.620] } [18:01:41.620] else { [18:01:41.620] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.620] windows = "NUL", "/dev/null"), open = "w") [18:01:41.620] } [18:01:41.620] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.620] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.620] base::sink(type = "output", split = FALSE) [18:01:41.620] base::close(...future.stdout) [18:01:41.620] }, add = TRUE) [18:01:41.620] } [18:01:41.620] ...future.frame <- base::sys.nframe() [18:01:41.620] ...future.conditions <- base::list() [18:01:41.620] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.620] if (FALSE) { [18:01:41.620] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.620] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.620] } [18:01:41.620] ...future.result <- base::tryCatch({ [18:01:41.620] base::withCallingHandlers({ [18:01:41.620] ...future.value <- base::withVisible(base::local({ [18:01:41.620] ...future.makeSendCondition <- local({ [18:01:41.620] sendCondition <- NULL [18:01:41.620] function(frame = 1L) { [18:01:41.620] if (is.function(sendCondition)) [18:01:41.620] return(sendCondition) [18:01:41.620] ns <- getNamespace("parallel") [18:01:41.620] if (exists("sendData", mode = "function", [18:01:41.620] envir = ns)) { [18:01:41.620] parallel_sendData <- get("sendData", mode = "function", [18:01:41.620] envir = ns) [18:01:41.620] envir <- sys.frame(frame) [18:01:41.620] master <- NULL [18:01:41.620] while (!identical(envir, .GlobalEnv) && [18:01:41.620] !identical(envir, emptyenv())) { [18:01:41.620] if (exists("master", mode = "list", envir = envir, [18:01:41.620] inherits = FALSE)) { [18:01:41.620] master <- get("master", mode = "list", [18:01:41.620] envir = envir, inherits = FALSE) [18:01:41.620] if (inherits(master, c("SOCKnode", [18:01:41.620] "SOCK0node"))) { [18:01:41.620] sendCondition <<- function(cond) { [18:01:41.620] data <- list(type = "VALUE", value = cond, [18:01:41.620] success = TRUE) [18:01:41.620] parallel_sendData(master, data) [18:01:41.620] } [18:01:41.620] return(sendCondition) [18:01:41.620] } [18:01:41.620] } [18:01:41.620] frame <- frame + 1L [18:01:41.620] envir <- sys.frame(frame) [18:01:41.620] } [18:01:41.620] } [18:01:41.620] sendCondition <<- function(cond) NULL [18:01:41.620] } [18:01:41.620] }) [18:01:41.620] withCallingHandlers({ [18:01:41.620] 2 [18:01:41.620] }, immediateCondition = function(cond) { [18:01:41.620] sendCondition <- ...future.makeSendCondition() [18:01:41.620] sendCondition(cond) [18:01:41.620] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.620] { [18:01:41.620] inherits <- base::inherits [18:01:41.620] invokeRestart <- base::invokeRestart [18:01:41.620] is.null <- base::is.null [18:01:41.620] muffled <- FALSE [18:01:41.620] if (inherits(cond, "message")) { [18:01:41.620] muffled <- grepl(pattern, "muffleMessage") [18:01:41.620] if (muffled) [18:01:41.620] invokeRestart("muffleMessage") [18:01:41.620] } [18:01:41.620] else if (inherits(cond, "warning")) { [18:01:41.620] muffled <- grepl(pattern, "muffleWarning") [18:01:41.620] if (muffled) [18:01:41.620] invokeRestart("muffleWarning") [18:01:41.620] } [18:01:41.620] else if (inherits(cond, "condition")) { [18:01:41.620] if (!is.null(pattern)) { [18:01:41.620] computeRestarts <- base::computeRestarts [18:01:41.620] grepl <- base::grepl [18:01:41.620] restarts <- computeRestarts(cond) [18:01:41.620] for (restart in restarts) { [18:01:41.620] name <- restart$name [18:01:41.620] if (is.null(name)) [18:01:41.620] next [18:01:41.620] if (!grepl(pattern, name)) [18:01:41.620] next [18:01:41.620] invokeRestart(restart) [18:01:41.620] muffled <- TRUE [18:01:41.620] break [18:01:41.620] } [18:01:41.620] } [18:01:41.620] } [18:01:41.620] invisible(muffled) [18:01:41.620] } [18:01:41.620] muffleCondition(cond) [18:01:41.620] }) [18:01:41.620] })) [18:01:41.620] future::FutureResult(value = ...future.value$value, [18:01:41.620] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.620] ...future.rng), globalenv = if (FALSE) [18:01:41.620] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.620] ...future.globalenv.names)) [18:01:41.620] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.620] }, condition = base::local({ [18:01:41.620] c <- base::c [18:01:41.620] inherits <- base::inherits [18:01:41.620] invokeRestart <- base::invokeRestart [18:01:41.620] length <- base::length [18:01:41.620] list <- base::list [18:01:41.620] seq.int <- base::seq.int [18:01:41.620] signalCondition <- base::signalCondition [18:01:41.620] sys.calls <- base::sys.calls [18:01:41.620] `[[` <- base::`[[` [18:01:41.620] `+` <- base::`+` [18:01:41.620] `<<-` <- base::`<<-` [18:01:41.620] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.620] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.620] 3L)] [18:01:41.620] } [18:01:41.620] function(cond) { [18:01:41.620] is_error <- inherits(cond, "error") [18:01:41.620] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.620] NULL) [18:01:41.620] if (is_error) { [18:01:41.620] sessionInformation <- function() { [18:01:41.620] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.620] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.620] search = base::search(), system = base::Sys.info()) [18:01:41.620] } [18:01:41.620] ...future.conditions[[length(...future.conditions) + [18:01:41.620] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.620] cond$call), session = sessionInformation(), [18:01:41.620] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.620] signalCondition(cond) [18:01:41.620] } [18:01:41.620] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.620] "immediateCondition"))) { [18:01:41.620] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.620] ...future.conditions[[length(...future.conditions) + [18:01:41.620] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.620] if (TRUE && !signal) { [18:01:41.620] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.620] { [18:01:41.620] inherits <- base::inherits [18:01:41.620] invokeRestart <- base::invokeRestart [18:01:41.620] is.null <- base::is.null [18:01:41.620] muffled <- FALSE [18:01:41.620] if (inherits(cond, "message")) { [18:01:41.620] muffled <- grepl(pattern, "muffleMessage") [18:01:41.620] if (muffled) [18:01:41.620] invokeRestart("muffleMessage") [18:01:41.620] } [18:01:41.620] else if (inherits(cond, "warning")) { [18:01:41.620] muffled <- grepl(pattern, "muffleWarning") [18:01:41.620] if (muffled) [18:01:41.620] invokeRestart("muffleWarning") [18:01:41.620] } [18:01:41.620] else if (inherits(cond, "condition")) { [18:01:41.620] if (!is.null(pattern)) { [18:01:41.620] computeRestarts <- base::computeRestarts [18:01:41.620] grepl <- base::grepl [18:01:41.620] restarts <- computeRestarts(cond) [18:01:41.620] for (restart in restarts) { [18:01:41.620] name <- restart$name [18:01:41.620] if (is.null(name)) [18:01:41.620] next [18:01:41.620] if (!grepl(pattern, name)) [18:01:41.620] next [18:01:41.620] invokeRestart(restart) [18:01:41.620] muffled <- TRUE [18:01:41.620] break [18:01:41.620] } [18:01:41.620] } [18:01:41.620] } [18:01:41.620] invisible(muffled) [18:01:41.620] } [18:01:41.620] muffleCondition(cond, pattern = "^muffle") [18:01:41.620] } [18:01:41.620] } [18:01:41.620] else { [18:01:41.620] if (TRUE) { [18:01:41.620] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.620] { [18:01:41.620] inherits <- base::inherits [18:01:41.620] invokeRestart <- base::invokeRestart [18:01:41.620] is.null <- base::is.null [18:01:41.620] muffled <- FALSE [18:01:41.620] if (inherits(cond, "message")) { [18:01:41.620] muffled <- grepl(pattern, "muffleMessage") [18:01:41.620] if (muffled) [18:01:41.620] invokeRestart("muffleMessage") [18:01:41.620] } [18:01:41.620] else if (inherits(cond, "warning")) { [18:01:41.620] muffled <- grepl(pattern, "muffleWarning") [18:01:41.620] if (muffled) [18:01:41.620] invokeRestart("muffleWarning") [18:01:41.620] } [18:01:41.620] else if (inherits(cond, "condition")) { [18:01:41.620] if (!is.null(pattern)) { [18:01:41.620] computeRestarts <- base::computeRestarts [18:01:41.620] grepl <- base::grepl [18:01:41.620] restarts <- computeRestarts(cond) [18:01:41.620] for (restart in restarts) { [18:01:41.620] name <- restart$name [18:01:41.620] if (is.null(name)) [18:01:41.620] next [18:01:41.620] if (!grepl(pattern, name)) [18:01:41.620] next [18:01:41.620] invokeRestart(restart) [18:01:41.620] muffled <- TRUE [18:01:41.620] break [18:01:41.620] } [18:01:41.620] } [18:01:41.620] } [18:01:41.620] invisible(muffled) [18:01:41.620] } [18:01:41.620] muffleCondition(cond, pattern = "^muffle") [18:01:41.620] } [18:01:41.620] } [18:01:41.620] } [18:01:41.620] })) [18:01:41.620] }, error = function(ex) { [18:01:41.620] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.620] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.620] ...future.rng), started = ...future.startTime, [18:01:41.620] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.620] version = "1.8"), class = "FutureResult") [18:01:41.620] }, finally = { [18:01:41.620] if (!identical(...future.workdir, getwd())) [18:01:41.620] setwd(...future.workdir) [18:01:41.620] { [18:01:41.620] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.620] ...future.oldOptions$nwarnings <- NULL [18:01:41.620] } [18:01:41.620] base::options(...future.oldOptions) [18:01:41.620] if (.Platform$OS.type == "windows") { [18:01:41.620] old_names <- names(...future.oldEnvVars) [18:01:41.620] envs <- base::Sys.getenv() [18:01:41.620] names <- names(envs) [18:01:41.620] common <- intersect(names, old_names) [18:01:41.620] added <- setdiff(names, old_names) [18:01:41.620] removed <- setdiff(old_names, names) [18:01:41.620] changed <- common[...future.oldEnvVars[common] != [18:01:41.620] envs[common]] [18:01:41.620] NAMES <- toupper(changed) [18:01:41.620] args <- list() [18:01:41.620] for (kk in seq_along(NAMES)) { [18:01:41.620] name <- changed[[kk]] [18:01:41.620] NAME <- NAMES[[kk]] [18:01:41.620] if (name != NAME && is.element(NAME, old_names)) [18:01:41.620] next [18:01:41.620] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.620] } [18:01:41.620] NAMES <- toupper(added) [18:01:41.620] for (kk in seq_along(NAMES)) { [18:01:41.620] name <- added[[kk]] [18:01:41.620] NAME <- NAMES[[kk]] [18:01:41.620] if (name != NAME && is.element(NAME, old_names)) [18:01:41.620] next [18:01:41.620] args[[name]] <- "" [18:01:41.620] } [18:01:41.620] NAMES <- toupper(removed) [18:01:41.620] for (kk in seq_along(NAMES)) { [18:01:41.620] name <- removed[[kk]] [18:01:41.620] NAME <- NAMES[[kk]] [18:01:41.620] if (name != NAME && is.element(NAME, old_names)) [18:01:41.620] next [18:01:41.620] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.620] } [18:01:41.620] if (length(args) > 0) [18:01:41.620] base::do.call(base::Sys.setenv, args = args) [18:01:41.620] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.620] } [18:01:41.620] else { [18:01:41.620] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.620] } [18:01:41.620] { [18:01:41.620] if (base::length(...future.futureOptionsAdded) > [18:01:41.620] 0L) { [18:01:41.620] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.620] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.620] base::options(opts) [18:01:41.620] } [18:01:41.620] { [18:01:41.620] { [18:01:41.620] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.620] NULL [18:01:41.620] } [18:01:41.620] options(future.plan = NULL) [18:01:41.620] if (is.na(NA_character_)) [18:01:41.620] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.620] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.620] future::plan(list(function (..., workers = availableCores(), [18:01:41.620] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.620] envir = parent.frame()) [18:01:41.620] { [18:01:41.620] if (is.function(workers)) [18:01:41.620] workers <- workers() [18:01:41.620] workers <- structure(as.integer(workers), [18:01:41.620] class = class(workers)) [18:01:41.620] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.620] workers >= 1) [18:01:41.620] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.620] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.620] } [18:01:41.620] future <- MultisessionFuture(..., workers = workers, [18:01:41.620] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.620] envir = envir) [18:01:41.620] if (!future$lazy) [18:01:41.620] future <- run(future) [18:01:41.620] invisible(future) [18:01:41.620] }), .cleanup = FALSE, .init = FALSE) [18:01:41.620] } [18:01:41.620] } [18:01:41.620] } [18:01:41.620] }) [18:01:41.620] if (TRUE) { [18:01:41.620] base::sink(type = "output", split = FALSE) [18:01:41.620] if (TRUE) { [18:01:41.620] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.620] } [18:01:41.620] else { [18:01:41.620] ...future.result["stdout"] <- base::list(NULL) [18:01:41.620] } [18:01:41.620] base::close(...future.stdout) [18:01:41.620] ...future.stdout <- NULL [18:01:41.620] } [18:01:41.620] ...future.result$conditions <- ...future.conditions [18:01:41.620] ...future.result$finished <- base::Sys.time() [18:01:41.620] ...future.result [18:01:41.620] } [18:01:41.626] MultisessionFuture started [18:01:41.626] - Launch lazy future ... done [18:01:41.629] run() for 'MultisessionFuture' ... done [18:01:41.629] getGlobalsAndPackages() ... [18:01:41.629] Searching for globals... [18:01:41.629] [18:01:41.630] Searching for globals ... DONE [18:01:41.630] - globals: [0] [18:01:41.630] getGlobalsAndPackages() ... DONE [18:01:41.630] run() for 'Future' ... [18:01:41.630] - state: 'created' [18:01:41.631] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.644] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.645] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.645] - Field: 'node' [18:01:41.645] - Field: 'label' [18:01:41.645] - Field: 'local' [18:01:41.645] - Field: 'owner' [18:01:41.646] - Field: 'envir' [18:01:41.646] - Field: 'workers' [18:01:41.646] - Field: 'packages' [18:01:41.646] - Field: 'gc' [18:01:41.646] - Field: 'conditions' [18:01:41.646] - Field: 'persistent' [18:01:41.647] - Field: 'expr' [18:01:41.647] - Field: 'uuid' [18:01:41.647] - Field: 'seed' [18:01:41.647] - Field: 'version' [18:01:41.647] - Field: 'result' [18:01:41.648] - Field: 'asynchronous' [18:01:41.648] - Field: 'calls' [18:01:41.648] - Field: 'globals' [18:01:41.648] - Field: 'stdout' [18:01:41.648] - Field: 'earlySignal' [18:01:41.648] - Field: 'lazy' [18:01:41.649] - Field: 'state' [18:01:41.649] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.649] - Launch lazy future ... [18:01:41.649] Packages needed by the future expression (n = 0): [18:01:41.649] Packages needed by future strategies (n = 0): [18:01:41.650] { [18:01:41.650] { [18:01:41.650] { [18:01:41.650] ...future.startTime <- base::Sys.time() [18:01:41.650] { [18:01:41.650] { [18:01:41.650] { [18:01:41.650] { [18:01:41.650] base::local({ [18:01:41.650] has_future <- base::requireNamespace("future", [18:01:41.650] quietly = TRUE) [18:01:41.650] if (has_future) { [18:01:41.650] ns <- base::getNamespace("future") [18:01:41.650] version <- ns[[".package"]][["version"]] [18:01:41.650] if (is.null(version)) [18:01:41.650] version <- utils::packageVersion("future") [18:01:41.650] } [18:01:41.650] else { [18:01:41.650] version <- NULL [18:01:41.650] } [18:01:41.650] if (!has_future || version < "1.8.0") { [18:01:41.650] info <- base::c(r_version = base::gsub("R version ", [18:01:41.650] "", base::R.version$version.string), [18:01:41.650] platform = base::sprintf("%s (%s-bit)", [18:01:41.650] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.650] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.650] "release", "version")], collapse = " "), [18:01:41.650] hostname = base::Sys.info()[["nodename"]]) [18:01:41.650] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.650] info) [18:01:41.650] info <- base::paste(info, collapse = "; ") [18:01:41.650] if (!has_future) { [18:01:41.650] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.650] info) [18:01:41.650] } [18:01:41.650] else { [18:01:41.650] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.650] info, version) [18:01:41.650] } [18:01:41.650] base::stop(msg) [18:01:41.650] } [18:01:41.650] }) [18:01:41.650] } [18:01:41.650] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.650] base::options(mc.cores = 1L) [18:01:41.650] } [18:01:41.650] options(future.plan = NULL) [18:01:41.650] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.650] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.650] } [18:01:41.650] ...future.workdir <- getwd() [18:01:41.650] } [18:01:41.650] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.650] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.650] } [18:01:41.650] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.650] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.650] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.650] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.650] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.650] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.650] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.650] base::names(...future.oldOptions)) [18:01:41.650] } [18:01:41.650] if (FALSE) { [18:01:41.650] } [18:01:41.650] else { [18:01:41.650] if (TRUE) { [18:01:41.650] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.650] open = "w") [18:01:41.650] } [18:01:41.650] else { [18:01:41.650] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.650] windows = "NUL", "/dev/null"), open = "w") [18:01:41.650] } [18:01:41.650] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.650] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.650] base::sink(type = "output", split = FALSE) [18:01:41.650] base::close(...future.stdout) [18:01:41.650] }, add = TRUE) [18:01:41.650] } [18:01:41.650] ...future.frame <- base::sys.nframe() [18:01:41.650] ...future.conditions <- base::list() [18:01:41.650] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.650] if (FALSE) { [18:01:41.650] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.650] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.650] } [18:01:41.650] ...future.result <- base::tryCatch({ [18:01:41.650] base::withCallingHandlers({ [18:01:41.650] ...future.value <- base::withVisible(base::local({ [18:01:41.650] ...future.makeSendCondition <- local({ [18:01:41.650] sendCondition <- NULL [18:01:41.650] function(frame = 1L) { [18:01:41.650] if (is.function(sendCondition)) [18:01:41.650] return(sendCondition) [18:01:41.650] ns <- getNamespace("parallel") [18:01:41.650] if (exists("sendData", mode = "function", [18:01:41.650] envir = ns)) { [18:01:41.650] parallel_sendData <- get("sendData", mode = "function", [18:01:41.650] envir = ns) [18:01:41.650] envir <- sys.frame(frame) [18:01:41.650] master <- NULL [18:01:41.650] while (!identical(envir, .GlobalEnv) && [18:01:41.650] !identical(envir, emptyenv())) { [18:01:41.650] if (exists("master", mode = "list", envir = envir, [18:01:41.650] inherits = FALSE)) { [18:01:41.650] master <- get("master", mode = "list", [18:01:41.650] envir = envir, inherits = FALSE) [18:01:41.650] if (inherits(master, c("SOCKnode", [18:01:41.650] "SOCK0node"))) { [18:01:41.650] sendCondition <<- function(cond) { [18:01:41.650] data <- list(type = "VALUE", value = cond, [18:01:41.650] success = TRUE) [18:01:41.650] parallel_sendData(master, data) [18:01:41.650] } [18:01:41.650] return(sendCondition) [18:01:41.650] } [18:01:41.650] } [18:01:41.650] frame <- frame + 1L [18:01:41.650] envir <- sys.frame(frame) [18:01:41.650] } [18:01:41.650] } [18:01:41.650] sendCondition <<- function(cond) NULL [18:01:41.650] } [18:01:41.650] }) [18:01:41.650] withCallingHandlers({ [18:01:41.650] NULL [18:01:41.650] }, immediateCondition = function(cond) { [18:01:41.650] sendCondition <- ...future.makeSendCondition() [18:01:41.650] sendCondition(cond) [18:01:41.650] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.650] { [18:01:41.650] inherits <- base::inherits [18:01:41.650] invokeRestart <- base::invokeRestart [18:01:41.650] is.null <- base::is.null [18:01:41.650] muffled <- FALSE [18:01:41.650] if (inherits(cond, "message")) { [18:01:41.650] muffled <- grepl(pattern, "muffleMessage") [18:01:41.650] if (muffled) [18:01:41.650] invokeRestart("muffleMessage") [18:01:41.650] } [18:01:41.650] else if (inherits(cond, "warning")) { [18:01:41.650] muffled <- grepl(pattern, "muffleWarning") [18:01:41.650] if (muffled) [18:01:41.650] invokeRestart("muffleWarning") [18:01:41.650] } [18:01:41.650] else if (inherits(cond, "condition")) { [18:01:41.650] if (!is.null(pattern)) { [18:01:41.650] computeRestarts <- base::computeRestarts [18:01:41.650] grepl <- base::grepl [18:01:41.650] restarts <- computeRestarts(cond) [18:01:41.650] for (restart in restarts) { [18:01:41.650] name <- restart$name [18:01:41.650] if (is.null(name)) [18:01:41.650] next [18:01:41.650] if (!grepl(pattern, name)) [18:01:41.650] next [18:01:41.650] invokeRestart(restart) [18:01:41.650] muffled <- TRUE [18:01:41.650] break [18:01:41.650] } [18:01:41.650] } [18:01:41.650] } [18:01:41.650] invisible(muffled) [18:01:41.650] } [18:01:41.650] muffleCondition(cond) [18:01:41.650] }) [18:01:41.650] })) [18:01:41.650] future::FutureResult(value = ...future.value$value, [18:01:41.650] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.650] ...future.rng), globalenv = if (FALSE) [18:01:41.650] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.650] ...future.globalenv.names)) [18:01:41.650] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.650] }, condition = base::local({ [18:01:41.650] c <- base::c [18:01:41.650] inherits <- base::inherits [18:01:41.650] invokeRestart <- base::invokeRestart [18:01:41.650] length <- base::length [18:01:41.650] list <- base::list [18:01:41.650] seq.int <- base::seq.int [18:01:41.650] signalCondition <- base::signalCondition [18:01:41.650] sys.calls <- base::sys.calls [18:01:41.650] `[[` <- base::`[[` [18:01:41.650] `+` <- base::`+` [18:01:41.650] `<<-` <- base::`<<-` [18:01:41.650] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.650] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.650] 3L)] [18:01:41.650] } [18:01:41.650] function(cond) { [18:01:41.650] is_error <- inherits(cond, "error") [18:01:41.650] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.650] NULL) [18:01:41.650] if (is_error) { [18:01:41.650] sessionInformation <- function() { [18:01:41.650] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.650] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.650] search = base::search(), system = base::Sys.info()) [18:01:41.650] } [18:01:41.650] ...future.conditions[[length(...future.conditions) + [18:01:41.650] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.650] cond$call), session = sessionInformation(), [18:01:41.650] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.650] signalCondition(cond) [18:01:41.650] } [18:01:41.650] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.650] "immediateCondition"))) { [18:01:41.650] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.650] ...future.conditions[[length(...future.conditions) + [18:01:41.650] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.650] if (TRUE && !signal) { [18:01:41.650] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.650] { [18:01:41.650] inherits <- base::inherits [18:01:41.650] invokeRestart <- base::invokeRestart [18:01:41.650] is.null <- base::is.null [18:01:41.650] muffled <- FALSE [18:01:41.650] if (inherits(cond, "message")) { [18:01:41.650] muffled <- grepl(pattern, "muffleMessage") [18:01:41.650] if (muffled) [18:01:41.650] invokeRestart("muffleMessage") [18:01:41.650] } [18:01:41.650] else if (inherits(cond, "warning")) { [18:01:41.650] muffled <- grepl(pattern, "muffleWarning") [18:01:41.650] if (muffled) [18:01:41.650] invokeRestart("muffleWarning") [18:01:41.650] } [18:01:41.650] else if (inherits(cond, "condition")) { [18:01:41.650] if (!is.null(pattern)) { [18:01:41.650] computeRestarts <- base::computeRestarts [18:01:41.650] grepl <- base::grepl [18:01:41.650] restarts <- computeRestarts(cond) [18:01:41.650] for (restart in restarts) { [18:01:41.650] name <- restart$name [18:01:41.650] if (is.null(name)) [18:01:41.650] next [18:01:41.650] if (!grepl(pattern, name)) [18:01:41.650] next [18:01:41.650] invokeRestart(restart) [18:01:41.650] muffled <- TRUE [18:01:41.650] break [18:01:41.650] } [18:01:41.650] } [18:01:41.650] } [18:01:41.650] invisible(muffled) [18:01:41.650] } [18:01:41.650] muffleCondition(cond, pattern = "^muffle") [18:01:41.650] } [18:01:41.650] } [18:01:41.650] else { [18:01:41.650] if (TRUE) { [18:01:41.650] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.650] { [18:01:41.650] inherits <- base::inherits [18:01:41.650] invokeRestart <- base::invokeRestart [18:01:41.650] is.null <- base::is.null [18:01:41.650] muffled <- FALSE [18:01:41.650] if (inherits(cond, "message")) { [18:01:41.650] muffled <- grepl(pattern, "muffleMessage") [18:01:41.650] if (muffled) [18:01:41.650] invokeRestart("muffleMessage") [18:01:41.650] } [18:01:41.650] else if (inherits(cond, "warning")) { [18:01:41.650] muffled <- grepl(pattern, "muffleWarning") [18:01:41.650] if (muffled) [18:01:41.650] invokeRestart("muffleWarning") [18:01:41.650] } [18:01:41.650] else if (inherits(cond, "condition")) { [18:01:41.650] if (!is.null(pattern)) { [18:01:41.650] computeRestarts <- base::computeRestarts [18:01:41.650] grepl <- base::grepl [18:01:41.650] restarts <- computeRestarts(cond) [18:01:41.650] for (restart in restarts) { [18:01:41.650] name <- restart$name [18:01:41.650] if (is.null(name)) [18:01:41.650] next [18:01:41.650] if (!grepl(pattern, name)) [18:01:41.650] next [18:01:41.650] invokeRestart(restart) [18:01:41.650] muffled <- TRUE [18:01:41.650] break [18:01:41.650] } [18:01:41.650] } [18:01:41.650] } [18:01:41.650] invisible(muffled) [18:01:41.650] } [18:01:41.650] muffleCondition(cond, pattern = "^muffle") [18:01:41.650] } [18:01:41.650] } [18:01:41.650] } [18:01:41.650] })) [18:01:41.650] }, error = function(ex) { [18:01:41.650] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.650] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.650] ...future.rng), started = ...future.startTime, [18:01:41.650] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.650] version = "1.8"), class = "FutureResult") [18:01:41.650] }, finally = { [18:01:41.650] if (!identical(...future.workdir, getwd())) [18:01:41.650] setwd(...future.workdir) [18:01:41.650] { [18:01:41.650] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.650] ...future.oldOptions$nwarnings <- NULL [18:01:41.650] } [18:01:41.650] base::options(...future.oldOptions) [18:01:41.650] if (.Platform$OS.type == "windows") { [18:01:41.650] old_names <- names(...future.oldEnvVars) [18:01:41.650] envs <- base::Sys.getenv() [18:01:41.650] names <- names(envs) [18:01:41.650] common <- intersect(names, old_names) [18:01:41.650] added <- setdiff(names, old_names) [18:01:41.650] removed <- setdiff(old_names, names) [18:01:41.650] changed <- common[...future.oldEnvVars[common] != [18:01:41.650] envs[common]] [18:01:41.650] NAMES <- toupper(changed) [18:01:41.650] args <- list() [18:01:41.650] for (kk in seq_along(NAMES)) { [18:01:41.650] name <- changed[[kk]] [18:01:41.650] NAME <- NAMES[[kk]] [18:01:41.650] if (name != NAME && is.element(NAME, old_names)) [18:01:41.650] next [18:01:41.650] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.650] } [18:01:41.650] NAMES <- toupper(added) [18:01:41.650] for (kk in seq_along(NAMES)) { [18:01:41.650] name <- added[[kk]] [18:01:41.650] NAME <- NAMES[[kk]] [18:01:41.650] if (name != NAME && is.element(NAME, old_names)) [18:01:41.650] next [18:01:41.650] args[[name]] <- "" [18:01:41.650] } [18:01:41.650] NAMES <- toupper(removed) [18:01:41.650] for (kk in seq_along(NAMES)) { [18:01:41.650] name <- removed[[kk]] [18:01:41.650] NAME <- NAMES[[kk]] [18:01:41.650] if (name != NAME && is.element(NAME, old_names)) [18:01:41.650] next [18:01:41.650] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.650] } [18:01:41.650] if (length(args) > 0) [18:01:41.650] base::do.call(base::Sys.setenv, args = args) [18:01:41.650] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.650] } [18:01:41.650] else { [18:01:41.650] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.650] } [18:01:41.650] { [18:01:41.650] if (base::length(...future.futureOptionsAdded) > [18:01:41.650] 0L) { [18:01:41.650] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.650] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.650] base::options(opts) [18:01:41.650] } [18:01:41.650] { [18:01:41.650] { [18:01:41.650] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.650] NULL [18:01:41.650] } [18:01:41.650] options(future.plan = NULL) [18:01:41.650] if (is.na(NA_character_)) [18:01:41.650] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.650] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.650] future::plan(list(function (..., workers = availableCores(), [18:01:41.650] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.650] envir = parent.frame()) [18:01:41.650] { [18:01:41.650] if (is.function(workers)) [18:01:41.650] workers <- workers() [18:01:41.650] workers <- structure(as.integer(workers), [18:01:41.650] class = class(workers)) [18:01:41.650] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.650] workers >= 1) [18:01:41.650] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.650] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.650] } [18:01:41.650] future <- MultisessionFuture(..., workers = workers, [18:01:41.650] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.650] envir = envir) [18:01:41.650] if (!future$lazy) [18:01:41.650] future <- run(future) [18:01:41.650] invisible(future) [18:01:41.650] }), .cleanup = FALSE, .init = FALSE) [18:01:41.650] } [18:01:41.650] } [18:01:41.650] } [18:01:41.650] }) [18:01:41.650] if (TRUE) { [18:01:41.650] base::sink(type = "output", split = FALSE) [18:01:41.650] if (TRUE) { [18:01:41.650] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.650] } [18:01:41.650] else { [18:01:41.650] ...future.result["stdout"] <- base::list(NULL) [18:01:41.650] } [18:01:41.650] base::close(...future.stdout) [18:01:41.650] ...future.stdout <- NULL [18:01:41.650] } [18:01:41.650] ...future.result$conditions <- ...future.conditions [18:01:41.650] ...future.result$finished <- base::Sys.time() [18:01:41.650] ...future.result [18:01:41.650] } [18:01:41.656] MultisessionFuture started [18:01:41.656] - Launch lazy future ... done [18:01:41.656] run() for 'MultisessionFuture' ... done [18:01:41.656] getGlobalsAndPackages() ... [18:01:41.657] Searching for globals... [18:01:41.657] - globals found: [1] '{' [18:01:41.658] Searching for globals ... DONE [18:01:41.658] Resolving globals: FALSE [18:01:41.658] [18:01:41.658] [18:01:41.659] getGlobalsAndPackages() ... DONE [18:01:41.659] run() for 'Future' ... [18:01:41.659] - state: 'created' [18:01:41.659] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.673] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.673] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.673] - Field: 'node' [18:01:41.673] - Field: 'label' [18:01:41.674] - Field: 'local' [18:01:41.674] - Field: 'owner' [18:01:41.674] - Field: 'envir' [18:01:41.674] - Field: 'workers' [18:01:41.674] - Field: 'packages' [18:01:41.675] - Field: 'gc' [18:01:41.675] - Field: 'conditions' [18:01:41.675] - Field: 'persistent' [18:01:41.675] - Field: 'expr' [18:01:41.675] - Field: 'uuid' [18:01:41.675] - Field: 'seed' [18:01:41.676] - Field: 'version' [18:01:41.676] - Field: 'result' [18:01:41.676] - Field: 'asynchronous' [18:01:41.676] - Field: 'calls' [18:01:41.676] - Field: 'globals' [18:01:41.676] - Field: 'stdout' [18:01:41.677] - Field: 'earlySignal' [18:01:41.677] - Field: 'lazy' [18:01:41.677] - Field: 'state' [18:01:41.677] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.677] - Launch lazy future ... [18:01:41.678] Packages needed by the future expression (n = 0): [18:01:41.678] Packages needed by future strategies (n = 0): [18:01:41.678] { [18:01:41.678] { [18:01:41.678] { [18:01:41.678] ...future.startTime <- base::Sys.time() [18:01:41.678] { [18:01:41.678] { [18:01:41.678] { [18:01:41.678] { [18:01:41.678] base::local({ [18:01:41.678] has_future <- base::requireNamespace("future", [18:01:41.678] quietly = TRUE) [18:01:41.678] if (has_future) { [18:01:41.678] ns <- base::getNamespace("future") [18:01:41.678] version <- ns[[".package"]][["version"]] [18:01:41.678] if (is.null(version)) [18:01:41.678] version <- utils::packageVersion("future") [18:01:41.678] } [18:01:41.678] else { [18:01:41.678] version <- NULL [18:01:41.678] } [18:01:41.678] if (!has_future || version < "1.8.0") { [18:01:41.678] info <- base::c(r_version = base::gsub("R version ", [18:01:41.678] "", base::R.version$version.string), [18:01:41.678] platform = base::sprintf("%s (%s-bit)", [18:01:41.678] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.678] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.678] "release", "version")], collapse = " "), [18:01:41.678] hostname = base::Sys.info()[["nodename"]]) [18:01:41.678] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.678] info) [18:01:41.678] info <- base::paste(info, collapse = "; ") [18:01:41.678] if (!has_future) { [18:01:41.678] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.678] info) [18:01:41.678] } [18:01:41.678] else { [18:01:41.678] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.678] info, version) [18:01:41.678] } [18:01:41.678] base::stop(msg) [18:01:41.678] } [18:01:41.678] }) [18:01:41.678] } [18:01:41.678] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.678] base::options(mc.cores = 1L) [18:01:41.678] } [18:01:41.678] options(future.plan = NULL) [18:01:41.678] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.678] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.678] } [18:01:41.678] ...future.workdir <- getwd() [18:01:41.678] } [18:01:41.678] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.678] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.678] } [18:01:41.678] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.678] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.678] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.678] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.678] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.678] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.678] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.678] base::names(...future.oldOptions)) [18:01:41.678] } [18:01:41.678] if (FALSE) { [18:01:41.678] } [18:01:41.678] else { [18:01:41.678] if (TRUE) { [18:01:41.678] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.678] open = "w") [18:01:41.678] } [18:01:41.678] else { [18:01:41.678] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.678] windows = "NUL", "/dev/null"), open = "w") [18:01:41.678] } [18:01:41.678] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.678] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.678] base::sink(type = "output", split = FALSE) [18:01:41.678] base::close(...future.stdout) [18:01:41.678] }, add = TRUE) [18:01:41.678] } [18:01:41.678] ...future.frame <- base::sys.nframe() [18:01:41.678] ...future.conditions <- base::list() [18:01:41.678] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.678] if (FALSE) { [18:01:41.678] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.678] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.678] } [18:01:41.678] ...future.result <- base::tryCatch({ [18:01:41.678] base::withCallingHandlers({ [18:01:41.678] ...future.value <- base::withVisible(base::local({ [18:01:41.678] ...future.makeSendCondition <- local({ [18:01:41.678] sendCondition <- NULL [18:01:41.678] function(frame = 1L) { [18:01:41.678] if (is.function(sendCondition)) [18:01:41.678] return(sendCondition) [18:01:41.678] ns <- getNamespace("parallel") [18:01:41.678] if (exists("sendData", mode = "function", [18:01:41.678] envir = ns)) { [18:01:41.678] parallel_sendData <- get("sendData", mode = "function", [18:01:41.678] envir = ns) [18:01:41.678] envir <- sys.frame(frame) [18:01:41.678] master <- NULL [18:01:41.678] while (!identical(envir, .GlobalEnv) && [18:01:41.678] !identical(envir, emptyenv())) { [18:01:41.678] if (exists("master", mode = "list", envir = envir, [18:01:41.678] inherits = FALSE)) { [18:01:41.678] master <- get("master", mode = "list", [18:01:41.678] envir = envir, inherits = FALSE) [18:01:41.678] if (inherits(master, c("SOCKnode", [18:01:41.678] "SOCK0node"))) { [18:01:41.678] sendCondition <<- function(cond) { [18:01:41.678] data <- list(type = "VALUE", value = cond, [18:01:41.678] success = TRUE) [18:01:41.678] parallel_sendData(master, data) [18:01:41.678] } [18:01:41.678] return(sendCondition) [18:01:41.678] } [18:01:41.678] } [18:01:41.678] frame <- frame + 1L [18:01:41.678] envir <- sys.frame(frame) [18:01:41.678] } [18:01:41.678] } [18:01:41.678] sendCondition <<- function(cond) NULL [18:01:41.678] } [18:01:41.678] }) [18:01:41.678] withCallingHandlers({ [18:01:41.678] { [18:01:41.678] 4 [18:01:41.678] } [18:01:41.678] }, immediateCondition = function(cond) { [18:01:41.678] sendCondition <- ...future.makeSendCondition() [18:01:41.678] sendCondition(cond) [18:01:41.678] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.678] { [18:01:41.678] inherits <- base::inherits [18:01:41.678] invokeRestart <- base::invokeRestart [18:01:41.678] is.null <- base::is.null [18:01:41.678] muffled <- FALSE [18:01:41.678] if (inherits(cond, "message")) { [18:01:41.678] muffled <- grepl(pattern, "muffleMessage") [18:01:41.678] if (muffled) [18:01:41.678] invokeRestart("muffleMessage") [18:01:41.678] } [18:01:41.678] else if (inherits(cond, "warning")) { [18:01:41.678] muffled <- grepl(pattern, "muffleWarning") [18:01:41.678] if (muffled) [18:01:41.678] invokeRestart("muffleWarning") [18:01:41.678] } [18:01:41.678] else if (inherits(cond, "condition")) { [18:01:41.678] if (!is.null(pattern)) { [18:01:41.678] computeRestarts <- base::computeRestarts [18:01:41.678] grepl <- base::grepl [18:01:41.678] restarts <- computeRestarts(cond) [18:01:41.678] for (restart in restarts) { [18:01:41.678] name <- restart$name [18:01:41.678] if (is.null(name)) [18:01:41.678] next [18:01:41.678] if (!grepl(pattern, name)) [18:01:41.678] next [18:01:41.678] invokeRestart(restart) [18:01:41.678] muffled <- TRUE [18:01:41.678] break [18:01:41.678] } [18:01:41.678] } [18:01:41.678] } [18:01:41.678] invisible(muffled) [18:01:41.678] } [18:01:41.678] muffleCondition(cond) [18:01:41.678] }) [18:01:41.678] })) [18:01:41.678] future::FutureResult(value = ...future.value$value, [18:01:41.678] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.678] ...future.rng), globalenv = if (FALSE) [18:01:41.678] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.678] ...future.globalenv.names)) [18:01:41.678] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.678] }, condition = base::local({ [18:01:41.678] c <- base::c [18:01:41.678] inherits <- base::inherits [18:01:41.678] invokeRestart <- base::invokeRestart [18:01:41.678] length <- base::length [18:01:41.678] list <- base::list [18:01:41.678] seq.int <- base::seq.int [18:01:41.678] signalCondition <- base::signalCondition [18:01:41.678] sys.calls <- base::sys.calls [18:01:41.678] `[[` <- base::`[[` [18:01:41.678] `+` <- base::`+` [18:01:41.678] `<<-` <- base::`<<-` [18:01:41.678] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.678] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.678] 3L)] [18:01:41.678] } [18:01:41.678] function(cond) { [18:01:41.678] is_error <- inherits(cond, "error") [18:01:41.678] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.678] NULL) [18:01:41.678] if (is_error) { [18:01:41.678] sessionInformation <- function() { [18:01:41.678] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.678] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.678] search = base::search(), system = base::Sys.info()) [18:01:41.678] } [18:01:41.678] ...future.conditions[[length(...future.conditions) + [18:01:41.678] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.678] cond$call), session = sessionInformation(), [18:01:41.678] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.678] signalCondition(cond) [18:01:41.678] } [18:01:41.678] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.678] "immediateCondition"))) { [18:01:41.678] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.678] ...future.conditions[[length(...future.conditions) + [18:01:41.678] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.678] if (TRUE && !signal) { [18:01:41.678] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.678] { [18:01:41.678] inherits <- base::inherits [18:01:41.678] invokeRestart <- base::invokeRestart [18:01:41.678] is.null <- base::is.null [18:01:41.678] muffled <- FALSE [18:01:41.678] if (inherits(cond, "message")) { [18:01:41.678] muffled <- grepl(pattern, "muffleMessage") [18:01:41.678] if (muffled) [18:01:41.678] invokeRestart("muffleMessage") [18:01:41.678] } [18:01:41.678] else if (inherits(cond, "warning")) { [18:01:41.678] muffled <- grepl(pattern, "muffleWarning") [18:01:41.678] if (muffled) [18:01:41.678] invokeRestart("muffleWarning") [18:01:41.678] } [18:01:41.678] else if (inherits(cond, "condition")) { [18:01:41.678] if (!is.null(pattern)) { [18:01:41.678] computeRestarts <- base::computeRestarts [18:01:41.678] grepl <- base::grepl [18:01:41.678] restarts <- computeRestarts(cond) [18:01:41.678] for (restart in restarts) { [18:01:41.678] name <- restart$name [18:01:41.678] if (is.null(name)) [18:01:41.678] next [18:01:41.678] if (!grepl(pattern, name)) [18:01:41.678] next [18:01:41.678] invokeRestart(restart) [18:01:41.678] muffled <- TRUE [18:01:41.678] break [18:01:41.678] } [18:01:41.678] } [18:01:41.678] } [18:01:41.678] invisible(muffled) [18:01:41.678] } [18:01:41.678] muffleCondition(cond, pattern = "^muffle") [18:01:41.678] } [18:01:41.678] } [18:01:41.678] else { [18:01:41.678] if (TRUE) { [18:01:41.678] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.678] { [18:01:41.678] inherits <- base::inherits [18:01:41.678] invokeRestart <- base::invokeRestart [18:01:41.678] is.null <- base::is.null [18:01:41.678] muffled <- FALSE [18:01:41.678] if (inherits(cond, "message")) { [18:01:41.678] muffled <- grepl(pattern, "muffleMessage") [18:01:41.678] if (muffled) [18:01:41.678] invokeRestart("muffleMessage") [18:01:41.678] } [18:01:41.678] else if (inherits(cond, "warning")) { [18:01:41.678] muffled <- grepl(pattern, "muffleWarning") [18:01:41.678] if (muffled) [18:01:41.678] invokeRestart("muffleWarning") [18:01:41.678] } [18:01:41.678] else if (inherits(cond, "condition")) { [18:01:41.678] if (!is.null(pattern)) { [18:01:41.678] computeRestarts <- base::computeRestarts [18:01:41.678] grepl <- base::grepl [18:01:41.678] restarts <- computeRestarts(cond) [18:01:41.678] for (restart in restarts) { [18:01:41.678] name <- restart$name [18:01:41.678] if (is.null(name)) [18:01:41.678] next [18:01:41.678] if (!grepl(pattern, name)) [18:01:41.678] next [18:01:41.678] invokeRestart(restart) [18:01:41.678] muffled <- TRUE [18:01:41.678] break [18:01:41.678] } [18:01:41.678] } [18:01:41.678] } [18:01:41.678] invisible(muffled) [18:01:41.678] } [18:01:41.678] muffleCondition(cond, pattern = "^muffle") [18:01:41.678] } [18:01:41.678] } [18:01:41.678] } [18:01:41.678] })) [18:01:41.678] }, error = function(ex) { [18:01:41.678] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.678] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.678] ...future.rng), started = ...future.startTime, [18:01:41.678] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.678] version = "1.8"), class = "FutureResult") [18:01:41.678] }, finally = { [18:01:41.678] if (!identical(...future.workdir, getwd())) [18:01:41.678] setwd(...future.workdir) [18:01:41.678] { [18:01:41.678] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.678] ...future.oldOptions$nwarnings <- NULL [18:01:41.678] } [18:01:41.678] base::options(...future.oldOptions) [18:01:41.678] if (.Platform$OS.type == "windows") { [18:01:41.678] old_names <- names(...future.oldEnvVars) [18:01:41.678] envs <- base::Sys.getenv() [18:01:41.678] names <- names(envs) [18:01:41.678] common <- intersect(names, old_names) [18:01:41.678] added <- setdiff(names, old_names) [18:01:41.678] removed <- setdiff(old_names, names) [18:01:41.678] changed <- common[...future.oldEnvVars[common] != [18:01:41.678] envs[common]] [18:01:41.678] NAMES <- toupper(changed) [18:01:41.678] args <- list() [18:01:41.678] for (kk in seq_along(NAMES)) { [18:01:41.678] name <- changed[[kk]] [18:01:41.678] NAME <- NAMES[[kk]] [18:01:41.678] if (name != NAME && is.element(NAME, old_names)) [18:01:41.678] next [18:01:41.678] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.678] } [18:01:41.678] NAMES <- toupper(added) [18:01:41.678] for (kk in seq_along(NAMES)) { [18:01:41.678] name <- added[[kk]] [18:01:41.678] NAME <- NAMES[[kk]] [18:01:41.678] if (name != NAME && is.element(NAME, old_names)) [18:01:41.678] next [18:01:41.678] args[[name]] <- "" [18:01:41.678] } [18:01:41.678] NAMES <- toupper(removed) [18:01:41.678] for (kk in seq_along(NAMES)) { [18:01:41.678] name <- removed[[kk]] [18:01:41.678] NAME <- NAMES[[kk]] [18:01:41.678] if (name != NAME && is.element(NAME, old_names)) [18:01:41.678] next [18:01:41.678] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.678] } [18:01:41.678] if (length(args) > 0) [18:01:41.678] base::do.call(base::Sys.setenv, args = args) [18:01:41.678] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.678] } [18:01:41.678] else { [18:01:41.678] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.678] } [18:01:41.678] { [18:01:41.678] if (base::length(...future.futureOptionsAdded) > [18:01:41.678] 0L) { [18:01:41.678] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.678] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.678] base::options(opts) [18:01:41.678] } [18:01:41.678] { [18:01:41.678] { [18:01:41.678] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.678] NULL [18:01:41.678] } [18:01:41.678] options(future.plan = NULL) [18:01:41.678] if (is.na(NA_character_)) [18:01:41.678] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.678] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.678] future::plan(list(function (..., workers = availableCores(), [18:01:41.678] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.678] envir = parent.frame()) [18:01:41.678] { [18:01:41.678] if (is.function(workers)) [18:01:41.678] workers <- workers() [18:01:41.678] workers <- structure(as.integer(workers), [18:01:41.678] class = class(workers)) [18:01:41.678] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.678] workers >= 1) [18:01:41.678] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.678] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.678] } [18:01:41.678] future <- MultisessionFuture(..., workers = workers, [18:01:41.678] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.678] envir = envir) [18:01:41.678] if (!future$lazy) [18:01:41.678] future <- run(future) [18:01:41.678] invisible(future) [18:01:41.678] }), .cleanup = FALSE, .init = FALSE) [18:01:41.678] } [18:01:41.678] } [18:01:41.678] } [18:01:41.678] }) [18:01:41.678] if (TRUE) { [18:01:41.678] base::sink(type = "output", split = FALSE) [18:01:41.678] if (TRUE) { [18:01:41.678] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.678] } [18:01:41.678] else { [18:01:41.678] ...future.result["stdout"] <- base::list(NULL) [18:01:41.678] } [18:01:41.678] base::close(...future.stdout) [18:01:41.678] ...future.stdout <- NULL [18:01:41.678] } [18:01:41.678] ...future.result$conditions <- ...future.conditions [18:01:41.678] ...future.result$finished <- base::Sys.time() [18:01:41.678] ...future.result [18:01:41.678] } [18:01:41.683] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:41.714] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.715] - Validating connection of MultisessionFuture [18:01:41.715] - received message: FutureResult [18:01:41.715] - Received FutureResult [18:01:41.715] - Erased future from FutureRegistry [18:01:41.715] result() for ClusterFuture ... [18:01:41.716] - result already collected: FutureResult [18:01:41.716] result() for ClusterFuture ... done [18:01:41.716] receiveMessageFromWorker() for ClusterFuture ... done [18:01:41.716] result() for ClusterFuture ... [18:01:41.716] - result already collected: FutureResult [18:01:41.716] result() for ClusterFuture ... done [18:01:41.717] result() for ClusterFuture ... [18:01:41.717] - result already collected: FutureResult [18:01:41.717] result() for ClusterFuture ... done [18:01:41.718] MultisessionFuture started [18:01:41.718] - Launch lazy future ... done [18:01:41.718] run() for 'MultisessionFuture' ... done [18:01:41.720] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.720] - Validating connection of MultisessionFuture [18:01:41.721] - received message: FutureResult [18:01:41.721] - Received FutureResult [18:01:41.721] - Erased future from FutureRegistry [18:01:41.721] result() for ClusterFuture ... [18:01:41.721] - result already collected: FutureResult [18:01:41.722] result() for ClusterFuture ... done [18:01:41.722] receiveMessageFromWorker() for ClusterFuture ... done [18:01:41.735] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.735] - Validating connection of MultisessionFuture [18:01:41.735] - received message: FutureResult [18:01:41.736] - Received FutureResult [18:01:41.736] - Erased future from FutureRegistry [18:01:41.736] result() for ClusterFuture ... [18:01:41.736] - result already collected: FutureResult [18:01:41.736] result() for ClusterFuture ... done [18:01:41.736] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:41.738] resolve() on environment ... [18:01:41.738] recursive: 0 [18:01:41.739] elements: [4] 'a', 'b', 'c', 'd' [18:01:41.739] signalConditionsASAP(numeric, pos=1) ... [18:01:41.739] - nx: 4 [18:01:41.739] - relay: TRUE [18:01:41.739] - stdout: TRUE [18:01:41.739] - signal: TRUE [18:01:41.740] - resignal: FALSE [18:01:41.740] - force: TRUE [18:01:41.740] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.740] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.740] - until=2 [18:01:41.740] - relaying element #2 [18:01:41.741] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:41.741] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.741] signalConditionsASAP(NULL, pos=1) ... done [18:01:41.741] length: 3 (resolved future 1) [18:01:41.741] Future #2 [18:01:41.742] result() for ClusterFuture ... [18:01:41.742] - result already collected: FutureResult [18:01:41.742] result() for ClusterFuture ... done [18:01:41.742] result() for ClusterFuture ... [18:01:41.742] - result already collected: FutureResult [18:01:41.742] result() for ClusterFuture ... done [18:01:41.742] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:41.743] - nx: 4 [18:01:41.743] - relay: TRUE [18:01:41.743] - stdout: TRUE [18:01:41.743] - signal: TRUE [18:01:41.743] - resignal: FALSE [18:01:41.743] - force: TRUE [18:01:41.744] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:41.744] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.744] - until=2 [18:01:41.744] - relaying element #2 [18:01:41.744] result() for ClusterFuture ... [18:01:41.744] - result already collected: FutureResult [18:01:41.745] result() for ClusterFuture ... done [18:01:41.745] result() for ClusterFuture ... [18:01:41.745] - result already collected: FutureResult [18:01:41.745] result() for ClusterFuture ... done [18:01:41.745] result() for ClusterFuture ... [18:01:41.745] - result already collected: FutureResult [18:01:41.746] result() for ClusterFuture ... done [18:01:41.746] result() for ClusterFuture ... [18:01:41.746] - result already collected: FutureResult [18:01:41.746] result() for ClusterFuture ... done [18:01:41.746] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:41.746] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:41.746] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:41.747] length: 2 (resolved future 2) [18:01:41.747] Future #3 [18:01:41.747] result() for ClusterFuture ... [18:01:41.747] - result already collected: FutureResult [18:01:41.747] result() for ClusterFuture ... done [18:01:41.748] result() for ClusterFuture ... [18:01:41.748] - result already collected: FutureResult [18:01:41.748] result() for ClusterFuture ... done [18:01:41.748] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:41.748] - nx: 4 [18:01:41.748] - relay: TRUE [18:01:41.748] - stdout: TRUE [18:01:41.749] - signal: TRUE [18:01:41.749] - resignal: FALSE [18:01:41.749] - force: TRUE [18:01:41.749] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:41.749] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:41.749] - until=3 [18:01:41.750] - relaying element #3 [18:01:41.750] result() for ClusterFuture ... [18:01:41.750] - result already collected: FutureResult [18:01:41.750] result() for ClusterFuture ... done [18:01:41.750] result() for ClusterFuture ... [18:01:41.750] - result already collected: FutureResult [18:01:41.751] result() for ClusterFuture ... done [18:01:41.751] result() for ClusterFuture ... [18:01:41.751] - result already collected: FutureResult [18:01:41.751] result() for ClusterFuture ... done [18:01:41.751] result() for ClusterFuture ... [18:01:41.751] - result already collected: FutureResult [18:01:41.752] result() for ClusterFuture ... done [18:01:41.752] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:41.752] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:41.752] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:41.752] length: 1 (resolved future 3) [18:01:41.752] Future #4 [18:01:41.753] result() for ClusterFuture ... [18:01:41.753] - result already collected: FutureResult [18:01:41.753] result() for ClusterFuture ... done [18:01:41.753] result() for ClusterFuture ... [18:01:41.753] - result already collected: FutureResult [18:01:41.753] result() for ClusterFuture ... done [18:01:41.754] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:41.754] - nx: 4 [18:01:41.754] - relay: TRUE [18:01:41.754] - stdout: TRUE [18:01:41.754] - signal: TRUE [18:01:41.754] - resignal: FALSE [18:01:41.754] - force: TRUE [18:01:41.755] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:41.755] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:41.755] - until=4 [18:01:41.755] - relaying element #4 [18:01:41.755] result() for ClusterFuture ... [18:01:41.755] - result already collected: FutureResult [18:01:41.756] result() for ClusterFuture ... done [18:01:41.756] result() for ClusterFuture ... [18:01:41.756] - result already collected: FutureResult [18:01:41.756] result() for ClusterFuture ... done [18:01:41.756] result() for ClusterFuture ... [18:01:41.756] - result already collected: FutureResult [18:01:41.757] result() for ClusterFuture ... done [18:01:41.757] result() for ClusterFuture ... [18:01:41.757] - result already collected: FutureResult [18:01:41.757] result() for ClusterFuture ... done [18:01:41.757] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.757] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:41.758] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:41.758] length: 0 (resolved future 4) [18:01:41.758] Relaying remaining futures [18:01:41.758] signalConditionsASAP(NULL, pos=0) ... [18:01:41.758] - nx: 4 [18:01:41.758] - relay: TRUE [18:01:41.758] - stdout: TRUE [18:01:41.759] - signal: TRUE [18:01:41.759] - resignal: FALSE [18:01:41.759] - force: TRUE [18:01:41.759] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.759] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:41.759] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.760] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:41.760] signalConditionsASAP(NULL, pos=0) ... done [18:01:41.760] resolve() on environment ... DONE [18:01:41.760] result() for ClusterFuture ... [18:01:41.760] - result already collected: FutureResult [18:01:41.760] result() for ClusterFuture ... done [18:01:41.761] result() for ClusterFuture ... [18:01:41.761] - result already collected: FutureResult [18:01:41.761] result() for ClusterFuture ... done [18:01:41.761] result() for ClusterFuture ... [18:01:41.761] - result already collected: FutureResult [18:01:41.761] result() for ClusterFuture ... done [18:01:41.762] result() for ClusterFuture ... [18:01:41.762] - result already collected: FutureResult [18:01:41.762] result() for ClusterFuture ... done [18:01:41.762] result() for ClusterFuture ... [18:01:41.762] - result already collected: FutureResult [18:01:41.762] result() for ClusterFuture ... done [18:01:41.763] result() for ClusterFuture ... [18:01:41.763] - result already collected: FutureResult [18:01:41.763] result() for ClusterFuture ... done Dimensions: c(2, 3) [18:01:41.763] getGlobalsAndPackages() ... [18:01:41.764] Searching for globals... [18:01:41.764] [18:01:41.764] Searching for globals ... DONE [18:01:41.764] - globals: [0] [18:01:41.764] getGlobalsAndPackages() ... DONE [18:01:41.765] run() for 'Future' ... [18:01:41.765] - state: 'created' [18:01:41.765] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.779] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.779] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.780] - Field: 'node' [18:01:41.780] - Field: 'label' [18:01:41.780] - Field: 'local' [18:01:41.780] - Field: 'owner' [18:01:41.780] - Field: 'envir' [18:01:41.780] - Field: 'workers' [18:01:41.781] - Field: 'packages' [18:01:41.781] - Field: 'gc' [18:01:41.781] - Field: 'conditions' [18:01:41.781] - Field: 'persistent' [18:01:41.781] - Field: 'expr' [18:01:41.782] - Field: 'uuid' [18:01:41.782] - Field: 'seed' [18:01:41.782] - Field: 'version' [18:01:41.782] - Field: 'result' [18:01:41.782] - Field: 'asynchronous' [18:01:41.782] - Field: 'calls' [18:01:41.783] - Field: 'globals' [18:01:41.783] - Field: 'stdout' [18:01:41.783] - Field: 'earlySignal' [18:01:41.783] - Field: 'lazy' [18:01:41.783] - Field: 'state' [18:01:41.783] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.784] - Launch lazy future ... [18:01:41.784] Packages needed by the future expression (n = 0): [18:01:41.784] Packages needed by future strategies (n = 0): [18:01:41.785] { [18:01:41.785] { [18:01:41.785] { [18:01:41.785] ...future.startTime <- base::Sys.time() [18:01:41.785] { [18:01:41.785] { [18:01:41.785] { [18:01:41.785] { [18:01:41.785] base::local({ [18:01:41.785] has_future <- base::requireNamespace("future", [18:01:41.785] quietly = TRUE) [18:01:41.785] if (has_future) { [18:01:41.785] ns <- base::getNamespace("future") [18:01:41.785] version <- ns[[".package"]][["version"]] [18:01:41.785] if (is.null(version)) [18:01:41.785] version <- utils::packageVersion("future") [18:01:41.785] } [18:01:41.785] else { [18:01:41.785] version <- NULL [18:01:41.785] } [18:01:41.785] if (!has_future || version < "1.8.0") { [18:01:41.785] info <- base::c(r_version = base::gsub("R version ", [18:01:41.785] "", base::R.version$version.string), [18:01:41.785] platform = base::sprintf("%s (%s-bit)", [18:01:41.785] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.785] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.785] "release", "version")], collapse = " "), [18:01:41.785] hostname = base::Sys.info()[["nodename"]]) [18:01:41.785] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.785] info) [18:01:41.785] info <- base::paste(info, collapse = "; ") [18:01:41.785] if (!has_future) { [18:01:41.785] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.785] info) [18:01:41.785] } [18:01:41.785] else { [18:01:41.785] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.785] info, version) [18:01:41.785] } [18:01:41.785] base::stop(msg) [18:01:41.785] } [18:01:41.785] }) [18:01:41.785] } [18:01:41.785] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.785] base::options(mc.cores = 1L) [18:01:41.785] } [18:01:41.785] options(future.plan = NULL) [18:01:41.785] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.785] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.785] } [18:01:41.785] ...future.workdir <- getwd() [18:01:41.785] } [18:01:41.785] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.785] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.785] } [18:01:41.785] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.785] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.785] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.785] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.785] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.785] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.785] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.785] base::names(...future.oldOptions)) [18:01:41.785] } [18:01:41.785] if (FALSE) { [18:01:41.785] } [18:01:41.785] else { [18:01:41.785] if (TRUE) { [18:01:41.785] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.785] open = "w") [18:01:41.785] } [18:01:41.785] else { [18:01:41.785] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.785] windows = "NUL", "/dev/null"), open = "w") [18:01:41.785] } [18:01:41.785] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.785] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.785] base::sink(type = "output", split = FALSE) [18:01:41.785] base::close(...future.stdout) [18:01:41.785] }, add = TRUE) [18:01:41.785] } [18:01:41.785] ...future.frame <- base::sys.nframe() [18:01:41.785] ...future.conditions <- base::list() [18:01:41.785] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.785] if (FALSE) { [18:01:41.785] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.785] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.785] } [18:01:41.785] ...future.result <- base::tryCatch({ [18:01:41.785] base::withCallingHandlers({ [18:01:41.785] ...future.value <- base::withVisible(base::local({ [18:01:41.785] ...future.makeSendCondition <- local({ [18:01:41.785] sendCondition <- NULL [18:01:41.785] function(frame = 1L) { [18:01:41.785] if (is.function(sendCondition)) [18:01:41.785] return(sendCondition) [18:01:41.785] ns <- getNamespace("parallel") [18:01:41.785] if (exists("sendData", mode = "function", [18:01:41.785] envir = ns)) { [18:01:41.785] parallel_sendData <- get("sendData", mode = "function", [18:01:41.785] envir = ns) [18:01:41.785] envir <- sys.frame(frame) [18:01:41.785] master <- NULL [18:01:41.785] while (!identical(envir, .GlobalEnv) && [18:01:41.785] !identical(envir, emptyenv())) { [18:01:41.785] if (exists("master", mode = "list", envir = envir, [18:01:41.785] inherits = FALSE)) { [18:01:41.785] master <- get("master", mode = "list", [18:01:41.785] envir = envir, inherits = FALSE) [18:01:41.785] if (inherits(master, c("SOCKnode", [18:01:41.785] "SOCK0node"))) { [18:01:41.785] sendCondition <<- function(cond) { [18:01:41.785] data <- list(type = "VALUE", value = cond, [18:01:41.785] success = TRUE) [18:01:41.785] parallel_sendData(master, data) [18:01:41.785] } [18:01:41.785] return(sendCondition) [18:01:41.785] } [18:01:41.785] } [18:01:41.785] frame <- frame + 1L [18:01:41.785] envir <- sys.frame(frame) [18:01:41.785] } [18:01:41.785] } [18:01:41.785] sendCondition <<- function(cond) NULL [18:01:41.785] } [18:01:41.785] }) [18:01:41.785] withCallingHandlers({ [18:01:41.785] 2 [18:01:41.785] }, immediateCondition = function(cond) { [18:01:41.785] sendCondition <- ...future.makeSendCondition() [18:01:41.785] sendCondition(cond) [18:01:41.785] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.785] { [18:01:41.785] inherits <- base::inherits [18:01:41.785] invokeRestart <- base::invokeRestart [18:01:41.785] is.null <- base::is.null [18:01:41.785] muffled <- FALSE [18:01:41.785] if (inherits(cond, "message")) { [18:01:41.785] muffled <- grepl(pattern, "muffleMessage") [18:01:41.785] if (muffled) [18:01:41.785] invokeRestart("muffleMessage") [18:01:41.785] } [18:01:41.785] else if (inherits(cond, "warning")) { [18:01:41.785] muffled <- grepl(pattern, "muffleWarning") [18:01:41.785] if (muffled) [18:01:41.785] invokeRestart("muffleWarning") [18:01:41.785] } [18:01:41.785] else if (inherits(cond, "condition")) { [18:01:41.785] if (!is.null(pattern)) { [18:01:41.785] computeRestarts <- base::computeRestarts [18:01:41.785] grepl <- base::grepl [18:01:41.785] restarts <- computeRestarts(cond) [18:01:41.785] for (restart in restarts) { [18:01:41.785] name <- restart$name [18:01:41.785] if (is.null(name)) [18:01:41.785] next [18:01:41.785] if (!grepl(pattern, name)) [18:01:41.785] next [18:01:41.785] invokeRestart(restart) [18:01:41.785] muffled <- TRUE [18:01:41.785] break [18:01:41.785] } [18:01:41.785] } [18:01:41.785] } [18:01:41.785] invisible(muffled) [18:01:41.785] } [18:01:41.785] muffleCondition(cond) [18:01:41.785] }) [18:01:41.785] })) [18:01:41.785] future::FutureResult(value = ...future.value$value, [18:01:41.785] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.785] ...future.rng), globalenv = if (FALSE) [18:01:41.785] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.785] ...future.globalenv.names)) [18:01:41.785] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.785] }, condition = base::local({ [18:01:41.785] c <- base::c [18:01:41.785] inherits <- base::inherits [18:01:41.785] invokeRestart <- base::invokeRestart [18:01:41.785] length <- base::length [18:01:41.785] list <- base::list [18:01:41.785] seq.int <- base::seq.int [18:01:41.785] signalCondition <- base::signalCondition [18:01:41.785] sys.calls <- base::sys.calls [18:01:41.785] `[[` <- base::`[[` [18:01:41.785] `+` <- base::`+` [18:01:41.785] `<<-` <- base::`<<-` [18:01:41.785] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.785] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.785] 3L)] [18:01:41.785] } [18:01:41.785] function(cond) { [18:01:41.785] is_error <- inherits(cond, "error") [18:01:41.785] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.785] NULL) [18:01:41.785] if (is_error) { [18:01:41.785] sessionInformation <- function() { [18:01:41.785] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.785] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.785] search = base::search(), system = base::Sys.info()) [18:01:41.785] } [18:01:41.785] ...future.conditions[[length(...future.conditions) + [18:01:41.785] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.785] cond$call), session = sessionInformation(), [18:01:41.785] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.785] signalCondition(cond) [18:01:41.785] } [18:01:41.785] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.785] "immediateCondition"))) { [18:01:41.785] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.785] ...future.conditions[[length(...future.conditions) + [18:01:41.785] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.785] if (TRUE && !signal) { [18:01:41.785] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.785] { [18:01:41.785] inherits <- base::inherits [18:01:41.785] invokeRestart <- base::invokeRestart [18:01:41.785] is.null <- base::is.null [18:01:41.785] muffled <- FALSE [18:01:41.785] if (inherits(cond, "message")) { [18:01:41.785] muffled <- grepl(pattern, "muffleMessage") [18:01:41.785] if (muffled) [18:01:41.785] invokeRestart("muffleMessage") [18:01:41.785] } [18:01:41.785] else if (inherits(cond, "warning")) { [18:01:41.785] muffled <- grepl(pattern, "muffleWarning") [18:01:41.785] if (muffled) [18:01:41.785] invokeRestart("muffleWarning") [18:01:41.785] } [18:01:41.785] else if (inherits(cond, "condition")) { [18:01:41.785] if (!is.null(pattern)) { [18:01:41.785] computeRestarts <- base::computeRestarts [18:01:41.785] grepl <- base::grepl [18:01:41.785] restarts <- computeRestarts(cond) [18:01:41.785] for (restart in restarts) { [18:01:41.785] name <- restart$name [18:01:41.785] if (is.null(name)) [18:01:41.785] next [18:01:41.785] if (!grepl(pattern, name)) [18:01:41.785] next [18:01:41.785] invokeRestart(restart) [18:01:41.785] muffled <- TRUE [18:01:41.785] break [18:01:41.785] } [18:01:41.785] } [18:01:41.785] } [18:01:41.785] invisible(muffled) [18:01:41.785] } [18:01:41.785] muffleCondition(cond, pattern = "^muffle") [18:01:41.785] } [18:01:41.785] } [18:01:41.785] else { [18:01:41.785] if (TRUE) { [18:01:41.785] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.785] { [18:01:41.785] inherits <- base::inherits [18:01:41.785] invokeRestart <- base::invokeRestart [18:01:41.785] is.null <- base::is.null [18:01:41.785] muffled <- FALSE [18:01:41.785] if (inherits(cond, "message")) { [18:01:41.785] muffled <- grepl(pattern, "muffleMessage") [18:01:41.785] if (muffled) [18:01:41.785] invokeRestart("muffleMessage") [18:01:41.785] } [18:01:41.785] else if (inherits(cond, "warning")) { [18:01:41.785] muffled <- grepl(pattern, "muffleWarning") [18:01:41.785] if (muffled) [18:01:41.785] invokeRestart("muffleWarning") [18:01:41.785] } [18:01:41.785] else if (inherits(cond, "condition")) { [18:01:41.785] if (!is.null(pattern)) { [18:01:41.785] computeRestarts <- base::computeRestarts [18:01:41.785] grepl <- base::grepl [18:01:41.785] restarts <- computeRestarts(cond) [18:01:41.785] for (restart in restarts) { [18:01:41.785] name <- restart$name [18:01:41.785] if (is.null(name)) [18:01:41.785] next [18:01:41.785] if (!grepl(pattern, name)) [18:01:41.785] next [18:01:41.785] invokeRestart(restart) [18:01:41.785] muffled <- TRUE [18:01:41.785] break [18:01:41.785] } [18:01:41.785] } [18:01:41.785] } [18:01:41.785] invisible(muffled) [18:01:41.785] } [18:01:41.785] muffleCondition(cond, pattern = "^muffle") [18:01:41.785] } [18:01:41.785] } [18:01:41.785] } [18:01:41.785] })) [18:01:41.785] }, error = function(ex) { [18:01:41.785] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.785] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.785] ...future.rng), started = ...future.startTime, [18:01:41.785] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.785] version = "1.8"), class = "FutureResult") [18:01:41.785] }, finally = { [18:01:41.785] if (!identical(...future.workdir, getwd())) [18:01:41.785] setwd(...future.workdir) [18:01:41.785] { [18:01:41.785] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.785] ...future.oldOptions$nwarnings <- NULL [18:01:41.785] } [18:01:41.785] base::options(...future.oldOptions) [18:01:41.785] if (.Platform$OS.type == "windows") { [18:01:41.785] old_names <- names(...future.oldEnvVars) [18:01:41.785] envs <- base::Sys.getenv() [18:01:41.785] names <- names(envs) [18:01:41.785] common <- intersect(names, old_names) [18:01:41.785] added <- setdiff(names, old_names) [18:01:41.785] removed <- setdiff(old_names, names) [18:01:41.785] changed <- common[...future.oldEnvVars[common] != [18:01:41.785] envs[common]] [18:01:41.785] NAMES <- toupper(changed) [18:01:41.785] args <- list() [18:01:41.785] for (kk in seq_along(NAMES)) { [18:01:41.785] name <- changed[[kk]] [18:01:41.785] NAME <- NAMES[[kk]] [18:01:41.785] if (name != NAME && is.element(NAME, old_names)) [18:01:41.785] next [18:01:41.785] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.785] } [18:01:41.785] NAMES <- toupper(added) [18:01:41.785] for (kk in seq_along(NAMES)) { [18:01:41.785] name <- added[[kk]] [18:01:41.785] NAME <- NAMES[[kk]] [18:01:41.785] if (name != NAME && is.element(NAME, old_names)) [18:01:41.785] next [18:01:41.785] args[[name]] <- "" [18:01:41.785] } [18:01:41.785] NAMES <- toupper(removed) [18:01:41.785] for (kk in seq_along(NAMES)) { [18:01:41.785] name <- removed[[kk]] [18:01:41.785] NAME <- NAMES[[kk]] [18:01:41.785] if (name != NAME && is.element(NAME, old_names)) [18:01:41.785] next [18:01:41.785] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.785] } [18:01:41.785] if (length(args) > 0) [18:01:41.785] base::do.call(base::Sys.setenv, args = args) [18:01:41.785] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.785] } [18:01:41.785] else { [18:01:41.785] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.785] } [18:01:41.785] { [18:01:41.785] if (base::length(...future.futureOptionsAdded) > [18:01:41.785] 0L) { [18:01:41.785] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.785] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.785] base::options(opts) [18:01:41.785] } [18:01:41.785] { [18:01:41.785] { [18:01:41.785] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.785] NULL [18:01:41.785] } [18:01:41.785] options(future.plan = NULL) [18:01:41.785] if (is.na(NA_character_)) [18:01:41.785] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.785] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.785] future::plan(list(function (..., workers = availableCores(), [18:01:41.785] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.785] envir = parent.frame()) [18:01:41.785] { [18:01:41.785] if (is.function(workers)) [18:01:41.785] workers <- workers() [18:01:41.785] workers <- structure(as.integer(workers), [18:01:41.785] class = class(workers)) [18:01:41.785] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.785] workers >= 1) [18:01:41.785] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.785] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.785] } [18:01:41.785] future <- MultisessionFuture(..., workers = workers, [18:01:41.785] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.785] envir = envir) [18:01:41.785] if (!future$lazy) [18:01:41.785] future <- run(future) [18:01:41.785] invisible(future) [18:01:41.785] }), .cleanup = FALSE, .init = FALSE) [18:01:41.785] } [18:01:41.785] } [18:01:41.785] } [18:01:41.785] }) [18:01:41.785] if (TRUE) { [18:01:41.785] base::sink(type = "output", split = FALSE) [18:01:41.785] if (TRUE) { [18:01:41.785] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.785] } [18:01:41.785] else { [18:01:41.785] ...future.result["stdout"] <- base::list(NULL) [18:01:41.785] } [18:01:41.785] base::close(...future.stdout) [18:01:41.785] ...future.stdout <- NULL [18:01:41.785] } [18:01:41.785] ...future.result$conditions <- ...future.conditions [18:01:41.785] ...future.result$finished <- base::Sys.time() [18:01:41.785] ...future.result [18:01:41.785] } [18:01:41.790] MultisessionFuture started [18:01:41.791] - Launch lazy future ... done [18:01:41.791] run() for 'MultisessionFuture' ... done [18:01:41.791] getGlobalsAndPackages() ... [18:01:41.791] Searching for globals... [18:01:41.792] [18:01:41.792] Searching for globals ... DONE [18:01:41.792] - globals: [0] [18:01:41.792] getGlobalsAndPackages() ... DONE [18:01:41.792] run() for 'Future' ... [18:01:41.793] - state: 'created' [18:01:41.793] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.806] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.806] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.807] - Field: 'node' [18:01:41.807] - Field: 'label' [18:01:41.807] - Field: 'local' [18:01:41.807] - Field: 'owner' [18:01:41.807] - Field: 'envir' [18:01:41.808] - Field: 'workers' [18:01:41.808] - Field: 'packages' [18:01:41.808] - Field: 'gc' [18:01:41.808] - Field: 'conditions' [18:01:41.808] - Field: 'persistent' [18:01:41.808] - Field: 'expr' [18:01:41.809] - Field: 'uuid' [18:01:41.809] - Field: 'seed' [18:01:41.809] - Field: 'version' [18:01:41.809] - Field: 'result' [18:01:41.809] - Field: 'asynchronous' [18:01:41.809] - Field: 'calls' [18:01:41.810] - Field: 'globals' [18:01:41.810] - Field: 'stdout' [18:01:41.810] - Field: 'earlySignal' [18:01:41.810] - Field: 'lazy' [18:01:41.810] - Field: 'state' [18:01:41.811] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.811] - Launch lazy future ... [18:01:41.811] Packages needed by the future expression (n = 0): [18:01:41.811] Packages needed by future strategies (n = 0): [18:01:41.812] { [18:01:41.812] { [18:01:41.812] { [18:01:41.812] ...future.startTime <- base::Sys.time() [18:01:41.812] { [18:01:41.812] { [18:01:41.812] { [18:01:41.812] { [18:01:41.812] base::local({ [18:01:41.812] has_future <- base::requireNamespace("future", [18:01:41.812] quietly = TRUE) [18:01:41.812] if (has_future) { [18:01:41.812] ns <- base::getNamespace("future") [18:01:41.812] version <- ns[[".package"]][["version"]] [18:01:41.812] if (is.null(version)) [18:01:41.812] version <- utils::packageVersion("future") [18:01:41.812] } [18:01:41.812] else { [18:01:41.812] version <- NULL [18:01:41.812] } [18:01:41.812] if (!has_future || version < "1.8.0") { [18:01:41.812] info <- base::c(r_version = base::gsub("R version ", [18:01:41.812] "", base::R.version$version.string), [18:01:41.812] platform = base::sprintf("%s (%s-bit)", [18:01:41.812] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.812] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.812] "release", "version")], collapse = " "), [18:01:41.812] hostname = base::Sys.info()[["nodename"]]) [18:01:41.812] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.812] info) [18:01:41.812] info <- base::paste(info, collapse = "; ") [18:01:41.812] if (!has_future) { [18:01:41.812] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.812] info) [18:01:41.812] } [18:01:41.812] else { [18:01:41.812] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.812] info, version) [18:01:41.812] } [18:01:41.812] base::stop(msg) [18:01:41.812] } [18:01:41.812] }) [18:01:41.812] } [18:01:41.812] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.812] base::options(mc.cores = 1L) [18:01:41.812] } [18:01:41.812] options(future.plan = NULL) [18:01:41.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.812] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.812] } [18:01:41.812] ...future.workdir <- getwd() [18:01:41.812] } [18:01:41.812] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.812] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.812] } [18:01:41.812] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.812] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.812] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.812] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.812] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.812] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.812] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.812] base::names(...future.oldOptions)) [18:01:41.812] } [18:01:41.812] if (FALSE) { [18:01:41.812] } [18:01:41.812] else { [18:01:41.812] if (TRUE) { [18:01:41.812] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.812] open = "w") [18:01:41.812] } [18:01:41.812] else { [18:01:41.812] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.812] windows = "NUL", "/dev/null"), open = "w") [18:01:41.812] } [18:01:41.812] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.812] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.812] base::sink(type = "output", split = FALSE) [18:01:41.812] base::close(...future.stdout) [18:01:41.812] }, add = TRUE) [18:01:41.812] } [18:01:41.812] ...future.frame <- base::sys.nframe() [18:01:41.812] ...future.conditions <- base::list() [18:01:41.812] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.812] if (FALSE) { [18:01:41.812] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.812] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.812] } [18:01:41.812] ...future.result <- base::tryCatch({ [18:01:41.812] base::withCallingHandlers({ [18:01:41.812] ...future.value <- base::withVisible(base::local({ [18:01:41.812] ...future.makeSendCondition <- local({ [18:01:41.812] sendCondition <- NULL [18:01:41.812] function(frame = 1L) { [18:01:41.812] if (is.function(sendCondition)) [18:01:41.812] return(sendCondition) [18:01:41.812] ns <- getNamespace("parallel") [18:01:41.812] if (exists("sendData", mode = "function", [18:01:41.812] envir = ns)) { [18:01:41.812] parallel_sendData <- get("sendData", mode = "function", [18:01:41.812] envir = ns) [18:01:41.812] envir <- sys.frame(frame) [18:01:41.812] master <- NULL [18:01:41.812] while (!identical(envir, .GlobalEnv) && [18:01:41.812] !identical(envir, emptyenv())) { [18:01:41.812] if (exists("master", mode = "list", envir = envir, [18:01:41.812] inherits = FALSE)) { [18:01:41.812] master <- get("master", mode = "list", [18:01:41.812] envir = envir, inherits = FALSE) [18:01:41.812] if (inherits(master, c("SOCKnode", [18:01:41.812] "SOCK0node"))) { [18:01:41.812] sendCondition <<- function(cond) { [18:01:41.812] data <- list(type = "VALUE", value = cond, [18:01:41.812] success = TRUE) [18:01:41.812] parallel_sendData(master, data) [18:01:41.812] } [18:01:41.812] return(sendCondition) [18:01:41.812] } [18:01:41.812] } [18:01:41.812] frame <- frame + 1L [18:01:41.812] envir <- sys.frame(frame) [18:01:41.812] } [18:01:41.812] } [18:01:41.812] sendCondition <<- function(cond) NULL [18:01:41.812] } [18:01:41.812] }) [18:01:41.812] withCallingHandlers({ [18:01:41.812] NULL [18:01:41.812] }, immediateCondition = function(cond) { [18:01:41.812] sendCondition <- ...future.makeSendCondition() [18:01:41.812] sendCondition(cond) [18:01:41.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.812] { [18:01:41.812] inherits <- base::inherits [18:01:41.812] invokeRestart <- base::invokeRestart [18:01:41.812] is.null <- base::is.null [18:01:41.812] muffled <- FALSE [18:01:41.812] if (inherits(cond, "message")) { [18:01:41.812] muffled <- grepl(pattern, "muffleMessage") [18:01:41.812] if (muffled) [18:01:41.812] invokeRestart("muffleMessage") [18:01:41.812] } [18:01:41.812] else if (inherits(cond, "warning")) { [18:01:41.812] muffled <- grepl(pattern, "muffleWarning") [18:01:41.812] if (muffled) [18:01:41.812] invokeRestart("muffleWarning") [18:01:41.812] } [18:01:41.812] else if (inherits(cond, "condition")) { [18:01:41.812] if (!is.null(pattern)) { [18:01:41.812] computeRestarts <- base::computeRestarts [18:01:41.812] grepl <- base::grepl [18:01:41.812] restarts <- computeRestarts(cond) [18:01:41.812] for (restart in restarts) { [18:01:41.812] name <- restart$name [18:01:41.812] if (is.null(name)) [18:01:41.812] next [18:01:41.812] if (!grepl(pattern, name)) [18:01:41.812] next [18:01:41.812] invokeRestart(restart) [18:01:41.812] muffled <- TRUE [18:01:41.812] break [18:01:41.812] } [18:01:41.812] } [18:01:41.812] } [18:01:41.812] invisible(muffled) [18:01:41.812] } [18:01:41.812] muffleCondition(cond) [18:01:41.812] }) [18:01:41.812] })) [18:01:41.812] future::FutureResult(value = ...future.value$value, [18:01:41.812] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.812] ...future.rng), globalenv = if (FALSE) [18:01:41.812] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.812] ...future.globalenv.names)) [18:01:41.812] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.812] }, condition = base::local({ [18:01:41.812] c <- base::c [18:01:41.812] inherits <- base::inherits [18:01:41.812] invokeRestart <- base::invokeRestart [18:01:41.812] length <- base::length [18:01:41.812] list <- base::list [18:01:41.812] seq.int <- base::seq.int [18:01:41.812] signalCondition <- base::signalCondition [18:01:41.812] sys.calls <- base::sys.calls [18:01:41.812] `[[` <- base::`[[` [18:01:41.812] `+` <- base::`+` [18:01:41.812] `<<-` <- base::`<<-` [18:01:41.812] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.812] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.812] 3L)] [18:01:41.812] } [18:01:41.812] function(cond) { [18:01:41.812] is_error <- inherits(cond, "error") [18:01:41.812] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.812] NULL) [18:01:41.812] if (is_error) { [18:01:41.812] sessionInformation <- function() { [18:01:41.812] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.812] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.812] search = base::search(), system = base::Sys.info()) [18:01:41.812] } [18:01:41.812] ...future.conditions[[length(...future.conditions) + [18:01:41.812] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.812] cond$call), session = sessionInformation(), [18:01:41.812] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.812] signalCondition(cond) [18:01:41.812] } [18:01:41.812] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.812] "immediateCondition"))) { [18:01:41.812] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.812] ...future.conditions[[length(...future.conditions) + [18:01:41.812] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.812] if (TRUE && !signal) { [18:01:41.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.812] { [18:01:41.812] inherits <- base::inherits [18:01:41.812] invokeRestart <- base::invokeRestart [18:01:41.812] is.null <- base::is.null [18:01:41.812] muffled <- FALSE [18:01:41.812] if (inherits(cond, "message")) { [18:01:41.812] muffled <- grepl(pattern, "muffleMessage") [18:01:41.812] if (muffled) [18:01:41.812] invokeRestart("muffleMessage") [18:01:41.812] } [18:01:41.812] else if (inherits(cond, "warning")) { [18:01:41.812] muffled <- grepl(pattern, "muffleWarning") [18:01:41.812] if (muffled) [18:01:41.812] invokeRestart("muffleWarning") [18:01:41.812] } [18:01:41.812] else if (inherits(cond, "condition")) { [18:01:41.812] if (!is.null(pattern)) { [18:01:41.812] computeRestarts <- base::computeRestarts [18:01:41.812] grepl <- base::grepl [18:01:41.812] restarts <- computeRestarts(cond) [18:01:41.812] for (restart in restarts) { [18:01:41.812] name <- restart$name [18:01:41.812] if (is.null(name)) [18:01:41.812] next [18:01:41.812] if (!grepl(pattern, name)) [18:01:41.812] next [18:01:41.812] invokeRestart(restart) [18:01:41.812] muffled <- TRUE [18:01:41.812] break [18:01:41.812] } [18:01:41.812] } [18:01:41.812] } [18:01:41.812] invisible(muffled) [18:01:41.812] } [18:01:41.812] muffleCondition(cond, pattern = "^muffle") [18:01:41.812] } [18:01:41.812] } [18:01:41.812] else { [18:01:41.812] if (TRUE) { [18:01:41.812] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.812] { [18:01:41.812] inherits <- base::inherits [18:01:41.812] invokeRestart <- base::invokeRestart [18:01:41.812] is.null <- base::is.null [18:01:41.812] muffled <- FALSE [18:01:41.812] if (inherits(cond, "message")) { [18:01:41.812] muffled <- grepl(pattern, "muffleMessage") [18:01:41.812] if (muffled) [18:01:41.812] invokeRestart("muffleMessage") [18:01:41.812] } [18:01:41.812] else if (inherits(cond, "warning")) { [18:01:41.812] muffled <- grepl(pattern, "muffleWarning") [18:01:41.812] if (muffled) [18:01:41.812] invokeRestart("muffleWarning") [18:01:41.812] } [18:01:41.812] else if (inherits(cond, "condition")) { [18:01:41.812] if (!is.null(pattern)) { [18:01:41.812] computeRestarts <- base::computeRestarts [18:01:41.812] grepl <- base::grepl [18:01:41.812] restarts <- computeRestarts(cond) [18:01:41.812] for (restart in restarts) { [18:01:41.812] name <- restart$name [18:01:41.812] if (is.null(name)) [18:01:41.812] next [18:01:41.812] if (!grepl(pattern, name)) [18:01:41.812] next [18:01:41.812] invokeRestart(restart) [18:01:41.812] muffled <- TRUE [18:01:41.812] break [18:01:41.812] } [18:01:41.812] } [18:01:41.812] } [18:01:41.812] invisible(muffled) [18:01:41.812] } [18:01:41.812] muffleCondition(cond, pattern = "^muffle") [18:01:41.812] } [18:01:41.812] } [18:01:41.812] } [18:01:41.812] })) [18:01:41.812] }, error = function(ex) { [18:01:41.812] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.812] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.812] ...future.rng), started = ...future.startTime, [18:01:41.812] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.812] version = "1.8"), class = "FutureResult") [18:01:41.812] }, finally = { [18:01:41.812] if (!identical(...future.workdir, getwd())) [18:01:41.812] setwd(...future.workdir) [18:01:41.812] { [18:01:41.812] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.812] ...future.oldOptions$nwarnings <- NULL [18:01:41.812] } [18:01:41.812] base::options(...future.oldOptions) [18:01:41.812] if (.Platform$OS.type == "windows") { [18:01:41.812] old_names <- names(...future.oldEnvVars) [18:01:41.812] envs <- base::Sys.getenv() [18:01:41.812] names <- names(envs) [18:01:41.812] common <- intersect(names, old_names) [18:01:41.812] added <- setdiff(names, old_names) [18:01:41.812] removed <- setdiff(old_names, names) [18:01:41.812] changed <- common[...future.oldEnvVars[common] != [18:01:41.812] envs[common]] [18:01:41.812] NAMES <- toupper(changed) [18:01:41.812] args <- list() [18:01:41.812] for (kk in seq_along(NAMES)) { [18:01:41.812] name <- changed[[kk]] [18:01:41.812] NAME <- NAMES[[kk]] [18:01:41.812] if (name != NAME && is.element(NAME, old_names)) [18:01:41.812] next [18:01:41.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.812] } [18:01:41.812] NAMES <- toupper(added) [18:01:41.812] for (kk in seq_along(NAMES)) { [18:01:41.812] name <- added[[kk]] [18:01:41.812] NAME <- NAMES[[kk]] [18:01:41.812] if (name != NAME && is.element(NAME, old_names)) [18:01:41.812] next [18:01:41.812] args[[name]] <- "" [18:01:41.812] } [18:01:41.812] NAMES <- toupper(removed) [18:01:41.812] for (kk in seq_along(NAMES)) { [18:01:41.812] name <- removed[[kk]] [18:01:41.812] NAME <- NAMES[[kk]] [18:01:41.812] if (name != NAME && is.element(NAME, old_names)) [18:01:41.812] next [18:01:41.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.812] } [18:01:41.812] if (length(args) > 0) [18:01:41.812] base::do.call(base::Sys.setenv, args = args) [18:01:41.812] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.812] } [18:01:41.812] else { [18:01:41.812] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.812] } [18:01:41.812] { [18:01:41.812] if (base::length(...future.futureOptionsAdded) > [18:01:41.812] 0L) { [18:01:41.812] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.812] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.812] base::options(opts) [18:01:41.812] } [18:01:41.812] { [18:01:41.812] { [18:01:41.812] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.812] NULL [18:01:41.812] } [18:01:41.812] options(future.plan = NULL) [18:01:41.812] if (is.na(NA_character_)) [18:01:41.812] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.812] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.812] future::plan(list(function (..., workers = availableCores(), [18:01:41.812] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.812] envir = parent.frame()) [18:01:41.812] { [18:01:41.812] if (is.function(workers)) [18:01:41.812] workers <- workers() [18:01:41.812] workers <- structure(as.integer(workers), [18:01:41.812] class = class(workers)) [18:01:41.812] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.812] workers >= 1) [18:01:41.812] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.812] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.812] } [18:01:41.812] future <- MultisessionFuture(..., workers = workers, [18:01:41.812] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.812] envir = envir) [18:01:41.812] if (!future$lazy) [18:01:41.812] future <- run(future) [18:01:41.812] invisible(future) [18:01:41.812] }), .cleanup = FALSE, .init = FALSE) [18:01:41.812] } [18:01:41.812] } [18:01:41.812] } [18:01:41.812] }) [18:01:41.812] if (TRUE) { [18:01:41.812] base::sink(type = "output", split = FALSE) [18:01:41.812] if (TRUE) { [18:01:41.812] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.812] } [18:01:41.812] else { [18:01:41.812] ...future.result["stdout"] <- base::list(NULL) [18:01:41.812] } [18:01:41.812] base::close(...future.stdout) [18:01:41.812] ...future.stdout <- NULL [18:01:41.812] } [18:01:41.812] ...future.result$conditions <- ...future.conditions [18:01:41.812] ...future.result$finished <- base::Sys.time() [18:01:41.812] ...future.result [18:01:41.812] } [18:01:41.817] MultisessionFuture started [18:01:41.818] - Launch lazy future ... done [18:01:41.818] run() for 'MultisessionFuture' ... done [18:01:41.818] getGlobalsAndPackages() ... [18:01:41.818] Searching for globals... [18:01:41.819] - globals found: [1] '{' [18:01:41.819] Searching for globals ... DONE [18:01:41.820] Resolving globals: FALSE [18:01:41.822] [18:01:41.822] [18:01:41.823] getGlobalsAndPackages() ... DONE [18:01:41.823] run() for 'Future' ... [18:01:41.823] - state: 'created' [18:01:41.823] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.837] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.837] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.837] - Field: 'node' [18:01:41.838] - Field: 'label' [18:01:41.838] - Field: 'local' [18:01:41.838] - Field: 'owner' [18:01:41.838] - Field: 'envir' [18:01:41.838] - Field: 'workers' [18:01:41.838] - Field: 'packages' [18:01:41.839] - Field: 'gc' [18:01:41.839] - Field: 'conditions' [18:01:41.839] - Field: 'persistent' [18:01:41.839] - Field: 'expr' [18:01:41.839] - Field: 'uuid' [18:01:41.840] - Field: 'seed' [18:01:41.840] - Field: 'version' [18:01:41.840] - Field: 'result' [18:01:41.840] - Field: 'asynchronous' [18:01:41.840] - Field: 'calls' [18:01:41.840] - Field: 'globals' [18:01:41.841] - Field: 'stdout' [18:01:41.841] - Field: 'earlySignal' [18:01:41.841] - Field: 'lazy' [18:01:41.841] - Field: 'state' [18:01:41.841] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.841] - Launch lazy future ... [18:01:41.842] Packages needed by the future expression (n = 0): [18:01:41.842] Packages needed by future strategies (n = 0): [18:01:41.843] { [18:01:41.843] { [18:01:41.843] { [18:01:41.843] ...future.startTime <- base::Sys.time() [18:01:41.843] { [18:01:41.843] { [18:01:41.843] { [18:01:41.843] { [18:01:41.843] base::local({ [18:01:41.843] has_future <- base::requireNamespace("future", [18:01:41.843] quietly = TRUE) [18:01:41.843] if (has_future) { [18:01:41.843] ns <- base::getNamespace("future") [18:01:41.843] version <- ns[[".package"]][["version"]] [18:01:41.843] if (is.null(version)) [18:01:41.843] version <- utils::packageVersion("future") [18:01:41.843] } [18:01:41.843] else { [18:01:41.843] version <- NULL [18:01:41.843] } [18:01:41.843] if (!has_future || version < "1.8.0") { [18:01:41.843] info <- base::c(r_version = base::gsub("R version ", [18:01:41.843] "", base::R.version$version.string), [18:01:41.843] platform = base::sprintf("%s (%s-bit)", [18:01:41.843] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.843] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.843] "release", "version")], collapse = " "), [18:01:41.843] hostname = base::Sys.info()[["nodename"]]) [18:01:41.843] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.843] info) [18:01:41.843] info <- base::paste(info, collapse = "; ") [18:01:41.843] if (!has_future) { [18:01:41.843] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.843] info) [18:01:41.843] } [18:01:41.843] else { [18:01:41.843] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.843] info, version) [18:01:41.843] } [18:01:41.843] base::stop(msg) [18:01:41.843] } [18:01:41.843] }) [18:01:41.843] } [18:01:41.843] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.843] base::options(mc.cores = 1L) [18:01:41.843] } [18:01:41.843] options(future.plan = NULL) [18:01:41.843] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.843] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.843] } [18:01:41.843] ...future.workdir <- getwd() [18:01:41.843] } [18:01:41.843] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.843] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.843] } [18:01:41.843] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.843] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.843] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.843] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.843] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.843] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.843] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.843] base::names(...future.oldOptions)) [18:01:41.843] } [18:01:41.843] if (FALSE) { [18:01:41.843] } [18:01:41.843] else { [18:01:41.843] if (TRUE) { [18:01:41.843] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.843] open = "w") [18:01:41.843] } [18:01:41.843] else { [18:01:41.843] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.843] windows = "NUL", "/dev/null"), open = "w") [18:01:41.843] } [18:01:41.843] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.843] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.843] base::sink(type = "output", split = FALSE) [18:01:41.843] base::close(...future.stdout) [18:01:41.843] }, add = TRUE) [18:01:41.843] } [18:01:41.843] ...future.frame <- base::sys.nframe() [18:01:41.843] ...future.conditions <- base::list() [18:01:41.843] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.843] if (FALSE) { [18:01:41.843] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.843] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.843] } [18:01:41.843] ...future.result <- base::tryCatch({ [18:01:41.843] base::withCallingHandlers({ [18:01:41.843] ...future.value <- base::withVisible(base::local({ [18:01:41.843] ...future.makeSendCondition <- local({ [18:01:41.843] sendCondition <- NULL [18:01:41.843] function(frame = 1L) { [18:01:41.843] if (is.function(sendCondition)) [18:01:41.843] return(sendCondition) [18:01:41.843] ns <- getNamespace("parallel") [18:01:41.843] if (exists("sendData", mode = "function", [18:01:41.843] envir = ns)) { [18:01:41.843] parallel_sendData <- get("sendData", mode = "function", [18:01:41.843] envir = ns) [18:01:41.843] envir <- sys.frame(frame) [18:01:41.843] master <- NULL [18:01:41.843] while (!identical(envir, .GlobalEnv) && [18:01:41.843] !identical(envir, emptyenv())) { [18:01:41.843] if (exists("master", mode = "list", envir = envir, [18:01:41.843] inherits = FALSE)) { [18:01:41.843] master <- get("master", mode = "list", [18:01:41.843] envir = envir, inherits = FALSE) [18:01:41.843] if (inherits(master, c("SOCKnode", [18:01:41.843] "SOCK0node"))) { [18:01:41.843] sendCondition <<- function(cond) { [18:01:41.843] data <- list(type = "VALUE", value = cond, [18:01:41.843] success = TRUE) [18:01:41.843] parallel_sendData(master, data) [18:01:41.843] } [18:01:41.843] return(sendCondition) [18:01:41.843] } [18:01:41.843] } [18:01:41.843] frame <- frame + 1L [18:01:41.843] envir <- sys.frame(frame) [18:01:41.843] } [18:01:41.843] } [18:01:41.843] sendCondition <<- function(cond) NULL [18:01:41.843] } [18:01:41.843] }) [18:01:41.843] withCallingHandlers({ [18:01:41.843] { [18:01:41.843] 4 [18:01:41.843] } [18:01:41.843] }, immediateCondition = function(cond) { [18:01:41.843] sendCondition <- ...future.makeSendCondition() [18:01:41.843] sendCondition(cond) [18:01:41.843] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.843] { [18:01:41.843] inherits <- base::inherits [18:01:41.843] invokeRestart <- base::invokeRestart [18:01:41.843] is.null <- base::is.null [18:01:41.843] muffled <- FALSE [18:01:41.843] if (inherits(cond, "message")) { [18:01:41.843] muffled <- grepl(pattern, "muffleMessage") [18:01:41.843] if (muffled) [18:01:41.843] invokeRestart("muffleMessage") [18:01:41.843] } [18:01:41.843] else if (inherits(cond, "warning")) { [18:01:41.843] muffled <- grepl(pattern, "muffleWarning") [18:01:41.843] if (muffled) [18:01:41.843] invokeRestart("muffleWarning") [18:01:41.843] } [18:01:41.843] else if (inherits(cond, "condition")) { [18:01:41.843] if (!is.null(pattern)) { [18:01:41.843] computeRestarts <- base::computeRestarts [18:01:41.843] grepl <- base::grepl [18:01:41.843] restarts <- computeRestarts(cond) [18:01:41.843] for (restart in restarts) { [18:01:41.843] name <- restart$name [18:01:41.843] if (is.null(name)) [18:01:41.843] next [18:01:41.843] if (!grepl(pattern, name)) [18:01:41.843] next [18:01:41.843] invokeRestart(restart) [18:01:41.843] muffled <- TRUE [18:01:41.843] break [18:01:41.843] } [18:01:41.843] } [18:01:41.843] } [18:01:41.843] invisible(muffled) [18:01:41.843] } [18:01:41.843] muffleCondition(cond) [18:01:41.843] }) [18:01:41.843] })) [18:01:41.843] future::FutureResult(value = ...future.value$value, [18:01:41.843] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.843] ...future.rng), globalenv = if (FALSE) [18:01:41.843] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.843] ...future.globalenv.names)) [18:01:41.843] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.843] }, condition = base::local({ [18:01:41.843] c <- base::c [18:01:41.843] inherits <- base::inherits [18:01:41.843] invokeRestart <- base::invokeRestart [18:01:41.843] length <- base::length [18:01:41.843] list <- base::list [18:01:41.843] seq.int <- base::seq.int [18:01:41.843] signalCondition <- base::signalCondition [18:01:41.843] sys.calls <- base::sys.calls [18:01:41.843] `[[` <- base::`[[` [18:01:41.843] `+` <- base::`+` [18:01:41.843] `<<-` <- base::`<<-` [18:01:41.843] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.843] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.843] 3L)] [18:01:41.843] } [18:01:41.843] function(cond) { [18:01:41.843] is_error <- inherits(cond, "error") [18:01:41.843] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.843] NULL) [18:01:41.843] if (is_error) { [18:01:41.843] sessionInformation <- function() { [18:01:41.843] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.843] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.843] search = base::search(), system = base::Sys.info()) [18:01:41.843] } [18:01:41.843] ...future.conditions[[length(...future.conditions) + [18:01:41.843] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.843] cond$call), session = sessionInformation(), [18:01:41.843] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.843] signalCondition(cond) [18:01:41.843] } [18:01:41.843] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.843] "immediateCondition"))) { [18:01:41.843] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.843] ...future.conditions[[length(...future.conditions) + [18:01:41.843] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.843] if (TRUE && !signal) { [18:01:41.843] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.843] { [18:01:41.843] inherits <- base::inherits [18:01:41.843] invokeRestart <- base::invokeRestart [18:01:41.843] is.null <- base::is.null [18:01:41.843] muffled <- FALSE [18:01:41.843] if (inherits(cond, "message")) { [18:01:41.843] muffled <- grepl(pattern, "muffleMessage") [18:01:41.843] if (muffled) [18:01:41.843] invokeRestart("muffleMessage") [18:01:41.843] } [18:01:41.843] else if (inherits(cond, "warning")) { [18:01:41.843] muffled <- grepl(pattern, "muffleWarning") [18:01:41.843] if (muffled) [18:01:41.843] invokeRestart("muffleWarning") [18:01:41.843] } [18:01:41.843] else if (inherits(cond, "condition")) { [18:01:41.843] if (!is.null(pattern)) { [18:01:41.843] computeRestarts <- base::computeRestarts [18:01:41.843] grepl <- base::grepl [18:01:41.843] restarts <- computeRestarts(cond) [18:01:41.843] for (restart in restarts) { [18:01:41.843] name <- restart$name [18:01:41.843] if (is.null(name)) [18:01:41.843] next [18:01:41.843] if (!grepl(pattern, name)) [18:01:41.843] next [18:01:41.843] invokeRestart(restart) [18:01:41.843] muffled <- TRUE [18:01:41.843] break [18:01:41.843] } [18:01:41.843] } [18:01:41.843] } [18:01:41.843] invisible(muffled) [18:01:41.843] } [18:01:41.843] muffleCondition(cond, pattern = "^muffle") [18:01:41.843] } [18:01:41.843] } [18:01:41.843] else { [18:01:41.843] if (TRUE) { [18:01:41.843] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.843] { [18:01:41.843] inherits <- base::inherits [18:01:41.843] invokeRestart <- base::invokeRestart [18:01:41.843] is.null <- base::is.null [18:01:41.843] muffled <- FALSE [18:01:41.843] if (inherits(cond, "message")) { [18:01:41.843] muffled <- grepl(pattern, "muffleMessage") [18:01:41.843] if (muffled) [18:01:41.843] invokeRestart("muffleMessage") [18:01:41.843] } [18:01:41.843] else if (inherits(cond, "warning")) { [18:01:41.843] muffled <- grepl(pattern, "muffleWarning") [18:01:41.843] if (muffled) [18:01:41.843] invokeRestart("muffleWarning") [18:01:41.843] } [18:01:41.843] else if (inherits(cond, "condition")) { [18:01:41.843] if (!is.null(pattern)) { [18:01:41.843] computeRestarts <- base::computeRestarts [18:01:41.843] grepl <- base::grepl [18:01:41.843] restarts <- computeRestarts(cond) [18:01:41.843] for (restart in restarts) { [18:01:41.843] name <- restart$name [18:01:41.843] if (is.null(name)) [18:01:41.843] next [18:01:41.843] if (!grepl(pattern, name)) [18:01:41.843] next [18:01:41.843] invokeRestart(restart) [18:01:41.843] muffled <- TRUE [18:01:41.843] break [18:01:41.843] } [18:01:41.843] } [18:01:41.843] } [18:01:41.843] invisible(muffled) [18:01:41.843] } [18:01:41.843] muffleCondition(cond, pattern = "^muffle") [18:01:41.843] } [18:01:41.843] } [18:01:41.843] } [18:01:41.843] })) [18:01:41.843] }, error = function(ex) { [18:01:41.843] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.843] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.843] ...future.rng), started = ...future.startTime, [18:01:41.843] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.843] version = "1.8"), class = "FutureResult") [18:01:41.843] }, finally = { [18:01:41.843] if (!identical(...future.workdir, getwd())) [18:01:41.843] setwd(...future.workdir) [18:01:41.843] { [18:01:41.843] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.843] ...future.oldOptions$nwarnings <- NULL [18:01:41.843] } [18:01:41.843] base::options(...future.oldOptions) [18:01:41.843] if (.Platform$OS.type == "windows") { [18:01:41.843] old_names <- names(...future.oldEnvVars) [18:01:41.843] envs <- base::Sys.getenv() [18:01:41.843] names <- names(envs) [18:01:41.843] common <- intersect(names, old_names) [18:01:41.843] added <- setdiff(names, old_names) [18:01:41.843] removed <- setdiff(old_names, names) [18:01:41.843] changed <- common[...future.oldEnvVars[common] != [18:01:41.843] envs[common]] [18:01:41.843] NAMES <- toupper(changed) [18:01:41.843] args <- list() [18:01:41.843] for (kk in seq_along(NAMES)) { [18:01:41.843] name <- changed[[kk]] [18:01:41.843] NAME <- NAMES[[kk]] [18:01:41.843] if (name != NAME && is.element(NAME, old_names)) [18:01:41.843] next [18:01:41.843] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.843] } [18:01:41.843] NAMES <- toupper(added) [18:01:41.843] for (kk in seq_along(NAMES)) { [18:01:41.843] name <- added[[kk]] [18:01:41.843] NAME <- NAMES[[kk]] [18:01:41.843] if (name != NAME && is.element(NAME, old_names)) [18:01:41.843] next [18:01:41.843] args[[name]] <- "" [18:01:41.843] } [18:01:41.843] NAMES <- toupper(removed) [18:01:41.843] for (kk in seq_along(NAMES)) { [18:01:41.843] name <- removed[[kk]] [18:01:41.843] NAME <- NAMES[[kk]] [18:01:41.843] if (name != NAME && is.element(NAME, old_names)) [18:01:41.843] next [18:01:41.843] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.843] } [18:01:41.843] if (length(args) > 0) [18:01:41.843] base::do.call(base::Sys.setenv, args = args) [18:01:41.843] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.843] } [18:01:41.843] else { [18:01:41.843] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.843] } [18:01:41.843] { [18:01:41.843] if (base::length(...future.futureOptionsAdded) > [18:01:41.843] 0L) { [18:01:41.843] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.843] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.843] base::options(opts) [18:01:41.843] } [18:01:41.843] { [18:01:41.843] { [18:01:41.843] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.843] NULL [18:01:41.843] } [18:01:41.843] options(future.plan = NULL) [18:01:41.843] if (is.na(NA_character_)) [18:01:41.843] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.843] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.843] future::plan(list(function (..., workers = availableCores(), [18:01:41.843] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.843] envir = parent.frame()) [18:01:41.843] { [18:01:41.843] if (is.function(workers)) [18:01:41.843] workers <- workers() [18:01:41.843] workers <- structure(as.integer(workers), [18:01:41.843] class = class(workers)) [18:01:41.843] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.843] workers >= 1) [18:01:41.843] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.843] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.843] } [18:01:41.843] future <- MultisessionFuture(..., workers = workers, [18:01:41.843] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.843] envir = envir) [18:01:41.843] if (!future$lazy) [18:01:41.843] future <- run(future) [18:01:41.843] invisible(future) [18:01:41.843] }), .cleanup = FALSE, .init = FALSE) [18:01:41.843] } [18:01:41.843] } [18:01:41.843] } [18:01:41.843] }) [18:01:41.843] if (TRUE) { [18:01:41.843] base::sink(type = "output", split = FALSE) [18:01:41.843] if (TRUE) { [18:01:41.843] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.843] } [18:01:41.843] else { [18:01:41.843] ...future.result["stdout"] <- base::list(NULL) [18:01:41.843] } [18:01:41.843] base::close(...future.stdout) [18:01:41.843] ...future.stdout <- NULL [18:01:41.843] } [18:01:41.843] ...future.result$conditions <- ...future.conditions [18:01:41.843] ...future.result$finished <- base::Sys.time() [18:01:41.843] ...future.result [18:01:41.843] } [18:01:41.848] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:41.861] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.861] - Validating connection of MultisessionFuture [18:01:41.861] - received message: FutureResult [18:01:41.862] - Received FutureResult [18:01:41.862] - Erased future from FutureRegistry [18:01:41.862] result() for ClusterFuture ... [18:01:41.862] - result already collected: FutureResult [18:01:41.862] result() for ClusterFuture ... done [18:01:41.862] receiveMessageFromWorker() for ClusterFuture ... done [18:01:41.863] result() for ClusterFuture ... [18:01:41.863] - result already collected: FutureResult [18:01:41.863] result() for ClusterFuture ... done [18:01:41.863] result() for ClusterFuture ... [18:01:41.863] - result already collected: FutureResult [18:01:41.863] result() for ClusterFuture ... done [18:01:41.864] MultisessionFuture started [18:01:41.865] - Launch lazy future ... done [18:01:41.865] run() for 'MultisessionFuture' ... done [18:01:41.867] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.867] - Validating connection of MultisessionFuture [18:01:41.867] - received message: FutureResult [18:01:41.867] - Received FutureResult [18:01:41.868] - Erased future from FutureRegistry [18:01:41.868] result() for ClusterFuture ... [18:01:41.868] - result already collected: FutureResult [18:01:41.868] result() for ClusterFuture ... done [18:01:41.868] receiveMessageFromWorker() for ClusterFuture ... done [18:01:41.883] receiveMessageFromWorker() for ClusterFuture ... [18:01:41.883] - Validating connection of MultisessionFuture [18:01:41.883] - received message: FutureResult [18:01:41.883] - Received FutureResult [18:01:41.884] - Erased future from FutureRegistry [18:01:41.884] result() for ClusterFuture ... [18:01:41.884] - result already collected: FutureResult [18:01:41.884] result() for ClusterFuture ... done [18:01:41.884] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:41.886] resolve() on environment ... [18:01:41.886] recursive: 0 [18:01:41.886] elements: [4] 'a', 'b', 'c', 'd' [18:01:41.887] signalConditionsASAP(numeric, pos=1) ... [18:01:41.887] - nx: 4 [18:01:41.887] - relay: TRUE [18:01:41.887] - stdout: TRUE [18:01:41.887] - signal: TRUE [18:01:41.887] - resignal: FALSE [18:01:41.888] - force: TRUE [18:01:41.888] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.888] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.888] - until=2 [18:01:41.888] - relaying element #2 [18:01:41.888] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:41.889] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.889] signalConditionsASAP(NULL, pos=1) ... done [18:01:41.889] length: 3 (resolved future 1) [18:01:41.889] Future #2 [18:01:41.889] result() for ClusterFuture ... [18:01:41.889] - result already collected: FutureResult [18:01:41.890] result() for ClusterFuture ... done [18:01:41.890] result() for ClusterFuture ... [18:01:41.890] - result already collected: FutureResult [18:01:41.890] result() for ClusterFuture ... done [18:01:41.890] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:41.890] - nx: 4 [18:01:41.891] - relay: TRUE [18:01:41.891] - stdout: TRUE [18:01:41.891] - signal: TRUE [18:01:41.891] - resignal: FALSE [18:01:41.891] - force: TRUE [18:01:41.891] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:41.891] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:41.892] - until=2 [18:01:41.892] - relaying element #2 [18:01:41.892] result() for ClusterFuture ... [18:01:41.892] - result already collected: FutureResult [18:01:41.892] result() for ClusterFuture ... done [18:01:41.892] result() for ClusterFuture ... [18:01:41.893] - result already collected: FutureResult [18:01:41.893] result() for ClusterFuture ... done [18:01:41.893] result() for ClusterFuture ... [18:01:41.893] - result already collected: FutureResult [18:01:41.893] result() for ClusterFuture ... done [18:01:41.893] result() for ClusterFuture ... [18:01:41.894] - result already collected: FutureResult [18:01:41.894] result() for ClusterFuture ... done [18:01:41.894] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:41.894] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:41.894] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:41.894] length: 2 (resolved future 2) [18:01:41.895] Future #3 [18:01:41.895] result() for ClusterFuture ... [18:01:41.895] - result already collected: FutureResult [18:01:41.895] result() for ClusterFuture ... done [18:01:41.895] result() for ClusterFuture ... [18:01:41.895] - result already collected: FutureResult [18:01:41.896] result() for ClusterFuture ... done [18:01:41.896] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:41.896] - nx: 4 [18:01:41.896] - relay: TRUE [18:01:41.896] - stdout: TRUE [18:01:41.896] - signal: TRUE [18:01:41.897] - resignal: FALSE [18:01:41.897] - force: TRUE [18:01:41.897] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:41.897] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:41.897] - until=3 [18:01:41.897] - relaying element #3 [18:01:41.898] result() for ClusterFuture ... [18:01:41.898] - result already collected: FutureResult [18:01:41.898] result() for ClusterFuture ... done [18:01:41.898] result() for ClusterFuture ... [18:01:41.898] - result already collected: FutureResult [18:01:41.898] result() for ClusterFuture ... done [18:01:41.899] result() for ClusterFuture ... [18:01:41.899] - result already collected: FutureResult [18:01:41.899] result() for ClusterFuture ... done [18:01:41.899] result() for ClusterFuture ... [18:01:41.899] - result already collected: FutureResult [18:01:41.899] result() for ClusterFuture ... done [18:01:41.899] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:41.900] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:41.900] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:41.900] length: 1 (resolved future 3) [18:01:41.900] Future #4 [18:01:41.900] result() for ClusterFuture ... [18:01:41.901] - result already collected: FutureResult [18:01:41.901] result() for ClusterFuture ... done [18:01:41.901] result() for ClusterFuture ... [18:01:41.901] - result already collected: FutureResult [18:01:41.901] result() for ClusterFuture ... done [18:01:41.901] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:41.902] - nx: 4 [18:01:41.902] - relay: TRUE [18:01:41.902] - stdout: TRUE [18:01:41.902] - signal: TRUE [18:01:41.902] - resignal: FALSE [18:01:41.902] - force: TRUE [18:01:41.902] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:41.903] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:41.903] - until=4 [18:01:41.903] - relaying element #4 [18:01:41.903] result() for ClusterFuture ... [18:01:41.903] - result already collected: FutureResult [18:01:41.903] result() for ClusterFuture ... done [18:01:41.904] result() for ClusterFuture ... [18:01:41.904] - result already collected: FutureResult [18:01:41.904] result() for ClusterFuture ... done [18:01:41.904] result() for ClusterFuture ... [18:01:41.904] - result already collected: FutureResult [18:01:41.904] result() for ClusterFuture ... done [18:01:41.905] result() for ClusterFuture ... [18:01:41.905] - result already collected: FutureResult [18:01:41.905] result() for ClusterFuture ... done [18:01:41.905] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.905] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:41.905] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:41.906] length: 0 (resolved future 4) [18:01:41.906] Relaying remaining futures [18:01:41.906] signalConditionsASAP(NULL, pos=0) ... [18:01:41.906] - nx: 4 [18:01:41.906] - relay: TRUE [18:01:41.906] - stdout: TRUE [18:01:41.906] - signal: TRUE [18:01:41.907] - resignal: FALSE [18:01:41.907] - force: TRUE [18:01:41.907] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.907] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:41.907] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:41.908] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:41.908] signalConditionsASAP(NULL, pos=0) ... done [18:01:41.908] resolve() on environment ... DONE [18:01:41.908] result() for ClusterFuture ... [18:01:41.908] - result already collected: FutureResult [18:01:41.908] result() for ClusterFuture ... done [18:01:41.909] result() for ClusterFuture ... [18:01:41.909] - result already collected: FutureResult [18:01:41.909] result() for ClusterFuture ... done [18:01:41.909] result() for ClusterFuture ... [18:01:41.909] - result already collected: FutureResult [18:01:41.909] result() for ClusterFuture ... done [18:01:41.910] result() for ClusterFuture ... [18:01:41.910] - result already collected: FutureResult [18:01:41.910] result() for ClusterFuture ... done [18:01:41.910] result() for ClusterFuture ... [18:01:41.911] - result already collected: FutureResult [18:01:41.911] result() for ClusterFuture ... done [18:01:41.911] result() for ClusterFuture ... [18:01:41.911] - result already collected: FutureResult [18:01:41.912] result() for ClusterFuture ... done Dimensions: c(2, 3, 1) [18:01:41.912] getGlobalsAndPackages() ... [18:01:41.913] Searching for globals... [18:01:41.913] [18:01:41.913] Searching for globals ... DONE [18:01:41.914] - globals: [0] [18:01:41.914] getGlobalsAndPackages() ... DONE [18:01:41.914] run() for 'Future' ... [18:01:41.915] - state: 'created' [18:01:41.915] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.930] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.930] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.930] - Field: 'node' [18:01:41.931] - Field: 'label' [18:01:41.931] - Field: 'local' [18:01:41.931] - Field: 'owner' [18:01:41.931] - Field: 'envir' [18:01:41.931] - Field: 'workers' [18:01:41.931] - Field: 'packages' [18:01:41.932] - Field: 'gc' [18:01:41.932] - Field: 'conditions' [18:01:41.932] - Field: 'persistent' [18:01:41.932] - Field: 'expr' [18:01:41.932] - Field: 'uuid' [18:01:41.933] - Field: 'seed' [18:01:41.933] - Field: 'version' [18:01:41.933] - Field: 'result' [18:01:41.933] - Field: 'asynchronous' [18:01:41.933] - Field: 'calls' [18:01:41.933] - Field: 'globals' [18:01:41.934] - Field: 'stdout' [18:01:41.934] - Field: 'earlySignal' [18:01:41.934] - Field: 'lazy' [18:01:41.934] - Field: 'state' [18:01:41.934] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.935] - Launch lazy future ... [18:01:41.935] Packages needed by the future expression (n = 0): [18:01:41.935] Packages needed by future strategies (n = 0): [18:01:41.936] { [18:01:41.936] { [18:01:41.936] { [18:01:41.936] ...future.startTime <- base::Sys.time() [18:01:41.936] { [18:01:41.936] { [18:01:41.936] { [18:01:41.936] { [18:01:41.936] base::local({ [18:01:41.936] has_future <- base::requireNamespace("future", [18:01:41.936] quietly = TRUE) [18:01:41.936] if (has_future) { [18:01:41.936] ns <- base::getNamespace("future") [18:01:41.936] version <- ns[[".package"]][["version"]] [18:01:41.936] if (is.null(version)) [18:01:41.936] version <- utils::packageVersion("future") [18:01:41.936] } [18:01:41.936] else { [18:01:41.936] version <- NULL [18:01:41.936] } [18:01:41.936] if (!has_future || version < "1.8.0") { [18:01:41.936] info <- base::c(r_version = base::gsub("R version ", [18:01:41.936] "", base::R.version$version.string), [18:01:41.936] platform = base::sprintf("%s (%s-bit)", [18:01:41.936] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.936] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.936] "release", "version")], collapse = " "), [18:01:41.936] hostname = base::Sys.info()[["nodename"]]) [18:01:41.936] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.936] info) [18:01:41.936] info <- base::paste(info, collapse = "; ") [18:01:41.936] if (!has_future) { [18:01:41.936] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.936] info) [18:01:41.936] } [18:01:41.936] else { [18:01:41.936] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.936] info, version) [18:01:41.936] } [18:01:41.936] base::stop(msg) [18:01:41.936] } [18:01:41.936] }) [18:01:41.936] } [18:01:41.936] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.936] base::options(mc.cores = 1L) [18:01:41.936] } [18:01:41.936] options(future.plan = NULL) [18:01:41.936] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.936] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.936] } [18:01:41.936] ...future.workdir <- getwd() [18:01:41.936] } [18:01:41.936] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.936] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.936] } [18:01:41.936] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.936] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.936] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.936] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.936] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.936] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.936] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.936] base::names(...future.oldOptions)) [18:01:41.936] } [18:01:41.936] if (FALSE) { [18:01:41.936] } [18:01:41.936] else { [18:01:41.936] if (TRUE) { [18:01:41.936] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.936] open = "w") [18:01:41.936] } [18:01:41.936] else { [18:01:41.936] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.936] windows = "NUL", "/dev/null"), open = "w") [18:01:41.936] } [18:01:41.936] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.936] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.936] base::sink(type = "output", split = FALSE) [18:01:41.936] base::close(...future.stdout) [18:01:41.936] }, add = TRUE) [18:01:41.936] } [18:01:41.936] ...future.frame <- base::sys.nframe() [18:01:41.936] ...future.conditions <- base::list() [18:01:41.936] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.936] if (FALSE) { [18:01:41.936] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.936] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.936] } [18:01:41.936] ...future.result <- base::tryCatch({ [18:01:41.936] base::withCallingHandlers({ [18:01:41.936] ...future.value <- base::withVisible(base::local({ [18:01:41.936] ...future.makeSendCondition <- local({ [18:01:41.936] sendCondition <- NULL [18:01:41.936] function(frame = 1L) { [18:01:41.936] if (is.function(sendCondition)) [18:01:41.936] return(sendCondition) [18:01:41.936] ns <- getNamespace("parallel") [18:01:41.936] if (exists("sendData", mode = "function", [18:01:41.936] envir = ns)) { [18:01:41.936] parallel_sendData <- get("sendData", mode = "function", [18:01:41.936] envir = ns) [18:01:41.936] envir <- sys.frame(frame) [18:01:41.936] master <- NULL [18:01:41.936] while (!identical(envir, .GlobalEnv) && [18:01:41.936] !identical(envir, emptyenv())) { [18:01:41.936] if (exists("master", mode = "list", envir = envir, [18:01:41.936] inherits = FALSE)) { [18:01:41.936] master <- get("master", mode = "list", [18:01:41.936] envir = envir, inherits = FALSE) [18:01:41.936] if (inherits(master, c("SOCKnode", [18:01:41.936] "SOCK0node"))) { [18:01:41.936] sendCondition <<- function(cond) { [18:01:41.936] data <- list(type = "VALUE", value = cond, [18:01:41.936] success = TRUE) [18:01:41.936] parallel_sendData(master, data) [18:01:41.936] } [18:01:41.936] return(sendCondition) [18:01:41.936] } [18:01:41.936] } [18:01:41.936] frame <- frame + 1L [18:01:41.936] envir <- sys.frame(frame) [18:01:41.936] } [18:01:41.936] } [18:01:41.936] sendCondition <<- function(cond) NULL [18:01:41.936] } [18:01:41.936] }) [18:01:41.936] withCallingHandlers({ [18:01:41.936] 2 [18:01:41.936] }, immediateCondition = function(cond) { [18:01:41.936] sendCondition <- ...future.makeSendCondition() [18:01:41.936] sendCondition(cond) [18:01:41.936] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.936] { [18:01:41.936] inherits <- base::inherits [18:01:41.936] invokeRestart <- base::invokeRestart [18:01:41.936] is.null <- base::is.null [18:01:41.936] muffled <- FALSE [18:01:41.936] if (inherits(cond, "message")) { [18:01:41.936] muffled <- grepl(pattern, "muffleMessage") [18:01:41.936] if (muffled) [18:01:41.936] invokeRestart("muffleMessage") [18:01:41.936] } [18:01:41.936] else if (inherits(cond, "warning")) { [18:01:41.936] muffled <- grepl(pattern, "muffleWarning") [18:01:41.936] if (muffled) [18:01:41.936] invokeRestart("muffleWarning") [18:01:41.936] } [18:01:41.936] else if (inherits(cond, "condition")) { [18:01:41.936] if (!is.null(pattern)) { [18:01:41.936] computeRestarts <- base::computeRestarts [18:01:41.936] grepl <- base::grepl [18:01:41.936] restarts <- computeRestarts(cond) [18:01:41.936] for (restart in restarts) { [18:01:41.936] name <- restart$name [18:01:41.936] if (is.null(name)) [18:01:41.936] next [18:01:41.936] if (!grepl(pattern, name)) [18:01:41.936] next [18:01:41.936] invokeRestart(restart) [18:01:41.936] muffled <- TRUE [18:01:41.936] break [18:01:41.936] } [18:01:41.936] } [18:01:41.936] } [18:01:41.936] invisible(muffled) [18:01:41.936] } [18:01:41.936] muffleCondition(cond) [18:01:41.936] }) [18:01:41.936] })) [18:01:41.936] future::FutureResult(value = ...future.value$value, [18:01:41.936] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.936] ...future.rng), globalenv = if (FALSE) [18:01:41.936] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.936] ...future.globalenv.names)) [18:01:41.936] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.936] }, condition = base::local({ [18:01:41.936] c <- base::c [18:01:41.936] inherits <- base::inherits [18:01:41.936] invokeRestart <- base::invokeRestart [18:01:41.936] length <- base::length [18:01:41.936] list <- base::list [18:01:41.936] seq.int <- base::seq.int [18:01:41.936] signalCondition <- base::signalCondition [18:01:41.936] sys.calls <- base::sys.calls [18:01:41.936] `[[` <- base::`[[` [18:01:41.936] `+` <- base::`+` [18:01:41.936] `<<-` <- base::`<<-` [18:01:41.936] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.936] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.936] 3L)] [18:01:41.936] } [18:01:41.936] function(cond) { [18:01:41.936] is_error <- inherits(cond, "error") [18:01:41.936] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.936] NULL) [18:01:41.936] if (is_error) { [18:01:41.936] sessionInformation <- function() { [18:01:41.936] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.936] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.936] search = base::search(), system = base::Sys.info()) [18:01:41.936] } [18:01:41.936] ...future.conditions[[length(...future.conditions) + [18:01:41.936] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.936] cond$call), session = sessionInformation(), [18:01:41.936] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.936] signalCondition(cond) [18:01:41.936] } [18:01:41.936] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.936] "immediateCondition"))) { [18:01:41.936] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.936] ...future.conditions[[length(...future.conditions) + [18:01:41.936] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.936] if (TRUE && !signal) { [18:01:41.936] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.936] { [18:01:41.936] inherits <- base::inherits [18:01:41.936] invokeRestart <- base::invokeRestart [18:01:41.936] is.null <- base::is.null [18:01:41.936] muffled <- FALSE [18:01:41.936] if (inherits(cond, "message")) { [18:01:41.936] muffled <- grepl(pattern, "muffleMessage") [18:01:41.936] if (muffled) [18:01:41.936] invokeRestart("muffleMessage") [18:01:41.936] } [18:01:41.936] else if (inherits(cond, "warning")) { [18:01:41.936] muffled <- grepl(pattern, "muffleWarning") [18:01:41.936] if (muffled) [18:01:41.936] invokeRestart("muffleWarning") [18:01:41.936] } [18:01:41.936] else if (inherits(cond, "condition")) { [18:01:41.936] if (!is.null(pattern)) { [18:01:41.936] computeRestarts <- base::computeRestarts [18:01:41.936] grepl <- base::grepl [18:01:41.936] restarts <- computeRestarts(cond) [18:01:41.936] for (restart in restarts) { [18:01:41.936] name <- restart$name [18:01:41.936] if (is.null(name)) [18:01:41.936] next [18:01:41.936] if (!grepl(pattern, name)) [18:01:41.936] next [18:01:41.936] invokeRestart(restart) [18:01:41.936] muffled <- TRUE [18:01:41.936] break [18:01:41.936] } [18:01:41.936] } [18:01:41.936] } [18:01:41.936] invisible(muffled) [18:01:41.936] } [18:01:41.936] muffleCondition(cond, pattern = "^muffle") [18:01:41.936] } [18:01:41.936] } [18:01:41.936] else { [18:01:41.936] if (TRUE) { [18:01:41.936] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.936] { [18:01:41.936] inherits <- base::inherits [18:01:41.936] invokeRestart <- base::invokeRestart [18:01:41.936] is.null <- base::is.null [18:01:41.936] muffled <- FALSE [18:01:41.936] if (inherits(cond, "message")) { [18:01:41.936] muffled <- grepl(pattern, "muffleMessage") [18:01:41.936] if (muffled) [18:01:41.936] invokeRestart("muffleMessage") [18:01:41.936] } [18:01:41.936] else if (inherits(cond, "warning")) { [18:01:41.936] muffled <- grepl(pattern, "muffleWarning") [18:01:41.936] if (muffled) [18:01:41.936] invokeRestart("muffleWarning") [18:01:41.936] } [18:01:41.936] else if (inherits(cond, "condition")) { [18:01:41.936] if (!is.null(pattern)) { [18:01:41.936] computeRestarts <- base::computeRestarts [18:01:41.936] grepl <- base::grepl [18:01:41.936] restarts <- computeRestarts(cond) [18:01:41.936] for (restart in restarts) { [18:01:41.936] name <- restart$name [18:01:41.936] if (is.null(name)) [18:01:41.936] next [18:01:41.936] if (!grepl(pattern, name)) [18:01:41.936] next [18:01:41.936] invokeRestart(restart) [18:01:41.936] muffled <- TRUE [18:01:41.936] break [18:01:41.936] } [18:01:41.936] } [18:01:41.936] } [18:01:41.936] invisible(muffled) [18:01:41.936] } [18:01:41.936] muffleCondition(cond, pattern = "^muffle") [18:01:41.936] } [18:01:41.936] } [18:01:41.936] } [18:01:41.936] })) [18:01:41.936] }, error = function(ex) { [18:01:41.936] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.936] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.936] ...future.rng), started = ...future.startTime, [18:01:41.936] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.936] version = "1.8"), class = "FutureResult") [18:01:41.936] }, finally = { [18:01:41.936] if (!identical(...future.workdir, getwd())) [18:01:41.936] setwd(...future.workdir) [18:01:41.936] { [18:01:41.936] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.936] ...future.oldOptions$nwarnings <- NULL [18:01:41.936] } [18:01:41.936] base::options(...future.oldOptions) [18:01:41.936] if (.Platform$OS.type == "windows") { [18:01:41.936] old_names <- names(...future.oldEnvVars) [18:01:41.936] envs <- base::Sys.getenv() [18:01:41.936] names <- names(envs) [18:01:41.936] common <- intersect(names, old_names) [18:01:41.936] added <- setdiff(names, old_names) [18:01:41.936] removed <- setdiff(old_names, names) [18:01:41.936] changed <- common[...future.oldEnvVars[common] != [18:01:41.936] envs[common]] [18:01:41.936] NAMES <- toupper(changed) [18:01:41.936] args <- list() [18:01:41.936] for (kk in seq_along(NAMES)) { [18:01:41.936] name <- changed[[kk]] [18:01:41.936] NAME <- NAMES[[kk]] [18:01:41.936] if (name != NAME && is.element(NAME, old_names)) [18:01:41.936] next [18:01:41.936] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.936] } [18:01:41.936] NAMES <- toupper(added) [18:01:41.936] for (kk in seq_along(NAMES)) { [18:01:41.936] name <- added[[kk]] [18:01:41.936] NAME <- NAMES[[kk]] [18:01:41.936] if (name != NAME && is.element(NAME, old_names)) [18:01:41.936] next [18:01:41.936] args[[name]] <- "" [18:01:41.936] } [18:01:41.936] NAMES <- toupper(removed) [18:01:41.936] for (kk in seq_along(NAMES)) { [18:01:41.936] name <- removed[[kk]] [18:01:41.936] NAME <- NAMES[[kk]] [18:01:41.936] if (name != NAME && is.element(NAME, old_names)) [18:01:41.936] next [18:01:41.936] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.936] } [18:01:41.936] if (length(args) > 0) [18:01:41.936] base::do.call(base::Sys.setenv, args = args) [18:01:41.936] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.936] } [18:01:41.936] else { [18:01:41.936] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.936] } [18:01:41.936] { [18:01:41.936] if (base::length(...future.futureOptionsAdded) > [18:01:41.936] 0L) { [18:01:41.936] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.936] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.936] base::options(opts) [18:01:41.936] } [18:01:41.936] { [18:01:41.936] { [18:01:41.936] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.936] NULL [18:01:41.936] } [18:01:41.936] options(future.plan = NULL) [18:01:41.936] if (is.na(NA_character_)) [18:01:41.936] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.936] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.936] future::plan(list(function (..., workers = availableCores(), [18:01:41.936] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.936] envir = parent.frame()) [18:01:41.936] { [18:01:41.936] if (is.function(workers)) [18:01:41.936] workers <- workers() [18:01:41.936] workers <- structure(as.integer(workers), [18:01:41.936] class = class(workers)) [18:01:41.936] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.936] workers >= 1) [18:01:41.936] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.936] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.936] } [18:01:41.936] future <- MultisessionFuture(..., workers = workers, [18:01:41.936] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.936] envir = envir) [18:01:41.936] if (!future$lazy) [18:01:41.936] future <- run(future) [18:01:41.936] invisible(future) [18:01:41.936] }), .cleanup = FALSE, .init = FALSE) [18:01:41.936] } [18:01:41.936] } [18:01:41.936] } [18:01:41.936] }) [18:01:41.936] if (TRUE) { [18:01:41.936] base::sink(type = "output", split = FALSE) [18:01:41.936] if (TRUE) { [18:01:41.936] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.936] } [18:01:41.936] else { [18:01:41.936] ...future.result["stdout"] <- base::list(NULL) [18:01:41.936] } [18:01:41.936] base::close(...future.stdout) [18:01:41.936] ...future.stdout <- NULL [18:01:41.936] } [18:01:41.936] ...future.result$conditions <- ...future.conditions [18:01:41.936] ...future.result$finished <- base::Sys.time() [18:01:41.936] ...future.result [18:01:41.936] } [18:01:41.941] MultisessionFuture started [18:01:41.941] - Launch lazy future ... done [18:01:41.942] run() for 'MultisessionFuture' ... done [18:01:41.942] getGlobalsAndPackages() ... [18:01:41.942] Searching for globals... [18:01:41.942] [18:01:41.943] Searching for globals ... DONE [18:01:41.943] - globals: [0] [18:01:41.943] getGlobalsAndPackages() ... DONE [18:01:41.943] run() for 'Future' ... [18:01:41.943] - state: 'created' [18:01:41.944] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.957] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.958] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.958] - Field: 'node' [18:01:41.958] - Field: 'label' [18:01:41.958] - Field: 'local' [18:01:41.958] - Field: 'owner' [18:01:41.959] - Field: 'envir' [18:01:41.959] - Field: 'workers' [18:01:41.959] - Field: 'packages' [18:01:41.959] - Field: 'gc' [18:01:41.959] - Field: 'conditions' [18:01:41.959] - Field: 'persistent' [18:01:41.960] - Field: 'expr' [18:01:41.960] - Field: 'uuid' [18:01:41.960] - Field: 'seed' [18:01:41.960] - Field: 'version' [18:01:41.960] - Field: 'result' [18:01:41.961] - Field: 'asynchronous' [18:01:41.961] - Field: 'calls' [18:01:41.961] - Field: 'globals' [18:01:41.961] - Field: 'stdout' [18:01:41.961] - Field: 'earlySignal' [18:01:41.961] - Field: 'lazy' [18:01:41.962] - Field: 'state' [18:01:41.962] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.962] - Launch lazy future ... [18:01:41.962] Packages needed by the future expression (n = 0): [18:01:41.963] Packages needed by future strategies (n = 0): [18:01:41.963] { [18:01:41.963] { [18:01:41.963] { [18:01:41.963] ...future.startTime <- base::Sys.time() [18:01:41.963] { [18:01:41.963] { [18:01:41.963] { [18:01:41.963] { [18:01:41.963] base::local({ [18:01:41.963] has_future <- base::requireNamespace("future", [18:01:41.963] quietly = TRUE) [18:01:41.963] if (has_future) { [18:01:41.963] ns <- base::getNamespace("future") [18:01:41.963] version <- ns[[".package"]][["version"]] [18:01:41.963] if (is.null(version)) [18:01:41.963] version <- utils::packageVersion("future") [18:01:41.963] } [18:01:41.963] else { [18:01:41.963] version <- NULL [18:01:41.963] } [18:01:41.963] if (!has_future || version < "1.8.0") { [18:01:41.963] info <- base::c(r_version = base::gsub("R version ", [18:01:41.963] "", base::R.version$version.string), [18:01:41.963] platform = base::sprintf("%s (%s-bit)", [18:01:41.963] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.963] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.963] "release", "version")], collapse = " "), [18:01:41.963] hostname = base::Sys.info()[["nodename"]]) [18:01:41.963] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.963] info) [18:01:41.963] info <- base::paste(info, collapse = "; ") [18:01:41.963] if (!has_future) { [18:01:41.963] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.963] info) [18:01:41.963] } [18:01:41.963] else { [18:01:41.963] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.963] info, version) [18:01:41.963] } [18:01:41.963] base::stop(msg) [18:01:41.963] } [18:01:41.963] }) [18:01:41.963] } [18:01:41.963] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.963] base::options(mc.cores = 1L) [18:01:41.963] } [18:01:41.963] options(future.plan = NULL) [18:01:41.963] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.963] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.963] } [18:01:41.963] ...future.workdir <- getwd() [18:01:41.963] } [18:01:41.963] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.963] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.963] } [18:01:41.963] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.963] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.963] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.963] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.963] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.963] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.963] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.963] base::names(...future.oldOptions)) [18:01:41.963] } [18:01:41.963] if (FALSE) { [18:01:41.963] } [18:01:41.963] else { [18:01:41.963] if (TRUE) { [18:01:41.963] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.963] open = "w") [18:01:41.963] } [18:01:41.963] else { [18:01:41.963] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.963] windows = "NUL", "/dev/null"), open = "w") [18:01:41.963] } [18:01:41.963] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.963] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.963] base::sink(type = "output", split = FALSE) [18:01:41.963] base::close(...future.stdout) [18:01:41.963] }, add = TRUE) [18:01:41.963] } [18:01:41.963] ...future.frame <- base::sys.nframe() [18:01:41.963] ...future.conditions <- base::list() [18:01:41.963] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.963] if (FALSE) { [18:01:41.963] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.963] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.963] } [18:01:41.963] ...future.result <- base::tryCatch({ [18:01:41.963] base::withCallingHandlers({ [18:01:41.963] ...future.value <- base::withVisible(base::local({ [18:01:41.963] ...future.makeSendCondition <- local({ [18:01:41.963] sendCondition <- NULL [18:01:41.963] function(frame = 1L) { [18:01:41.963] if (is.function(sendCondition)) [18:01:41.963] return(sendCondition) [18:01:41.963] ns <- getNamespace("parallel") [18:01:41.963] if (exists("sendData", mode = "function", [18:01:41.963] envir = ns)) { [18:01:41.963] parallel_sendData <- get("sendData", mode = "function", [18:01:41.963] envir = ns) [18:01:41.963] envir <- sys.frame(frame) [18:01:41.963] master <- NULL [18:01:41.963] while (!identical(envir, .GlobalEnv) && [18:01:41.963] !identical(envir, emptyenv())) { [18:01:41.963] if (exists("master", mode = "list", envir = envir, [18:01:41.963] inherits = FALSE)) { [18:01:41.963] master <- get("master", mode = "list", [18:01:41.963] envir = envir, inherits = FALSE) [18:01:41.963] if (inherits(master, c("SOCKnode", [18:01:41.963] "SOCK0node"))) { [18:01:41.963] sendCondition <<- function(cond) { [18:01:41.963] data <- list(type = "VALUE", value = cond, [18:01:41.963] success = TRUE) [18:01:41.963] parallel_sendData(master, data) [18:01:41.963] } [18:01:41.963] return(sendCondition) [18:01:41.963] } [18:01:41.963] } [18:01:41.963] frame <- frame + 1L [18:01:41.963] envir <- sys.frame(frame) [18:01:41.963] } [18:01:41.963] } [18:01:41.963] sendCondition <<- function(cond) NULL [18:01:41.963] } [18:01:41.963] }) [18:01:41.963] withCallingHandlers({ [18:01:41.963] NULL [18:01:41.963] }, immediateCondition = function(cond) { [18:01:41.963] sendCondition <- ...future.makeSendCondition() [18:01:41.963] sendCondition(cond) [18:01:41.963] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.963] { [18:01:41.963] inherits <- base::inherits [18:01:41.963] invokeRestart <- base::invokeRestart [18:01:41.963] is.null <- base::is.null [18:01:41.963] muffled <- FALSE [18:01:41.963] if (inherits(cond, "message")) { [18:01:41.963] muffled <- grepl(pattern, "muffleMessage") [18:01:41.963] if (muffled) [18:01:41.963] invokeRestart("muffleMessage") [18:01:41.963] } [18:01:41.963] else if (inherits(cond, "warning")) { [18:01:41.963] muffled <- grepl(pattern, "muffleWarning") [18:01:41.963] if (muffled) [18:01:41.963] invokeRestart("muffleWarning") [18:01:41.963] } [18:01:41.963] else if (inherits(cond, "condition")) { [18:01:41.963] if (!is.null(pattern)) { [18:01:41.963] computeRestarts <- base::computeRestarts [18:01:41.963] grepl <- base::grepl [18:01:41.963] restarts <- computeRestarts(cond) [18:01:41.963] for (restart in restarts) { [18:01:41.963] name <- restart$name [18:01:41.963] if (is.null(name)) [18:01:41.963] next [18:01:41.963] if (!grepl(pattern, name)) [18:01:41.963] next [18:01:41.963] invokeRestart(restart) [18:01:41.963] muffled <- TRUE [18:01:41.963] break [18:01:41.963] } [18:01:41.963] } [18:01:41.963] } [18:01:41.963] invisible(muffled) [18:01:41.963] } [18:01:41.963] muffleCondition(cond) [18:01:41.963] }) [18:01:41.963] })) [18:01:41.963] future::FutureResult(value = ...future.value$value, [18:01:41.963] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.963] ...future.rng), globalenv = if (FALSE) [18:01:41.963] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.963] ...future.globalenv.names)) [18:01:41.963] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.963] }, condition = base::local({ [18:01:41.963] c <- base::c [18:01:41.963] inherits <- base::inherits [18:01:41.963] invokeRestart <- base::invokeRestart [18:01:41.963] length <- base::length [18:01:41.963] list <- base::list [18:01:41.963] seq.int <- base::seq.int [18:01:41.963] signalCondition <- base::signalCondition [18:01:41.963] sys.calls <- base::sys.calls [18:01:41.963] `[[` <- base::`[[` [18:01:41.963] `+` <- base::`+` [18:01:41.963] `<<-` <- base::`<<-` [18:01:41.963] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.963] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.963] 3L)] [18:01:41.963] } [18:01:41.963] function(cond) { [18:01:41.963] is_error <- inherits(cond, "error") [18:01:41.963] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.963] NULL) [18:01:41.963] if (is_error) { [18:01:41.963] sessionInformation <- function() { [18:01:41.963] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.963] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.963] search = base::search(), system = base::Sys.info()) [18:01:41.963] } [18:01:41.963] ...future.conditions[[length(...future.conditions) + [18:01:41.963] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.963] cond$call), session = sessionInformation(), [18:01:41.963] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.963] signalCondition(cond) [18:01:41.963] } [18:01:41.963] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.963] "immediateCondition"))) { [18:01:41.963] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.963] ...future.conditions[[length(...future.conditions) + [18:01:41.963] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.963] if (TRUE && !signal) { [18:01:41.963] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.963] { [18:01:41.963] inherits <- base::inherits [18:01:41.963] invokeRestart <- base::invokeRestart [18:01:41.963] is.null <- base::is.null [18:01:41.963] muffled <- FALSE [18:01:41.963] if (inherits(cond, "message")) { [18:01:41.963] muffled <- grepl(pattern, "muffleMessage") [18:01:41.963] if (muffled) [18:01:41.963] invokeRestart("muffleMessage") [18:01:41.963] } [18:01:41.963] else if (inherits(cond, "warning")) { [18:01:41.963] muffled <- grepl(pattern, "muffleWarning") [18:01:41.963] if (muffled) [18:01:41.963] invokeRestart("muffleWarning") [18:01:41.963] } [18:01:41.963] else if (inherits(cond, "condition")) { [18:01:41.963] if (!is.null(pattern)) { [18:01:41.963] computeRestarts <- base::computeRestarts [18:01:41.963] grepl <- base::grepl [18:01:41.963] restarts <- computeRestarts(cond) [18:01:41.963] for (restart in restarts) { [18:01:41.963] name <- restart$name [18:01:41.963] if (is.null(name)) [18:01:41.963] next [18:01:41.963] if (!grepl(pattern, name)) [18:01:41.963] next [18:01:41.963] invokeRestart(restart) [18:01:41.963] muffled <- TRUE [18:01:41.963] break [18:01:41.963] } [18:01:41.963] } [18:01:41.963] } [18:01:41.963] invisible(muffled) [18:01:41.963] } [18:01:41.963] muffleCondition(cond, pattern = "^muffle") [18:01:41.963] } [18:01:41.963] } [18:01:41.963] else { [18:01:41.963] if (TRUE) { [18:01:41.963] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.963] { [18:01:41.963] inherits <- base::inherits [18:01:41.963] invokeRestart <- base::invokeRestart [18:01:41.963] is.null <- base::is.null [18:01:41.963] muffled <- FALSE [18:01:41.963] if (inherits(cond, "message")) { [18:01:41.963] muffled <- grepl(pattern, "muffleMessage") [18:01:41.963] if (muffled) [18:01:41.963] invokeRestart("muffleMessage") [18:01:41.963] } [18:01:41.963] else if (inherits(cond, "warning")) { [18:01:41.963] muffled <- grepl(pattern, "muffleWarning") [18:01:41.963] if (muffled) [18:01:41.963] invokeRestart("muffleWarning") [18:01:41.963] } [18:01:41.963] else if (inherits(cond, "condition")) { [18:01:41.963] if (!is.null(pattern)) { [18:01:41.963] computeRestarts <- base::computeRestarts [18:01:41.963] grepl <- base::grepl [18:01:41.963] restarts <- computeRestarts(cond) [18:01:41.963] for (restart in restarts) { [18:01:41.963] name <- restart$name [18:01:41.963] if (is.null(name)) [18:01:41.963] next [18:01:41.963] if (!grepl(pattern, name)) [18:01:41.963] next [18:01:41.963] invokeRestart(restart) [18:01:41.963] muffled <- TRUE [18:01:41.963] break [18:01:41.963] } [18:01:41.963] } [18:01:41.963] } [18:01:41.963] invisible(muffled) [18:01:41.963] } [18:01:41.963] muffleCondition(cond, pattern = "^muffle") [18:01:41.963] } [18:01:41.963] } [18:01:41.963] } [18:01:41.963] })) [18:01:41.963] }, error = function(ex) { [18:01:41.963] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.963] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.963] ...future.rng), started = ...future.startTime, [18:01:41.963] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.963] version = "1.8"), class = "FutureResult") [18:01:41.963] }, finally = { [18:01:41.963] if (!identical(...future.workdir, getwd())) [18:01:41.963] setwd(...future.workdir) [18:01:41.963] { [18:01:41.963] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.963] ...future.oldOptions$nwarnings <- NULL [18:01:41.963] } [18:01:41.963] base::options(...future.oldOptions) [18:01:41.963] if (.Platform$OS.type == "windows") { [18:01:41.963] old_names <- names(...future.oldEnvVars) [18:01:41.963] envs <- base::Sys.getenv() [18:01:41.963] names <- names(envs) [18:01:41.963] common <- intersect(names, old_names) [18:01:41.963] added <- setdiff(names, old_names) [18:01:41.963] removed <- setdiff(old_names, names) [18:01:41.963] changed <- common[...future.oldEnvVars[common] != [18:01:41.963] envs[common]] [18:01:41.963] NAMES <- toupper(changed) [18:01:41.963] args <- list() [18:01:41.963] for (kk in seq_along(NAMES)) { [18:01:41.963] name <- changed[[kk]] [18:01:41.963] NAME <- NAMES[[kk]] [18:01:41.963] if (name != NAME && is.element(NAME, old_names)) [18:01:41.963] next [18:01:41.963] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.963] } [18:01:41.963] NAMES <- toupper(added) [18:01:41.963] for (kk in seq_along(NAMES)) { [18:01:41.963] name <- added[[kk]] [18:01:41.963] NAME <- NAMES[[kk]] [18:01:41.963] if (name != NAME && is.element(NAME, old_names)) [18:01:41.963] next [18:01:41.963] args[[name]] <- "" [18:01:41.963] } [18:01:41.963] NAMES <- toupper(removed) [18:01:41.963] for (kk in seq_along(NAMES)) { [18:01:41.963] name <- removed[[kk]] [18:01:41.963] NAME <- NAMES[[kk]] [18:01:41.963] if (name != NAME && is.element(NAME, old_names)) [18:01:41.963] next [18:01:41.963] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.963] } [18:01:41.963] if (length(args) > 0) [18:01:41.963] base::do.call(base::Sys.setenv, args = args) [18:01:41.963] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.963] } [18:01:41.963] else { [18:01:41.963] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.963] } [18:01:41.963] { [18:01:41.963] if (base::length(...future.futureOptionsAdded) > [18:01:41.963] 0L) { [18:01:41.963] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.963] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.963] base::options(opts) [18:01:41.963] } [18:01:41.963] { [18:01:41.963] { [18:01:41.963] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.963] NULL [18:01:41.963] } [18:01:41.963] options(future.plan = NULL) [18:01:41.963] if (is.na(NA_character_)) [18:01:41.963] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.963] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.963] future::plan(list(function (..., workers = availableCores(), [18:01:41.963] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.963] envir = parent.frame()) [18:01:41.963] { [18:01:41.963] if (is.function(workers)) [18:01:41.963] workers <- workers() [18:01:41.963] workers <- structure(as.integer(workers), [18:01:41.963] class = class(workers)) [18:01:41.963] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.963] workers >= 1) [18:01:41.963] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.963] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.963] } [18:01:41.963] future <- MultisessionFuture(..., workers = workers, [18:01:41.963] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.963] envir = envir) [18:01:41.963] if (!future$lazy) [18:01:41.963] future <- run(future) [18:01:41.963] invisible(future) [18:01:41.963] }), .cleanup = FALSE, .init = FALSE) [18:01:41.963] } [18:01:41.963] } [18:01:41.963] } [18:01:41.963] }) [18:01:41.963] if (TRUE) { [18:01:41.963] base::sink(type = "output", split = FALSE) [18:01:41.963] if (TRUE) { [18:01:41.963] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.963] } [18:01:41.963] else { [18:01:41.963] ...future.result["stdout"] <- base::list(NULL) [18:01:41.963] } [18:01:41.963] base::close(...future.stdout) [18:01:41.963] ...future.stdout <- NULL [18:01:41.963] } [18:01:41.963] ...future.result$conditions <- ...future.conditions [18:01:41.963] ...future.result$finished <- base::Sys.time() [18:01:41.963] ...future.result [18:01:41.963] } [18:01:41.969] MultisessionFuture started [18:01:41.969] - Launch lazy future ... done [18:01:41.969] run() for 'MultisessionFuture' ... done [18:01:41.970] getGlobalsAndPackages() ... [18:01:41.970] Searching for globals... [18:01:41.971] - globals found: [1] '{' [18:01:41.971] Searching for globals ... DONE [18:01:41.971] Resolving globals: FALSE [18:01:41.971] [18:01:41.972] [18:01:41.972] getGlobalsAndPackages() ... DONE [18:01:41.972] run() for 'Future' ... [18:01:41.972] - state: 'created' [18:01:41.972] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:41.986] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:41.986] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:41.986] - Field: 'node' [18:01:41.986] - Field: 'label' [18:01:41.987] - Field: 'local' [18:01:41.987] - Field: 'owner' [18:01:41.987] - Field: 'envir' [18:01:41.987] - Field: 'workers' [18:01:41.987] - Field: 'packages' [18:01:41.988] - Field: 'gc' [18:01:41.988] - Field: 'conditions' [18:01:41.988] - Field: 'persistent' [18:01:41.988] - Field: 'expr' [18:01:41.988] - Field: 'uuid' [18:01:41.988] - Field: 'seed' [18:01:41.989] - Field: 'version' [18:01:41.989] - Field: 'result' [18:01:41.989] - Field: 'asynchronous' [18:01:41.989] - Field: 'calls' [18:01:41.989] - Field: 'globals' [18:01:41.990] - Field: 'stdout' [18:01:41.990] - Field: 'earlySignal' [18:01:41.990] - Field: 'lazy' [18:01:41.990] - Field: 'state' [18:01:41.990] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:41.990] - Launch lazy future ... [18:01:41.991] Packages needed by the future expression (n = 0): [18:01:41.991] Packages needed by future strategies (n = 0): [18:01:41.992] { [18:01:41.992] { [18:01:41.992] { [18:01:41.992] ...future.startTime <- base::Sys.time() [18:01:41.992] { [18:01:41.992] { [18:01:41.992] { [18:01:41.992] { [18:01:41.992] base::local({ [18:01:41.992] has_future <- base::requireNamespace("future", [18:01:41.992] quietly = TRUE) [18:01:41.992] if (has_future) { [18:01:41.992] ns <- base::getNamespace("future") [18:01:41.992] version <- ns[[".package"]][["version"]] [18:01:41.992] if (is.null(version)) [18:01:41.992] version <- utils::packageVersion("future") [18:01:41.992] } [18:01:41.992] else { [18:01:41.992] version <- NULL [18:01:41.992] } [18:01:41.992] if (!has_future || version < "1.8.0") { [18:01:41.992] info <- base::c(r_version = base::gsub("R version ", [18:01:41.992] "", base::R.version$version.string), [18:01:41.992] platform = base::sprintf("%s (%s-bit)", [18:01:41.992] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:41.992] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:41.992] "release", "version")], collapse = " "), [18:01:41.992] hostname = base::Sys.info()[["nodename"]]) [18:01:41.992] info <- base::sprintf("%s: %s", base::names(info), [18:01:41.992] info) [18:01:41.992] info <- base::paste(info, collapse = "; ") [18:01:41.992] if (!has_future) { [18:01:41.992] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:41.992] info) [18:01:41.992] } [18:01:41.992] else { [18:01:41.992] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:41.992] info, version) [18:01:41.992] } [18:01:41.992] base::stop(msg) [18:01:41.992] } [18:01:41.992] }) [18:01:41.992] } [18:01:41.992] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:41.992] base::options(mc.cores = 1L) [18:01:41.992] } [18:01:41.992] options(future.plan = NULL) [18:01:41.992] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.992] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:41.992] } [18:01:41.992] ...future.workdir <- getwd() [18:01:41.992] } [18:01:41.992] ...future.oldOptions <- base::as.list(base::.Options) [18:01:41.992] ...future.oldEnvVars <- base::Sys.getenv() [18:01:41.992] } [18:01:41.992] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:41.992] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:41.992] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:41.992] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:41.992] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:41.992] future.stdout.windows.reencode = NULL, width = 80L) [18:01:41.992] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:41.992] base::names(...future.oldOptions)) [18:01:41.992] } [18:01:41.992] if (FALSE) { [18:01:41.992] } [18:01:41.992] else { [18:01:41.992] if (TRUE) { [18:01:41.992] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:41.992] open = "w") [18:01:41.992] } [18:01:41.992] else { [18:01:41.992] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:41.992] windows = "NUL", "/dev/null"), open = "w") [18:01:41.992] } [18:01:41.992] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:41.992] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:41.992] base::sink(type = "output", split = FALSE) [18:01:41.992] base::close(...future.stdout) [18:01:41.992] }, add = TRUE) [18:01:41.992] } [18:01:41.992] ...future.frame <- base::sys.nframe() [18:01:41.992] ...future.conditions <- base::list() [18:01:41.992] ...future.rng <- base::globalenv()$.Random.seed [18:01:41.992] if (FALSE) { [18:01:41.992] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:41.992] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:41.992] } [18:01:41.992] ...future.result <- base::tryCatch({ [18:01:41.992] base::withCallingHandlers({ [18:01:41.992] ...future.value <- base::withVisible(base::local({ [18:01:41.992] ...future.makeSendCondition <- local({ [18:01:41.992] sendCondition <- NULL [18:01:41.992] function(frame = 1L) { [18:01:41.992] if (is.function(sendCondition)) [18:01:41.992] return(sendCondition) [18:01:41.992] ns <- getNamespace("parallel") [18:01:41.992] if (exists("sendData", mode = "function", [18:01:41.992] envir = ns)) { [18:01:41.992] parallel_sendData <- get("sendData", mode = "function", [18:01:41.992] envir = ns) [18:01:41.992] envir <- sys.frame(frame) [18:01:41.992] master <- NULL [18:01:41.992] while (!identical(envir, .GlobalEnv) && [18:01:41.992] !identical(envir, emptyenv())) { [18:01:41.992] if (exists("master", mode = "list", envir = envir, [18:01:41.992] inherits = FALSE)) { [18:01:41.992] master <- get("master", mode = "list", [18:01:41.992] envir = envir, inherits = FALSE) [18:01:41.992] if (inherits(master, c("SOCKnode", [18:01:41.992] "SOCK0node"))) { [18:01:41.992] sendCondition <<- function(cond) { [18:01:41.992] data <- list(type = "VALUE", value = cond, [18:01:41.992] success = TRUE) [18:01:41.992] parallel_sendData(master, data) [18:01:41.992] } [18:01:41.992] return(sendCondition) [18:01:41.992] } [18:01:41.992] } [18:01:41.992] frame <- frame + 1L [18:01:41.992] envir <- sys.frame(frame) [18:01:41.992] } [18:01:41.992] } [18:01:41.992] sendCondition <<- function(cond) NULL [18:01:41.992] } [18:01:41.992] }) [18:01:41.992] withCallingHandlers({ [18:01:41.992] { [18:01:41.992] 4 [18:01:41.992] } [18:01:41.992] }, immediateCondition = function(cond) { [18:01:41.992] sendCondition <- ...future.makeSendCondition() [18:01:41.992] sendCondition(cond) [18:01:41.992] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.992] { [18:01:41.992] inherits <- base::inherits [18:01:41.992] invokeRestart <- base::invokeRestart [18:01:41.992] is.null <- base::is.null [18:01:41.992] muffled <- FALSE [18:01:41.992] if (inherits(cond, "message")) { [18:01:41.992] muffled <- grepl(pattern, "muffleMessage") [18:01:41.992] if (muffled) [18:01:41.992] invokeRestart("muffleMessage") [18:01:41.992] } [18:01:41.992] else if (inherits(cond, "warning")) { [18:01:41.992] muffled <- grepl(pattern, "muffleWarning") [18:01:41.992] if (muffled) [18:01:41.992] invokeRestart("muffleWarning") [18:01:41.992] } [18:01:41.992] else if (inherits(cond, "condition")) { [18:01:41.992] if (!is.null(pattern)) { [18:01:41.992] computeRestarts <- base::computeRestarts [18:01:41.992] grepl <- base::grepl [18:01:41.992] restarts <- computeRestarts(cond) [18:01:41.992] for (restart in restarts) { [18:01:41.992] name <- restart$name [18:01:41.992] if (is.null(name)) [18:01:41.992] next [18:01:41.992] if (!grepl(pattern, name)) [18:01:41.992] next [18:01:41.992] invokeRestart(restart) [18:01:41.992] muffled <- TRUE [18:01:41.992] break [18:01:41.992] } [18:01:41.992] } [18:01:41.992] } [18:01:41.992] invisible(muffled) [18:01:41.992] } [18:01:41.992] muffleCondition(cond) [18:01:41.992] }) [18:01:41.992] })) [18:01:41.992] future::FutureResult(value = ...future.value$value, [18:01:41.992] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.992] ...future.rng), globalenv = if (FALSE) [18:01:41.992] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:41.992] ...future.globalenv.names)) [18:01:41.992] else NULL, started = ...future.startTime, version = "1.8") [18:01:41.992] }, condition = base::local({ [18:01:41.992] c <- base::c [18:01:41.992] inherits <- base::inherits [18:01:41.992] invokeRestart <- base::invokeRestart [18:01:41.992] length <- base::length [18:01:41.992] list <- base::list [18:01:41.992] seq.int <- base::seq.int [18:01:41.992] signalCondition <- base::signalCondition [18:01:41.992] sys.calls <- base::sys.calls [18:01:41.992] `[[` <- base::`[[` [18:01:41.992] `+` <- base::`+` [18:01:41.992] `<<-` <- base::`<<-` [18:01:41.992] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:41.992] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:41.992] 3L)] [18:01:41.992] } [18:01:41.992] function(cond) { [18:01:41.992] is_error <- inherits(cond, "error") [18:01:41.992] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:41.992] NULL) [18:01:41.992] if (is_error) { [18:01:41.992] sessionInformation <- function() { [18:01:41.992] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:41.992] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:41.992] search = base::search(), system = base::Sys.info()) [18:01:41.992] } [18:01:41.992] ...future.conditions[[length(...future.conditions) + [18:01:41.992] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:41.992] cond$call), session = sessionInformation(), [18:01:41.992] timestamp = base::Sys.time(), signaled = 0L) [18:01:41.992] signalCondition(cond) [18:01:41.992] } [18:01:41.992] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:41.992] "immediateCondition"))) { [18:01:41.992] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:41.992] ...future.conditions[[length(...future.conditions) + [18:01:41.992] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:41.992] if (TRUE && !signal) { [18:01:41.992] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.992] { [18:01:41.992] inherits <- base::inherits [18:01:41.992] invokeRestart <- base::invokeRestart [18:01:41.992] is.null <- base::is.null [18:01:41.992] muffled <- FALSE [18:01:41.992] if (inherits(cond, "message")) { [18:01:41.992] muffled <- grepl(pattern, "muffleMessage") [18:01:41.992] if (muffled) [18:01:41.992] invokeRestart("muffleMessage") [18:01:41.992] } [18:01:41.992] else if (inherits(cond, "warning")) { [18:01:41.992] muffled <- grepl(pattern, "muffleWarning") [18:01:41.992] if (muffled) [18:01:41.992] invokeRestart("muffleWarning") [18:01:41.992] } [18:01:41.992] else if (inherits(cond, "condition")) { [18:01:41.992] if (!is.null(pattern)) { [18:01:41.992] computeRestarts <- base::computeRestarts [18:01:41.992] grepl <- base::grepl [18:01:41.992] restarts <- computeRestarts(cond) [18:01:41.992] for (restart in restarts) { [18:01:41.992] name <- restart$name [18:01:41.992] if (is.null(name)) [18:01:41.992] next [18:01:41.992] if (!grepl(pattern, name)) [18:01:41.992] next [18:01:41.992] invokeRestart(restart) [18:01:41.992] muffled <- TRUE [18:01:41.992] break [18:01:41.992] } [18:01:41.992] } [18:01:41.992] } [18:01:41.992] invisible(muffled) [18:01:41.992] } [18:01:41.992] muffleCondition(cond, pattern = "^muffle") [18:01:41.992] } [18:01:41.992] } [18:01:41.992] else { [18:01:41.992] if (TRUE) { [18:01:41.992] muffleCondition <- function (cond, pattern = "^muffle") [18:01:41.992] { [18:01:41.992] inherits <- base::inherits [18:01:41.992] invokeRestart <- base::invokeRestart [18:01:41.992] is.null <- base::is.null [18:01:41.992] muffled <- FALSE [18:01:41.992] if (inherits(cond, "message")) { [18:01:41.992] muffled <- grepl(pattern, "muffleMessage") [18:01:41.992] if (muffled) [18:01:41.992] invokeRestart("muffleMessage") [18:01:41.992] } [18:01:41.992] else if (inherits(cond, "warning")) { [18:01:41.992] muffled <- grepl(pattern, "muffleWarning") [18:01:41.992] if (muffled) [18:01:41.992] invokeRestart("muffleWarning") [18:01:41.992] } [18:01:41.992] else if (inherits(cond, "condition")) { [18:01:41.992] if (!is.null(pattern)) { [18:01:41.992] computeRestarts <- base::computeRestarts [18:01:41.992] grepl <- base::grepl [18:01:41.992] restarts <- computeRestarts(cond) [18:01:41.992] for (restart in restarts) { [18:01:41.992] name <- restart$name [18:01:41.992] if (is.null(name)) [18:01:41.992] next [18:01:41.992] if (!grepl(pattern, name)) [18:01:41.992] next [18:01:41.992] invokeRestart(restart) [18:01:41.992] muffled <- TRUE [18:01:41.992] break [18:01:41.992] } [18:01:41.992] } [18:01:41.992] } [18:01:41.992] invisible(muffled) [18:01:41.992] } [18:01:41.992] muffleCondition(cond, pattern = "^muffle") [18:01:41.992] } [18:01:41.992] } [18:01:41.992] } [18:01:41.992] })) [18:01:41.992] }, error = function(ex) { [18:01:41.992] base::structure(base::list(value = NULL, visible = NULL, [18:01:41.992] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:41.992] ...future.rng), started = ...future.startTime, [18:01:41.992] finished = Sys.time(), session_uuid = NA_character_, [18:01:41.992] version = "1.8"), class = "FutureResult") [18:01:41.992] }, finally = { [18:01:41.992] if (!identical(...future.workdir, getwd())) [18:01:41.992] setwd(...future.workdir) [18:01:41.992] { [18:01:41.992] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:41.992] ...future.oldOptions$nwarnings <- NULL [18:01:41.992] } [18:01:41.992] base::options(...future.oldOptions) [18:01:41.992] if (.Platform$OS.type == "windows") { [18:01:41.992] old_names <- names(...future.oldEnvVars) [18:01:41.992] envs <- base::Sys.getenv() [18:01:41.992] names <- names(envs) [18:01:41.992] common <- intersect(names, old_names) [18:01:41.992] added <- setdiff(names, old_names) [18:01:41.992] removed <- setdiff(old_names, names) [18:01:41.992] changed <- common[...future.oldEnvVars[common] != [18:01:41.992] envs[common]] [18:01:41.992] NAMES <- toupper(changed) [18:01:41.992] args <- list() [18:01:41.992] for (kk in seq_along(NAMES)) { [18:01:41.992] name <- changed[[kk]] [18:01:41.992] NAME <- NAMES[[kk]] [18:01:41.992] if (name != NAME && is.element(NAME, old_names)) [18:01:41.992] next [18:01:41.992] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.992] } [18:01:41.992] NAMES <- toupper(added) [18:01:41.992] for (kk in seq_along(NAMES)) { [18:01:41.992] name <- added[[kk]] [18:01:41.992] NAME <- NAMES[[kk]] [18:01:41.992] if (name != NAME && is.element(NAME, old_names)) [18:01:41.992] next [18:01:41.992] args[[name]] <- "" [18:01:41.992] } [18:01:41.992] NAMES <- toupper(removed) [18:01:41.992] for (kk in seq_along(NAMES)) { [18:01:41.992] name <- removed[[kk]] [18:01:41.992] NAME <- NAMES[[kk]] [18:01:41.992] if (name != NAME && is.element(NAME, old_names)) [18:01:41.992] next [18:01:41.992] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:41.992] } [18:01:41.992] if (length(args) > 0) [18:01:41.992] base::do.call(base::Sys.setenv, args = args) [18:01:41.992] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:41.992] } [18:01:41.992] else { [18:01:41.992] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:41.992] } [18:01:41.992] { [18:01:41.992] if (base::length(...future.futureOptionsAdded) > [18:01:41.992] 0L) { [18:01:41.992] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:41.992] base::names(opts) <- ...future.futureOptionsAdded [18:01:41.992] base::options(opts) [18:01:41.992] } [18:01:41.992] { [18:01:41.992] { [18:01:41.992] base::options(mc.cores = ...future.mc.cores.old) [18:01:41.992] NULL [18:01:41.992] } [18:01:41.992] options(future.plan = NULL) [18:01:41.992] if (is.na(NA_character_)) [18:01:41.992] Sys.unsetenv("R_FUTURE_PLAN") [18:01:41.992] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:41.992] future::plan(list(function (..., workers = availableCores(), [18:01:41.992] lazy = FALSE, rscript_libs = .libPaths(), [18:01:41.992] envir = parent.frame()) [18:01:41.992] { [18:01:41.992] if (is.function(workers)) [18:01:41.992] workers <- workers() [18:01:41.992] workers <- structure(as.integer(workers), [18:01:41.992] class = class(workers)) [18:01:41.992] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:41.992] workers >= 1) [18:01:41.992] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:41.992] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:41.992] } [18:01:41.992] future <- MultisessionFuture(..., workers = workers, [18:01:41.992] lazy = lazy, rscript_libs = rscript_libs, [18:01:41.992] envir = envir) [18:01:41.992] if (!future$lazy) [18:01:41.992] future <- run(future) [18:01:41.992] invisible(future) [18:01:41.992] }), .cleanup = FALSE, .init = FALSE) [18:01:41.992] } [18:01:41.992] } [18:01:41.992] } [18:01:41.992] }) [18:01:41.992] if (TRUE) { [18:01:41.992] base::sink(type = "output", split = FALSE) [18:01:41.992] if (TRUE) { [18:01:41.992] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:41.992] } [18:01:41.992] else { [18:01:41.992] ...future.result["stdout"] <- base::list(NULL) [18:01:41.992] } [18:01:41.992] base::close(...future.stdout) [18:01:41.992] ...future.stdout <- NULL [18:01:41.992] } [18:01:41.992] ...future.result$conditions <- ...future.conditions [18:01:41.992] ...future.result$finished <- base::Sys.time() [18:01:41.992] ...future.result [18:01:41.992] } [18:01:41.996] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:42.017] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.017] - Validating connection of MultisessionFuture [18:01:42.018] - received message: FutureResult [18:01:42.018] - Received FutureResult [18:01:42.018] - Erased future from FutureRegistry [18:01:42.018] result() for ClusterFuture ... [18:01:42.018] - result already collected: FutureResult [18:01:42.018] result() for ClusterFuture ... done [18:01:42.019] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.019] result() for ClusterFuture ... [18:01:42.019] - result already collected: FutureResult [18:01:42.019] result() for ClusterFuture ... done [18:01:42.019] result() for ClusterFuture ... [18:01:42.019] - result already collected: FutureResult [18:01:42.020] result() for ClusterFuture ... done [18:01:42.021] MultisessionFuture started [18:01:42.021] - Launch lazy future ... done [18:01:42.021] run() for 'MultisessionFuture' ... done [18:01:42.023] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.023] - Validating connection of MultisessionFuture [18:01:42.023] - received message: FutureResult [18:01:42.024] - Received FutureResult [18:01:42.024] - Erased future from FutureRegistry [18:01:42.024] result() for ClusterFuture ... [18:01:42.024] - result already collected: FutureResult [18:01:42.024] result() for ClusterFuture ... done [18:01:42.024] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.038] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.039] - Validating connection of MultisessionFuture [18:01:42.039] - received message: FutureResult [18:01:42.039] - Received FutureResult [18:01:42.039] - Erased future from FutureRegistry [18:01:42.039] result() for ClusterFuture ... [18:01:42.039] - result already collected: FutureResult [18:01:42.040] result() for ClusterFuture ... done [18:01:42.040] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:42.041] resolve() on environment ... [18:01:42.041] recursive: 0 [18:01:42.042] elements: [4] 'a', 'b', 'c', 'd' [18:01:42.042] signalConditionsASAP(numeric, pos=1) ... [18:01:42.042] - nx: 4 [18:01:42.043] - relay: TRUE [18:01:42.043] - stdout: TRUE [18:01:42.043] - signal: TRUE [18:01:42.043] - resignal: FALSE [18:01:42.043] - force: TRUE [18:01:42.043] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.044] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.044] - until=2 [18:01:42.044] - relaying element #2 [18:01:42.044] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:42.044] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.044] signalConditionsASAP(NULL, pos=1) ... done [18:01:42.045] length: 3 (resolved future 1) [18:01:42.045] Future #2 [18:01:42.045] result() for ClusterFuture ... [18:01:42.045] - result already collected: FutureResult [18:01:42.045] result() for ClusterFuture ... done [18:01:42.045] result() for ClusterFuture ... [18:01:42.046] - result already collected: FutureResult [18:01:42.046] result() for ClusterFuture ... done [18:01:42.046] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:42.046] - nx: 4 [18:01:42.046] - relay: TRUE [18:01:42.046] - stdout: TRUE [18:01:42.046] - signal: TRUE [18:01:42.047] - resignal: FALSE [18:01:42.047] - force: TRUE [18:01:42.047] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:42.047] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.047] - until=2 [18:01:42.047] - relaying element #2 [18:01:42.048] result() for ClusterFuture ... [18:01:42.048] - result already collected: FutureResult [18:01:42.048] result() for ClusterFuture ... done [18:01:42.048] result() for ClusterFuture ... [18:01:42.048] - result already collected: FutureResult [18:01:42.048] result() for ClusterFuture ... done [18:01:42.049] result() for ClusterFuture ... [18:01:42.049] - result already collected: FutureResult [18:01:42.049] result() for ClusterFuture ... done [18:01:42.049] result() for ClusterFuture ... [18:01:42.049] - result already collected: FutureResult [18:01:42.049] result() for ClusterFuture ... done [18:01:42.050] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:42.050] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:42.050] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:42.050] length: 2 (resolved future 2) [18:01:42.052] Future #3 [18:01:42.053] result() for ClusterFuture ... [18:01:42.053] - result already collected: FutureResult [18:01:42.053] result() for ClusterFuture ... done [18:01:42.053] result() for ClusterFuture ... [18:01:42.053] - result already collected: FutureResult [18:01:42.053] result() for ClusterFuture ... done [18:01:42.054] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:42.054] - nx: 4 [18:01:42.054] - relay: TRUE [18:01:42.054] - stdout: TRUE [18:01:42.054] - signal: TRUE [18:01:42.054] - resignal: FALSE [18:01:42.054] - force: TRUE [18:01:42.055] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:42.055] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:42.055] - until=3 [18:01:42.055] - relaying element #3 [18:01:42.055] result() for ClusterFuture ... [18:01:42.055] - result already collected: FutureResult [18:01:42.056] result() for ClusterFuture ... done [18:01:42.056] result() for ClusterFuture ... [18:01:42.056] - result already collected: FutureResult [18:01:42.056] result() for ClusterFuture ... done [18:01:42.056] result() for ClusterFuture ... [18:01:42.056] - result already collected: FutureResult [18:01:42.057] result() for ClusterFuture ... done [18:01:42.057] result() for ClusterFuture ... [18:01:42.057] - result already collected: FutureResult [18:01:42.057] result() for ClusterFuture ... done [18:01:42.057] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:42.057] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:42.057] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:42.058] length: 1 (resolved future 3) [18:01:42.058] Future #4 [18:01:42.058] result() for ClusterFuture ... [18:01:42.058] - result already collected: FutureResult [18:01:42.058] result() for ClusterFuture ... done [18:01:42.058] result() for ClusterFuture ... [18:01:42.059] - result already collected: FutureResult [18:01:42.059] result() for ClusterFuture ... done [18:01:42.059] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:42.059] - nx: 4 [18:01:42.059] - relay: TRUE [18:01:42.059] - stdout: TRUE [18:01:42.060] - signal: TRUE [18:01:42.060] - resignal: FALSE [18:01:42.060] - force: TRUE [18:01:42.060] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:42.060] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:42.060] - until=4 [18:01:42.060] - relaying element #4 [18:01:42.061] result() for ClusterFuture ... [18:01:42.061] - result already collected: FutureResult [18:01:42.061] result() for ClusterFuture ... done [18:01:42.061] result() for ClusterFuture ... [18:01:42.061] - result already collected: FutureResult [18:01:42.061] result() for ClusterFuture ... done [18:01:42.062] result() for ClusterFuture ... [18:01:42.062] - result already collected: FutureResult [18:01:42.062] result() for ClusterFuture ... done [18:01:42.062] result() for ClusterFuture ... [18:01:42.062] - result already collected: FutureResult [18:01:42.062] result() for ClusterFuture ... done [18:01:42.063] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:42.063] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:42.063] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:42.063] length: 0 (resolved future 4) [18:01:42.063] Relaying remaining futures [18:01:42.063] signalConditionsASAP(NULL, pos=0) ... [18:01:42.064] - nx: 4 [18:01:42.064] - relay: TRUE [18:01:42.064] - stdout: TRUE [18:01:42.064] - signal: TRUE [18:01:42.064] - resignal: FALSE [18:01:42.064] - force: TRUE [18:01:42.064] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:42.065] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:42.065] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:42.065] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:42.065] signalConditionsASAP(NULL, pos=0) ... done [18:01:42.065] resolve() on environment ... DONE [18:01:42.065] result() for ClusterFuture ... [18:01:42.066] - result already collected: FutureResult [18:01:42.066] result() for ClusterFuture ... done [18:01:42.066] result() for ClusterFuture ... [18:01:42.066] - result already collected: FutureResult [18:01:42.066] result() for ClusterFuture ... done [18:01:42.066] result() for ClusterFuture ... [18:01:42.067] - result already collected: FutureResult [18:01:42.067] result() for ClusterFuture ... done [18:01:42.067] result() for ClusterFuture ... [18:01:42.067] - result already collected: FutureResult [18:01:42.067] result() for ClusterFuture ... done [18:01:42.067] result() for ClusterFuture ... [18:01:42.068] - result already collected: FutureResult [18:01:42.068] result() for ClusterFuture ... done [18:01:42.068] result() for ClusterFuture ... [18:01:42.068] - result already collected: FutureResult [18:01:42.068] result() for ClusterFuture ... done Dimensions: c(2, 1, 3, 1) [18:01:42.069] getGlobalsAndPackages() ... [18:01:42.069] Searching for globals... [18:01:42.069] [18:01:42.069] Searching for globals ... DONE [18:01:42.070] - globals: [0] [18:01:42.070] getGlobalsAndPackages() ... DONE [18:01:42.070] run() for 'Future' ... [18:01:42.070] - state: 'created' [18:01:42.070] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.084] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.084] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.084] - Field: 'node' [18:01:42.085] - Field: 'label' [18:01:42.085] - Field: 'local' [18:01:42.085] - Field: 'owner' [18:01:42.085] - Field: 'envir' [18:01:42.085] - Field: 'workers' [18:01:42.086] - Field: 'packages' [18:01:42.086] - Field: 'gc' [18:01:42.086] - Field: 'conditions' [18:01:42.086] - Field: 'persistent' [18:01:42.086] - Field: 'expr' [18:01:42.086] - Field: 'uuid' [18:01:42.087] - Field: 'seed' [18:01:42.087] - Field: 'version' [18:01:42.087] - Field: 'result' [18:01:42.087] - Field: 'asynchronous' [18:01:42.087] - Field: 'calls' [18:01:42.087] - Field: 'globals' [18:01:42.088] - Field: 'stdout' [18:01:42.088] - Field: 'earlySignal' [18:01:42.088] - Field: 'lazy' [18:01:42.088] - Field: 'state' [18:01:42.088] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.089] - Launch lazy future ... [18:01:42.089] Packages needed by the future expression (n = 0): [18:01:42.089] Packages needed by future strategies (n = 0): [18:01:42.090] { [18:01:42.090] { [18:01:42.090] { [18:01:42.090] ...future.startTime <- base::Sys.time() [18:01:42.090] { [18:01:42.090] { [18:01:42.090] { [18:01:42.090] { [18:01:42.090] base::local({ [18:01:42.090] has_future <- base::requireNamespace("future", [18:01:42.090] quietly = TRUE) [18:01:42.090] if (has_future) { [18:01:42.090] ns <- base::getNamespace("future") [18:01:42.090] version <- ns[[".package"]][["version"]] [18:01:42.090] if (is.null(version)) [18:01:42.090] version <- utils::packageVersion("future") [18:01:42.090] } [18:01:42.090] else { [18:01:42.090] version <- NULL [18:01:42.090] } [18:01:42.090] if (!has_future || version < "1.8.0") { [18:01:42.090] info <- base::c(r_version = base::gsub("R version ", [18:01:42.090] "", base::R.version$version.string), [18:01:42.090] platform = base::sprintf("%s (%s-bit)", [18:01:42.090] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.090] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.090] "release", "version")], collapse = " "), [18:01:42.090] hostname = base::Sys.info()[["nodename"]]) [18:01:42.090] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.090] info) [18:01:42.090] info <- base::paste(info, collapse = "; ") [18:01:42.090] if (!has_future) { [18:01:42.090] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.090] info) [18:01:42.090] } [18:01:42.090] else { [18:01:42.090] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.090] info, version) [18:01:42.090] } [18:01:42.090] base::stop(msg) [18:01:42.090] } [18:01:42.090] }) [18:01:42.090] } [18:01:42.090] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.090] base::options(mc.cores = 1L) [18:01:42.090] } [18:01:42.090] options(future.plan = NULL) [18:01:42.090] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.090] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.090] } [18:01:42.090] ...future.workdir <- getwd() [18:01:42.090] } [18:01:42.090] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.090] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.090] } [18:01:42.090] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.090] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.090] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.090] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.090] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.090] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.090] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.090] base::names(...future.oldOptions)) [18:01:42.090] } [18:01:42.090] if (FALSE) { [18:01:42.090] } [18:01:42.090] else { [18:01:42.090] if (TRUE) { [18:01:42.090] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.090] open = "w") [18:01:42.090] } [18:01:42.090] else { [18:01:42.090] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.090] windows = "NUL", "/dev/null"), open = "w") [18:01:42.090] } [18:01:42.090] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.090] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.090] base::sink(type = "output", split = FALSE) [18:01:42.090] base::close(...future.stdout) [18:01:42.090] }, add = TRUE) [18:01:42.090] } [18:01:42.090] ...future.frame <- base::sys.nframe() [18:01:42.090] ...future.conditions <- base::list() [18:01:42.090] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.090] if (FALSE) { [18:01:42.090] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.090] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.090] } [18:01:42.090] ...future.result <- base::tryCatch({ [18:01:42.090] base::withCallingHandlers({ [18:01:42.090] ...future.value <- base::withVisible(base::local({ [18:01:42.090] ...future.makeSendCondition <- local({ [18:01:42.090] sendCondition <- NULL [18:01:42.090] function(frame = 1L) { [18:01:42.090] if (is.function(sendCondition)) [18:01:42.090] return(sendCondition) [18:01:42.090] ns <- getNamespace("parallel") [18:01:42.090] if (exists("sendData", mode = "function", [18:01:42.090] envir = ns)) { [18:01:42.090] parallel_sendData <- get("sendData", mode = "function", [18:01:42.090] envir = ns) [18:01:42.090] envir <- sys.frame(frame) [18:01:42.090] master <- NULL [18:01:42.090] while (!identical(envir, .GlobalEnv) && [18:01:42.090] !identical(envir, emptyenv())) { [18:01:42.090] if (exists("master", mode = "list", envir = envir, [18:01:42.090] inherits = FALSE)) { [18:01:42.090] master <- get("master", mode = "list", [18:01:42.090] envir = envir, inherits = FALSE) [18:01:42.090] if (inherits(master, c("SOCKnode", [18:01:42.090] "SOCK0node"))) { [18:01:42.090] sendCondition <<- function(cond) { [18:01:42.090] data <- list(type = "VALUE", value = cond, [18:01:42.090] success = TRUE) [18:01:42.090] parallel_sendData(master, data) [18:01:42.090] } [18:01:42.090] return(sendCondition) [18:01:42.090] } [18:01:42.090] } [18:01:42.090] frame <- frame + 1L [18:01:42.090] envir <- sys.frame(frame) [18:01:42.090] } [18:01:42.090] } [18:01:42.090] sendCondition <<- function(cond) NULL [18:01:42.090] } [18:01:42.090] }) [18:01:42.090] withCallingHandlers({ [18:01:42.090] 2 [18:01:42.090] }, immediateCondition = function(cond) { [18:01:42.090] sendCondition <- ...future.makeSendCondition() [18:01:42.090] sendCondition(cond) [18:01:42.090] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.090] { [18:01:42.090] inherits <- base::inherits [18:01:42.090] invokeRestart <- base::invokeRestart [18:01:42.090] is.null <- base::is.null [18:01:42.090] muffled <- FALSE [18:01:42.090] if (inherits(cond, "message")) { [18:01:42.090] muffled <- grepl(pattern, "muffleMessage") [18:01:42.090] if (muffled) [18:01:42.090] invokeRestart("muffleMessage") [18:01:42.090] } [18:01:42.090] else if (inherits(cond, "warning")) { [18:01:42.090] muffled <- grepl(pattern, "muffleWarning") [18:01:42.090] if (muffled) [18:01:42.090] invokeRestart("muffleWarning") [18:01:42.090] } [18:01:42.090] else if (inherits(cond, "condition")) { [18:01:42.090] if (!is.null(pattern)) { [18:01:42.090] computeRestarts <- base::computeRestarts [18:01:42.090] grepl <- base::grepl [18:01:42.090] restarts <- computeRestarts(cond) [18:01:42.090] for (restart in restarts) { [18:01:42.090] name <- restart$name [18:01:42.090] if (is.null(name)) [18:01:42.090] next [18:01:42.090] if (!grepl(pattern, name)) [18:01:42.090] next [18:01:42.090] invokeRestart(restart) [18:01:42.090] muffled <- TRUE [18:01:42.090] break [18:01:42.090] } [18:01:42.090] } [18:01:42.090] } [18:01:42.090] invisible(muffled) [18:01:42.090] } [18:01:42.090] muffleCondition(cond) [18:01:42.090] }) [18:01:42.090] })) [18:01:42.090] future::FutureResult(value = ...future.value$value, [18:01:42.090] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.090] ...future.rng), globalenv = if (FALSE) [18:01:42.090] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.090] ...future.globalenv.names)) [18:01:42.090] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.090] }, condition = base::local({ [18:01:42.090] c <- base::c [18:01:42.090] inherits <- base::inherits [18:01:42.090] invokeRestart <- base::invokeRestart [18:01:42.090] length <- base::length [18:01:42.090] list <- base::list [18:01:42.090] seq.int <- base::seq.int [18:01:42.090] signalCondition <- base::signalCondition [18:01:42.090] sys.calls <- base::sys.calls [18:01:42.090] `[[` <- base::`[[` [18:01:42.090] `+` <- base::`+` [18:01:42.090] `<<-` <- base::`<<-` [18:01:42.090] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.090] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.090] 3L)] [18:01:42.090] } [18:01:42.090] function(cond) { [18:01:42.090] is_error <- inherits(cond, "error") [18:01:42.090] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.090] NULL) [18:01:42.090] if (is_error) { [18:01:42.090] sessionInformation <- function() { [18:01:42.090] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.090] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.090] search = base::search(), system = base::Sys.info()) [18:01:42.090] } [18:01:42.090] ...future.conditions[[length(...future.conditions) + [18:01:42.090] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.090] cond$call), session = sessionInformation(), [18:01:42.090] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.090] signalCondition(cond) [18:01:42.090] } [18:01:42.090] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.090] "immediateCondition"))) { [18:01:42.090] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.090] ...future.conditions[[length(...future.conditions) + [18:01:42.090] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.090] if (TRUE && !signal) { [18:01:42.090] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.090] { [18:01:42.090] inherits <- base::inherits [18:01:42.090] invokeRestart <- base::invokeRestart [18:01:42.090] is.null <- base::is.null [18:01:42.090] muffled <- FALSE [18:01:42.090] if (inherits(cond, "message")) { [18:01:42.090] muffled <- grepl(pattern, "muffleMessage") [18:01:42.090] if (muffled) [18:01:42.090] invokeRestart("muffleMessage") [18:01:42.090] } [18:01:42.090] else if (inherits(cond, "warning")) { [18:01:42.090] muffled <- grepl(pattern, "muffleWarning") [18:01:42.090] if (muffled) [18:01:42.090] invokeRestart("muffleWarning") [18:01:42.090] } [18:01:42.090] else if (inherits(cond, "condition")) { [18:01:42.090] if (!is.null(pattern)) { [18:01:42.090] computeRestarts <- base::computeRestarts [18:01:42.090] grepl <- base::grepl [18:01:42.090] restarts <- computeRestarts(cond) [18:01:42.090] for (restart in restarts) { [18:01:42.090] name <- restart$name [18:01:42.090] if (is.null(name)) [18:01:42.090] next [18:01:42.090] if (!grepl(pattern, name)) [18:01:42.090] next [18:01:42.090] invokeRestart(restart) [18:01:42.090] muffled <- TRUE [18:01:42.090] break [18:01:42.090] } [18:01:42.090] } [18:01:42.090] } [18:01:42.090] invisible(muffled) [18:01:42.090] } [18:01:42.090] muffleCondition(cond, pattern = "^muffle") [18:01:42.090] } [18:01:42.090] } [18:01:42.090] else { [18:01:42.090] if (TRUE) { [18:01:42.090] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.090] { [18:01:42.090] inherits <- base::inherits [18:01:42.090] invokeRestart <- base::invokeRestart [18:01:42.090] is.null <- base::is.null [18:01:42.090] muffled <- FALSE [18:01:42.090] if (inherits(cond, "message")) { [18:01:42.090] muffled <- grepl(pattern, "muffleMessage") [18:01:42.090] if (muffled) [18:01:42.090] invokeRestart("muffleMessage") [18:01:42.090] } [18:01:42.090] else if (inherits(cond, "warning")) { [18:01:42.090] muffled <- grepl(pattern, "muffleWarning") [18:01:42.090] if (muffled) [18:01:42.090] invokeRestart("muffleWarning") [18:01:42.090] } [18:01:42.090] else if (inherits(cond, "condition")) { [18:01:42.090] if (!is.null(pattern)) { [18:01:42.090] computeRestarts <- base::computeRestarts [18:01:42.090] grepl <- base::grepl [18:01:42.090] restarts <- computeRestarts(cond) [18:01:42.090] for (restart in restarts) { [18:01:42.090] name <- restart$name [18:01:42.090] if (is.null(name)) [18:01:42.090] next [18:01:42.090] if (!grepl(pattern, name)) [18:01:42.090] next [18:01:42.090] invokeRestart(restart) [18:01:42.090] muffled <- TRUE [18:01:42.090] break [18:01:42.090] } [18:01:42.090] } [18:01:42.090] } [18:01:42.090] invisible(muffled) [18:01:42.090] } [18:01:42.090] muffleCondition(cond, pattern = "^muffle") [18:01:42.090] } [18:01:42.090] } [18:01:42.090] } [18:01:42.090] })) [18:01:42.090] }, error = function(ex) { [18:01:42.090] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.090] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.090] ...future.rng), started = ...future.startTime, [18:01:42.090] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.090] version = "1.8"), class = "FutureResult") [18:01:42.090] }, finally = { [18:01:42.090] if (!identical(...future.workdir, getwd())) [18:01:42.090] setwd(...future.workdir) [18:01:42.090] { [18:01:42.090] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.090] ...future.oldOptions$nwarnings <- NULL [18:01:42.090] } [18:01:42.090] base::options(...future.oldOptions) [18:01:42.090] if (.Platform$OS.type == "windows") { [18:01:42.090] old_names <- names(...future.oldEnvVars) [18:01:42.090] envs <- base::Sys.getenv() [18:01:42.090] names <- names(envs) [18:01:42.090] common <- intersect(names, old_names) [18:01:42.090] added <- setdiff(names, old_names) [18:01:42.090] removed <- setdiff(old_names, names) [18:01:42.090] changed <- common[...future.oldEnvVars[common] != [18:01:42.090] envs[common]] [18:01:42.090] NAMES <- toupper(changed) [18:01:42.090] args <- list() [18:01:42.090] for (kk in seq_along(NAMES)) { [18:01:42.090] name <- changed[[kk]] [18:01:42.090] NAME <- NAMES[[kk]] [18:01:42.090] if (name != NAME && is.element(NAME, old_names)) [18:01:42.090] next [18:01:42.090] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.090] } [18:01:42.090] NAMES <- toupper(added) [18:01:42.090] for (kk in seq_along(NAMES)) { [18:01:42.090] name <- added[[kk]] [18:01:42.090] NAME <- NAMES[[kk]] [18:01:42.090] if (name != NAME && is.element(NAME, old_names)) [18:01:42.090] next [18:01:42.090] args[[name]] <- "" [18:01:42.090] } [18:01:42.090] NAMES <- toupper(removed) [18:01:42.090] for (kk in seq_along(NAMES)) { [18:01:42.090] name <- removed[[kk]] [18:01:42.090] NAME <- NAMES[[kk]] [18:01:42.090] if (name != NAME && is.element(NAME, old_names)) [18:01:42.090] next [18:01:42.090] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.090] } [18:01:42.090] if (length(args) > 0) [18:01:42.090] base::do.call(base::Sys.setenv, args = args) [18:01:42.090] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.090] } [18:01:42.090] else { [18:01:42.090] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.090] } [18:01:42.090] { [18:01:42.090] if (base::length(...future.futureOptionsAdded) > [18:01:42.090] 0L) { [18:01:42.090] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.090] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.090] base::options(opts) [18:01:42.090] } [18:01:42.090] { [18:01:42.090] { [18:01:42.090] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.090] NULL [18:01:42.090] } [18:01:42.090] options(future.plan = NULL) [18:01:42.090] if (is.na(NA_character_)) [18:01:42.090] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.090] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.090] future::plan(list(function (..., workers = availableCores(), [18:01:42.090] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.090] envir = parent.frame()) [18:01:42.090] { [18:01:42.090] if (is.function(workers)) [18:01:42.090] workers <- workers() [18:01:42.090] workers <- structure(as.integer(workers), [18:01:42.090] class = class(workers)) [18:01:42.090] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.090] workers >= 1) [18:01:42.090] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.090] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.090] } [18:01:42.090] future <- MultisessionFuture(..., workers = workers, [18:01:42.090] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.090] envir = envir) [18:01:42.090] if (!future$lazy) [18:01:42.090] future <- run(future) [18:01:42.090] invisible(future) [18:01:42.090] }), .cleanup = FALSE, .init = FALSE) [18:01:42.090] } [18:01:42.090] } [18:01:42.090] } [18:01:42.090] }) [18:01:42.090] if (TRUE) { [18:01:42.090] base::sink(type = "output", split = FALSE) [18:01:42.090] if (TRUE) { [18:01:42.090] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.090] } [18:01:42.090] else { [18:01:42.090] ...future.result["stdout"] <- base::list(NULL) [18:01:42.090] } [18:01:42.090] base::close(...future.stdout) [18:01:42.090] ...future.stdout <- NULL [18:01:42.090] } [18:01:42.090] ...future.result$conditions <- ...future.conditions [18:01:42.090] ...future.result$finished <- base::Sys.time() [18:01:42.090] ...future.result [18:01:42.090] } [18:01:42.095] MultisessionFuture started [18:01:42.096] - Launch lazy future ... done [18:01:42.096] run() for 'MultisessionFuture' ... done [18:01:42.096] getGlobalsAndPackages() ... [18:01:42.096] Searching for globals... [18:01:42.097] [18:01:42.097] Searching for globals ... DONE [18:01:42.097] - globals: [0] [18:01:42.097] getGlobalsAndPackages() ... DONE [18:01:42.097] run() for 'Future' ... [18:01:42.098] - state: 'created' [18:01:42.098] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.112] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.112] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.112] - Field: 'node' [18:01:42.112] - Field: 'label' [18:01:42.113] - Field: 'local' [18:01:42.113] - Field: 'owner' [18:01:42.113] - Field: 'envir' [18:01:42.113] - Field: 'workers' [18:01:42.113] - Field: 'packages' [18:01:42.114] - Field: 'gc' [18:01:42.114] - Field: 'conditions' [18:01:42.114] - Field: 'persistent' [18:01:42.114] - Field: 'expr' [18:01:42.114] - Field: 'uuid' [18:01:42.115] - Field: 'seed' [18:01:42.115] - Field: 'version' [18:01:42.115] - Field: 'result' [18:01:42.115] - Field: 'asynchronous' [18:01:42.115] - Field: 'calls' [18:01:42.115] - Field: 'globals' [18:01:42.116] - Field: 'stdout' [18:01:42.116] - Field: 'earlySignal' [18:01:42.116] - Field: 'lazy' [18:01:42.116] - Field: 'state' [18:01:42.116] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.117] - Launch lazy future ... [18:01:42.117] Packages needed by the future expression (n = 0): [18:01:42.117] Packages needed by future strategies (n = 0): [18:01:42.118] { [18:01:42.118] { [18:01:42.118] { [18:01:42.118] ...future.startTime <- base::Sys.time() [18:01:42.118] { [18:01:42.118] { [18:01:42.118] { [18:01:42.118] { [18:01:42.118] base::local({ [18:01:42.118] has_future <- base::requireNamespace("future", [18:01:42.118] quietly = TRUE) [18:01:42.118] if (has_future) { [18:01:42.118] ns <- base::getNamespace("future") [18:01:42.118] version <- ns[[".package"]][["version"]] [18:01:42.118] if (is.null(version)) [18:01:42.118] version <- utils::packageVersion("future") [18:01:42.118] } [18:01:42.118] else { [18:01:42.118] version <- NULL [18:01:42.118] } [18:01:42.118] if (!has_future || version < "1.8.0") { [18:01:42.118] info <- base::c(r_version = base::gsub("R version ", [18:01:42.118] "", base::R.version$version.string), [18:01:42.118] platform = base::sprintf("%s (%s-bit)", [18:01:42.118] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.118] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.118] "release", "version")], collapse = " "), [18:01:42.118] hostname = base::Sys.info()[["nodename"]]) [18:01:42.118] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.118] info) [18:01:42.118] info <- base::paste(info, collapse = "; ") [18:01:42.118] if (!has_future) { [18:01:42.118] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.118] info) [18:01:42.118] } [18:01:42.118] else { [18:01:42.118] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.118] info, version) [18:01:42.118] } [18:01:42.118] base::stop(msg) [18:01:42.118] } [18:01:42.118] }) [18:01:42.118] } [18:01:42.118] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.118] base::options(mc.cores = 1L) [18:01:42.118] } [18:01:42.118] options(future.plan = NULL) [18:01:42.118] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.118] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.118] } [18:01:42.118] ...future.workdir <- getwd() [18:01:42.118] } [18:01:42.118] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.118] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.118] } [18:01:42.118] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.118] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.118] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.118] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.118] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.118] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.118] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.118] base::names(...future.oldOptions)) [18:01:42.118] } [18:01:42.118] if (FALSE) { [18:01:42.118] } [18:01:42.118] else { [18:01:42.118] if (TRUE) { [18:01:42.118] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.118] open = "w") [18:01:42.118] } [18:01:42.118] else { [18:01:42.118] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.118] windows = "NUL", "/dev/null"), open = "w") [18:01:42.118] } [18:01:42.118] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.118] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.118] base::sink(type = "output", split = FALSE) [18:01:42.118] base::close(...future.stdout) [18:01:42.118] }, add = TRUE) [18:01:42.118] } [18:01:42.118] ...future.frame <- base::sys.nframe() [18:01:42.118] ...future.conditions <- base::list() [18:01:42.118] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.118] if (FALSE) { [18:01:42.118] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.118] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.118] } [18:01:42.118] ...future.result <- base::tryCatch({ [18:01:42.118] base::withCallingHandlers({ [18:01:42.118] ...future.value <- base::withVisible(base::local({ [18:01:42.118] ...future.makeSendCondition <- local({ [18:01:42.118] sendCondition <- NULL [18:01:42.118] function(frame = 1L) { [18:01:42.118] if (is.function(sendCondition)) [18:01:42.118] return(sendCondition) [18:01:42.118] ns <- getNamespace("parallel") [18:01:42.118] if (exists("sendData", mode = "function", [18:01:42.118] envir = ns)) { [18:01:42.118] parallel_sendData <- get("sendData", mode = "function", [18:01:42.118] envir = ns) [18:01:42.118] envir <- sys.frame(frame) [18:01:42.118] master <- NULL [18:01:42.118] while (!identical(envir, .GlobalEnv) && [18:01:42.118] !identical(envir, emptyenv())) { [18:01:42.118] if (exists("master", mode = "list", envir = envir, [18:01:42.118] inherits = FALSE)) { [18:01:42.118] master <- get("master", mode = "list", [18:01:42.118] envir = envir, inherits = FALSE) [18:01:42.118] if (inherits(master, c("SOCKnode", [18:01:42.118] "SOCK0node"))) { [18:01:42.118] sendCondition <<- function(cond) { [18:01:42.118] data <- list(type = "VALUE", value = cond, [18:01:42.118] success = TRUE) [18:01:42.118] parallel_sendData(master, data) [18:01:42.118] } [18:01:42.118] return(sendCondition) [18:01:42.118] } [18:01:42.118] } [18:01:42.118] frame <- frame + 1L [18:01:42.118] envir <- sys.frame(frame) [18:01:42.118] } [18:01:42.118] } [18:01:42.118] sendCondition <<- function(cond) NULL [18:01:42.118] } [18:01:42.118] }) [18:01:42.118] withCallingHandlers({ [18:01:42.118] NULL [18:01:42.118] }, immediateCondition = function(cond) { [18:01:42.118] sendCondition <- ...future.makeSendCondition() [18:01:42.118] sendCondition(cond) [18:01:42.118] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.118] { [18:01:42.118] inherits <- base::inherits [18:01:42.118] invokeRestart <- base::invokeRestart [18:01:42.118] is.null <- base::is.null [18:01:42.118] muffled <- FALSE [18:01:42.118] if (inherits(cond, "message")) { [18:01:42.118] muffled <- grepl(pattern, "muffleMessage") [18:01:42.118] if (muffled) [18:01:42.118] invokeRestart("muffleMessage") [18:01:42.118] } [18:01:42.118] else if (inherits(cond, "warning")) { [18:01:42.118] muffled <- grepl(pattern, "muffleWarning") [18:01:42.118] if (muffled) [18:01:42.118] invokeRestart("muffleWarning") [18:01:42.118] } [18:01:42.118] else if (inherits(cond, "condition")) { [18:01:42.118] if (!is.null(pattern)) { [18:01:42.118] computeRestarts <- base::computeRestarts [18:01:42.118] grepl <- base::grepl [18:01:42.118] restarts <- computeRestarts(cond) [18:01:42.118] for (restart in restarts) { [18:01:42.118] name <- restart$name [18:01:42.118] if (is.null(name)) [18:01:42.118] next [18:01:42.118] if (!grepl(pattern, name)) [18:01:42.118] next [18:01:42.118] invokeRestart(restart) [18:01:42.118] muffled <- TRUE [18:01:42.118] break [18:01:42.118] } [18:01:42.118] } [18:01:42.118] } [18:01:42.118] invisible(muffled) [18:01:42.118] } [18:01:42.118] muffleCondition(cond) [18:01:42.118] }) [18:01:42.118] })) [18:01:42.118] future::FutureResult(value = ...future.value$value, [18:01:42.118] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.118] ...future.rng), globalenv = if (FALSE) [18:01:42.118] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.118] ...future.globalenv.names)) [18:01:42.118] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.118] }, condition = base::local({ [18:01:42.118] c <- base::c [18:01:42.118] inherits <- base::inherits [18:01:42.118] invokeRestart <- base::invokeRestart [18:01:42.118] length <- base::length [18:01:42.118] list <- base::list [18:01:42.118] seq.int <- base::seq.int [18:01:42.118] signalCondition <- base::signalCondition [18:01:42.118] sys.calls <- base::sys.calls [18:01:42.118] `[[` <- base::`[[` [18:01:42.118] `+` <- base::`+` [18:01:42.118] `<<-` <- base::`<<-` [18:01:42.118] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.118] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.118] 3L)] [18:01:42.118] } [18:01:42.118] function(cond) { [18:01:42.118] is_error <- inherits(cond, "error") [18:01:42.118] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.118] NULL) [18:01:42.118] if (is_error) { [18:01:42.118] sessionInformation <- function() { [18:01:42.118] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.118] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.118] search = base::search(), system = base::Sys.info()) [18:01:42.118] } [18:01:42.118] ...future.conditions[[length(...future.conditions) + [18:01:42.118] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.118] cond$call), session = sessionInformation(), [18:01:42.118] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.118] signalCondition(cond) [18:01:42.118] } [18:01:42.118] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.118] "immediateCondition"))) { [18:01:42.118] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.118] ...future.conditions[[length(...future.conditions) + [18:01:42.118] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.118] if (TRUE && !signal) { [18:01:42.118] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.118] { [18:01:42.118] inherits <- base::inherits [18:01:42.118] invokeRestart <- base::invokeRestart [18:01:42.118] is.null <- base::is.null [18:01:42.118] muffled <- FALSE [18:01:42.118] if (inherits(cond, "message")) { [18:01:42.118] muffled <- grepl(pattern, "muffleMessage") [18:01:42.118] if (muffled) [18:01:42.118] invokeRestart("muffleMessage") [18:01:42.118] } [18:01:42.118] else if (inherits(cond, "warning")) { [18:01:42.118] muffled <- grepl(pattern, "muffleWarning") [18:01:42.118] if (muffled) [18:01:42.118] invokeRestart("muffleWarning") [18:01:42.118] } [18:01:42.118] else if (inherits(cond, "condition")) { [18:01:42.118] if (!is.null(pattern)) { [18:01:42.118] computeRestarts <- base::computeRestarts [18:01:42.118] grepl <- base::grepl [18:01:42.118] restarts <- computeRestarts(cond) [18:01:42.118] for (restart in restarts) { [18:01:42.118] name <- restart$name [18:01:42.118] if (is.null(name)) [18:01:42.118] next [18:01:42.118] if (!grepl(pattern, name)) [18:01:42.118] next [18:01:42.118] invokeRestart(restart) [18:01:42.118] muffled <- TRUE [18:01:42.118] break [18:01:42.118] } [18:01:42.118] } [18:01:42.118] } [18:01:42.118] invisible(muffled) [18:01:42.118] } [18:01:42.118] muffleCondition(cond, pattern = "^muffle") [18:01:42.118] } [18:01:42.118] } [18:01:42.118] else { [18:01:42.118] if (TRUE) { [18:01:42.118] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.118] { [18:01:42.118] inherits <- base::inherits [18:01:42.118] invokeRestart <- base::invokeRestart [18:01:42.118] is.null <- base::is.null [18:01:42.118] muffled <- FALSE [18:01:42.118] if (inherits(cond, "message")) { [18:01:42.118] muffled <- grepl(pattern, "muffleMessage") [18:01:42.118] if (muffled) [18:01:42.118] invokeRestart("muffleMessage") [18:01:42.118] } [18:01:42.118] else if (inherits(cond, "warning")) { [18:01:42.118] muffled <- grepl(pattern, "muffleWarning") [18:01:42.118] if (muffled) [18:01:42.118] invokeRestart("muffleWarning") [18:01:42.118] } [18:01:42.118] else if (inherits(cond, "condition")) { [18:01:42.118] if (!is.null(pattern)) { [18:01:42.118] computeRestarts <- base::computeRestarts [18:01:42.118] grepl <- base::grepl [18:01:42.118] restarts <- computeRestarts(cond) [18:01:42.118] for (restart in restarts) { [18:01:42.118] name <- restart$name [18:01:42.118] if (is.null(name)) [18:01:42.118] next [18:01:42.118] if (!grepl(pattern, name)) [18:01:42.118] next [18:01:42.118] invokeRestart(restart) [18:01:42.118] muffled <- TRUE [18:01:42.118] break [18:01:42.118] } [18:01:42.118] } [18:01:42.118] } [18:01:42.118] invisible(muffled) [18:01:42.118] } [18:01:42.118] muffleCondition(cond, pattern = "^muffle") [18:01:42.118] } [18:01:42.118] } [18:01:42.118] } [18:01:42.118] })) [18:01:42.118] }, error = function(ex) { [18:01:42.118] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.118] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.118] ...future.rng), started = ...future.startTime, [18:01:42.118] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.118] version = "1.8"), class = "FutureResult") [18:01:42.118] }, finally = { [18:01:42.118] if (!identical(...future.workdir, getwd())) [18:01:42.118] setwd(...future.workdir) [18:01:42.118] { [18:01:42.118] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.118] ...future.oldOptions$nwarnings <- NULL [18:01:42.118] } [18:01:42.118] base::options(...future.oldOptions) [18:01:42.118] if (.Platform$OS.type == "windows") { [18:01:42.118] old_names <- names(...future.oldEnvVars) [18:01:42.118] envs <- base::Sys.getenv() [18:01:42.118] names <- names(envs) [18:01:42.118] common <- intersect(names, old_names) [18:01:42.118] added <- setdiff(names, old_names) [18:01:42.118] removed <- setdiff(old_names, names) [18:01:42.118] changed <- common[...future.oldEnvVars[common] != [18:01:42.118] envs[common]] [18:01:42.118] NAMES <- toupper(changed) [18:01:42.118] args <- list() [18:01:42.118] for (kk in seq_along(NAMES)) { [18:01:42.118] name <- changed[[kk]] [18:01:42.118] NAME <- NAMES[[kk]] [18:01:42.118] if (name != NAME && is.element(NAME, old_names)) [18:01:42.118] next [18:01:42.118] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.118] } [18:01:42.118] NAMES <- toupper(added) [18:01:42.118] for (kk in seq_along(NAMES)) { [18:01:42.118] name <- added[[kk]] [18:01:42.118] NAME <- NAMES[[kk]] [18:01:42.118] if (name != NAME && is.element(NAME, old_names)) [18:01:42.118] next [18:01:42.118] args[[name]] <- "" [18:01:42.118] } [18:01:42.118] NAMES <- toupper(removed) [18:01:42.118] for (kk in seq_along(NAMES)) { [18:01:42.118] name <- removed[[kk]] [18:01:42.118] NAME <- NAMES[[kk]] [18:01:42.118] if (name != NAME && is.element(NAME, old_names)) [18:01:42.118] next [18:01:42.118] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.118] } [18:01:42.118] if (length(args) > 0) [18:01:42.118] base::do.call(base::Sys.setenv, args = args) [18:01:42.118] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.118] } [18:01:42.118] else { [18:01:42.118] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.118] } [18:01:42.118] { [18:01:42.118] if (base::length(...future.futureOptionsAdded) > [18:01:42.118] 0L) { [18:01:42.118] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.118] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.118] base::options(opts) [18:01:42.118] } [18:01:42.118] { [18:01:42.118] { [18:01:42.118] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.118] NULL [18:01:42.118] } [18:01:42.118] options(future.plan = NULL) [18:01:42.118] if (is.na(NA_character_)) [18:01:42.118] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.118] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.118] future::plan(list(function (..., workers = availableCores(), [18:01:42.118] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.118] envir = parent.frame()) [18:01:42.118] { [18:01:42.118] if (is.function(workers)) [18:01:42.118] workers <- workers() [18:01:42.118] workers <- structure(as.integer(workers), [18:01:42.118] class = class(workers)) [18:01:42.118] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.118] workers >= 1) [18:01:42.118] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.118] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.118] } [18:01:42.118] future <- MultisessionFuture(..., workers = workers, [18:01:42.118] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.118] envir = envir) [18:01:42.118] if (!future$lazy) [18:01:42.118] future <- run(future) [18:01:42.118] invisible(future) [18:01:42.118] }), .cleanup = FALSE, .init = FALSE) [18:01:42.118] } [18:01:42.118] } [18:01:42.118] } [18:01:42.118] }) [18:01:42.118] if (TRUE) { [18:01:42.118] base::sink(type = "output", split = FALSE) [18:01:42.118] if (TRUE) { [18:01:42.118] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.118] } [18:01:42.118] else { [18:01:42.118] ...future.result["stdout"] <- base::list(NULL) [18:01:42.118] } [18:01:42.118] base::close(...future.stdout) [18:01:42.118] ...future.stdout <- NULL [18:01:42.118] } [18:01:42.118] ...future.result$conditions <- ...future.conditions [18:01:42.118] ...future.result$finished <- base::Sys.time() [18:01:42.118] ...future.result [18:01:42.118] } [18:01:42.123] MultisessionFuture started [18:01:42.123] - Launch lazy future ... done [18:01:42.124] run() for 'MultisessionFuture' ... done [18:01:42.124] getGlobalsAndPackages() ... [18:01:42.124] Searching for globals... [18:01:42.125] - globals found: [1] '{' [18:01:42.125] Searching for globals ... DONE [18:01:42.125] Resolving globals: FALSE [18:01:42.126] [18:01:42.126] [18:01:42.126] getGlobalsAndPackages() ... DONE [18:01:42.126] run() for 'Future' ... [18:01:42.127] - state: 'created' [18:01:42.127] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.140] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.140] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.141] - Field: 'node' [18:01:42.141] - Field: 'label' [18:01:42.141] - Field: 'local' [18:01:42.141] - Field: 'owner' [18:01:42.141] - Field: 'envir' [18:01:42.142] - Field: 'workers' [18:01:42.142] - Field: 'packages' [18:01:42.142] - Field: 'gc' [18:01:42.142] - Field: 'conditions' [18:01:42.142] - Field: 'persistent' [18:01:42.143] - Field: 'expr' [18:01:42.143] - Field: 'uuid' [18:01:42.143] - Field: 'seed' [18:01:42.143] - Field: 'version' [18:01:42.143] - Field: 'result' [18:01:42.143] - Field: 'asynchronous' [18:01:42.144] - Field: 'calls' [18:01:42.144] - Field: 'globals' [18:01:42.144] - Field: 'stdout' [18:01:42.144] - Field: 'earlySignal' [18:01:42.144] - Field: 'lazy' [18:01:42.144] - Field: 'state' [18:01:42.145] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.145] - Launch lazy future ... [18:01:42.145] Packages needed by the future expression (n = 0): [18:01:42.145] Packages needed by future strategies (n = 0): [18:01:42.146] { [18:01:42.146] { [18:01:42.146] { [18:01:42.146] ...future.startTime <- base::Sys.time() [18:01:42.146] { [18:01:42.146] { [18:01:42.146] { [18:01:42.146] { [18:01:42.146] base::local({ [18:01:42.146] has_future <- base::requireNamespace("future", [18:01:42.146] quietly = TRUE) [18:01:42.146] if (has_future) { [18:01:42.146] ns <- base::getNamespace("future") [18:01:42.146] version <- ns[[".package"]][["version"]] [18:01:42.146] if (is.null(version)) [18:01:42.146] version <- utils::packageVersion("future") [18:01:42.146] } [18:01:42.146] else { [18:01:42.146] version <- NULL [18:01:42.146] } [18:01:42.146] if (!has_future || version < "1.8.0") { [18:01:42.146] info <- base::c(r_version = base::gsub("R version ", [18:01:42.146] "", base::R.version$version.string), [18:01:42.146] platform = base::sprintf("%s (%s-bit)", [18:01:42.146] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.146] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.146] "release", "version")], collapse = " "), [18:01:42.146] hostname = base::Sys.info()[["nodename"]]) [18:01:42.146] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.146] info) [18:01:42.146] info <- base::paste(info, collapse = "; ") [18:01:42.146] if (!has_future) { [18:01:42.146] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.146] info) [18:01:42.146] } [18:01:42.146] else { [18:01:42.146] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.146] info, version) [18:01:42.146] } [18:01:42.146] base::stop(msg) [18:01:42.146] } [18:01:42.146] }) [18:01:42.146] } [18:01:42.146] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.146] base::options(mc.cores = 1L) [18:01:42.146] } [18:01:42.146] options(future.plan = NULL) [18:01:42.146] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.146] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.146] } [18:01:42.146] ...future.workdir <- getwd() [18:01:42.146] } [18:01:42.146] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.146] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.146] } [18:01:42.146] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.146] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.146] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.146] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.146] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.146] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.146] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.146] base::names(...future.oldOptions)) [18:01:42.146] } [18:01:42.146] if (FALSE) { [18:01:42.146] } [18:01:42.146] else { [18:01:42.146] if (TRUE) { [18:01:42.146] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.146] open = "w") [18:01:42.146] } [18:01:42.146] else { [18:01:42.146] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.146] windows = "NUL", "/dev/null"), open = "w") [18:01:42.146] } [18:01:42.146] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.146] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.146] base::sink(type = "output", split = FALSE) [18:01:42.146] base::close(...future.stdout) [18:01:42.146] }, add = TRUE) [18:01:42.146] } [18:01:42.146] ...future.frame <- base::sys.nframe() [18:01:42.146] ...future.conditions <- base::list() [18:01:42.146] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.146] if (FALSE) { [18:01:42.146] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.146] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.146] } [18:01:42.146] ...future.result <- base::tryCatch({ [18:01:42.146] base::withCallingHandlers({ [18:01:42.146] ...future.value <- base::withVisible(base::local({ [18:01:42.146] ...future.makeSendCondition <- local({ [18:01:42.146] sendCondition <- NULL [18:01:42.146] function(frame = 1L) { [18:01:42.146] if (is.function(sendCondition)) [18:01:42.146] return(sendCondition) [18:01:42.146] ns <- getNamespace("parallel") [18:01:42.146] if (exists("sendData", mode = "function", [18:01:42.146] envir = ns)) { [18:01:42.146] parallel_sendData <- get("sendData", mode = "function", [18:01:42.146] envir = ns) [18:01:42.146] envir <- sys.frame(frame) [18:01:42.146] master <- NULL [18:01:42.146] while (!identical(envir, .GlobalEnv) && [18:01:42.146] !identical(envir, emptyenv())) { [18:01:42.146] if (exists("master", mode = "list", envir = envir, [18:01:42.146] inherits = FALSE)) { [18:01:42.146] master <- get("master", mode = "list", [18:01:42.146] envir = envir, inherits = FALSE) [18:01:42.146] if (inherits(master, c("SOCKnode", [18:01:42.146] "SOCK0node"))) { [18:01:42.146] sendCondition <<- function(cond) { [18:01:42.146] data <- list(type = "VALUE", value = cond, [18:01:42.146] success = TRUE) [18:01:42.146] parallel_sendData(master, data) [18:01:42.146] } [18:01:42.146] return(sendCondition) [18:01:42.146] } [18:01:42.146] } [18:01:42.146] frame <- frame + 1L [18:01:42.146] envir <- sys.frame(frame) [18:01:42.146] } [18:01:42.146] } [18:01:42.146] sendCondition <<- function(cond) NULL [18:01:42.146] } [18:01:42.146] }) [18:01:42.146] withCallingHandlers({ [18:01:42.146] { [18:01:42.146] 4 [18:01:42.146] } [18:01:42.146] }, immediateCondition = function(cond) { [18:01:42.146] sendCondition <- ...future.makeSendCondition() [18:01:42.146] sendCondition(cond) [18:01:42.146] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.146] { [18:01:42.146] inherits <- base::inherits [18:01:42.146] invokeRestart <- base::invokeRestart [18:01:42.146] is.null <- base::is.null [18:01:42.146] muffled <- FALSE [18:01:42.146] if (inherits(cond, "message")) { [18:01:42.146] muffled <- grepl(pattern, "muffleMessage") [18:01:42.146] if (muffled) [18:01:42.146] invokeRestart("muffleMessage") [18:01:42.146] } [18:01:42.146] else if (inherits(cond, "warning")) { [18:01:42.146] muffled <- grepl(pattern, "muffleWarning") [18:01:42.146] if (muffled) [18:01:42.146] invokeRestart("muffleWarning") [18:01:42.146] } [18:01:42.146] else if (inherits(cond, "condition")) { [18:01:42.146] if (!is.null(pattern)) { [18:01:42.146] computeRestarts <- base::computeRestarts [18:01:42.146] grepl <- base::grepl [18:01:42.146] restarts <- computeRestarts(cond) [18:01:42.146] for (restart in restarts) { [18:01:42.146] name <- restart$name [18:01:42.146] if (is.null(name)) [18:01:42.146] next [18:01:42.146] if (!grepl(pattern, name)) [18:01:42.146] next [18:01:42.146] invokeRestart(restart) [18:01:42.146] muffled <- TRUE [18:01:42.146] break [18:01:42.146] } [18:01:42.146] } [18:01:42.146] } [18:01:42.146] invisible(muffled) [18:01:42.146] } [18:01:42.146] muffleCondition(cond) [18:01:42.146] }) [18:01:42.146] })) [18:01:42.146] future::FutureResult(value = ...future.value$value, [18:01:42.146] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.146] ...future.rng), globalenv = if (FALSE) [18:01:42.146] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.146] ...future.globalenv.names)) [18:01:42.146] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.146] }, condition = base::local({ [18:01:42.146] c <- base::c [18:01:42.146] inherits <- base::inherits [18:01:42.146] invokeRestart <- base::invokeRestart [18:01:42.146] length <- base::length [18:01:42.146] list <- base::list [18:01:42.146] seq.int <- base::seq.int [18:01:42.146] signalCondition <- base::signalCondition [18:01:42.146] sys.calls <- base::sys.calls [18:01:42.146] `[[` <- base::`[[` [18:01:42.146] `+` <- base::`+` [18:01:42.146] `<<-` <- base::`<<-` [18:01:42.146] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.146] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.146] 3L)] [18:01:42.146] } [18:01:42.146] function(cond) { [18:01:42.146] is_error <- inherits(cond, "error") [18:01:42.146] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.146] NULL) [18:01:42.146] if (is_error) { [18:01:42.146] sessionInformation <- function() { [18:01:42.146] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.146] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.146] search = base::search(), system = base::Sys.info()) [18:01:42.146] } [18:01:42.146] ...future.conditions[[length(...future.conditions) + [18:01:42.146] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.146] cond$call), session = sessionInformation(), [18:01:42.146] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.146] signalCondition(cond) [18:01:42.146] } [18:01:42.146] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.146] "immediateCondition"))) { [18:01:42.146] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.146] ...future.conditions[[length(...future.conditions) + [18:01:42.146] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.146] if (TRUE && !signal) { [18:01:42.146] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.146] { [18:01:42.146] inherits <- base::inherits [18:01:42.146] invokeRestart <- base::invokeRestart [18:01:42.146] is.null <- base::is.null [18:01:42.146] muffled <- FALSE [18:01:42.146] if (inherits(cond, "message")) { [18:01:42.146] muffled <- grepl(pattern, "muffleMessage") [18:01:42.146] if (muffled) [18:01:42.146] invokeRestart("muffleMessage") [18:01:42.146] } [18:01:42.146] else if (inherits(cond, "warning")) { [18:01:42.146] muffled <- grepl(pattern, "muffleWarning") [18:01:42.146] if (muffled) [18:01:42.146] invokeRestart("muffleWarning") [18:01:42.146] } [18:01:42.146] else if (inherits(cond, "condition")) { [18:01:42.146] if (!is.null(pattern)) { [18:01:42.146] computeRestarts <- base::computeRestarts [18:01:42.146] grepl <- base::grepl [18:01:42.146] restarts <- computeRestarts(cond) [18:01:42.146] for (restart in restarts) { [18:01:42.146] name <- restart$name [18:01:42.146] if (is.null(name)) [18:01:42.146] next [18:01:42.146] if (!grepl(pattern, name)) [18:01:42.146] next [18:01:42.146] invokeRestart(restart) [18:01:42.146] muffled <- TRUE [18:01:42.146] break [18:01:42.146] } [18:01:42.146] } [18:01:42.146] } [18:01:42.146] invisible(muffled) [18:01:42.146] } [18:01:42.146] muffleCondition(cond, pattern = "^muffle") [18:01:42.146] } [18:01:42.146] } [18:01:42.146] else { [18:01:42.146] if (TRUE) { [18:01:42.146] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.146] { [18:01:42.146] inherits <- base::inherits [18:01:42.146] invokeRestart <- base::invokeRestart [18:01:42.146] is.null <- base::is.null [18:01:42.146] muffled <- FALSE [18:01:42.146] if (inherits(cond, "message")) { [18:01:42.146] muffled <- grepl(pattern, "muffleMessage") [18:01:42.146] if (muffled) [18:01:42.146] invokeRestart("muffleMessage") [18:01:42.146] } [18:01:42.146] else if (inherits(cond, "warning")) { [18:01:42.146] muffled <- grepl(pattern, "muffleWarning") [18:01:42.146] if (muffled) [18:01:42.146] invokeRestart("muffleWarning") [18:01:42.146] } [18:01:42.146] else if (inherits(cond, "condition")) { [18:01:42.146] if (!is.null(pattern)) { [18:01:42.146] computeRestarts <- base::computeRestarts [18:01:42.146] grepl <- base::grepl [18:01:42.146] restarts <- computeRestarts(cond) [18:01:42.146] for (restart in restarts) { [18:01:42.146] name <- restart$name [18:01:42.146] if (is.null(name)) [18:01:42.146] next [18:01:42.146] if (!grepl(pattern, name)) [18:01:42.146] next [18:01:42.146] invokeRestart(restart) [18:01:42.146] muffled <- TRUE [18:01:42.146] break [18:01:42.146] } [18:01:42.146] } [18:01:42.146] } [18:01:42.146] invisible(muffled) [18:01:42.146] } [18:01:42.146] muffleCondition(cond, pattern = "^muffle") [18:01:42.146] } [18:01:42.146] } [18:01:42.146] } [18:01:42.146] })) [18:01:42.146] }, error = function(ex) { [18:01:42.146] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.146] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.146] ...future.rng), started = ...future.startTime, [18:01:42.146] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.146] version = "1.8"), class = "FutureResult") [18:01:42.146] }, finally = { [18:01:42.146] if (!identical(...future.workdir, getwd())) [18:01:42.146] setwd(...future.workdir) [18:01:42.146] { [18:01:42.146] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.146] ...future.oldOptions$nwarnings <- NULL [18:01:42.146] } [18:01:42.146] base::options(...future.oldOptions) [18:01:42.146] if (.Platform$OS.type == "windows") { [18:01:42.146] old_names <- names(...future.oldEnvVars) [18:01:42.146] envs <- base::Sys.getenv() [18:01:42.146] names <- names(envs) [18:01:42.146] common <- intersect(names, old_names) [18:01:42.146] added <- setdiff(names, old_names) [18:01:42.146] removed <- setdiff(old_names, names) [18:01:42.146] changed <- common[...future.oldEnvVars[common] != [18:01:42.146] envs[common]] [18:01:42.146] NAMES <- toupper(changed) [18:01:42.146] args <- list() [18:01:42.146] for (kk in seq_along(NAMES)) { [18:01:42.146] name <- changed[[kk]] [18:01:42.146] NAME <- NAMES[[kk]] [18:01:42.146] if (name != NAME && is.element(NAME, old_names)) [18:01:42.146] next [18:01:42.146] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.146] } [18:01:42.146] NAMES <- toupper(added) [18:01:42.146] for (kk in seq_along(NAMES)) { [18:01:42.146] name <- added[[kk]] [18:01:42.146] NAME <- NAMES[[kk]] [18:01:42.146] if (name != NAME && is.element(NAME, old_names)) [18:01:42.146] next [18:01:42.146] args[[name]] <- "" [18:01:42.146] } [18:01:42.146] NAMES <- toupper(removed) [18:01:42.146] for (kk in seq_along(NAMES)) { [18:01:42.146] name <- removed[[kk]] [18:01:42.146] NAME <- NAMES[[kk]] [18:01:42.146] if (name != NAME && is.element(NAME, old_names)) [18:01:42.146] next [18:01:42.146] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.146] } [18:01:42.146] if (length(args) > 0) [18:01:42.146] base::do.call(base::Sys.setenv, args = args) [18:01:42.146] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.146] } [18:01:42.146] else { [18:01:42.146] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.146] } [18:01:42.146] { [18:01:42.146] if (base::length(...future.futureOptionsAdded) > [18:01:42.146] 0L) { [18:01:42.146] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.146] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.146] base::options(opts) [18:01:42.146] } [18:01:42.146] { [18:01:42.146] { [18:01:42.146] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.146] NULL [18:01:42.146] } [18:01:42.146] options(future.plan = NULL) [18:01:42.146] if (is.na(NA_character_)) [18:01:42.146] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.146] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.146] future::plan(list(function (..., workers = availableCores(), [18:01:42.146] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.146] envir = parent.frame()) [18:01:42.146] { [18:01:42.146] if (is.function(workers)) [18:01:42.146] workers <- workers() [18:01:42.146] workers <- structure(as.integer(workers), [18:01:42.146] class = class(workers)) [18:01:42.146] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.146] workers >= 1) [18:01:42.146] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.146] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.146] } [18:01:42.146] future <- MultisessionFuture(..., workers = workers, [18:01:42.146] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.146] envir = envir) [18:01:42.146] if (!future$lazy) [18:01:42.146] future <- run(future) [18:01:42.146] invisible(future) [18:01:42.146] }), .cleanup = FALSE, .init = FALSE) [18:01:42.146] } [18:01:42.146] } [18:01:42.146] } [18:01:42.146] }) [18:01:42.146] if (TRUE) { [18:01:42.146] base::sink(type = "output", split = FALSE) [18:01:42.146] if (TRUE) { [18:01:42.146] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.146] } [18:01:42.146] else { [18:01:42.146] ...future.result["stdout"] <- base::list(NULL) [18:01:42.146] } [18:01:42.146] base::close(...future.stdout) [18:01:42.146] ...future.stdout <- NULL [18:01:42.146] } [18:01:42.146] ...future.result$conditions <- ...future.conditions [18:01:42.146] ...future.result$finished <- base::Sys.time() [18:01:42.146] ...future.result [18:01:42.146] } [18:01:42.151] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:42.173] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.174] - Validating connection of MultisessionFuture [18:01:42.174] - received message: FutureResult [18:01:42.174] - Received FutureResult [18:01:42.174] - Erased future from FutureRegistry [18:01:42.174] result() for ClusterFuture ... [18:01:42.175] - result already collected: FutureResult [18:01:42.175] result() for ClusterFuture ... done [18:01:42.175] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.175] result() for ClusterFuture ... [18:01:42.175] - result already collected: FutureResult [18:01:42.175] result() for ClusterFuture ... done [18:01:42.175] result() for ClusterFuture ... [18:01:42.176] - result already collected: FutureResult [18:01:42.176] result() for ClusterFuture ... done [18:01:42.177] MultisessionFuture started [18:01:42.177] - Launch lazy future ... done [18:01:42.177] run() for 'MultisessionFuture' ... done [18:01:42.179] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.179] - Validating connection of MultisessionFuture [18:01:42.180] - received message: FutureResult [18:01:42.180] - Received FutureResult [18:01:42.180] - Erased future from FutureRegistry [18:01:42.180] result() for ClusterFuture ... [18:01:42.180] - result already collected: FutureResult [18:01:42.180] result() for ClusterFuture ... done [18:01:42.181] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.196] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.196] - Validating connection of MultisessionFuture [18:01:42.196] - received message: FutureResult [18:01:42.196] - Received FutureResult [18:01:42.196] - Erased future from FutureRegistry [18:01:42.197] result() for ClusterFuture ... [18:01:42.197] - result already collected: FutureResult [18:01:42.197] result() for ClusterFuture ... done [18:01:42.197] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:4] TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:4] "a" "b" "c" "d" [18:01:42.199] resolve() on environment ... [18:01:42.199] recursive: 0 [18:01:42.199] elements: [4] 'a', 'b', 'c', 'd' [18:01:42.200] signalConditionsASAP(numeric, pos=1) ... [18:01:42.200] - nx: 4 [18:01:42.200] - relay: TRUE [18:01:42.200] - stdout: TRUE [18:01:42.200] - signal: TRUE [18:01:42.200] - resignal: FALSE [18:01:42.201] - force: TRUE [18:01:42.201] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.201] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.201] - until=2 [18:01:42.201] - relaying element #2 [18:01:42.201] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:42.201] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.202] signalConditionsASAP(NULL, pos=1) ... done [18:01:42.202] length: 3 (resolved future 1) [18:01:42.202] Future #2 [18:01:42.202] result() for ClusterFuture ... [18:01:42.202] - result already collected: FutureResult [18:01:42.203] result() for ClusterFuture ... done [18:01:42.203] result() for ClusterFuture ... [18:01:42.203] - result already collected: FutureResult [18:01:42.203] result() for ClusterFuture ... done [18:01:42.203] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:42.203] - nx: 4 [18:01:42.203] - relay: TRUE [18:01:42.204] - stdout: TRUE [18:01:42.204] - signal: TRUE [18:01:42.204] - resignal: FALSE [18:01:42.204] - force: TRUE [18:01:42.204] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:01:42.204] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:01:42.205] - until=2 [18:01:42.205] - relaying element #2 [18:01:42.205] result() for ClusterFuture ... [18:01:42.205] - result already collected: FutureResult [18:01:42.205] result() for ClusterFuture ... done [18:01:42.205] result() for ClusterFuture ... [18:01:42.206] - result already collected: FutureResult [18:01:42.206] result() for ClusterFuture ... done [18:01:42.206] result() for ClusterFuture ... [18:01:42.206] - result already collected: FutureResult [18:01:42.206] result() for ClusterFuture ... done [18:01:42.206] result() for ClusterFuture ... [18:01:42.207] - result already collected: FutureResult [18:01:42.207] result() for ClusterFuture ... done [18:01:42.207] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:42.207] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:42.207] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:42.207] length: 2 (resolved future 2) [18:01:42.208] Future #3 [18:01:42.208] result() for ClusterFuture ... [18:01:42.208] - result already collected: FutureResult [18:01:42.208] result() for ClusterFuture ... done [18:01:42.208] result() for ClusterFuture ... [18:01:42.208] - result already collected: FutureResult [18:01:42.208] result() for ClusterFuture ... done [18:01:42.209] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:42.209] - nx: 4 [18:01:42.209] - relay: TRUE [18:01:42.209] - stdout: TRUE [18:01:42.209] - signal: TRUE [18:01:42.209] - resignal: FALSE [18:01:42.210] - force: TRUE [18:01:42.210] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:01:42.210] - queued futures: [n=4] FALSE, TRUE, FALSE, FALSE [18:01:42.210] - until=3 [18:01:42.210] - relaying element #3 [18:01:42.210] result() for ClusterFuture ... [18:01:42.211] - result already collected: FutureResult [18:01:42.211] result() for ClusterFuture ... done [18:01:42.211] result() for ClusterFuture ... [18:01:42.211] - result already collected: FutureResult [18:01:42.211] result() for ClusterFuture ... done [18:01:42.211] result() for ClusterFuture ... [18:01:42.212] - result already collected: FutureResult [18:01:42.212] result() for ClusterFuture ... done [18:01:42.212] result() for ClusterFuture ... [18:01:42.212] - result already collected: FutureResult [18:01:42.212] result() for ClusterFuture ... done [18:01:42.212] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:42.212] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:42.213] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:42.213] length: 1 (resolved future 3) [18:01:42.213] Future #4 [18:01:42.213] result() for ClusterFuture ... [18:01:42.213] - result already collected: FutureResult [18:01:42.213] result() for ClusterFuture ... done [18:01:42.214] result() for ClusterFuture ... [18:01:42.214] - result already collected: FutureResult [18:01:42.214] result() for ClusterFuture ... done [18:01:42.214] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:42.214] - nx: 4 [18:01:42.214] - relay: TRUE [18:01:42.215] - stdout: TRUE [18:01:42.215] - signal: TRUE [18:01:42.215] - resignal: FALSE [18:01:42.215] - force: TRUE [18:01:42.215] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:01:42.215] - queued futures: [n=4] FALSE, TRUE, TRUE, FALSE [18:01:42.215] - until=4 [18:01:42.216] - relaying element #4 [18:01:42.216] result() for ClusterFuture ... [18:01:42.216] - result already collected: FutureResult [18:01:42.216] result() for ClusterFuture ... done [18:01:42.216] result() for ClusterFuture ... [18:01:42.216] - result already collected: FutureResult [18:01:42.217] result() for ClusterFuture ... done [18:01:42.217] result() for ClusterFuture ... [18:01:42.217] - result already collected: FutureResult [18:01:42.217] result() for ClusterFuture ... done [18:01:42.217] result() for ClusterFuture ... [18:01:42.217] - result already collected: FutureResult [18:01:42.218] result() for ClusterFuture ... done [18:01:42.218] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:42.218] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:42.218] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:42.218] length: 0 (resolved future 4) [18:01:42.218] Relaying remaining futures [18:01:42.219] signalConditionsASAP(NULL, pos=0) ... [18:01:42.219] - nx: 4 [18:01:42.219] - relay: TRUE [18:01:42.219] - stdout: TRUE [18:01:42.219] - signal: TRUE [18:01:42.219] - resignal: FALSE [18:01:42.219] - force: TRUE [18:01:42.220] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:42.220] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE - flush all [18:01:42.220] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:01:42.220] - queued futures: [n=4] FALSE, TRUE, TRUE, TRUE [18:01:42.220] signalConditionsASAP(NULL, pos=0) ... done [18:01:42.221] resolve() on environment ... DONE [18:01:42.221] result() for ClusterFuture ... [18:01:42.221] - result already collected: FutureResult [18:01:42.221] result() for ClusterFuture ... done [18:01:42.221] result() for ClusterFuture ... [18:01:42.221] - result already collected: FutureResult [18:01:42.222] result() for ClusterFuture ... done [18:01:42.222] result() for ClusterFuture ... [18:01:42.222] - result already collected: FutureResult [18:01:42.222] result() for ClusterFuture ... done [18:01:42.222] result() for ClusterFuture ... [18:01:42.222] - result already collected: FutureResult [18:01:42.223] result() for ClusterFuture ... done [18:01:42.223] result() for ClusterFuture ... [18:01:42.223] - result already collected: FutureResult [18:01:42.223] result() for ClusterFuture ... done [18:01:42.223] result() for ClusterFuture ... [18:01:42.223] - result already collected: FutureResult [18:01:42.223] result() for ClusterFuture ... done *** futures() - environment ... DONE Type of object: listenv Type of future: multisession [18:01:42.224] plan(): Setting new future strategy stack: [18:01:42.224] List of future strategies: [18:01:42.224] 1. multisession: [18:01:42.224] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:42.224] - tweaked: FALSE [18:01:42.224] - call: plan(strategy) [18:01:42.225] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:01:42.225] multisession: [18:01:42.225] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:42.225] - tweaked: FALSE [18:01:42.225] - call: plan(strategy) [18:01:42.228] getGlobalsAndPackages() ... [18:01:42.228] Not searching for globals [18:01:42.229] - globals: [0] [18:01:42.229] getGlobalsAndPackages() ... DONE [18:01:42.229] [local output] makeClusterPSOCK() ... [18:01:42.229] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:01:42.232] [local output] Base port: 30781 [18:01:42.233] [local output] Getting setup options for 2 cluster nodes ... [18:01:42.233] [local output] - Node 1 of 2 ... [18:01:42.233] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:42.235] [local output] Rscript port: 30781 [18:01:42.235] [local output] - Node 2 of 2 ... [18:01:42.236] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:42.237] [local output] Rscript port: 30781 [18:01:42.238] [local output] Getting setup options for 2 cluster nodes ... done [18:01:42.238] [local output] - Parallel setup requested for some PSOCK nodes [18:01:42.238] [local output] Setting up PSOCK nodes in parallel [18:01:42.238] List of 36 [18:01:42.238] $ worker : chr "localhost" [18:01:42.238] ..- attr(*, "localhost")= logi TRUE [18:01:42.238] $ master : chr "localhost" [18:01:42.238] $ port : int 30781 [18:01:42.238] $ connectTimeout : num 120 [18:01:42.238] $ timeout : num 120 [18:01:42.238] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:01:42.238] $ homogeneous : logi TRUE [18:01:42.238] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=futures.R:202876:CRANWIN3:CRAN\""| __truncated__ [18:01:42.238] $ rscript_envs : NULL [18:01:42.238] $ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:42.238] $ rscript_startup : NULL [18:01:42.238] $ rscript_sh : chr "cmd" [18:01:42.238] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:42.238] $ methods : logi TRUE [18:01:42.238] $ socketOptions : chr "no-delay" [18:01:42.238] $ useXDR : logi FALSE [18:01:42.238] $ outfile : chr "/dev/null" [18:01:42.238] $ renice : int NA [18:01:42.238] $ rshcmd : NULL [18:01:42.238] $ user : chr(0) [18:01:42.238] $ revtunnel : logi FALSE [18:01:42.238] $ rshlogfile : NULL [18:01:42.238] $ rshopts : chr(0) [18:01:42.238] $ rank : int 1 [18:01:42.238] $ manual : logi FALSE [18:01:42.238] $ dryrun : logi FALSE [18:01:42.238] $ quiet : logi FALSE [18:01:42.238] $ setup_strategy : chr "parallel" [18:01:42.238] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:42.238] $ pidfile : chr "D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187c6a604d84.pid" [18:01:42.238] $ rshcmd_label : NULL [18:01:42.238] $ rsh_call : NULL [18:01:42.238] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:42.238] $ localMachine : logi TRUE [18:01:42.238] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:01:42.238] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:01:42.238] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:01:42.238] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:01:42.238] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:01:42.238] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [18:01:42.238] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:01:42.238] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:01:42.238] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:01:42.238] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:01:42.238] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:01:42.238] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:01:42.238] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:01:42.238] $ arguments :List of 28 [18:01:42.238] ..$ worker : chr "localhost" [18:01:42.238] ..$ master : NULL [18:01:42.238] ..$ port : int 30781 [18:01:42.238] ..$ connectTimeout : num 120 [18:01:42.238] ..$ timeout : num 120 [18:01:42.238] ..$ rscript : NULL [18:01:42.238] ..$ homogeneous : NULL [18:01:42.238] ..$ rscript_args : NULL [18:01:42.238] ..$ rscript_envs : NULL [18:01:42.238] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:42.238] ..$ rscript_startup : NULL [18:01:42.238] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [18:01:42.238] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:42.238] ..$ methods : logi TRUE [18:01:42.238] ..$ socketOptions : chr "no-delay" [18:01:42.238] ..$ useXDR : logi FALSE [18:01:42.238] ..$ outfile : chr "/dev/null" [18:01:42.238] ..$ renice : int NA [18:01:42.238] ..$ rshcmd : NULL [18:01:42.238] ..$ user : NULL [18:01:42.238] ..$ revtunnel : logi NA [18:01:42.238] ..$ rshlogfile : NULL [18:01:42.238] ..$ rshopts : NULL [18:01:42.238] ..$ rank : int 1 [18:01:42.238] ..$ manual : logi FALSE [18:01:42.238] ..$ dryrun : logi FALSE [18:01:42.238] ..$ quiet : logi FALSE [18:01:42.238] ..$ setup_strategy : chr "parallel" [18:01:42.238] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:01:42.262] [local output] System call to launch all workers: [18:01:42.263] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=futures.R:202876:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmpczr1tT/worker.rank=1.parallelly.parent=202876.3187c6a604d84.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=30781 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:01:42.263] [local output] Starting PSOCK main server [18:01:42.271] [local output] Workers launched [18:01:42.271] [local output] Waiting for workers to connect back [18:01:42.272] - [local output] 0 workers out of 2 ready [18:01:42.441] - [local output] 0 workers out of 2 ready [18:01:42.442] - [local output] 1 workers out of 2 ready [18:01:42.442] - [local output] 2 workers out of 2 ready [18:01:42.443] [local output] Launching of workers completed [18:01:42.443] [local output] Collecting session information from workers [18:01:42.443] [local output] - Worker #1 of 2 [18:01:42.444] [local output] - Worker #2 of 2 [18:01:42.444] [local output] makeClusterPSOCK() ... done [18:01:42.458] Packages needed by the future expression (n = 0): [18:01:42.458] Packages needed by future strategies (n = 0): [18:01:42.458] { [18:01:42.458] { [18:01:42.458] { [18:01:42.458] ...future.startTime <- base::Sys.time() [18:01:42.458] { [18:01:42.458] { [18:01:42.458] { [18:01:42.458] { [18:01:42.458] base::local({ [18:01:42.458] has_future <- base::requireNamespace("future", [18:01:42.458] quietly = TRUE) [18:01:42.458] if (has_future) { [18:01:42.458] ns <- base::getNamespace("future") [18:01:42.458] version <- ns[[".package"]][["version"]] [18:01:42.458] if (is.null(version)) [18:01:42.458] version <- utils::packageVersion("future") [18:01:42.458] } [18:01:42.458] else { [18:01:42.458] version <- NULL [18:01:42.458] } [18:01:42.458] if (!has_future || version < "1.8.0") { [18:01:42.458] info <- base::c(r_version = base::gsub("R version ", [18:01:42.458] "", base::R.version$version.string), [18:01:42.458] platform = base::sprintf("%s (%s-bit)", [18:01:42.458] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.458] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.458] "release", "version")], collapse = " "), [18:01:42.458] hostname = base::Sys.info()[["nodename"]]) [18:01:42.458] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.458] info) [18:01:42.458] info <- base::paste(info, collapse = "; ") [18:01:42.458] if (!has_future) { [18:01:42.458] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.458] info) [18:01:42.458] } [18:01:42.458] else { [18:01:42.458] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.458] info, version) [18:01:42.458] } [18:01:42.458] base::stop(msg) [18:01:42.458] } [18:01:42.458] }) [18:01:42.458] } [18:01:42.458] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.458] base::options(mc.cores = 1L) [18:01:42.458] } [18:01:42.458] options(future.plan = NULL) [18:01:42.458] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.458] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.458] } [18:01:42.458] ...future.workdir <- getwd() [18:01:42.458] } [18:01:42.458] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.458] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.458] } [18:01:42.458] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.458] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.458] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.458] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.458] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.458] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.458] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.458] base::names(...future.oldOptions)) [18:01:42.458] } [18:01:42.458] if (FALSE) { [18:01:42.458] } [18:01:42.458] else { [18:01:42.458] if (TRUE) { [18:01:42.458] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.458] open = "w") [18:01:42.458] } [18:01:42.458] else { [18:01:42.458] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.458] windows = "NUL", "/dev/null"), open = "w") [18:01:42.458] } [18:01:42.458] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.458] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.458] base::sink(type = "output", split = FALSE) [18:01:42.458] base::close(...future.stdout) [18:01:42.458] }, add = TRUE) [18:01:42.458] } [18:01:42.458] ...future.frame <- base::sys.nframe() [18:01:42.458] ...future.conditions <- base::list() [18:01:42.458] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.458] if (FALSE) { [18:01:42.458] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.458] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.458] } [18:01:42.458] ...future.result <- base::tryCatch({ [18:01:42.458] base::withCallingHandlers({ [18:01:42.458] ...future.value <- base::withVisible(base::local({ [18:01:42.458] ...future.makeSendCondition <- local({ [18:01:42.458] sendCondition <- NULL [18:01:42.458] function(frame = 1L) { [18:01:42.458] if (is.function(sendCondition)) [18:01:42.458] return(sendCondition) [18:01:42.458] ns <- getNamespace("parallel") [18:01:42.458] if (exists("sendData", mode = "function", [18:01:42.458] envir = ns)) { [18:01:42.458] parallel_sendData <- get("sendData", mode = "function", [18:01:42.458] envir = ns) [18:01:42.458] envir <- sys.frame(frame) [18:01:42.458] master <- NULL [18:01:42.458] while (!identical(envir, .GlobalEnv) && [18:01:42.458] !identical(envir, emptyenv())) { [18:01:42.458] if (exists("master", mode = "list", envir = envir, [18:01:42.458] inherits = FALSE)) { [18:01:42.458] master <- get("master", mode = "list", [18:01:42.458] envir = envir, inherits = FALSE) [18:01:42.458] if (inherits(master, c("SOCKnode", [18:01:42.458] "SOCK0node"))) { [18:01:42.458] sendCondition <<- function(cond) { [18:01:42.458] data <- list(type = "VALUE", value = cond, [18:01:42.458] success = TRUE) [18:01:42.458] parallel_sendData(master, data) [18:01:42.458] } [18:01:42.458] return(sendCondition) [18:01:42.458] } [18:01:42.458] } [18:01:42.458] frame <- frame + 1L [18:01:42.458] envir <- sys.frame(frame) [18:01:42.458] } [18:01:42.458] } [18:01:42.458] sendCondition <<- function(cond) NULL [18:01:42.458] } [18:01:42.458] }) [18:01:42.458] withCallingHandlers({ [18:01:42.458] NA [18:01:42.458] }, immediateCondition = function(cond) { [18:01:42.458] sendCondition <- ...future.makeSendCondition() [18:01:42.458] sendCondition(cond) [18:01:42.458] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.458] { [18:01:42.458] inherits <- base::inherits [18:01:42.458] invokeRestart <- base::invokeRestart [18:01:42.458] is.null <- base::is.null [18:01:42.458] muffled <- FALSE [18:01:42.458] if (inherits(cond, "message")) { [18:01:42.458] muffled <- grepl(pattern, "muffleMessage") [18:01:42.458] if (muffled) [18:01:42.458] invokeRestart("muffleMessage") [18:01:42.458] } [18:01:42.458] else if (inherits(cond, "warning")) { [18:01:42.458] muffled <- grepl(pattern, "muffleWarning") [18:01:42.458] if (muffled) [18:01:42.458] invokeRestart("muffleWarning") [18:01:42.458] } [18:01:42.458] else if (inherits(cond, "condition")) { [18:01:42.458] if (!is.null(pattern)) { [18:01:42.458] computeRestarts <- base::computeRestarts [18:01:42.458] grepl <- base::grepl [18:01:42.458] restarts <- computeRestarts(cond) [18:01:42.458] for (restart in restarts) { [18:01:42.458] name <- restart$name [18:01:42.458] if (is.null(name)) [18:01:42.458] next [18:01:42.458] if (!grepl(pattern, name)) [18:01:42.458] next [18:01:42.458] invokeRestart(restart) [18:01:42.458] muffled <- TRUE [18:01:42.458] break [18:01:42.458] } [18:01:42.458] } [18:01:42.458] } [18:01:42.458] invisible(muffled) [18:01:42.458] } [18:01:42.458] muffleCondition(cond) [18:01:42.458] }) [18:01:42.458] })) [18:01:42.458] future::FutureResult(value = ...future.value$value, [18:01:42.458] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.458] ...future.rng), globalenv = if (FALSE) [18:01:42.458] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.458] ...future.globalenv.names)) [18:01:42.458] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.458] }, condition = base::local({ [18:01:42.458] c <- base::c [18:01:42.458] inherits <- base::inherits [18:01:42.458] invokeRestart <- base::invokeRestart [18:01:42.458] length <- base::length [18:01:42.458] list <- base::list [18:01:42.458] seq.int <- base::seq.int [18:01:42.458] signalCondition <- base::signalCondition [18:01:42.458] sys.calls <- base::sys.calls [18:01:42.458] `[[` <- base::`[[` [18:01:42.458] `+` <- base::`+` [18:01:42.458] `<<-` <- base::`<<-` [18:01:42.458] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.458] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.458] 3L)] [18:01:42.458] } [18:01:42.458] function(cond) { [18:01:42.458] is_error <- inherits(cond, "error") [18:01:42.458] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.458] NULL) [18:01:42.458] if (is_error) { [18:01:42.458] sessionInformation <- function() { [18:01:42.458] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.458] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.458] search = base::search(), system = base::Sys.info()) [18:01:42.458] } [18:01:42.458] ...future.conditions[[length(...future.conditions) + [18:01:42.458] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.458] cond$call), session = sessionInformation(), [18:01:42.458] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.458] signalCondition(cond) [18:01:42.458] } [18:01:42.458] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.458] "immediateCondition"))) { [18:01:42.458] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.458] ...future.conditions[[length(...future.conditions) + [18:01:42.458] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.458] if (TRUE && !signal) { [18:01:42.458] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.458] { [18:01:42.458] inherits <- base::inherits [18:01:42.458] invokeRestart <- base::invokeRestart [18:01:42.458] is.null <- base::is.null [18:01:42.458] muffled <- FALSE [18:01:42.458] if (inherits(cond, "message")) { [18:01:42.458] muffled <- grepl(pattern, "muffleMessage") [18:01:42.458] if (muffled) [18:01:42.458] invokeRestart("muffleMessage") [18:01:42.458] } [18:01:42.458] else if (inherits(cond, "warning")) { [18:01:42.458] muffled <- grepl(pattern, "muffleWarning") [18:01:42.458] if (muffled) [18:01:42.458] invokeRestart("muffleWarning") [18:01:42.458] } [18:01:42.458] else if (inherits(cond, "condition")) { [18:01:42.458] if (!is.null(pattern)) { [18:01:42.458] computeRestarts <- base::computeRestarts [18:01:42.458] grepl <- base::grepl [18:01:42.458] restarts <- computeRestarts(cond) [18:01:42.458] for (restart in restarts) { [18:01:42.458] name <- restart$name [18:01:42.458] if (is.null(name)) [18:01:42.458] next [18:01:42.458] if (!grepl(pattern, name)) [18:01:42.458] next [18:01:42.458] invokeRestart(restart) [18:01:42.458] muffled <- TRUE [18:01:42.458] break [18:01:42.458] } [18:01:42.458] } [18:01:42.458] } [18:01:42.458] invisible(muffled) [18:01:42.458] } [18:01:42.458] muffleCondition(cond, pattern = "^muffle") [18:01:42.458] } [18:01:42.458] } [18:01:42.458] else { [18:01:42.458] if (TRUE) { [18:01:42.458] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.458] { [18:01:42.458] inherits <- base::inherits [18:01:42.458] invokeRestart <- base::invokeRestart [18:01:42.458] is.null <- base::is.null [18:01:42.458] muffled <- FALSE [18:01:42.458] if (inherits(cond, "message")) { [18:01:42.458] muffled <- grepl(pattern, "muffleMessage") [18:01:42.458] if (muffled) [18:01:42.458] invokeRestart("muffleMessage") [18:01:42.458] } [18:01:42.458] else if (inherits(cond, "warning")) { [18:01:42.458] muffled <- grepl(pattern, "muffleWarning") [18:01:42.458] if (muffled) [18:01:42.458] invokeRestart("muffleWarning") [18:01:42.458] } [18:01:42.458] else if (inherits(cond, "condition")) { [18:01:42.458] if (!is.null(pattern)) { [18:01:42.458] computeRestarts <- base::computeRestarts [18:01:42.458] grepl <- base::grepl [18:01:42.458] restarts <- computeRestarts(cond) [18:01:42.458] for (restart in restarts) { [18:01:42.458] name <- restart$name [18:01:42.458] if (is.null(name)) [18:01:42.458] next [18:01:42.458] if (!grepl(pattern, name)) [18:01:42.458] next [18:01:42.458] invokeRestart(restart) [18:01:42.458] muffled <- TRUE [18:01:42.458] break [18:01:42.458] } [18:01:42.458] } [18:01:42.458] } [18:01:42.458] invisible(muffled) [18:01:42.458] } [18:01:42.458] muffleCondition(cond, pattern = "^muffle") [18:01:42.458] } [18:01:42.458] } [18:01:42.458] } [18:01:42.458] })) [18:01:42.458] }, error = function(ex) { [18:01:42.458] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.458] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.458] ...future.rng), started = ...future.startTime, [18:01:42.458] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.458] version = "1.8"), class = "FutureResult") [18:01:42.458] }, finally = { [18:01:42.458] if (!identical(...future.workdir, getwd())) [18:01:42.458] setwd(...future.workdir) [18:01:42.458] { [18:01:42.458] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.458] ...future.oldOptions$nwarnings <- NULL [18:01:42.458] } [18:01:42.458] base::options(...future.oldOptions) [18:01:42.458] if (.Platform$OS.type == "windows") { [18:01:42.458] old_names <- names(...future.oldEnvVars) [18:01:42.458] envs <- base::Sys.getenv() [18:01:42.458] names <- names(envs) [18:01:42.458] common <- intersect(names, old_names) [18:01:42.458] added <- setdiff(names, old_names) [18:01:42.458] removed <- setdiff(old_names, names) [18:01:42.458] changed <- common[...future.oldEnvVars[common] != [18:01:42.458] envs[common]] [18:01:42.458] NAMES <- toupper(changed) [18:01:42.458] args <- list() [18:01:42.458] for (kk in seq_along(NAMES)) { [18:01:42.458] name <- changed[[kk]] [18:01:42.458] NAME <- NAMES[[kk]] [18:01:42.458] if (name != NAME && is.element(NAME, old_names)) [18:01:42.458] next [18:01:42.458] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.458] } [18:01:42.458] NAMES <- toupper(added) [18:01:42.458] for (kk in seq_along(NAMES)) { [18:01:42.458] name <- added[[kk]] [18:01:42.458] NAME <- NAMES[[kk]] [18:01:42.458] if (name != NAME && is.element(NAME, old_names)) [18:01:42.458] next [18:01:42.458] args[[name]] <- "" [18:01:42.458] } [18:01:42.458] NAMES <- toupper(removed) [18:01:42.458] for (kk in seq_along(NAMES)) { [18:01:42.458] name <- removed[[kk]] [18:01:42.458] NAME <- NAMES[[kk]] [18:01:42.458] if (name != NAME && is.element(NAME, old_names)) [18:01:42.458] next [18:01:42.458] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.458] } [18:01:42.458] if (length(args) > 0) [18:01:42.458] base::do.call(base::Sys.setenv, args = args) [18:01:42.458] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.458] } [18:01:42.458] else { [18:01:42.458] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.458] } [18:01:42.458] { [18:01:42.458] if (base::length(...future.futureOptionsAdded) > [18:01:42.458] 0L) { [18:01:42.458] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.458] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.458] base::options(opts) [18:01:42.458] } [18:01:42.458] { [18:01:42.458] { [18:01:42.458] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.458] NULL [18:01:42.458] } [18:01:42.458] options(future.plan = NULL) [18:01:42.458] if (is.na(NA_character_)) [18:01:42.458] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.458] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.458] future::plan(list(function (..., workers = availableCores(), [18:01:42.458] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.458] envir = parent.frame()) [18:01:42.458] { [18:01:42.458] if (is.function(workers)) [18:01:42.458] workers <- workers() [18:01:42.458] workers <- structure(as.integer(workers), [18:01:42.458] class = class(workers)) [18:01:42.458] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.458] workers >= 1) [18:01:42.458] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.458] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.458] } [18:01:42.458] future <- MultisessionFuture(..., workers = workers, [18:01:42.458] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.458] envir = envir) [18:01:42.458] if (!future$lazy) [18:01:42.458] future <- run(future) [18:01:42.458] invisible(future) [18:01:42.458] }), .cleanup = FALSE, .init = FALSE) [18:01:42.458] } [18:01:42.458] } [18:01:42.458] } [18:01:42.458] }) [18:01:42.458] if (TRUE) { [18:01:42.458] base::sink(type = "output", split = FALSE) [18:01:42.458] if (TRUE) { [18:01:42.458] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.458] } [18:01:42.458] else { [18:01:42.458] ...future.result["stdout"] <- base::list(NULL) [18:01:42.458] } [18:01:42.458] base::close(...future.stdout) [18:01:42.458] ...future.stdout <- NULL [18:01:42.458] } [18:01:42.458] ...future.result$conditions <- ...future.conditions [18:01:42.458] ...future.result$finished <- base::Sys.time() [18:01:42.458] ...future.result [18:01:42.458] } [18:01:42.544] MultisessionFuture started [18:01:42.545] result() for ClusterFuture ... [18:01:42.545] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.545] - Validating connection of MultisessionFuture [18:01:42.603] - received message: FutureResult [18:01:42.603] - Received FutureResult [18:01:42.603] - Erased future from FutureRegistry [18:01:42.603] result() for ClusterFuture ... [18:01:42.603] - result already collected: FutureResult [18:01:42.603] result() for ClusterFuture ... done [18:01:42.604] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.604] result() for ClusterFuture ... done [18:01:42.604] result() for ClusterFuture ... [18:01:42.604] - result already collected: FutureResult [18:01:42.604] result() for ClusterFuture ... done [18:01:42.605] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:01:42.607] plan(): nbrOfWorkers() = 2 Dimensions: NULL [18:01:42.608] getGlobalsAndPackages() ... [18:01:42.608] Searching for globals... [18:01:42.608] [18:01:42.608] Searching for globals ... DONE [18:01:42.609] - globals: [0] [18:01:42.609] getGlobalsAndPackages() ... DONE [18:01:42.609] run() for 'Future' ... [18:01:42.609] - state: 'created' [18:01:42.609] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.624] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.624] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.624] - Field: 'node' [18:01:42.624] - Field: 'label' [18:01:42.624] - Field: 'local' [18:01:42.625] - Field: 'owner' [18:01:42.625] - Field: 'envir' [18:01:42.625] - Field: 'workers' [18:01:42.625] - Field: 'packages' [18:01:42.625] - Field: 'gc' [18:01:42.626] - Field: 'conditions' [18:01:42.626] - Field: 'persistent' [18:01:42.626] - Field: 'expr' [18:01:42.626] - Field: 'uuid' [18:01:42.626] - Field: 'seed' [18:01:42.626] - Field: 'version' [18:01:42.627] - Field: 'result' [18:01:42.627] - Field: 'asynchronous' [18:01:42.627] - Field: 'calls' [18:01:42.627] - Field: 'globals' [18:01:42.627] - Field: 'stdout' [18:01:42.628] - Field: 'earlySignal' [18:01:42.628] - Field: 'lazy' [18:01:42.628] - Field: 'state' [18:01:42.628] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.628] - Launch lazy future ... [18:01:42.629] Packages needed by the future expression (n = 0): [18:01:42.629] Packages needed by future strategies (n = 0): [18:01:42.629] { [18:01:42.629] { [18:01:42.629] { [18:01:42.629] ...future.startTime <- base::Sys.time() [18:01:42.629] { [18:01:42.629] { [18:01:42.629] { [18:01:42.629] { [18:01:42.629] base::local({ [18:01:42.629] has_future <- base::requireNamespace("future", [18:01:42.629] quietly = TRUE) [18:01:42.629] if (has_future) { [18:01:42.629] ns <- base::getNamespace("future") [18:01:42.629] version <- ns[[".package"]][["version"]] [18:01:42.629] if (is.null(version)) [18:01:42.629] version <- utils::packageVersion("future") [18:01:42.629] } [18:01:42.629] else { [18:01:42.629] version <- NULL [18:01:42.629] } [18:01:42.629] if (!has_future || version < "1.8.0") { [18:01:42.629] info <- base::c(r_version = base::gsub("R version ", [18:01:42.629] "", base::R.version$version.string), [18:01:42.629] platform = base::sprintf("%s (%s-bit)", [18:01:42.629] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.629] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.629] "release", "version")], collapse = " "), [18:01:42.629] hostname = base::Sys.info()[["nodename"]]) [18:01:42.629] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.629] info) [18:01:42.629] info <- base::paste(info, collapse = "; ") [18:01:42.629] if (!has_future) { [18:01:42.629] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.629] info) [18:01:42.629] } [18:01:42.629] else { [18:01:42.629] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.629] info, version) [18:01:42.629] } [18:01:42.629] base::stop(msg) [18:01:42.629] } [18:01:42.629] }) [18:01:42.629] } [18:01:42.629] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.629] base::options(mc.cores = 1L) [18:01:42.629] } [18:01:42.629] options(future.plan = NULL) [18:01:42.629] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.629] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.629] } [18:01:42.629] ...future.workdir <- getwd() [18:01:42.629] } [18:01:42.629] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.629] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.629] } [18:01:42.629] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.629] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.629] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.629] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.629] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.629] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.629] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.629] base::names(...future.oldOptions)) [18:01:42.629] } [18:01:42.629] if (FALSE) { [18:01:42.629] } [18:01:42.629] else { [18:01:42.629] if (TRUE) { [18:01:42.629] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.629] open = "w") [18:01:42.629] } [18:01:42.629] else { [18:01:42.629] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.629] windows = "NUL", "/dev/null"), open = "w") [18:01:42.629] } [18:01:42.629] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.629] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.629] base::sink(type = "output", split = FALSE) [18:01:42.629] base::close(...future.stdout) [18:01:42.629] }, add = TRUE) [18:01:42.629] } [18:01:42.629] ...future.frame <- base::sys.nframe() [18:01:42.629] ...future.conditions <- base::list() [18:01:42.629] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.629] if (FALSE) { [18:01:42.629] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.629] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.629] } [18:01:42.629] ...future.result <- base::tryCatch({ [18:01:42.629] base::withCallingHandlers({ [18:01:42.629] ...future.value <- base::withVisible(base::local({ [18:01:42.629] ...future.makeSendCondition <- local({ [18:01:42.629] sendCondition <- NULL [18:01:42.629] function(frame = 1L) { [18:01:42.629] if (is.function(sendCondition)) [18:01:42.629] return(sendCondition) [18:01:42.629] ns <- getNamespace("parallel") [18:01:42.629] if (exists("sendData", mode = "function", [18:01:42.629] envir = ns)) { [18:01:42.629] parallel_sendData <- get("sendData", mode = "function", [18:01:42.629] envir = ns) [18:01:42.629] envir <- sys.frame(frame) [18:01:42.629] master <- NULL [18:01:42.629] while (!identical(envir, .GlobalEnv) && [18:01:42.629] !identical(envir, emptyenv())) { [18:01:42.629] if (exists("master", mode = "list", envir = envir, [18:01:42.629] inherits = FALSE)) { [18:01:42.629] master <- get("master", mode = "list", [18:01:42.629] envir = envir, inherits = FALSE) [18:01:42.629] if (inherits(master, c("SOCKnode", [18:01:42.629] "SOCK0node"))) { [18:01:42.629] sendCondition <<- function(cond) { [18:01:42.629] data <- list(type = "VALUE", value = cond, [18:01:42.629] success = TRUE) [18:01:42.629] parallel_sendData(master, data) [18:01:42.629] } [18:01:42.629] return(sendCondition) [18:01:42.629] } [18:01:42.629] } [18:01:42.629] frame <- frame + 1L [18:01:42.629] envir <- sys.frame(frame) [18:01:42.629] } [18:01:42.629] } [18:01:42.629] sendCondition <<- function(cond) NULL [18:01:42.629] } [18:01:42.629] }) [18:01:42.629] withCallingHandlers({ [18:01:42.629] 2 [18:01:42.629] }, immediateCondition = function(cond) { [18:01:42.629] sendCondition <- ...future.makeSendCondition() [18:01:42.629] sendCondition(cond) [18:01:42.629] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.629] { [18:01:42.629] inherits <- base::inherits [18:01:42.629] invokeRestart <- base::invokeRestart [18:01:42.629] is.null <- base::is.null [18:01:42.629] muffled <- FALSE [18:01:42.629] if (inherits(cond, "message")) { [18:01:42.629] muffled <- grepl(pattern, "muffleMessage") [18:01:42.629] if (muffled) [18:01:42.629] invokeRestart("muffleMessage") [18:01:42.629] } [18:01:42.629] else if (inherits(cond, "warning")) { [18:01:42.629] muffled <- grepl(pattern, "muffleWarning") [18:01:42.629] if (muffled) [18:01:42.629] invokeRestart("muffleWarning") [18:01:42.629] } [18:01:42.629] else if (inherits(cond, "condition")) { [18:01:42.629] if (!is.null(pattern)) { [18:01:42.629] computeRestarts <- base::computeRestarts [18:01:42.629] grepl <- base::grepl [18:01:42.629] restarts <- computeRestarts(cond) [18:01:42.629] for (restart in restarts) { [18:01:42.629] name <- restart$name [18:01:42.629] if (is.null(name)) [18:01:42.629] next [18:01:42.629] if (!grepl(pattern, name)) [18:01:42.629] next [18:01:42.629] invokeRestart(restart) [18:01:42.629] muffled <- TRUE [18:01:42.629] break [18:01:42.629] } [18:01:42.629] } [18:01:42.629] } [18:01:42.629] invisible(muffled) [18:01:42.629] } [18:01:42.629] muffleCondition(cond) [18:01:42.629] }) [18:01:42.629] })) [18:01:42.629] future::FutureResult(value = ...future.value$value, [18:01:42.629] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.629] ...future.rng), globalenv = if (FALSE) [18:01:42.629] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.629] ...future.globalenv.names)) [18:01:42.629] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.629] }, condition = base::local({ [18:01:42.629] c <- base::c [18:01:42.629] inherits <- base::inherits [18:01:42.629] invokeRestart <- base::invokeRestart [18:01:42.629] length <- base::length [18:01:42.629] list <- base::list [18:01:42.629] seq.int <- base::seq.int [18:01:42.629] signalCondition <- base::signalCondition [18:01:42.629] sys.calls <- base::sys.calls [18:01:42.629] `[[` <- base::`[[` [18:01:42.629] `+` <- base::`+` [18:01:42.629] `<<-` <- base::`<<-` [18:01:42.629] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.629] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.629] 3L)] [18:01:42.629] } [18:01:42.629] function(cond) { [18:01:42.629] is_error <- inherits(cond, "error") [18:01:42.629] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.629] NULL) [18:01:42.629] if (is_error) { [18:01:42.629] sessionInformation <- function() { [18:01:42.629] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.629] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.629] search = base::search(), system = base::Sys.info()) [18:01:42.629] } [18:01:42.629] ...future.conditions[[length(...future.conditions) + [18:01:42.629] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.629] cond$call), session = sessionInformation(), [18:01:42.629] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.629] signalCondition(cond) [18:01:42.629] } [18:01:42.629] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.629] "immediateCondition"))) { [18:01:42.629] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.629] ...future.conditions[[length(...future.conditions) + [18:01:42.629] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.629] if (TRUE && !signal) { [18:01:42.629] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.629] { [18:01:42.629] inherits <- base::inherits [18:01:42.629] invokeRestart <- base::invokeRestart [18:01:42.629] is.null <- base::is.null [18:01:42.629] muffled <- FALSE [18:01:42.629] if (inherits(cond, "message")) { [18:01:42.629] muffled <- grepl(pattern, "muffleMessage") [18:01:42.629] if (muffled) [18:01:42.629] invokeRestart("muffleMessage") [18:01:42.629] } [18:01:42.629] else if (inherits(cond, "warning")) { [18:01:42.629] muffled <- grepl(pattern, "muffleWarning") [18:01:42.629] if (muffled) [18:01:42.629] invokeRestart("muffleWarning") [18:01:42.629] } [18:01:42.629] else if (inherits(cond, "condition")) { [18:01:42.629] if (!is.null(pattern)) { [18:01:42.629] computeRestarts <- base::computeRestarts [18:01:42.629] grepl <- base::grepl [18:01:42.629] restarts <- computeRestarts(cond) [18:01:42.629] for (restart in restarts) { [18:01:42.629] name <- restart$name [18:01:42.629] if (is.null(name)) [18:01:42.629] next [18:01:42.629] if (!grepl(pattern, name)) [18:01:42.629] next [18:01:42.629] invokeRestart(restart) [18:01:42.629] muffled <- TRUE [18:01:42.629] break [18:01:42.629] } [18:01:42.629] } [18:01:42.629] } [18:01:42.629] invisible(muffled) [18:01:42.629] } [18:01:42.629] muffleCondition(cond, pattern = "^muffle") [18:01:42.629] } [18:01:42.629] } [18:01:42.629] else { [18:01:42.629] if (TRUE) { [18:01:42.629] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.629] { [18:01:42.629] inherits <- base::inherits [18:01:42.629] invokeRestart <- base::invokeRestart [18:01:42.629] is.null <- base::is.null [18:01:42.629] muffled <- FALSE [18:01:42.629] if (inherits(cond, "message")) { [18:01:42.629] muffled <- grepl(pattern, "muffleMessage") [18:01:42.629] if (muffled) [18:01:42.629] invokeRestart("muffleMessage") [18:01:42.629] } [18:01:42.629] else if (inherits(cond, "warning")) { [18:01:42.629] muffled <- grepl(pattern, "muffleWarning") [18:01:42.629] if (muffled) [18:01:42.629] invokeRestart("muffleWarning") [18:01:42.629] } [18:01:42.629] else if (inherits(cond, "condition")) { [18:01:42.629] if (!is.null(pattern)) { [18:01:42.629] computeRestarts <- base::computeRestarts [18:01:42.629] grepl <- base::grepl [18:01:42.629] restarts <- computeRestarts(cond) [18:01:42.629] for (restart in restarts) { [18:01:42.629] name <- restart$name [18:01:42.629] if (is.null(name)) [18:01:42.629] next [18:01:42.629] if (!grepl(pattern, name)) [18:01:42.629] next [18:01:42.629] invokeRestart(restart) [18:01:42.629] muffled <- TRUE [18:01:42.629] break [18:01:42.629] } [18:01:42.629] } [18:01:42.629] } [18:01:42.629] invisible(muffled) [18:01:42.629] } [18:01:42.629] muffleCondition(cond, pattern = "^muffle") [18:01:42.629] } [18:01:42.629] } [18:01:42.629] } [18:01:42.629] })) [18:01:42.629] }, error = function(ex) { [18:01:42.629] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.629] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.629] ...future.rng), started = ...future.startTime, [18:01:42.629] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.629] version = "1.8"), class = "FutureResult") [18:01:42.629] }, finally = { [18:01:42.629] if (!identical(...future.workdir, getwd())) [18:01:42.629] setwd(...future.workdir) [18:01:42.629] { [18:01:42.629] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.629] ...future.oldOptions$nwarnings <- NULL [18:01:42.629] } [18:01:42.629] base::options(...future.oldOptions) [18:01:42.629] if (.Platform$OS.type == "windows") { [18:01:42.629] old_names <- names(...future.oldEnvVars) [18:01:42.629] envs <- base::Sys.getenv() [18:01:42.629] names <- names(envs) [18:01:42.629] common <- intersect(names, old_names) [18:01:42.629] added <- setdiff(names, old_names) [18:01:42.629] removed <- setdiff(old_names, names) [18:01:42.629] changed <- common[...future.oldEnvVars[common] != [18:01:42.629] envs[common]] [18:01:42.629] NAMES <- toupper(changed) [18:01:42.629] args <- list() [18:01:42.629] for (kk in seq_along(NAMES)) { [18:01:42.629] name <- changed[[kk]] [18:01:42.629] NAME <- NAMES[[kk]] [18:01:42.629] if (name != NAME && is.element(NAME, old_names)) [18:01:42.629] next [18:01:42.629] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.629] } [18:01:42.629] NAMES <- toupper(added) [18:01:42.629] for (kk in seq_along(NAMES)) { [18:01:42.629] name <- added[[kk]] [18:01:42.629] NAME <- NAMES[[kk]] [18:01:42.629] if (name != NAME && is.element(NAME, old_names)) [18:01:42.629] next [18:01:42.629] args[[name]] <- "" [18:01:42.629] } [18:01:42.629] NAMES <- toupper(removed) [18:01:42.629] for (kk in seq_along(NAMES)) { [18:01:42.629] name <- removed[[kk]] [18:01:42.629] NAME <- NAMES[[kk]] [18:01:42.629] if (name != NAME && is.element(NAME, old_names)) [18:01:42.629] next [18:01:42.629] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.629] } [18:01:42.629] if (length(args) > 0) [18:01:42.629] base::do.call(base::Sys.setenv, args = args) [18:01:42.629] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.629] } [18:01:42.629] else { [18:01:42.629] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.629] } [18:01:42.629] { [18:01:42.629] if (base::length(...future.futureOptionsAdded) > [18:01:42.629] 0L) { [18:01:42.629] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.629] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.629] base::options(opts) [18:01:42.629] } [18:01:42.629] { [18:01:42.629] { [18:01:42.629] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.629] NULL [18:01:42.629] } [18:01:42.629] options(future.plan = NULL) [18:01:42.629] if (is.na(NA_character_)) [18:01:42.629] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.629] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.629] future::plan(list(function (..., workers = availableCores(), [18:01:42.629] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.629] envir = parent.frame()) [18:01:42.629] { [18:01:42.629] if (is.function(workers)) [18:01:42.629] workers <- workers() [18:01:42.629] workers <- structure(as.integer(workers), [18:01:42.629] class = class(workers)) [18:01:42.629] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.629] workers >= 1) [18:01:42.629] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.629] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.629] } [18:01:42.629] future <- MultisessionFuture(..., workers = workers, [18:01:42.629] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.629] envir = envir) [18:01:42.629] if (!future$lazy) [18:01:42.629] future <- run(future) [18:01:42.629] invisible(future) [18:01:42.629] }), .cleanup = FALSE, .init = FALSE) [18:01:42.629] } [18:01:42.629] } [18:01:42.629] } [18:01:42.629] }) [18:01:42.629] if (TRUE) { [18:01:42.629] base::sink(type = "output", split = FALSE) [18:01:42.629] if (TRUE) { [18:01:42.629] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.629] } [18:01:42.629] else { [18:01:42.629] ...future.result["stdout"] <- base::list(NULL) [18:01:42.629] } [18:01:42.629] base::close(...future.stdout) [18:01:42.629] ...future.stdout <- NULL [18:01:42.629] } [18:01:42.629] ...future.result$conditions <- ...future.conditions [18:01:42.629] ...future.result$finished <- base::Sys.time() [18:01:42.629] ...future.result [18:01:42.629] } [18:01:42.635] MultisessionFuture started [18:01:42.636] - Launch lazy future ... done [18:01:42.636] run() for 'MultisessionFuture' ... done [18:01:42.636] getGlobalsAndPackages() ... [18:01:42.636] Searching for globals... [18:01:42.637] [18:01:42.637] Searching for globals ... DONE [18:01:42.637] - globals: [0] [18:01:42.637] getGlobalsAndPackages() ... DONE [18:01:42.638] run() for 'Future' ... [18:01:42.638] - state: 'created' [18:01:42.638] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.652] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.652] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.652] - Field: 'node' [18:01:42.652] - Field: 'label' [18:01:42.653] - Field: 'local' [18:01:42.653] - Field: 'owner' [18:01:42.653] - Field: 'envir' [18:01:42.653] - Field: 'workers' [18:01:42.653] - Field: 'packages' [18:01:42.654] - Field: 'gc' [18:01:42.654] - Field: 'conditions' [18:01:42.654] - Field: 'persistent' [18:01:42.654] - Field: 'expr' [18:01:42.654] - Field: 'uuid' [18:01:42.654] - Field: 'seed' [18:01:42.655] - Field: 'version' [18:01:42.655] - Field: 'result' [18:01:42.655] - Field: 'asynchronous' [18:01:42.655] - Field: 'calls' [18:01:42.655] - Field: 'globals' [18:01:42.656] - Field: 'stdout' [18:01:42.656] - Field: 'earlySignal' [18:01:42.656] - Field: 'lazy' [18:01:42.656] - Field: 'state' [18:01:42.656] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.656] - Launch lazy future ... [18:01:42.657] Packages needed by the future expression (n = 0): [18:01:42.657] Packages needed by future strategies (n = 0): [18:01:42.658] { [18:01:42.658] { [18:01:42.658] { [18:01:42.658] ...future.startTime <- base::Sys.time() [18:01:42.658] { [18:01:42.658] { [18:01:42.658] { [18:01:42.658] { [18:01:42.658] base::local({ [18:01:42.658] has_future <- base::requireNamespace("future", [18:01:42.658] quietly = TRUE) [18:01:42.658] if (has_future) { [18:01:42.658] ns <- base::getNamespace("future") [18:01:42.658] version <- ns[[".package"]][["version"]] [18:01:42.658] if (is.null(version)) [18:01:42.658] version <- utils::packageVersion("future") [18:01:42.658] } [18:01:42.658] else { [18:01:42.658] version <- NULL [18:01:42.658] } [18:01:42.658] if (!has_future || version < "1.8.0") { [18:01:42.658] info <- base::c(r_version = base::gsub("R version ", [18:01:42.658] "", base::R.version$version.string), [18:01:42.658] platform = base::sprintf("%s (%s-bit)", [18:01:42.658] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.658] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.658] "release", "version")], collapse = " "), [18:01:42.658] hostname = base::Sys.info()[["nodename"]]) [18:01:42.658] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.658] info) [18:01:42.658] info <- base::paste(info, collapse = "; ") [18:01:42.658] if (!has_future) { [18:01:42.658] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.658] info) [18:01:42.658] } [18:01:42.658] else { [18:01:42.658] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.658] info, version) [18:01:42.658] } [18:01:42.658] base::stop(msg) [18:01:42.658] } [18:01:42.658] }) [18:01:42.658] } [18:01:42.658] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.658] base::options(mc.cores = 1L) [18:01:42.658] } [18:01:42.658] options(future.plan = NULL) [18:01:42.658] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.658] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.658] } [18:01:42.658] ...future.workdir <- getwd() [18:01:42.658] } [18:01:42.658] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.658] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.658] } [18:01:42.658] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.658] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.658] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.658] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.658] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.658] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.658] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.658] base::names(...future.oldOptions)) [18:01:42.658] } [18:01:42.658] if (FALSE) { [18:01:42.658] } [18:01:42.658] else { [18:01:42.658] if (TRUE) { [18:01:42.658] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.658] open = "w") [18:01:42.658] } [18:01:42.658] else { [18:01:42.658] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.658] windows = "NUL", "/dev/null"), open = "w") [18:01:42.658] } [18:01:42.658] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.658] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.658] base::sink(type = "output", split = FALSE) [18:01:42.658] base::close(...future.stdout) [18:01:42.658] }, add = TRUE) [18:01:42.658] } [18:01:42.658] ...future.frame <- base::sys.nframe() [18:01:42.658] ...future.conditions <- base::list() [18:01:42.658] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.658] if (FALSE) { [18:01:42.658] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.658] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.658] } [18:01:42.658] ...future.result <- base::tryCatch({ [18:01:42.658] base::withCallingHandlers({ [18:01:42.658] ...future.value <- base::withVisible(base::local({ [18:01:42.658] ...future.makeSendCondition <- local({ [18:01:42.658] sendCondition <- NULL [18:01:42.658] function(frame = 1L) { [18:01:42.658] if (is.function(sendCondition)) [18:01:42.658] return(sendCondition) [18:01:42.658] ns <- getNamespace("parallel") [18:01:42.658] if (exists("sendData", mode = "function", [18:01:42.658] envir = ns)) { [18:01:42.658] parallel_sendData <- get("sendData", mode = "function", [18:01:42.658] envir = ns) [18:01:42.658] envir <- sys.frame(frame) [18:01:42.658] master <- NULL [18:01:42.658] while (!identical(envir, .GlobalEnv) && [18:01:42.658] !identical(envir, emptyenv())) { [18:01:42.658] if (exists("master", mode = "list", envir = envir, [18:01:42.658] inherits = FALSE)) { [18:01:42.658] master <- get("master", mode = "list", [18:01:42.658] envir = envir, inherits = FALSE) [18:01:42.658] if (inherits(master, c("SOCKnode", [18:01:42.658] "SOCK0node"))) { [18:01:42.658] sendCondition <<- function(cond) { [18:01:42.658] data <- list(type = "VALUE", value = cond, [18:01:42.658] success = TRUE) [18:01:42.658] parallel_sendData(master, data) [18:01:42.658] } [18:01:42.658] return(sendCondition) [18:01:42.658] } [18:01:42.658] } [18:01:42.658] frame <- frame + 1L [18:01:42.658] envir <- sys.frame(frame) [18:01:42.658] } [18:01:42.658] } [18:01:42.658] sendCondition <<- function(cond) NULL [18:01:42.658] } [18:01:42.658] }) [18:01:42.658] withCallingHandlers({ [18:01:42.658] NULL [18:01:42.658] }, immediateCondition = function(cond) { [18:01:42.658] sendCondition <- ...future.makeSendCondition() [18:01:42.658] sendCondition(cond) [18:01:42.658] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.658] { [18:01:42.658] inherits <- base::inherits [18:01:42.658] invokeRestart <- base::invokeRestart [18:01:42.658] is.null <- base::is.null [18:01:42.658] muffled <- FALSE [18:01:42.658] if (inherits(cond, "message")) { [18:01:42.658] muffled <- grepl(pattern, "muffleMessage") [18:01:42.658] if (muffled) [18:01:42.658] invokeRestart("muffleMessage") [18:01:42.658] } [18:01:42.658] else if (inherits(cond, "warning")) { [18:01:42.658] muffled <- grepl(pattern, "muffleWarning") [18:01:42.658] if (muffled) [18:01:42.658] invokeRestart("muffleWarning") [18:01:42.658] } [18:01:42.658] else if (inherits(cond, "condition")) { [18:01:42.658] if (!is.null(pattern)) { [18:01:42.658] computeRestarts <- base::computeRestarts [18:01:42.658] grepl <- base::grepl [18:01:42.658] restarts <- computeRestarts(cond) [18:01:42.658] for (restart in restarts) { [18:01:42.658] name <- restart$name [18:01:42.658] if (is.null(name)) [18:01:42.658] next [18:01:42.658] if (!grepl(pattern, name)) [18:01:42.658] next [18:01:42.658] invokeRestart(restart) [18:01:42.658] muffled <- TRUE [18:01:42.658] break [18:01:42.658] } [18:01:42.658] } [18:01:42.658] } [18:01:42.658] invisible(muffled) [18:01:42.658] } [18:01:42.658] muffleCondition(cond) [18:01:42.658] }) [18:01:42.658] })) [18:01:42.658] future::FutureResult(value = ...future.value$value, [18:01:42.658] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.658] ...future.rng), globalenv = if (FALSE) [18:01:42.658] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.658] ...future.globalenv.names)) [18:01:42.658] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.658] }, condition = base::local({ [18:01:42.658] c <- base::c [18:01:42.658] inherits <- base::inherits [18:01:42.658] invokeRestart <- base::invokeRestart [18:01:42.658] length <- base::length [18:01:42.658] list <- base::list [18:01:42.658] seq.int <- base::seq.int [18:01:42.658] signalCondition <- base::signalCondition [18:01:42.658] sys.calls <- base::sys.calls [18:01:42.658] `[[` <- base::`[[` [18:01:42.658] `+` <- base::`+` [18:01:42.658] `<<-` <- base::`<<-` [18:01:42.658] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.658] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.658] 3L)] [18:01:42.658] } [18:01:42.658] function(cond) { [18:01:42.658] is_error <- inherits(cond, "error") [18:01:42.658] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.658] NULL) [18:01:42.658] if (is_error) { [18:01:42.658] sessionInformation <- function() { [18:01:42.658] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.658] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.658] search = base::search(), system = base::Sys.info()) [18:01:42.658] } [18:01:42.658] ...future.conditions[[length(...future.conditions) + [18:01:42.658] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.658] cond$call), session = sessionInformation(), [18:01:42.658] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.658] signalCondition(cond) [18:01:42.658] } [18:01:42.658] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.658] "immediateCondition"))) { [18:01:42.658] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.658] ...future.conditions[[length(...future.conditions) + [18:01:42.658] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.658] if (TRUE && !signal) { [18:01:42.658] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.658] { [18:01:42.658] inherits <- base::inherits [18:01:42.658] invokeRestart <- base::invokeRestart [18:01:42.658] is.null <- base::is.null [18:01:42.658] muffled <- FALSE [18:01:42.658] if (inherits(cond, "message")) { [18:01:42.658] muffled <- grepl(pattern, "muffleMessage") [18:01:42.658] if (muffled) [18:01:42.658] invokeRestart("muffleMessage") [18:01:42.658] } [18:01:42.658] else if (inherits(cond, "warning")) { [18:01:42.658] muffled <- grepl(pattern, "muffleWarning") [18:01:42.658] if (muffled) [18:01:42.658] invokeRestart("muffleWarning") [18:01:42.658] } [18:01:42.658] else if (inherits(cond, "condition")) { [18:01:42.658] if (!is.null(pattern)) { [18:01:42.658] computeRestarts <- base::computeRestarts [18:01:42.658] grepl <- base::grepl [18:01:42.658] restarts <- computeRestarts(cond) [18:01:42.658] for (restart in restarts) { [18:01:42.658] name <- restart$name [18:01:42.658] if (is.null(name)) [18:01:42.658] next [18:01:42.658] if (!grepl(pattern, name)) [18:01:42.658] next [18:01:42.658] invokeRestart(restart) [18:01:42.658] muffled <- TRUE [18:01:42.658] break [18:01:42.658] } [18:01:42.658] } [18:01:42.658] } [18:01:42.658] invisible(muffled) [18:01:42.658] } [18:01:42.658] muffleCondition(cond, pattern = "^muffle") [18:01:42.658] } [18:01:42.658] } [18:01:42.658] else { [18:01:42.658] if (TRUE) { [18:01:42.658] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.658] { [18:01:42.658] inherits <- base::inherits [18:01:42.658] invokeRestart <- base::invokeRestart [18:01:42.658] is.null <- base::is.null [18:01:42.658] muffled <- FALSE [18:01:42.658] if (inherits(cond, "message")) { [18:01:42.658] muffled <- grepl(pattern, "muffleMessage") [18:01:42.658] if (muffled) [18:01:42.658] invokeRestart("muffleMessage") [18:01:42.658] } [18:01:42.658] else if (inherits(cond, "warning")) { [18:01:42.658] muffled <- grepl(pattern, "muffleWarning") [18:01:42.658] if (muffled) [18:01:42.658] invokeRestart("muffleWarning") [18:01:42.658] } [18:01:42.658] else if (inherits(cond, "condition")) { [18:01:42.658] if (!is.null(pattern)) { [18:01:42.658] computeRestarts <- base::computeRestarts [18:01:42.658] grepl <- base::grepl [18:01:42.658] restarts <- computeRestarts(cond) [18:01:42.658] for (restart in restarts) { [18:01:42.658] name <- restart$name [18:01:42.658] if (is.null(name)) [18:01:42.658] next [18:01:42.658] if (!grepl(pattern, name)) [18:01:42.658] next [18:01:42.658] invokeRestart(restart) [18:01:42.658] muffled <- TRUE [18:01:42.658] break [18:01:42.658] } [18:01:42.658] } [18:01:42.658] } [18:01:42.658] invisible(muffled) [18:01:42.658] } [18:01:42.658] muffleCondition(cond, pattern = "^muffle") [18:01:42.658] } [18:01:42.658] } [18:01:42.658] } [18:01:42.658] })) [18:01:42.658] }, error = function(ex) { [18:01:42.658] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.658] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.658] ...future.rng), started = ...future.startTime, [18:01:42.658] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.658] version = "1.8"), class = "FutureResult") [18:01:42.658] }, finally = { [18:01:42.658] if (!identical(...future.workdir, getwd())) [18:01:42.658] setwd(...future.workdir) [18:01:42.658] { [18:01:42.658] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.658] ...future.oldOptions$nwarnings <- NULL [18:01:42.658] } [18:01:42.658] base::options(...future.oldOptions) [18:01:42.658] if (.Platform$OS.type == "windows") { [18:01:42.658] old_names <- names(...future.oldEnvVars) [18:01:42.658] envs <- base::Sys.getenv() [18:01:42.658] names <- names(envs) [18:01:42.658] common <- intersect(names, old_names) [18:01:42.658] added <- setdiff(names, old_names) [18:01:42.658] removed <- setdiff(old_names, names) [18:01:42.658] changed <- common[...future.oldEnvVars[common] != [18:01:42.658] envs[common]] [18:01:42.658] NAMES <- toupper(changed) [18:01:42.658] args <- list() [18:01:42.658] for (kk in seq_along(NAMES)) { [18:01:42.658] name <- changed[[kk]] [18:01:42.658] NAME <- NAMES[[kk]] [18:01:42.658] if (name != NAME && is.element(NAME, old_names)) [18:01:42.658] next [18:01:42.658] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.658] } [18:01:42.658] NAMES <- toupper(added) [18:01:42.658] for (kk in seq_along(NAMES)) { [18:01:42.658] name <- added[[kk]] [18:01:42.658] NAME <- NAMES[[kk]] [18:01:42.658] if (name != NAME && is.element(NAME, old_names)) [18:01:42.658] next [18:01:42.658] args[[name]] <- "" [18:01:42.658] } [18:01:42.658] NAMES <- toupper(removed) [18:01:42.658] for (kk in seq_along(NAMES)) { [18:01:42.658] name <- removed[[kk]] [18:01:42.658] NAME <- NAMES[[kk]] [18:01:42.658] if (name != NAME && is.element(NAME, old_names)) [18:01:42.658] next [18:01:42.658] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.658] } [18:01:42.658] if (length(args) > 0) [18:01:42.658] base::do.call(base::Sys.setenv, args = args) [18:01:42.658] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.658] } [18:01:42.658] else { [18:01:42.658] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.658] } [18:01:42.658] { [18:01:42.658] if (base::length(...future.futureOptionsAdded) > [18:01:42.658] 0L) { [18:01:42.658] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.658] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.658] base::options(opts) [18:01:42.658] } [18:01:42.658] { [18:01:42.658] { [18:01:42.658] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.658] NULL [18:01:42.658] } [18:01:42.658] options(future.plan = NULL) [18:01:42.658] if (is.na(NA_character_)) [18:01:42.658] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.658] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.658] future::plan(list(function (..., workers = availableCores(), [18:01:42.658] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.658] envir = parent.frame()) [18:01:42.658] { [18:01:42.658] if (is.function(workers)) [18:01:42.658] workers <- workers() [18:01:42.658] workers <- structure(as.integer(workers), [18:01:42.658] class = class(workers)) [18:01:42.658] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.658] workers >= 1) [18:01:42.658] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.658] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.658] } [18:01:42.658] future <- MultisessionFuture(..., workers = workers, [18:01:42.658] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.658] envir = envir) [18:01:42.658] if (!future$lazy) [18:01:42.658] future <- run(future) [18:01:42.658] invisible(future) [18:01:42.658] }), .cleanup = FALSE, .init = FALSE) [18:01:42.658] } [18:01:42.658] } [18:01:42.658] } [18:01:42.658] }) [18:01:42.658] if (TRUE) { [18:01:42.658] base::sink(type = "output", split = FALSE) [18:01:42.658] if (TRUE) { [18:01:42.658] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.658] } [18:01:42.658] else { [18:01:42.658] ...future.result["stdout"] <- base::list(NULL) [18:01:42.658] } [18:01:42.658] base::close(...future.stdout) [18:01:42.658] ...future.stdout <- NULL [18:01:42.658] } [18:01:42.658] ...future.result$conditions <- ...future.conditions [18:01:42.658] ...future.result$finished <- base::Sys.time() [18:01:42.658] ...future.result [18:01:42.658] } [18:01:42.747] MultisessionFuture started [18:01:42.747] - Launch lazy future ... done [18:01:42.747] run() for 'MultisessionFuture' ... done [18:01:42.748] getGlobalsAndPackages() ... [18:01:42.748] Searching for globals... [18:01:42.749] - globals found: [1] '{' [18:01:42.749] Searching for globals ... DONE [18:01:42.749] Resolving globals: FALSE [18:01:42.750] [18:01:42.750] [18:01:42.750] getGlobalsAndPackages() ... DONE [18:01:42.750] run() for 'Future' ... [18:01:42.751] - state: 'created' [18:01:42.751] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.765] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.765] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.765] - Field: 'node' [18:01:42.765] - Field: 'label' [18:01:42.766] - Field: 'local' [18:01:42.766] - Field: 'owner' [18:01:42.766] - Field: 'envir' [18:01:42.766] - Field: 'workers' [18:01:42.766] - Field: 'packages' [18:01:42.767] - Field: 'gc' [18:01:42.767] - Field: 'conditions' [18:01:42.767] - Field: 'persistent' [18:01:42.767] - Field: 'expr' [18:01:42.767] - Field: 'uuid' [18:01:42.768] - Field: 'seed' [18:01:42.768] - Field: 'version' [18:01:42.768] - Field: 'result' [18:01:42.768] - Field: 'asynchronous' [18:01:42.768] - Field: 'calls' [18:01:42.769] - Field: 'globals' [18:01:42.769] - Field: 'stdout' [18:01:42.769] - Field: 'earlySignal' [18:01:42.769] - Field: 'lazy' [18:01:42.769] - Field: 'state' [18:01:42.769] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.770] - Launch lazy future ... [18:01:42.770] Packages needed by the future expression (n = 0): [18:01:42.770] Packages needed by future strategies (n = 0): [18:01:42.771] { [18:01:42.771] { [18:01:42.771] { [18:01:42.771] ...future.startTime <- base::Sys.time() [18:01:42.771] { [18:01:42.771] { [18:01:42.771] { [18:01:42.771] { [18:01:42.771] base::local({ [18:01:42.771] has_future <- base::requireNamespace("future", [18:01:42.771] quietly = TRUE) [18:01:42.771] if (has_future) { [18:01:42.771] ns <- base::getNamespace("future") [18:01:42.771] version <- ns[[".package"]][["version"]] [18:01:42.771] if (is.null(version)) [18:01:42.771] version <- utils::packageVersion("future") [18:01:42.771] } [18:01:42.771] else { [18:01:42.771] version <- NULL [18:01:42.771] } [18:01:42.771] if (!has_future || version < "1.8.0") { [18:01:42.771] info <- base::c(r_version = base::gsub("R version ", [18:01:42.771] "", base::R.version$version.string), [18:01:42.771] platform = base::sprintf("%s (%s-bit)", [18:01:42.771] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.771] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.771] "release", "version")], collapse = " "), [18:01:42.771] hostname = base::Sys.info()[["nodename"]]) [18:01:42.771] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.771] info) [18:01:42.771] info <- base::paste(info, collapse = "; ") [18:01:42.771] if (!has_future) { [18:01:42.771] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.771] info) [18:01:42.771] } [18:01:42.771] else { [18:01:42.771] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.771] info, version) [18:01:42.771] } [18:01:42.771] base::stop(msg) [18:01:42.771] } [18:01:42.771] }) [18:01:42.771] } [18:01:42.771] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.771] base::options(mc.cores = 1L) [18:01:42.771] } [18:01:42.771] options(future.plan = NULL) [18:01:42.771] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.771] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.771] } [18:01:42.771] ...future.workdir <- getwd() [18:01:42.771] } [18:01:42.771] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.771] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.771] } [18:01:42.771] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.771] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.771] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.771] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.771] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.771] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.771] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.771] base::names(...future.oldOptions)) [18:01:42.771] } [18:01:42.771] if (FALSE) { [18:01:42.771] } [18:01:42.771] else { [18:01:42.771] if (TRUE) { [18:01:42.771] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.771] open = "w") [18:01:42.771] } [18:01:42.771] else { [18:01:42.771] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.771] windows = "NUL", "/dev/null"), open = "w") [18:01:42.771] } [18:01:42.771] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.771] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.771] base::sink(type = "output", split = FALSE) [18:01:42.771] base::close(...future.stdout) [18:01:42.771] }, add = TRUE) [18:01:42.771] } [18:01:42.771] ...future.frame <- base::sys.nframe() [18:01:42.771] ...future.conditions <- base::list() [18:01:42.771] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.771] if (FALSE) { [18:01:42.771] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.771] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.771] } [18:01:42.771] ...future.result <- base::tryCatch({ [18:01:42.771] base::withCallingHandlers({ [18:01:42.771] ...future.value <- base::withVisible(base::local({ [18:01:42.771] ...future.makeSendCondition <- local({ [18:01:42.771] sendCondition <- NULL [18:01:42.771] function(frame = 1L) { [18:01:42.771] if (is.function(sendCondition)) [18:01:42.771] return(sendCondition) [18:01:42.771] ns <- getNamespace("parallel") [18:01:42.771] if (exists("sendData", mode = "function", [18:01:42.771] envir = ns)) { [18:01:42.771] parallel_sendData <- get("sendData", mode = "function", [18:01:42.771] envir = ns) [18:01:42.771] envir <- sys.frame(frame) [18:01:42.771] master <- NULL [18:01:42.771] while (!identical(envir, .GlobalEnv) && [18:01:42.771] !identical(envir, emptyenv())) { [18:01:42.771] if (exists("master", mode = "list", envir = envir, [18:01:42.771] inherits = FALSE)) { [18:01:42.771] master <- get("master", mode = "list", [18:01:42.771] envir = envir, inherits = FALSE) [18:01:42.771] if (inherits(master, c("SOCKnode", [18:01:42.771] "SOCK0node"))) { [18:01:42.771] sendCondition <<- function(cond) { [18:01:42.771] data <- list(type = "VALUE", value = cond, [18:01:42.771] success = TRUE) [18:01:42.771] parallel_sendData(master, data) [18:01:42.771] } [18:01:42.771] return(sendCondition) [18:01:42.771] } [18:01:42.771] } [18:01:42.771] frame <- frame + 1L [18:01:42.771] envir <- sys.frame(frame) [18:01:42.771] } [18:01:42.771] } [18:01:42.771] sendCondition <<- function(cond) NULL [18:01:42.771] } [18:01:42.771] }) [18:01:42.771] withCallingHandlers({ [18:01:42.771] { [18:01:42.771] 4 [18:01:42.771] } [18:01:42.771] }, immediateCondition = function(cond) { [18:01:42.771] sendCondition <- ...future.makeSendCondition() [18:01:42.771] sendCondition(cond) [18:01:42.771] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.771] { [18:01:42.771] inherits <- base::inherits [18:01:42.771] invokeRestart <- base::invokeRestart [18:01:42.771] is.null <- base::is.null [18:01:42.771] muffled <- FALSE [18:01:42.771] if (inherits(cond, "message")) { [18:01:42.771] muffled <- grepl(pattern, "muffleMessage") [18:01:42.771] if (muffled) [18:01:42.771] invokeRestart("muffleMessage") [18:01:42.771] } [18:01:42.771] else if (inherits(cond, "warning")) { [18:01:42.771] muffled <- grepl(pattern, "muffleWarning") [18:01:42.771] if (muffled) [18:01:42.771] invokeRestart("muffleWarning") [18:01:42.771] } [18:01:42.771] else if (inherits(cond, "condition")) { [18:01:42.771] if (!is.null(pattern)) { [18:01:42.771] computeRestarts <- base::computeRestarts [18:01:42.771] grepl <- base::grepl [18:01:42.771] restarts <- computeRestarts(cond) [18:01:42.771] for (restart in restarts) { [18:01:42.771] name <- restart$name [18:01:42.771] if (is.null(name)) [18:01:42.771] next [18:01:42.771] if (!grepl(pattern, name)) [18:01:42.771] next [18:01:42.771] invokeRestart(restart) [18:01:42.771] muffled <- TRUE [18:01:42.771] break [18:01:42.771] } [18:01:42.771] } [18:01:42.771] } [18:01:42.771] invisible(muffled) [18:01:42.771] } [18:01:42.771] muffleCondition(cond) [18:01:42.771] }) [18:01:42.771] })) [18:01:42.771] future::FutureResult(value = ...future.value$value, [18:01:42.771] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.771] ...future.rng), globalenv = if (FALSE) [18:01:42.771] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.771] ...future.globalenv.names)) [18:01:42.771] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.771] }, condition = base::local({ [18:01:42.771] c <- base::c [18:01:42.771] inherits <- base::inherits [18:01:42.771] invokeRestart <- base::invokeRestart [18:01:42.771] length <- base::length [18:01:42.771] list <- base::list [18:01:42.771] seq.int <- base::seq.int [18:01:42.771] signalCondition <- base::signalCondition [18:01:42.771] sys.calls <- base::sys.calls [18:01:42.771] `[[` <- base::`[[` [18:01:42.771] `+` <- base::`+` [18:01:42.771] `<<-` <- base::`<<-` [18:01:42.771] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.771] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.771] 3L)] [18:01:42.771] } [18:01:42.771] function(cond) { [18:01:42.771] is_error <- inherits(cond, "error") [18:01:42.771] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.771] NULL) [18:01:42.771] if (is_error) { [18:01:42.771] sessionInformation <- function() { [18:01:42.771] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.771] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.771] search = base::search(), system = base::Sys.info()) [18:01:42.771] } [18:01:42.771] ...future.conditions[[length(...future.conditions) + [18:01:42.771] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.771] cond$call), session = sessionInformation(), [18:01:42.771] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.771] signalCondition(cond) [18:01:42.771] } [18:01:42.771] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.771] "immediateCondition"))) { [18:01:42.771] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.771] ...future.conditions[[length(...future.conditions) + [18:01:42.771] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.771] if (TRUE && !signal) { [18:01:42.771] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.771] { [18:01:42.771] inherits <- base::inherits [18:01:42.771] invokeRestart <- base::invokeRestart [18:01:42.771] is.null <- base::is.null [18:01:42.771] muffled <- FALSE [18:01:42.771] if (inherits(cond, "message")) { [18:01:42.771] muffled <- grepl(pattern, "muffleMessage") [18:01:42.771] if (muffled) [18:01:42.771] invokeRestart("muffleMessage") [18:01:42.771] } [18:01:42.771] else if (inherits(cond, "warning")) { [18:01:42.771] muffled <- grepl(pattern, "muffleWarning") [18:01:42.771] if (muffled) [18:01:42.771] invokeRestart("muffleWarning") [18:01:42.771] } [18:01:42.771] else if (inherits(cond, "condition")) { [18:01:42.771] if (!is.null(pattern)) { [18:01:42.771] computeRestarts <- base::computeRestarts [18:01:42.771] grepl <- base::grepl [18:01:42.771] restarts <- computeRestarts(cond) [18:01:42.771] for (restart in restarts) { [18:01:42.771] name <- restart$name [18:01:42.771] if (is.null(name)) [18:01:42.771] next [18:01:42.771] if (!grepl(pattern, name)) [18:01:42.771] next [18:01:42.771] invokeRestart(restart) [18:01:42.771] muffled <- TRUE [18:01:42.771] break [18:01:42.771] } [18:01:42.771] } [18:01:42.771] } [18:01:42.771] invisible(muffled) [18:01:42.771] } [18:01:42.771] muffleCondition(cond, pattern = "^muffle") [18:01:42.771] } [18:01:42.771] } [18:01:42.771] else { [18:01:42.771] if (TRUE) { [18:01:42.771] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.771] { [18:01:42.771] inherits <- base::inherits [18:01:42.771] invokeRestart <- base::invokeRestart [18:01:42.771] is.null <- base::is.null [18:01:42.771] muffled <- FALSE [18:01:42.771] if (inherits(cond, "message")) { [18:01:42.771] muffled <- grepl(pattern, "muffleMessage") [18:01:42.771] if (muffled) [18:01:42.771] invokeRestart("muffleMessage") [18:01:42.771] } [18:01:42.771] else if (inherits(cond, "warning")) { [18:01:42.771] muffled <- grepl(pattern, "muffleWarning") [18:01:42.771] if (muffled) [18:01:42.771] invokeRestart("muffleWarning") [18:01:42.771] } [18:01:42.771] else if (inherits(cond, "condition")) { [18:01:42.771] if (!is.null(pattern)) { [18:01:42.771] computeRestarts <- base::computeRestarts [18:01:42.771] grepl <- base::grepl [18:01:42.771] restarts <- computeRestarts(cond) [18:01:42.771] for (restart in restarts) { [18:01:42.771] name <- restart$name [18:01:42.771] if (is.null(name)) [18:01:42.771] next [18:01:42.771] if (!grepl(pattern, name)) [18:01:42.771] next [18:01:42.771] invokeRestart(restart) [18:01:42.771] muffled <- TRUE [18:01:42.771] break [18:01:42.771] } [18:01:42.771] } [18:01:42.771] } [18:01:42.771] invisible(muffled) [18:01:42.771] } [18:01:42.771] muffleCondition(cond, pattern = "^muffle") [18:01:42.771] } [18:01:42.771] } [18:01:42.771] } [18:01:42.771] })) [18:01:42.771] }, error = function(ex) { [18:01:42.771] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.771] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.771] ...future.rng), started = ...future.startTime, [18:01:42.771] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.771] version = "1.8"), class = "FutureResult") [18:01:42.771] }, finally = { [18:01:42.771] if (!identical(...future.workdir, getwd())) [18:01:42.771] setwd(...future.workdir) [18:01:42.771] { [18:01:42.771] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.771] ...future.oldOptions$nwarnings <- NULL [18:01:42.771] } [18:01:42.771] base::options(...future.oldOptions) [18:01:42.771] if (.Platform$OS.type == "windows") { [18:01:42.771] old_names <- names(...future.oldEnvVars) [18:01:42.771] envs <- base::Sys.getenv() [18:01:42.771] names <- names(envs) [18:01:42.771] common <- intersect(names, old_names) [18:01:42.771] added <- setdiff(names, old_names) [18:01:42.771] removed <- setdiff(old_names, names) [18:01:42.771] changed <- common[...future.oldEnvVars[common] != [18:01:42.771] envs[common]] [18:01:42.771] NAMES <- toupper(changed) [18:01:42.771] args <- list() [18:01:42.771] for (kk in seq_along(NAMES)) { [18:01:42.771] name <- changed[[kk]] [18:01:42.771] NAME <- NAMES[[kk]] [18:01:42.771] if (name != NAME && is.element(NAME, old_names)) [18:01:42.771] next [18:01:42.771] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.771] } [18:01:42.771] NAMES <- toupper(added) [18:01:42.771] for (kk in seq_along(NAMES)) { [18:01:42.771] name <- added[[kk]] [18:01:42.771] NAME <- NAMES[[kk]] [18:01:42.771] if (name != NAME && is.element(NAME, old_names)) [18:01:42.771] next [18:01:42.771] args[[name]] <- "" [18:01:42.771] } [18:01:42.771] NAMES <- toupper(removed) [18:01:42.771] for (kk in seq_along(NAMES)) { [18:01:42.771] name <- removed[[kk]] [18:01:42.771] NAME <- NAMES[[kk]] [18:01:42.771] if (name != NAME && is.element(NAME, old_names)) [18:01:42.771] next [18:01:42.771] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.771] } [18:01:42.771] if (length(args) > 0) [18:01:42.771] base::do.call(base::Sys.setenv, args = args) [18:01:42.771] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.771] } [18:01:42.771] else { [18:01:42.771] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.771] } [18:01:42.771] { [18:01:42.771] if (base::length(...future.futureOptionsAdded) > [18:01:42.771] 0L) { [18:01:42.771] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.771] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.771] base::options(opts) [18:01:42.771] } [18:01:42.771] { [18:01:42.771] { [18:01:42.771] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.771] NULL [18:01:42.771] } [18:01:42.771] options(future.plan = NULL) [18:01:42.771] if (is.na(NA_character_)) [18:01:42.771] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.771] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.771] future::plan(list(function (..., workers = availableCores(), [18:01:42.771] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.771] envir = parent.frame()) [18:01:42.771] { [18:01:42.771] if (is.function(workers)) [18:01:42.771] workers <- workers() [18:01:42.771] workers <- structure(as.integer(workers), [18:01:42.771] class = class(workers)) [18:01:42.771] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.771] workers >= 1) [18:01:42.771] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.771] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.771] } [18:01:42.771] future <- MultisessionFuture(..., workers = workers, [18:01:42.771] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.771] envir = envir) [18:01:42.771] if (!future$lazy) [18:01:42.771] future <- run(future) [18:01:42.771] invisible(future) [18:01:42.771] }), .cleanup = FALSE, .init = FALSE) [18:01:42.771] } [18:01:42.771] } [18:01:42.771] } [18:01:42.771] }) [18:01:42.771] if (TRUE) { [18:01:42.771] base::sink(type = "output", split = FALSE) [18:01:42.771] if (TRUE) { [18:01:42.771] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.771] } [18:01:42.771] else { [18:01:42.771] ...future.result["stdout"] <- base::list(NULL) [18:01:42.771] } [18:01:42.771] base::close(...future.stdout) [18:01:42.771] ...future.stdout <- NULL [18:01:42.771] } [18:01:42.771] ...future.result$conditions <- ...future.conditions [18:01:42.771] ...future.result$finished <- base::Sys.time() [18:01:42.771] ...future.result [18:01:42.771] } [18:01:42.776] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:42.798] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.799] - Validating connection of MultisessionFuture [18:01:42.799] - received message: FutureResult [18:01:42.799] - Received FutureResult [18:01:42.799] - Erased future from FutureRegistry [18:01:42.800] result() for ClusterFuture ... [18:01:42.800] - result already collected: FutureResult [18:01:42.800] result() for ClusterFuture ... done [18:01:42.800] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.800] result() for ClusterFuture ... [18:01:42.800] - result already collected: FutureResult [18:01:42.801] result() for ClusterFuture ... done [18:01:42.801] result() for ClusterFuture ... [18:01:42.801] - result already collected: FutureResult [18:01:42.801] result() for ClusterFuture ... done [18:01:42.802] MultisessionFuture started [18:01:42.803] - Launch lazy future ... done [18:01:42.803] run() for 'MultisessionFuture' ... done Classes 'listenv', 'environment' Classes 'listenv', 'environment' [18:01:42.806] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.806] - Validating connection of MultisessionFuture [18:01:42.807] - received message: FutureResult [18:01:42.807] - Received FutureResult [18:01:42.807] - Erased future from FutureRegistry [18:01:42.807] result() for ClusterFuture ... [18:01:42.807] - result already collected: FutureResult [18:01:42.808] result() for ClusterFuture ... done [18:01:42.808] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.820] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.820] - Validating connection of MultisessionFuture [18:01:42.820] - received message: FutureResult [18:01:42.820] - Received FutureResult [18:01:42.820] - Erased future from FutureRegistry [18:01:42.821] result() for ClusterFuture ... [18:01:42.821] - result already collected: FutureResult [18:01:42.821] result() for ClusterFuture ... done [18:01:42.821] receiveMessageFromWorker() for ClusterFuture ... done Named logi [1:6] TRUE TRUE TRUE TRUE TRUE TRUE - attr(*, "names")= chr [1:6] "a" "b" "c" "d" ... [18:01:42.823] resolve() on list environment ... [18:01:42.823] recursive: 0 [18:01:42.824] length: 6 [18:01:42.825] elements: 'a', 'b', 'c', 'd', '', '' [18:01:42.825] signalConditionsASAP(numeric, pos=1) ... [18:01:42.825] - nx: 6 [18:01:42.825] - relay: TRUE [18:01:42.825] - stdout: TRUE [18:01:42.825] - signal: TRUE [18:01:42.826] - resignal: FALSE [18:01:42.826] - force: TRUE [18:01:42.826] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.826] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.826] - until=2 [18:01:42.826] - relaying element #2 [18:01:42.827] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.827] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.827] signalConditionsASAP(NULL, pos=1) ... done [18:01:42.827] length: 5 (resolved future 1) [18:01:42.827] Future #2 [18:01:42.827] result() for ClusterFuture ... [18:01:42.828] - result already collected: FutureResult [18:01:42.828] result() for ClusterFuture ... done [18:01:42.828] result() for ClusterFuture ... [18:01:42.828] - result already collected: FutureResult [18:01:42.828] result() for ClusterFuture ... done [18:01:42.829] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:42.829] - nx: 6 [18:01:42.829] - relay: TRUE [18:01:42.829] - stdout: TRUE [18:01:42.829] - signal: TRUE [18:01:42.829] - resignal: FALSE [18:01:42.830] - force: TRUE [18:01:42.830] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.830] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.830] - until=2 [18:01:42.830] - relaying element #2 [18:01:42.830] result() for ClusterFuture ... [18:01:42.831] - result already collected: FutureResult [18:01:42.831] result() for ClusterFuture ... done [18:01:42.831] result() for ClusterFuture ... [18:01:42.831] - result already collected: FutureResult [18:01:42.831] result() for ClusterFuture ... done [18:01:42.831] result() for ClusterFuture ... [18:01:42.832] - result already collected: FutureResult [18:01:42.832] result() for ClusterFuture ... done [18:01:42.832] result() for ClusterFuture ... [18:01:42.832] - result already collected: FutureResult [18:01:42.832] result() for ClusterFuture ... done [18:01:42.832] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:42.833] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:42.833] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:42.833] length: 4 (resolved future 2) [18:01:42.833] Future #3 [18:01:42.833] result() for ClusterFuture ... [18:01:42.833] - result already collected: FutureResult [18:01:42.834] result() for ClusterFuture ... done [18:01:42.834] result() for ClusterFuture ... [18:01:42.834] - result already collected: FutureResult [18:01:42.834] result() for ClusterFuture ... done [18:01:42.834] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:42.834] - nx: 6 [18:01:42.835] - relay: TRUE [18:01:42.835] - stdout: TRUE [18:01:42.835] - signal: TRUE [18:01:42.835] - resignal: FALSE [18:01:42.835] - force: TRUE [18:01:42.835] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:42.836] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:42.836] - until=3 [18:01:42.836] - relaying element #3 [18:01:42.836] result() for ClusterFuture ... [18:01:42.836] - result already collected: FutureResult [18:01:42.839] result() for ClusterFuture ... done [18:01:42.840] result() for ClusterFuture ... [18:01:42.840] - result already collected: FutureResult [18:01:42.840] result() for ClusterFuture ... done [18:01:42.840] result() for ClusterFuture ... [18:01:42.840] - result already collected: FutureResult [18:01:42.840] result() for ClusterFuture ... done [18:01:42.841] result() for ClusterFuture ... [18:01:42.841] - result already collected: FutureResult [18:01:42.841] result() for ClusterFuture ... done [18:01:42.841] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:42.841] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:42.841] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:42.842] length: 3 (resolved future 3) [18:01:42.842] Future #4 [18:01:42.842] result() for ClusterFuture ... [18:01:42.842] - result already collected: FutureResult [18:01:42.842] result() for ClusterFuture ... done [18:01:42.842] result() for ClusterFuture ... [18:01:42.843] - result already collected: FutureResult [18:01:42.843] result() for ClusterFuture ... done [18:01:42.843] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:42.843] - nx: 6 [18:01:42.843] - relay: TRUE [18:01:42.843] - stdout: TRUE [18:01:42.843] - signal: TRUE [18:01:42.844] - resignal: FALSE [18:01:42.844] - force: TRUE [18:01:42.844] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:42.844] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:42.844] - until=4 [18:01:42.844] - relaying element #4 [18:01:42.845] result() for ClusterFuture ... [18:01:42.845] - result already collected: FutureResult [18:01:42.845] result() for ClusterFuture ... done [18:01:42.845] result() for ClusterFuture ... [18:01:42.845] - result already collected: FutureResult [18:01:42.845] result() for ClusterFuture ... done [18:01:42.846] result() for ClusterFuture ... [18:01:42.846] - result already collected: FutureResult [18:01:42.846] result() for ClusterFuture ... done [18:01:42.846] result() for ClusterFuture ... [18:01:42.846] - result already collected: FutureResult [18:01:42.846] result() for ClusterFuture ... done [18:01:42.847] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.847] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.847] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:42.847] length: 2 (resolved future 4) [18:01:42.847] signalConditionsASAP(NULL, pos=5) ... [18:01:42.847] - nx: 6 [18:01:42.848] - relay: TRUE [18:01:42.848] - stdout: TRUE [18:01:42.848] - signal: TRUE [18:01:42.848] - resignal: FALSE [18:01:42.848] - force: TRUE [18:01:42.848] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.848] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.849] - until=6 [18:01:42.849] - relaying element #6 [18:01:42.849] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:42.849] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.849] signalConditionsASAP(NULL, pos=5) ... done [18:01:42.849] length: 1 (resolved future 5) [18:01:42.850] signalConditionsASAP(numeric, pos=6) ... [18:01:42.850] - nx: 6 [18:01:42.850] - relay: TRUE [18:01:42.850] - stdout: TRUE [18:01:42.850] - signal: TRUE [18:01:42.850] - resignal: FALSE [18:01:42.850] - force: TRUE [18:01:42.851] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:42.851] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.851] - until=6 [18:01:42.851] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:42.851] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.851] signalConditionsASAP(numeric, pos=6) ... done [18:01:42.852] length: 0 (resolved future 6) [18:01:42.852] Relaying remaining futures [18:01:42.852] signalConditionsASAP(NULL, pos=0) ... [18:01:42.852] - nx: 6 [18:01:42.852] - relay: TRUE [18:01:42.852] - stdout: TRUE [18:01:42.853] - signal: TRUE [18:01:42.853] - resignal: FALSE [18:01:42.853] - force: TRUE [18:01:42.853] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:42.853] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:42.853] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:42.854] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:42.854] signalConditionsASAP(NULL, pos=0) ... done [18:01:42.854] resolve() on list environment ... DONE [18:01:42.854] result() for ClusterFuture ... [18:01:42.854] - result already collected: FutureResult [18:01:42.854] result() for ClusterFuture ... done [18:01:42.855] result() for ClusterFuture ... [18:01:42.855] - result already collected: FutureResult [18:01:42.855] result() for ClusterFuture ... done [18:01:42.855] result() for ClusterFuture ... [18:01:42.855] - result already collected: FutureResult [18:01:42.855] result() for ClusterFuture ... done [18:01:42.856] result() for ClusterFuture ... [18:01:42.856] - result already collected: FutureResult [18:01:42.856] result() for ClusterFuture ... done [18:01:42.856] result() for ClusterFuture ... [18:01:42.856] - result already collected: FutureResult [18:01:42.856] result() for ClusterFuture ... done [18:01:42.857] result() for ClusterFuture ... [18:01:42.857] - result already collected: FutureResult [18:01:42.857] result() for ClusterFuture ... done Classes 'listenv', 'environment' Dimensions: c(1, 6) [18:01:42.858] getGlobalsAndPackages() ... [18:01:42.858] Searching for globals... [18:01:42.858] [18:01:42.858] Searching for globals ... DONE [18:01:42.859] - globals: [0] [18:01:42.859] getGlobalsAndPackages() ... DONE [18:01:42.859] run() for 'Future' ... [18:01:42.859] - state: 'created' [18:01:42.860] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.875] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.875] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.875] - Field: 'node' [18:01:42.875] - Field: 'label' [18:01:42.876] - Field: 'local' [18:01:42.876] - Field: 'owner' [18:01:42.876] - Field: 'envir' [18:01:42.876] - Field: 'workers' [18:01:42.876] - Field: 'packages' [18:01:42.876] - Field: 'gc' [18:01:42.877] - Field: 'conditions' [18:01:42.877] - Field: 'persistent' [18:01:42.877] - Field: 'expr' [18:01:42.877] - Field: 'uuid' [18:01:42.877] - Field: 'seed' [18:01:42.878] - Field: 'version' [18:01:42.878] - Field: 'result' [18:01:42.878] - Field: 'asynchronous' [18:01:42.878] - Field: 'calls' [18:01:42.878] - Field: 'globals' [18:01:42.878] - Field: 'stdout' [18:01:42.879] - Field: 'earlySignal' [18:01:42.879] - Field: 'lazy' [18:01:42.879] - Field: 'state' [18:01:42.879] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.879] - Launch lazy future ... [18:01:42.880] Packages needed by the future expression (n = 0): [18:01:42.880] Packages needed by future strategies (n = 0): [18:01:42.880] { [18:01:42.880] { [18:01:42.880] { [18:01:42.880] ...future.startTime <- base::Sys.time() [18:01:42.880] { [18:01:42.880] { [18:01:42.880] { [18:01:42.880] { [18:01:42.880] base::local({ [18:01:42.880] has_future <- base::requireNamespace("future", [18:01:42.880] quietly = TRUE) [18:01:42.880] if (has_future) { [18:01:42.880] ns <- base::getNamespace("future") [18:01:42.880] version <- ns[[".package"]][["version"]] [18:01:42.880] if (is.null(version)) [18:01:42.880] version <- utils::packageVersion("future") [18:01:42.880] } [18:01:42.880] else { [18:01:42.880] version <- NULL [18:01:42.880] } [18:01:42.880] if (!has_future || version < "1.8.0") { [18:01:42.880] info <- base::c(r_version = base::gsub("R version ", [18:01:42.880] "", base::R.version$version.string), [18:01:42.880] platform = base::sprintf("%s (%s-bit)", [18:01:42.880] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.880] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.880] "release", "version")], collapse = " "), [18:01:42.880] hostname = base::Sys.info()[["nodename"]]) [18:01:42.880] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.880] info) [18:01:42.880] info <- base::paste(info, collapse = "; ") [18:01:42.880] if (!has_future) { [18:01:42.880] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.880] info) [18:01:42.880] } [18:01:42.880] else { [18:01:42.880] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.880] info, version) [18:01:42.880] } [18:01:42.880] base::stop(msg) [18:01:42.880] } [18:01:42.880] }) [18:01:42.880] } [18:01:42.880] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.880] base::options(mc.cores = 1L) [18:01:42.880] } [18:01:42.880] options(future.plan = NULL) [18:01:42.880] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.880] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.880] } [18:01:42.880] ...future.workdir <- getwd() [18:01:42.880] } [18:01:42.880] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.880] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.880] } [18:01:42.880] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.880] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.880] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.880] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.880] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.880] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.880] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.880] base::names(...future.oldOptions)) [18:01:42.880] } [18:01:42.880] if (FALSE) { [18:01:42.880] } [18:01:42.880] else { [18:01:42.880] if (TRUE) { [18:01:42.880] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.880] open = "w") [18:01:42.880] } [18:01:42.880] else { [18:01:42.880] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.880] windows = "NUL", "/dev/null"), open = "w") [18:01:42.880] } [18:01:42.880] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.880] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.880] base::sink(type = "output", split = FALSE) [18:01:42.880] base::close(...future.stdout) [18:01:42.880] }, add = TRUE) [18:01:42.880] } [18:01:42.880] ...future.frame <- base::sys.nframe() [18:01:42.880] ...future.conditions <- base::list() [18:01:42.880] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.880] if (FALSE) { [18:01:42.880] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.880] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.880] } [18:01:42.880] ...future.result <- base::tryCatch({ [18:01:42.880] base::withCallingHandlers({ [18:01:42.880] ...future.value <- base::withVisible(base::local({ [18:01:42.880] ...future.makeSendCondition <- local({ [18:01:42.880] sendCondition <- NULL [18:01:42.880] function(frame = 1L) { [18:01:42.880] if (is.function(sendCondition)) [18:01:42.880] return(sendCondition) [18:01:42.880] ns <- getNamespace("parallel") [18:01:42.880] if (exists("sendData", mode = "function", [18:01:42.880] envir = ns)) { [18:01:42.880] parallel_sendData <- get("sendData", mode = "function", [18:01:42.880] envir = ns) [18:01:42.880] envir <- sys.frame(frame) [18:01:42.880] master <- NULL [18:01:42.880] while (!identical(envir, .GlobalEnv) && [18:01:42.880] !identical(envir, emptyenv())) { [18:01:42.880] if (exists("master", mode = "list", envir = envir, [18:01:42.880] inherits = FALSE)) { [18:01:42.880] master <- get("master", mode = "list", [18:01:42.880] envir = envir, inherits = FALSE) [18:01:42.880] if (inherits(master, c("SOCKnode", [18:01:42.880] "SOCK0node"))) { [18:01:42.880] sendCondition <<- function(cond) { [18:01:42.880] data <- list(type = "VALUE", value = cond, [18:01:42.880] success = TRUE) [18:01:42.880] parallel_sendData(master, data) [18:01:42.880] } [18:01:42.880] return(sendCondition) [18:01:42.880] } [18:01:42.880] } [18:01:42.880] frame <- frame + 1L [18:01:42.880] envir <- sys.frame(frame) [18:01:42.880] } [18:01:42.880] } [18:01:42.880] sendCondition <<- function(cond) NULL [18:01:42.880] } [18:01:42.880] }) [18:01:42.880] withCallingHandlers({ [18:01:42.880] 2 [18:01:42.880] }, immediateCondition = function(cond) { [18:01:42.880] sendCondition <- ...future.makeSendCondition() [18:01:42.880] sendCondition(cond) [18:01:42.880] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.880] { [18:01:42.880] inherits <- base::inherits [18:01:42.880] invokeRestart <- base::invokeRestart [18:01:42.880] is.null <- base::is.null [18:01:42.880] muffled <- FALSE [18:01:42.880] if (inherits(cond, "message")) { [18:01:42.880] muffled <- grepl(pattern, "muffleMessage") [18:01:42.880] if (muffled) [18:01:42.880] invokeRestart("muffleMessage") [18:01:42.880] } [18:01:42.880] else if (inherits(cond, "warning")) { [18:01:42.880] muffled <- grepl(pattern, "muffleWarning") [18:01:42.880] if (muffled) [18:01:42.880] invokeRestart("muffleWarning") [18:01:42.880] } [18:01:42.880] else if (inherits(cond, "condition")) { [18:01:42.880] if (!is.null(pattern)) { [18:01:42.880] computeRestarts <- base::computeRestarts [18:01:42.880] grepl <- base::grepl [18:01:42.880] restarts <- computeRestarts(cond) [18:01:42.880] for (restart in restarts) { [18:01:42.880] name <- restart$name [18:01:42.880] if (is.null(name)) [18:01:42.880] next [18:01:42.880] if (!grepl(pattern, name)) [18:01:42.880] next [18:01:42.880] invokeRestart(restart) [18:01:42.880] muffled <- TRUE [18:01:42.880] break [18:01:42.880] } [18:01:42.880] } [18:01:42.880] } [18:01:42.880] invisible(muffled) [18:01:42.880] } [18:01:42.880] muffleCondition(cond) [18:01:42.880] }) [18:01:42.880] })) [18:01:42.880] future::FutureResult(value = ...future.value$value, [18:01:42.880] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.880] ...future.rng), globalenv = if (FALSE) [18:01:42.880] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.880] ...future.globalenv.names)) [18:01:42.880] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.880] }, condition = base::local({ [18:01:42.880] c <- base::c [18:01:42.880] inherits <- base::inherits [18:01:42.880] invokeRestart <- base::invokeRestart [18:01:42.880] length <- base::length [18:01:42.880] list <- base::list [18:01:42.880] seq.int <- base::seq.int [18:01:42.880] signalCondition <- base::signalCondition [18:01:42.880] sys.calls <- base::sys.calls [18:01:42.880] `[[` <- base::`[[` [18:01:42.880] `+` <- base::`+` [18:01:42.880] `<<-` <- base::`<<-` [18:01:42.880] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.880] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.880] 3L)] [18:01:42.880] } [18:01:42.880] function(cond) { [18:01:42.880] is_error <- inherits(cond, "error") [18:01:42.880] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.880] NULL) [18:01:42.880] if (is_error) { [18:01:42.880] sessionInformation <- function() { [18:01:42.880] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.880] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.880] search = base::search(), system = base::Sys.info()) [18:01:42.880] } [18:01:42.880] ...future.conditions[[length(...future.conditions) + [18:01:42.880] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.880] cond$call), session = sessionInformation(), [18:01:42.880] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.880] signalCondition(cond) [18:01:42.880] } [18:01:42.880] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.880] "immediateCondition"))) { [18:01:42.880] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.880] ...future.conditions[[length(...future.conditions) + [18:01:42.880] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.880] if (TRUE && !signal) { [18:01:42.880] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.880] { [18:01:42.880] inherits <- base::inherits [18:01:42.880] invokeRestart <- base::invokeRestart [18:01:42.880] is.null <- base::is.null [18:01:42.880] muffled <- FALSE [18:01:42.880] if (inherits(cond, "message")) { [18:01:42.880] muffled <- grepl(pattern, "muffleMessage") [18:01:42.880] if (muffled) [18:01:42.880] invokeRestart("muffleMessage") [18:01:42.880] } [18:01:42.880] else if (inherits(cond, "warning")) { [18:01:42.880] muffled <- grepl(pattern, "muffleWarning") [18:01:42.880] if (muffled) [18:01:42.880] invokeRestart("muffleWarning") [18:01:42.880] } [18:01:42.880] else if (inherits(cond, "condition")) { [18:01:42.880] if (!is.null(pattern)) { [18:01:42.880] computeRestarts <- base::computeRestarts [18:01:42.880] grepl <- base::grepl [18:01:42.880] restarts <- computeRestarts(cond) [18:01:42.880] for (restart in restarts) { [18:01:42.880] name <- restart$name [18:01:42.880] if (is.null(name)) [18:01:42.880] next [18:01:42.880] if (!grepl(pattern, name)) [18:01:42.880] next [18:01:42.880] invokeRestart(restart) [18:01:42.880] muffled <- TRUE [18:01:42.880] break [18:01:42.880] } [18:01:42.880] } [18:01:42.880] } [18:01:42.880] invisible(muffled) [18:01:42.880] } [18:01:42.880] muffleCondition(cond, pattern = "^muffle") [18:01:42.880] } [18:01:42.880] } [18:01:42.880] else { [18:01:42.880] if (TRUE) { [18:01:42.880] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.880] { [18:01:42.880] inherits <- base::inherits [18:01:42.880] invokeRestart <- base::invokeRestart [18:01:42.880] is.null <- base::is.null [18:01:42.880] muffled <- FALSE [18:01:42.880] if (inherits(cond, "message")) { [18:01:42.880] muffled <- grepl(pattern, "muffleMessage") [18:01:42.880] if (muffled) [18:01:42.880] invokeRestart("muffleMessage") [18:01:42.880] } [18:01:42.880] else if (inherits(cond, "warning")) { [18:01:42.880] muffled <- grepl(pattern, "muffleWarning") [18:01:42.880] if (muffled) [18:01:42.880] invokeRestart("muffleWarning") [18:01:42.880] } [18:01:42.880] else if (inherits(cond, "condition")) { [18:01:42.880] if (!is.null(pattern)) { [18:01:42.880] computeRestarts <- base::computeRestarts [18:01:42.880] grepl <- base::grepl [18:01:42.880] restarts <- computeRestarts(cond) [18:01:42.880] for (restart in restarts) { [18:01:42.880] name <- restart$name [18:01:42.880] if (is.null(name)) [18:01:42.880] next [18:01:42.880] if (!grepl(pattern, name)) [18:01:42.880] next [18:01:42.880] invokeRestart(restart) [18:01:42.880] muffled <- TRUE [18:01:42.880] break [18:01:42.880] } [18:01:42.880] } [18:01:42.880] } [18:01:42.880] invisible(muffled) [18:01:42.880] } [18:01:42.880] muffleCondition(cond, pattern = "^muffle") [18:01:42.880] } [18:01:42.880] } [18:01:42.880] } [18:01:42.880] })) [18:01:42.880] }, error = function(ex) { [18:01:42.880] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.880] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.880] ...future.rng), started = ...future.startTime, [18:01:42.880] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.880] version = "1.8"), class = "FutureResult") [18:01:42.880] }, finally = { [18:01:42.880] if (!identical(...future.workdir, getwd())) [18:01:42.880] setwd(...future.workdir) [18:01:42.880] { [18:01:42.880] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.880] ...future.oldOptions$nwarnings <- NULL [18:01:42.880] } [18:01:42.880] base::options(...future.oldOptions) [18:01:42.880] if (.Platform$OS.type == "windows") { [18:01:42.880] old_names <- names(...future.oldEnvVars) [18:01:42.880] envs <- base::Sys.getenv() [18:01:42.880] names <- names(envs) [18:01:42.880] common <- intersect(names, old_names) [18:01:42.880] added <- setdiff(names, old_names) [18:01:42.880] removed <- setdiff(old_names, names) [18:01:42.880] changed <- common[...future.oldEnvVars[common] != [18:01:42.880] envs[common]] [18:01:42.880] NAMES <- toupper(changed) [18:01:42.880] args <- list() [18:01:42.880] for (kk in seq_along(NAMES)) { [18:01:42.880] name <- changed[[kk]] [18:01:42.880] NAME <- NAMES[[kk]] [18:01:42.880] if (name != NAME && is.element(NAME, old_names)) [18:01:42.880] next [18:01:42.880] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.880] } [18:01:42.880] NAMES <- toupper(added) [18:01:42.880] for (kk in seq_along(NAMES)) { [18:01:42.880] name <- added[[kk]] [18:01:42.880] NAME <- NAMES[[kk]] [18:01:42.880] if (name != NAME && is.element(NAME, old_names)) [18:01:42.880] next [18:01:42.880] args[[name]] <- "" [18:01:42.880] } [18:01:42.880] NAMES <- toupper(removed) [18:01:42.880] for (kk in seq_along(NAMES)) { [18:01:42.880] name <- removed[[kk]] [18:01:42.880] NAME <- NAMES[[kk]] [18:01:42.880] if (name != NAME && is.element(NAME, old_names)) [18:01:42.880] next [18:01:42.880] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.880] } [18:01:42.880] if (length(args) > 0) [18:01:42.880] base::do.call(base::Sys.setenv, args = args) [18:01:42.880] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.880] } [18:01:42.880] else { [18:01:42.880] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.880] } [18:01:42.880] { [18:01:42.880] if (base::length(...future.futureOptionsAdded) > [18:01:42.880] 0L) { [18:01:42.880] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.880] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.880] base::options(opts) [18:01:42.880] } [18:01:42.880] { [18:01:42.880] { [18:01:42.880] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.880] NULL [18:01:42.880] } [18:01:42.880] options(future.plan = NULL) [18:01:42.880] if (is.na(NA_character_)) [18:01:42.880] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.880] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.880] future::plan(list(function (..., workers = availableCores(), [18:01:42.880] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.880] envir = parent.frame()) [18:01:42.880] { [18:01:42.880] if (is.function(workers)) [18:01:42.880] workers <- workers() [18:01:42.880] workers <- structure(as.integer(workers), [18:01:42.880] class = class(workers)) [18:01:42.880] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.880] workers >= 1) [18:01:42.880] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.880] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.880] } [18:01:42.880] future <- MultisessionFuture(..., workers = workers, [18:01:42.880] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.880] envir = envir) [18:01:42.880] if (!future$lazy) [18:01:42.880] future <- run(future) [18:01:42.880] invisible(future) [18:01:42.880] }), .cleanup = FALSE, .init = FALSE) [18:01:42.880] } [18:01:42.880] } [18:01:42.880] } [18:01:42.880] }) [18:01:42.880] if (TRUE) { [18:01:42.880] base::sink(type = "output", split = FALSE) [18:01:42.880] if (TRUE) { [18:01:42.880] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.880] } [18:01:42.880] else { [18:01:42.880] ...future.result["stdout"] <- base::list(NULL) [18:01:42.880] } [18:01:42.880] base::close(...future.stdout) [18:01:42.880] ...future.stdout <- NULL [18:01:42.880] } [18:01:42.880] ...future.result$conditions <- ...future.conditions [18:01:42.880] ...future.result$finished <- base::Sys.time() [18:01:42.880] ...future.result [18:01:42.880] } [18:01:42.886] MultisessionFuture started [18:01:42.886] - Launch lazy future ... done [18:01:42.887] run() for 'MultisessionFuture' ... done [18:01:42.887] getGlobalsAndPackages() ... [18:01:42.887] Searching for globals... [18:01:42.887] [18:01:42.888] Searching for globals ... DONE [18:01:42.888] - globals: [0] [18:01:42.888] getGlobalsAndPackages() ... DONE [18:01:42.888] run() for 'Future' ... [18:01:42.888] - state: 'created' [18:01:42.889] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.903] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.904] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.904] - Field: 'node' [18:01:42.904] - Field: 'label' [18:01:42.904] - Field: 'local' [18:01:42.904] - Field: 'owner' [18:01:42.905] - Field: 'envir' [18:01:42.905] - Field: 'workers' [18:01:42.905] - Field: 'packages' [18:01:42.905] - Field: 'gc' [18:01:42.905] - Field: 'conditions' [18:01:42.905] - Field: 'persistent' [18:01:42.906] - Field: 'expr' [18:01:42.906] - Field: 'uuid' [18:01:42.906] - Field: 'seed' [18:01:42.906] - Field: 'version' [18:01:42.906] - Field: 'result' [18:01:42.907] - Field: 'asynchronous' [18:01:42.907] - Field: 'calls' [18:01:42.907] - Field: 'globals' [18:01:42.907] - Field: 'stdout' [18:01:42.907] - Field: 'earlySignal' [18:01:42.907] - Field: 'lazy' [18:01:42.908] - Field: 'state' [18:01:42.908] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.908] - Launch lazy future ... [18:01:42.909] Packages needed by the future expression (n = 0): [18:01:42.909] Packages needed by future strategies (n = 0): [18:01:42.910] { [18:01:42.910] { [18:01:42.910] { [18:01:42.910] ...future.startTime <- base::Sys.time() [18:01:42.910] { [18:01:42.910] { [18:01:42.910] { [18:01:42.910] { [18:01:42.910] base::local({ [18:01:42.910] has_future <- base::requireNamespace("future", [18:01:42.910] quietly = TRUE) [18:01:42.910] if (has_future) { [18:01:42.910] ns <- base::getNamespace("future") [18:01:42.910] version <- ns[[".package"]][["version"]] [18:01:42.910] if (is.null(version)) [18:01:42.910] version <- utils::packageVersion("future") [18:01:42.910] } [18:01:42.910] else { [18:01:42.910] version <- NULL [18:01:42.910] } [18:01:42.910] if (!has_future || version < "1.8.0") { [18:01:42.910] info <- base::c(r_version = base::gsub("R version ", [18:01:42.910] "", base::R.version$version.string), [18:01:42.910] platform = base::sprintf("%s (%s-bit)", [18:01:42.910] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.910] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.910] "release", "version")], collapse = " "), [18:01:42.910] hostname = base::Sys.info()[["nodename"]]) [18:01:42.910] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.910] info) [18:01:42.910] info <- base::paste(info, collapse = "; ") [18:01:42.910] if (!has_future) { [18:01:42.910] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.910] info) [18:01:42.910] } [18:01:42.910] else { [18:01:42.910] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.910] info, version) [18:01:42.910] } [18:01:42.910] base::stop(msg) [18:01:42.910] } [18:01:42.910] }) [18:01:42.910] } [18:01:42.910] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.910] base::options(mc.cores = 1L) [18:01:42.910] } [18:01:42.910] options(future.plan = NULL) [18:01:42.910] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.910] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.910] } [18:01:42.910] ...future.workdir <- getwd() [18:01:42.910] } [18:01:42.910] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.910] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.910] } [18:01:42.910] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.910] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.910] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.910] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.910] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.910] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.910] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.910] base::names(...future.oldOptions)) [18:01:42.910] } [18:01:42.910] if (FALSE) { [18:01:42.910] } [18:01:42.910] else { [18:01:42.910] if (TRUE) { [18:01:42.910] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.910] open = "w") [18:01:42.910] } [18:01:42.910] else { [18:01:42.910] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.910] windows = "NUL", "/dev/null"), open = "w") [18:01:42.910] } [18:01:42.910] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.910] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.910] base::sink(type = "output", split = FALSE) [18:01:42.910] base::close(...future.stdout) [18:01:42.910] }, add = TRUE) [18:01:42.910] } [18:01:42.910] ...future.frame <- base::sys.nframe() [18:01:42.910] ...future.conditions <- base::list() [18:01:42.910] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.910] if (FALSE) { [18:01:42.910] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.910] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.910] } [18:01:42.910] ...future.result <- base::tryCatch({ [18:01:42.910] base::withCallingHandlers({ [18:01:42.910] ...future.value <- base::withVisible(base::local({ [18:01:42.910] ...future.makeSendCondition <- local({ [18:01:42.910] sendCondition <- NULL [18:01:42.910] function(frame = 1L) { [18:01:42.910] if (is.function(sendCondition)) [18:01:42.910] return(sendCondition) [18:01:42.910] ns <- getNamespace("parallel") [18:01:42.910] if (exists("sendData", mode = "function", [18:01:42.910] envir = ns)) { [18:01:42.910] parallel_sendData <- get("sendData", mode = "function", [18:01:42.910] envir = ns) [18:01:42.910] envir <- sys.frame(frame) [18:01:42.910] master <- NULL [18:01:42.910] while (!identical(envir, .GlobalEnv) && [18:01:42.910] !identical(envir, emptyenv())) { [18:01:42.910] if (exists("master", mode = "list", envir = envir, [18:01:42.910] inherits = FALSE)) { [18:01:42.910] master <- get("master", mode = "list", [18:01:42.910] envir = envir, inherits = FALSE) [18:01:42.910] if (inherits(master, c("SOCKnode", [18:01:42.910] "SOCK0node"))) { [18:01:42.910] sendCondition <<- function(cond) { [18:01:42.910] data <- list(type = "VALUE", value = cond, [18:01:42.910] success = TRUE) [18:01:42.910] parallel_sendData(master, data) [18:01:42.910] } [18:01:42.910] return(sendCondition) [18:01:42.910] } [18:01:42.910] } [18:01:42.910] frame <- frame + 1L [18:01:42.910] envir <- sys.frame(frame) [18:01:42.910] } [18:01:42.910] } [18:01:42.910] sendCondition <<- function(cond) NULL [18:01:42.910] } [18:01:42.910] }) [18:01:42.910] withCallingHandlers({ [18:01:42.910] NULL [18:01:42.910] }, immediateCondition = function(cond) { [18:01:42.910] sendCondition <- ...future.makeSendCondition() [18:01:42.910] sendCondition(cond) [18:01:42.910] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.910] { [18:01:42.910] inherits <- base::inherits [18:01:42.910] invokeRestart <- base::invokeRestart [18:01:42.910] is.null <- base::is.null [18:01:42.910] muffled <- FALSE [18:01:42.910] if (inherits(cond, "message")) { [18:01:42.910] muffled <- grepl(pattern, "muffleMessage") [18:01:42.910] if (muffled) [18:01:42.910] invokeRestart("muffleMessage") [18:01:42.910] } [18:01:42.910] else if (inherits(cond, "warning")) { [18:01:42.910] muffled <- grepl(pattern, "muffleWarning") [18:01:42.910] if (muffled) [18:01:42.910] invokeRestart("muffleWarning") [18:01:42.910] } [18:01:42.910] else if (inherits(cond, "condition")) { [18:01:42.910] if (!is.null(pattern)) { [18:01:42.910] computeRestarts <- base::computeRestarts [18:01:42.910] grepl <- base::grepl [18:01:42.910] restarts <- computeRestarts(cond) [18:01:42.910] for (restart in restarts) { [18:01:42.910] name <- restart$name [18:01:42.910] if (is.null(name)) [18:01:42.910] next [18:01:42.910] if (!grepl(pattern, name)) [18:01:42.910] next [18:01:42.910] invokeRestart(restart) [18:01:42.910] muffled <- TRUE [18:01:42.910] break [18:01:42.910] } [18:01:42.910] } [18:01:42.910] } [18:01:42.910] invisible(muffled) [18:01:42.910] } [18:01:42.910] muffleCondition(cond) [18:01:42.910] }) [18:01:42.910] })) [18:01:42.910] future::FutureResult(value = ...future.value$value, [18:01:42.910] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.910] ...future.rng), globalenv = if (FALSE) [18:01:42.910] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.910] ...future.globalenv.names)) [18:01:42.910] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.910] }, condition = base::local({ [18:01:42.910] c <- base::c [18:01:42.910] inherits <- base::inherits [18:01:42.910] invokeRestart <- base::invokeRestart [18:01:42.910] length <- base::length [18:01:42.910] list <- base::list [18:01:42.910] seq.int <- base::seq.int [18:01:42.910] signalCondition <- base::signalCondition [18:01:42.910] sys.calls <- base::sys.calls [18:01:42.910] `[[` <- base::`[[` [18:01:42.910] `+` <- base::`+` [18:01:42.910] `<<-` <- base::`<<-` [18:01:42.910] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.910] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.910] 3L)] [18:01:42.910] } [18:01:42.910] function(cond) { [18:01:42.910] is_error <- inherits(cond, "error") [18:01:42.910] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.910] NULL) [18:01:42.910] if (is_error) { [18:01:42.910] sessionInformation <- function() { [18:01:42.910] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.910] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.910] search = base::search(), system = base::Sys.info()) [18:01:42.910] } [18:01:42.910] ...future.conditions[[length(...future.conditions) + [18:01:42.910] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.910] cond$call), session = sessionInformation(), [18:01:42.910] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.910] signalCondition(cond) [18:01:42.910] } [18:01:42.910] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.910] "immediateCondition"))) { [18:01:42.910] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.910] ...future.conditions[[length(...future.conditions) + [18:01:42.910] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.910] if (TRUE && !signal) { [18:01:42.910] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.910] { [18:01:42.910] inherits <- base::inherits [18:01:42.910] invokeRestart <- base::invokeRestart [18:01:42.910] is.null <- base::is.null [18:01:42.910] muffled <- FALSE [18:01:42.910] if (inherits(cond, "message")) { [18:01:42.910] muffled <- grepl(pattern, "muffleMessage") [18:01:42.910] if (muffled) [18:01:42.910] invokeRestart("muffleMessage") [18:01:42.910] } [18:01:42.910] else if (inherits(cond, "warning")) { [18:01:42.910] muffled <- grepl(pattern, "muffleWarning") [18:01:42.910] if (muffled) [18:01:42.910] invokeRestart("muffleWarning") [18:01:42.910] } [18:01:42.910] else if (inherits(cond, "condition")) { [18:01:42.910] if (!is.null(pattern)) { [18:01:42.910] computeRestarts <- base::computeRestarts [18:01:42.910] grepl <- base::grepl [18:01:42.910] restarts <- computeRestarts(cond) [18:01:42.910] for (restart in restarts) { [18:01:42.910] name <- restart$name [18:01:42.910] if (is.null(name)) [18:01:42.910] next [18:01:42.910] if (!grepl(pattern, name)) [18:01:42.910] next [18:01:42.910] invokeRestart(restart) [18:01:42.910] muffled <- TRUE [18:01:42.910] break [18:01:42.910] } [18:01:42.910] } [18:01:42.910] } [18:01:42.910] invisible(muffled) [18:01:42.910] } [18:01:42.910] muffleCondition(cond, pattern = "^muffle") [18:01:42.910] } [18:01:42.910] } [18:01:42.910] else { [18:01:42.910] if (TRUE) { [18:01:42.910] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.910] { [18:01:42.910] inherits <- base::inherits [18:01:42.910] invokeRestart <- base::invokeRestart [18:01:42.910] is.null <- base::is.null [18:01:42.910] muffled <- FALSE [18:01:42.910] if (inherits(cond, "message")) { [18:01:42.910] muffled <- grepl(pattern, "muffleMessage") [18:01:42.910] if (muffled) [18:01:42.910] invokeRestart("muffleMessage") [18:01:42.910] } [18:01:42.910] else if (inherits(cond, "warning")) { [18:01:42.910] muffled <- grepl(pattern, "muffleWarning") [18:01:42.910] if (muffled) [18:01:42.910] invokeRestart("muffleWarning") [18:01:42.910] } [18:01:42.910] else if (inherits(cond, "condition")) { [18:01:42.910] if (!is.null(pattern)) { [18:01:42.910] computeRestarts <- base::computeRestarts [18:01:42.910] grepl <- base::grepl [18:01:42.910] restarts <- computeRestarts(cond) [18:01:42.910] for (restart in restarts) { [18:01:42.910] name <- restart$name [18:01:42.910] if (is.null(name)) [18:01:42.910] next [18:01:42.910] if (!grepl(pattern, name)) [18:01:42.910] next [18:01:42.910] invokeRestart(restart) [18:01:42.910] muffled <- TRUE [18:01:42.910] break [18:01:42.910] } [18:01:42.910] } [18:01:42.910] } [18:01:42.910] invisible(muffled) [18:01:42.910] } [18:01:42.910] muffleCondition(cond, pattern = "^muffle") [18:01:42.910] } [18:01:42.910] } [18:01:42.910] } [18:01:42.910] })) [18:01:42.910] }, error = function(ex) { [18:01:42.910] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.910] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.910] ...future.rng), started = ...future.startTime, [18:01:42.910] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.910] version = "1.8"), class = "FutureResult") [18:01:42.910] }, finally = { [18:01:42.910] if (!identical(...future.workdir, getwd())) [18:01:42.910] setwd(...future.workdir) [18:01:42.910] { [18:01:42.910] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.910] ...future.oldOptions$nwarnings <- NULL [18:01:42.910] } [18:01:42.910] base::options(...future.oldOptions) [18:01:42.910] if (.Platform$OS.type == "windows") { [18:01:42.910] old_names <- names(...future.oldEnvVars) [18:01:42.910] envs <- base::Sys.getenv() [18:01:42.910] names <- names(envs) [18:01:42.910] common <- intersect(names, old_names) [18:01:42.910] added <- setdiff(names, old_names) [18:01:42.910] removed <- setdiff(old_names, names) [18:01:42.910] changed <- common[...future.oldEnvVars[common] != [18:01:42.910] envs[common]] [18:01:42.910] NAMES <- toupper(changed) [18:01:42.910] args <- list() [18:01:42.910] for (kk in seq_along(NAMES)) { [18:01:42.910] name <- changed[[kk]] [18:01:42.910] NAME <- NAMES[[kk]] [18:01:42.910] if (name != NAME && is.element(NAME, old_names)) [18:01:42.910] next [18:01:42.910] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.910] } [18:01:42.910] NAMES <- toupper(added) [18:01:42.910] for (kk in seq_along(NAMES)) { [18:01:42.910] name <- added[[kk]] [18:01:42.910] NAME <- NAMES[[kk]] [18:01:42.910] if (name != NAME && is.element(NAME, old_names)) [18:01:42.910] next [18:01:42.910] args[[name]] <- "" [18:01:42.910] } [18:01:42.910] NAMES <- toupper(removed) [18:01:42.910] for (kk in seq_along(NAMES)) { [18:01:42.910] name <- removed[[kk]] [18:01:42.910] NAME <- NAMES[[kk]] [18:01:42.910] if (name != NAME && is.element(NAME, old_names)) [18:01:42.910] next [18:01:42.910] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.910] } [18:01:42.910] if (length(args) > 0) [18:01:42.910] base::do.call(base::Sys.setenv, args = args) [18:01:42.910] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.910] } [18:01:42.910] else { [18:01:42.910] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.910] } [18:01:42.910] { [18:01:42.910] if (base::length(...future.futureOptionsAdded) > [18:01:42.910] 0L) { [18:01:42.910] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.910] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.910] base::options(opts) [18:01:42.910] } [18:01:42.910] { [18:01:42.910] { [18:01:42.910] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.910] NULL [18:01:42.910] } [18:01:42.910] options(future.plan = NULL) [18:01:42.910] if (is.na(NA_character_)) [18:01:42.910] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.910] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.910] future::plan(list(function (..., workers = availableCores(), [18:01:42.910] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.910] envir = parent.frame()) [18:01:42.910] { [18:01:42.910] if (is.function(workers)) [18:01:42.910] workers <- workers() [18:01:42.910] workers <- structure(as.integer(workers), [18:01:42.910] class = class(workers)) [18:01:42.910] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.910] workers >= 1) [18:01:42.910] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.910] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.910] } [18:01:42.910] future <- MultisessionFuture(..., workers = workers, [18:01:42.910] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.910] envir = envir) [18:01:42.910] if (!future$lazy) [18:01:42.910] future <- run(future) [18:01:42.910] invisible(future) [18:01:42.910] }), .cleanup = FALSE, .init = FALSE) [18:01:42.910] } [18:01:42.910] } [18:01:42.910] } [18:01:42.910] }) [18:01:42.910] if (TRUE) { [18:01:42.910] base::sink(type = "output", split = FALSE) [18:01:42.910] if (TRUE) { [18:01:42.910] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.910] } [18:01:42.910] else { [18:01:42.910] ...future.result["stdout"] <- base::list(NULL) [18:01:42.910] } [18:01:42.910] base::close(...future.stdout) [18:01:42.910] ...future.stdout <- NULL [18:01:42.910] } [18:01:42.910] ...future.result$conditions <- ...future.conditions [18:01:42.910] ...future.result$finished <- base::Sys.time() [18:01:42.910] ...future.result [18:01:42.910] } [18:01:42.917] MultisessionFuture started [18:01:42.917] - Launch lazy future ... done [18:01:42.918] run() for 'MultisessionFuture' ... done [18:01:42.918] getGlobalsAndPackages() ... [18:01:42.919] Searching for globals... [18:01:42.920] - globals found: [1] '{' [18:01:42.920] Searching for globals ... DONE [18:01:42.920] Resolving globals: FALSE [18:01:42.921] [18:01:42.921] [18:01:42.921] getGlobalsAndPackages() ... DONE [18:01:42.922] run() for 'Future' ... [18:01:42.922] - state: 'created' [18:01:42.922] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:42.937] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:42.937] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:42.937] - Field: 'node' [18:01:42.938] - Field: 'label' [18:01:42.938] - Field: 'local' [18:01:42.938] - Field: 'owner' [18:01:42.938] - Field: 'envir' [18:01:42.938] - Field: 'workers' [18:01:42.938] - Field: 'packages' [18:01:42.939] - Field: 'gc' [18:01:42.939] - Field: 'conditions' [18:01:42.939] - Field: 'persistent' [18:01:42.939] - Field: 'expr' [18:01:42.939] - Field: 'uuid' [18:01:42.940] - Field: 'seed' [18:01:42.940] - Field: 'version' [18:01:42.940] - Field: 'result' [18:01:42.940] - Field: 'asynchronous' [18:01:42.940] - Field: 'calls' [18:01:42.940] - Field: 'globals' [18:01:42.941] - Field: 'stdout' [18:01:42.941] - Field: 'earlySignal' [18:01:42.941] - Field: 'lazy' [18:01:42.941] - Field: 'state' [18:01:42.941] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:42.942] - Launch lazy future ... [18:01:42.942] Packages needed by the future expression (n = 0): [18:01:42.942] Packages needed by future strategies (n = 0): [18:01:42.943] { [18:01:42.943] { [18:01:42.943] { [18:01:42.943] ...future.startTime <- base::Sys.time() [18:01:42.943] { [18:01:42.943] { [18:01:42.943] { [18:01:42.943] { [18:01:42.943] base::local({ [18:01:42.943] has_future <- base::requireNamespace("future", [18:01:42.943] quietly = TRUE) [18:01:42.943] if (has_future) { [18:01:42.943] ns <- base::getNamespace("future") [18:01:42.943] version <- ns[[".package"]][["version"]] [18:01:42.943] if (is.null(version)) [18:01:42.943] version <- utils::packageVersion("future") [18:01:42.943] } [18:01:42.943] else { [18:01:42.943] version <- NULL [18:01:42.943] } [18:01:42.943] if (!has_future || version < "1.8.0") { [18:01:42.943] info <- base::c(r_version = base::gsub("R version ", [18:01:42.943] "", base::R.version$version.string), [18:01:42.943] platform = base::sprintf("%s (%s-bit)", [18:01:42.943] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:42.943] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:42.943] "release", "version")], collapse = " "), [18:01:42.943] hostname = base::Sys.info()[["nodename"]]) [18:01:42.943] info <- base::sprintf("%s: %s", base::names(info), [18:01:42.943] info) [18:01:42.943] info <- base::paste(info, collapse = "; ") [18:01:42.943] if (!has_future) { [18:01:42.943] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:42.943] info) [18:01:42.943] } [18:01:42.943] else { [18:01:42.943] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:42.943] info, version) [18:01:42.943] } [18:01:42.943] base::stop(msg) [18:01:42.943] } [18:01:42.943] }) [18:01:42.943] } [18:01:42.943] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:42.943] base::options(mc.cores = 1L) [18:01:42.943] } [18:01:42.943] options(future.plan = NULL) [18:01:42.943] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.943] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:42.943] } [18:01:42.943] ...future.workdir <- getwd() [18:01:42.943] } [18:01:42.943] ...future.oldOptions <- base::as.list(base::.Options) [18:01:42.943] ...future.oldEnvVars <- base::Sys.getenv() [18:01:42.943] } [18:01:42.943] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:42.943] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:42.943] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:42.943] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:42.943] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:42.943] future.stdout.windows.reencode = NULL, width = 80L) [18:01:42.943] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:42.943] base::names(...future.oldOptions)) [18:01:42.943] } [18:01:42.943] if (FALSE) { [18:01:42.943] } [18:01:42.943] else { [18:01:42.943] if (TRUE) { [18:01:42.943] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:42.943] open = "w") [18:01:42.943] } [18:01:42.943] else { [18:01:42.943] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:42.943] windows = "NUL", "/dev/null"), open = "w") [18:01:42.943] } [18:01:42.943] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:42.943] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:42.943] base::sink(type = "output", split = FALSE) [18:01:42.943] base::close(...future.stdout) [18:01:42.943] }, add = TRUE) [18:01:42.943] } [18:01:42.943] ...future.frame <- base::sys.nframe() [18:01:42.943] ...future.conditions <- base::list() [18:01:42.943] ...future.rng <- base::globalenv()$.Random.seed [18:01:42.943] if (FALSE) { [18:01:42.943] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:42.943] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:42.943] } [18:01:42.943] ...future.result <- base::tryCatch({ [18:01:42.943] base::withCallingHandlers({ [18:01:42.943] ...future.value <- base::withVisible(base::local({ [18:01:42.943] ...future.makeSendCondition <- local({ [18:01:42.943] sendCondition <- NULL [18:01:42.943] function(frame = 1L) { [18:01:42.943] if (is.function(sendCondition)) [18:01:42.943] return(sendCondition) [18:01:42.943] ns <- getNamespace("parallel") [18:01:42.943] if (exists("sendData", mode = "function", [18:01:42.943] envir = ns)) { [18:01:42.943] parallel_sendData <- get("sendData", mode = "function", [18:01:42.943] envir = ns) [18:01:42.943] envir <- sys.frame(frame) [18:01:42.943] master <- NULL [18:01:42.943] while (!identical(envir, .GlobalEnv) && [18:01:42.943] !identical(envir, emptyenv())) { [18:01:42.943] if (exists("master", mode = "list", envir = envir, [18:01:42.943] inherits = FALSE)) { [18:01:42.943] master <- get("master", mode = "list", [18:01:42.943] envir = envir, inherits = FALSE) [18:01:42.943] if (inherits(master, c("SOCKnode", [18:01:42.943] "SOCK0node"))) { [18:01:42.943] sendCondition <<- function(cond) { [18:01:42.943] data <- list(type = "VALUE", value = cond, [18:01:42.943] success = TRUE) [18:01:42.943] parallel_sendData(master, data) [18:01:42.943] } [18:01:42.943] return(sendCondition) [18:01:42.943] } [18:01:42.943] } [18:01:42.943] frame <- frame + 1L [18:01:42.943] envir <- sys.frame(frame) [18:01:42.943] } [18:01:42.943] } [18:01:42.943] sendCondition <<- function(cond) NULL [18:01:42.943] } [18:01:42.943] }) [18:01:42.943] withCallingHandlers({ [18:01:42.943] { [18:01:42.943] 4 [18:01:42.943] } [18:01:42.943] }, immediateCondition = function(cond) { [18:01:42.943] sendCondition <- ...future.makeSendCondition() [18:01:42.943] sendCondition(cond) [18:01:42.943] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.943] { [18:01:42.943] inherits <- base::inherits [18:01:42.943] invokeRestart <- base::invokeRestart [18:01:42.943] is.null <- base::is.null [18:01:42.943] muffled <- FALSE [18:01:42.943] if (inherits(cond, "message")) { [18:01:42.943] muffled <- grepl(pattern, "muffleMessage") [18:01:42.943] if (muffled) [18:01:42.943] invokeRestart("muffleMessage") [18:01:42.943] } [18:01:42.943] else if (inherits(cond, "warning")) { [18:01:42.943] muffled <- grepl(pattern, "muffleWarning") [18:01:42.943] if (muffled) [18:01:42.943] invokeRestart("muffleWarning") [18:01:42.943] } [18:01:42.943] else if (inherits(cond, "condition")) { [18:01:42.943] if (!is.null(pattern)) { [18:01:42.943] computeRestarts <- base::computeRestarts [18:01:42.943] grepl <- base::grepl [18:01:42.943] restarts <- computeRestarts(cond) [18:01:42.943] for (restart in restarts) { [18:01:42.943] name <- restart$name [18:01:42.943] if (is.null(name)) [18:01:42.943] next [18:01:42.943] if (!grepl(pattern, name)) [18:01:42.943] next [18:01:42.943] invokeRestart(restart) [18:01:42.943] muffled <- TRUE [18:01:42.943] break [18:01:42.943] } [18:01:42.943] } [18:01:42.943] } [18:01:42.943] invisible(muffled) [18:01:42.943] } [18:01:42.943] muffleCondition(cond) [18:01:42.943] }) [18:01:42.943] })) [18:01:42.943] future::FutureResult(value = ...future.value$value, [18:01:42.943] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.943] ...future.rng), globalenv = if (FALSE) [18:01:42.943] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:42.943] ...future.globalenv.names)) [18:01:42.943] else NULL, started = ...future.startTime, version = "1.8") [18:01:42.943] }, condition = base::local({ [18:01:42.943] c <- base::c [18:01:42.943] inherits <- base::inherits [18:01:42.943] invokeRestart <- base::invokeRestart [18:01:42.943] length <- base::length [18:01:42.943] list <- base::list [18:01:42.943] seq.int <- base::seq.int [18:01:42.943] signalCondition <- base::signalCondition [18:01:42.943] sys.calls <- base::sys.calls [18:01:42.943] `[[` <- base::`[[` [18:01:42.943] `+` <- base::`+` [18:01:42.943] `<<-` <- base::`<<-` [18:01:42.943] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:42.943] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:42.943] 3L)] [18:01:42.943] } [18:01:42.943] function(cond) { [18:01:42.943] is_error <- inherits(cond, "error") [18:01:42.943] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:42.943] NULL) [18:01:42.943] if (is_error) { [18:01:42.943] sessionInformation <- function() { [18:01:42.943] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:42.943] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:42.943] search = base::search(), system = base::Sys.info()) [18:01:42.943] } [18:01:42.943] ...future.conditions[[length(...future.conditions) + [18:01:42.943] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:42.943] cond$call), session = sessionInformation(), [18:01:42.943] timestamp = base::Sys.time(), signaled = 0L) [18:01:42.943] signalCondition(cond) [18:01:42.943] } [18:01:42.943] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:42.943] "immediateCondition"))) { [18:01:42.943] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:42.943] ...future.conditions[[length(...future.conditions) + [18:01:42.943] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:42.943] if (TRUE && !signal) { [18:01:42.943] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.943] { [18:01:42.943] inherits <- base::inherits [18:01:42.943] invokeRestart <- base::invokeRestart [18:01:42.943] is.null <- base::is.null [18:01:42.943] muffled <- FALSE [18:01:42.943] if (inherits(cond, "message")) { [18:01:42.943] muffled <- grepl(pattern, "muffleMessage") [18:01:42.943] if (muffled) [18:01:42.943] invokeRestart("muffleMessage") [18:01:42.943] } [18:01:42.943] else if (inherits(cond, "warning")) { [18:01:42.943] muffled <- grepl(pattern, "muffleWarning") [18:01:42.943] if (muffled) [18:01:42.943] invokeRestart("muffleWarning") [18:01:42.943] } [18:01:42.943] else if (inherits(cond, "condition")) { [18:01:42.943] if (!is.null(pattern)) { [18:01:42.943] computeRestarts <- base::computeRestarts [18:01:42.943] grepl <- base::grepl [18:01:42.943] restarts <- computeRestarts(cond) [18:01:42.943] for (restart in restarts) { [18:01:42.943] name <- restart$name [18:01:42.943] if (is.null(name)) [18:01:42.943] next [18:01:42.943] if (!grepl(pattern, name)) [18:01:42.943] next [18:01:42.943] invokeRestart(restart) [18:01:42.943] muffled <- TRUE [18:01:42.943] break [18:01:42.943] } [18:01:42.943] } [18:01:42.943] } [18:01:42.943] invisible(muffled) [18:01:42.943] } [18:01:42.943] muffleCondition(cond, pattern = "^muffle") [18:01:42.943] } [18:01:42.943] } [18:01:42.943] else { [18:01:42.943] if (TRUE) { [18:01:42.943] muffleCondition <- function (cond, pattern = "^muffle") [18:01:42.943] { [18:01:42.943] inherits <- base::inherits [18:01:42.943] invokeRestart <- base::invokeRestart [18:01:42.943] is.null <- base::is.null [18:01:42.943] muffled <- FALSE [18:01:42.943] if (inherits(cond, "message")) { [18:01:42.943] muffled <- grepl(pattern, "muffleMessage") [18:01:42.943] if (muffled) [18:01:42.943] invokeRestart("muffleMessage") [18:01:42.943] } [18:01:42.943] else if (inherits(cond, "warning")) { [18:01:42.943] muffled <- grepl(pattern, "muffleWarning") [18:01:42.943] if (muffled) [18:01:42.943] invokeRestart("muffleWarning") [18:01:42.943] } [18:01:42.943] else if (inherits(cond, "condition")) { [18:01:42.943] if (!is.null(pattern)) { [18:01:42.943] computeRestarts <- base::computeRestarts [18:01:42.943] grepl <- base::grepl [18:01:42.943] restarts <- computeRestarts(cond) [18:01:42.943] for (restart in restarts) { [18:01:42.943] name <- restart$name [18:01:42.943] if (is.null(name)) [18:01:42.943] next [18:01:42.943] if (!grepl(pattern, name)) [18:01:42.943] next [18:01:42.943] invokeRestart(restart) [18:01:42.943] muffled <- TRUE [18:01:42.943] break [18:01:42.943] } [18:01:42.943] } [18:01:42.943] } [18:01:42.943] invisible(muffled) [18:01:42.943] } [18:01:42.943] muffleCondition(cond, pattern = "^muffle") [18:01:42.943] } [18:01:42.943] } [18:01:42.943] } [18:01:42.943] })) [18:01:42.943] }, error = function(ex) { [18:01:42.943] base::structure(base::list(value = NULL, visible = NULL, [18:01:42.943] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:42.943] ...future.rng), started = ...future.startTime, [18:01:42.943] finished = Sys.time(), session_uuid = NA_character_, [18:01:42.943] version = "1.8"), class = "FutureResult") [18:01:42.943] }, finally = { [18:01:42.943] if (!identical(...future.workdir, getwd())) [18:01:42.943] setwd(...future.workdir) [18:01:42.943] { [18:01:42.943] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:42.943] ...future.oldOptions$nwarnings <- NULL [18:01:42.943] } [18:01:42.943] base::options(...future.oldOptions) [18:01:42.943] if (.Platform$OS.type == "windows") { [18:01:42.943] old_names <- names(...future.oldEnvVars) [18:01:42.943] envs <- base::Sys.getenv() [18:01:42.943] names <- names(envs) [18:01:42.943] common <- intersect(names, old_names) [18:01:42.943] added <- setdiff(names, old_names) [18:01:42.943] removed <- setdiff(old_names, names) [18:01:42.943] changed <- common[...future.oldEnvVars[common] != [18:01:42.943] envs[common]] [18:01:42.943] NAMES <- toupper(changed) [18:01:42.943] args <- list() [18:01:42.943] for (kk in seq_along(NAMES)) { [18:01:42.943] name <- changed[[kk]] [18:01:42.943] NAME <- NAMES[[kk]] [18:01:42.943] if (name != NAME && is.element(NAME, old_names)) [18:01:42.943] next [18:01:42.943] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.943] } [18:01:42.943] NAMES <- toupper(added) [18:01:42.943] for (kk in seq_along(NAMES)) { [18:01:42.943] name <- added[[kk]] [18:01:42.943] NAME <- NAMES[[kk]] [18:01:42.943] if (name != NAME && is.element(NAME, old_names)) [18:01:42.943] next [18:01:42.943] args[[name]] <- "" [18:01:42.943] } [18:01:42.943] NAMES <- toupper(removed) [18:01:42.943] for (kk in seq_along(NAMES)) { [18:01:42.943] name <- removed[[kk]] [18:01:42.943] NAME <- NAMES[[kk]] [18:01:42.943] if (name != NAME && is.element(NAME, old_names)) [18:01:42.943] next [18:01:42.943] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:42.943] } [18:01:42.943] if (length(args) > 0) [18:01:42.943] base::do.call(base::Sys.setenv, args = args) [18:01:42.943] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:42.943] } [18:01:42.943] else { [18:01:42.943] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:42.943] } [18:01:42.943] { [18:01:42.943] if (base::length(...future.futureOptionsAdded) > [18:01:42.943] 0L) { [18:01:42.943] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:42.943] base::names(opts) <- ...future.futureOptionsAdded [18:01:42.943] base::options(opts) [18:01:42.943] } [18:01:42.943] { [18:01:42.943] { [18:01:42.943] base::options(mc.cores = ...future.mc.cores.old) [18:01:42.943] NULL [18:01:42.943] } [18:01:42.943] options(future.plan = NULL) [18:01:42.943] if (is.na(NA_character_)) [18:01:42.943] Sys.unsetenv("R_FUTURE_PLAN") [18:01:42.943] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:42.943] future::plan(list(function (..., workers = availableCores(), [18:01:42.943] lazy = FALSE, rscript_libs = .libPaths(), [18:01:42.943] envir = parent.frame()) [18:01:42.943] { [18:01:42.943] if (is.function(workers)) [18:01:42.943] workers <- workers() [18:01:42.943] workers <- structure(as.integer(workers), [18:01:42.943] class = class(workers)) [18:01:42.943] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:42.943] workers >= 1) [18:01:42.943] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:42.943] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:42.943] } [18:01:42.943] future <- MultisessionFuture(..., workers = workers, [18:01:42.943] lazy = lazy, rscript_libs = rscript_libs, [18:01:42.943] envir = envir) [18:01:42.943] if (!future$lazy) [18:01:42.943] future <- run(future) [18:01:42.943] invisible(future) [18:01:42.943] }), .cleanup = FALSE, .init = FALSE) [18:01:42.943] } [18:01:42.943] } [18:01:42.943] } [18:01:42.943] }) [18:01:42.943] if (TRUE) { [18:01:42.943] base::sink(type = "output", split = FALSE) [18:01:42.943] if (TRUE) { [18:01:42.943] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:42.943] } [18:01:42.943] else { [18:01:42.943] ...future.result["stdout"] <- base::list(NULL) [18:01:42.943] } [18:01:42.943] base::close(...future.stdout) [18:01:42.943] ...future.stdout <- NULL [18:01:42.943] } [18:01:42.943] ...future.result$conditions <- ...future.conditions [18:01:42.943] ...future.result$finished <- base::Sys.time() [18:01:42.943] ...future.result [18:01:42.943] } [18:01:42.948] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:42.970] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.970] - Validating connection of MultisessionFuture [18:01:42.971] - received message: FutureResult [18:01:42.971] - Received FutureResult [18:01:42.971] - Erased future from FutureRegistry [18:01:42.971] result() for ClusterFuture ... [18:01:42.971] - result already collected: FutureResult [18:01:42.972] result() for ClusterFuture ... done [18:01:42.972] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.972] result() for ClusterFuture ... [18:01:42.972] - result already collected: FutureResult [18:01:42.972] result() for ClusterFuture ... done [18:01:42.972] result() for ClusterFuture ... [18:01:42.973] - result already collected: FutureResult [18:01:42.973] result() for ClusterFuture ... done [18:01:42.974] MultisessionFuture started [18:01:42.974] - Launch lazy future ... done [18:01:42.974] 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" ... [18:01:42.979] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.979] - Validating connection of MultisessionFuture [18:01:42.979] - received message: FutureResult [18:01:42.979] - Received FutureResult [18:01:42.980] - Erased future from FutureRegistry [18:01:42.980] result() for ClusterFuture ... [18:01:42.980] - result already collected: FutureResult [18:01:42.980] result() for ClusterFuture ... done [18:01:42.980] receiveMessageFromWorker() for ClusterFuture ... done [18:01:42.990] receiveMessageFromWorker() for ClusterFuture ... [18:01:42.990] - Validating connection of MultisessionFuture [18:01:42.991] - received message: FutureResult [18:01:42.991] - Received FutureResult [18:01:42.991] - Erased future from FutureRegistry [18:01:42.991] result() for ClusterFuture ... [18:01:42.991] - result already collected: FutureResult [18:01:42.991] result() for ClusterFuture ... done [18:01:42.992] 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" ... [18:01:42.994] resolve() on list environment ... [18:01:42.995] recursive: 0 [18:01:42.996] length: 6 [18:01:42.996] elements: 'a', 'b', 'c', 'd', '', '' [18:01:42.996] signalConditionsASAP(numeric, pos=1) ... [18:01:42.996] - nx: 6 [18:01:42.996] - relay: TRUE [18:01:42.997] - stdout: TRUE [18:01:42.997] - signal: TRUE [18:01:42.997] - resignal: FALSE [18:01:42.997] - force: TRUE [18:01:42.997] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.997] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.998] - until=2 [18:01:42.998] - relaying element #2 [18:01:42.998] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.998] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:42.998] signalConditionsASAP(NULL, pos=1) ... done [18:01:42.998] length: 5 (resolved future 1) [18:01:42.999] Future #2 [18:01:42.999] result() for ClusterFuture ... [18:01:42.999] - result already collected: FutureResult [18:01:42.999] result() for ClusterFuture ... done [18:01:42.999] result() for ClusterFuture ... [18:01:42.999] - result already collected: FutureResult [18:01:43.000] result() for ClusterFuture ... done [18:01:43.000] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:43.000] - nx: 6 [18:01:43.000] - relay: TRUE [18:01:43.000] - stdout: TRUE [18:01:43.000] - signal: TRUE [18:01:43.000] - resignal: FALSE [18:01:43.001] - force: TRUE [18:01:43.001] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.001] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.001] - until=2 [18:01:43.001] - relaying element #2 [18:01:43.001] result() for ClusterFuture ... [18:01:43.002] - result already collected: FutureResult [18:01:43.002] result() for ClusterFuture ... done [18:01:43.002] result() for ClusterFuture ... [18:01:43.002] - result already collected: FutureResult [18:01:43.002] result() for ClusterFuture ... done [18:01:43.002] result() for ClusterFuture ... [18:01:43.003] - result already collected: FutureResult [18:01:43.003] result() for ClusterFuture ... done [18:01:43.003] result() for ClusterFuture ... [18:01:43.003] - result already collected: FutureResult [18:01:43.003] result() for ClusterFuture ... done [18:01:43.003] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.004] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.004] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:43.004] length: 4 (resolved future 2) [18:01:43.004] Future #3 [18:01:43.004] result() for ClusterFuture ... [18:01:43.004] - result already collected: FutureResult [18:01:43.005] result() for ClusterFuture ... done [18:01:43.005] result() for ClusterFuture ... [18:01:43.005] - result already collected: FutureResult [18:01:43.005] result() for ClusterFuture ... done [18:01:43.005] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:43.005] - nx: 6 [18:01:43.006] - relay: TRUE [18:01:43.006] - stdout: TRUE [18:01:43.006] - signal: TRUE [18:01:43.006] - resignal: FALSE [18:01:43.006] - force: TRUE [18:01:43.006] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.006] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.007] - until=3 [18:01:43.007] - relaying element #3 [18:01:43.007] result() for ClusterFuture ... [18:01:43.007] - result already collected: FutureResult [18:01:43.007] result() for ClusterFuture ... done [18:01:43.007] result() for ClusterFuture ... [18:01:43.008] - result already collected: FutureResult [18:01:43.008] result() for ClusterFuture ... done [18:01:43.008] result() for ClusterFuture ... [18:01:43.008] - result already collected: FutureResult [18:01:43.008] result() for ClusterFuture ... done [18:01:43.008] result() for ClusterFuture ... [18:01:43.009] - result already collected: FutureResult [18:01:43.009] result() for ClusterFuture ... done [18:01:43.009] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.009] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.009] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:43.009] length: 3 (resolved future 3) [18:01:43.010] Future #4 [18:01:43.010] result() for ClusterFuture ... [18:01:43.010] - result already collected: FutureResult [18:01:43.010] result() for ClusterFuture ... done [18:01:43.010] result() for ClusterFuture ... [18:01:43.010] - result already collected: FutureResult [18:01:43.010] result() for ClusterFuture ... done [18:01:43.011] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:43.011] - nx: 6 [18:01:43.011] - relay: TRUE [18:01:43.011] - stdout: TRUE [18:01:43.011] - signal: TRUE [18:01:43.011] - resignal: FALSE [18:01:43.012] - force: TRUE [18:01:43.012] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.012] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.012] - until=4 [18:01:43.012] - relaying element #4 [18:01:43.012] result() for ClusterFuture ... [18:01:43.013] - result already collected: FutureResult [18:01:43.013] result() for ClusterFuture ... done [18:01:43.013] result() for ClusterFuture ... [18:01:43.013] - result already collected: FutureResult [18:01:43.013] result() for ClusterFuture ... done [18:01:43.013] result() for ClusterFuture ... [18:01:43.014] - result already collected: FutureResult [18:01:43.014] result() for ClusterFuture ... done [18:01:43.014] result() for ClusterFuture ... [18:01:43.014] - result already collected: FutureResult [18:01:43.014] result() for ClusterFuture ... done [18:01:43.014] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.015] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.015] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:43.015] length: 2 (resolved future 4) [18:01:43.015] signalConditionsASAP(NULL, pos=5) ... [18:01:43.015] - nx: 6 [18:01:43.015] - relay: TRUE [18:01:43.016] - stdout: TRUE [18:01:43.016] - signal: TRUE [18:01:43.016] - resignal: FALSE [18:01:43.016] - force: TRUE [18:01:43.016] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.016] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.016] - until=6 [18:01:43.017] - relaying element #6 [18:01:43.017] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.017] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.017] signalConditionsASAP(NULL, pos=5) ... done [18:01:43.017] length: 1 (resolved future 5) [18:01:43.017] signalConditionsASAP(numeric, pos=6) ... [18:01:43.018] - nx: 6 [18:01:43.018] - relay: TRUE [18:01:43.018] - stdout: TRUE [18:01:43.018] - signal: TRUE [18:01:43.018] - resignal: FALSE [18:01:43.018] - force: TRUE [18:01:43.019] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.019] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.019] - until=6 [18:01:43.019] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.019] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.019] signalConditionsASAP(numeric, pos=6) ... done [18:01:43.020] length: 0 (resolved future 6) [18:01:43.020] Relaying remaining futures [18:01:43.020] signalConditionsASAP(NULL, pos=0) ... [18:01:43.020] - nx: 6 [18:01:43.020] - relay: TRUE [18:01:43.020] - stdout: TRUE [18:01:43.020] - signal: TRUE [18:01:43.021] - resignal: FALSE [18:01:43.021] - force: TRUE [18:01:43.021] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.021] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:43.022] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.022] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.022] signalConditionsASAP(NULL, pos=0) ... done [18:01:43.022] resolve() on list environment ... DONE [18:01:43.022] result() for ClusterFuture ... [18:01:43.022] - result already collected: FutureResult [18:01:43.023] result() for ClusterFuture ... done [18:01:43.023] result() for ClusterFuture ... [18:01:43.023] - result already collected: FutureResult [18:01:43.023] result() for ClusterFuture ... done [18:01:43.023] result() for ClusterFuture ... [18:01:43.023] - result already collected: FutureResult [18:01:43.024] result() for ClusterFuture ... done [18:01:43.024] result() for ClusterFuture ... [18:01:43.024] - result already collected: FutureResult [18:01:43.027] result() for ClusterFuture ... done [18:01:43.027] result() for ClusterFuture ... [18:01:43.027] - result already collected: FutureResult [18:01:43.027] result() for ClusterFuture ... done [18:01:43.028] result() for ClusterFuture ... [18:01:43.028] - result already collected: FutureResult [18:01:43.028] 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) [18:01:43.030] getGlobalsAndPackages() ... [18:01:43.030] Searching for globals... [18:01:43.030] [18:01:43.031] Searching for globals ... DONE [18:01:43.031] - globals: [0] [18:01:43.031] getGlobalsAndPackages() ... DONE [18:01:43.031] run() for 'Future' ... [18:01:43.031] - state: 'created' [18:01:43.032] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.045] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.046] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.046] - Field: 'node' [18:01:43.046] - Field: 'label' [18:01:43.046] - Field: 'local' [18:01:43.046] - Field: 'owner' [18:01:43.047] - Field: 'envir' [18:01:43.047] - Field: 'workers' [18:01:43.047] - Field: 'packages' [18:01:43.047] - Field: 'gc' [18:01:43.047] - Field: 'conditions' [18:01:43.047] - Field: 'persistent' [18:01:43.048] - Field: 'expr' [18:01:43.048] - Field: 'uuid' [18:01:43.048] - Field: 'seed' [18:01:43.048] - Field: 'version' [18:01:43.048] - Field: 'result' [18:01:43.049] - Field: 'asynchronous' [18:01:43.049] - Field: 'calls' [18:01:43.049] - Field: 'globals' [18:01:43.049] - Field: 'stdout' [18:01:43.049] - Field: 'earlySignal' [18:01:43.049] - Field: 'lazy' [18:01:43.050] - Field: 'state' [18:01:43.050] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.050] - Launch lazy future ... [18:01:43.050] Packages needed by the future expression (n = 0): [18:01:43.051] Packages needed by future strategies (n = 0): [18:01:43.051] { [18:01:43.051] { [18:01:43.051] { [18:01:43.051] ...future.startTime <- base::Sys.time() [18:01:43.051] { [18:01:43.051] { [18:01:43.051] { [18:01:43.051] { [18:01:43.051] base::local({ [18:01:43.051] has_future <- base::requireNamespace("future", [18:01:43.051] quietly = TRUE) [18:01:43.051] if (has_future) { [18:01:43.051] ns <- base::getNamespace("future") [18:01:43.051] version <- ns[[".package"]][["version"]] [18:01:43.051] if (is.null(version)) [18:01:43.051] version <- utils::packageVersion("future") [18:01:43.051] } [18:01:43.051] else { [18:01:43.051] version <- NULL [18:01:43.051] } [18:01:43.051] if (!has_future || version < "1.8.0") { [18:01:43.051] info <- base::c(r_version = base::gsub("R version ", [18:01:43.051] "", base::R.version$version.string), [18:01:43.051] platform = base::sprintf("%s (%s-bit)", [18:01:43.051] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.051] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.051] "release", "version")], collapse = " "), [18:01:43.051] hostname = base::Sys.info()[["nodename"]]) [18:01:43.051] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.051] info) [18:01:43.051] info <- base::paste(info, collapse = "; ") [18:01:43.051] if (!has_future) { [18:01:43.051] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.051] info) [18:01:43.051] } [18:01:43.051] else { [18:01:43.051] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.051] info, version) [18:01:43.051] } [18:01:43.051] base::stop(msg) [18:01:43.051] } [18:01:43.051] }) [18:01:43.051] } [18:01:43.051] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.051] base::options(mc.cores = 1L) [18:01:43.051] } [18:01:43.051] options(future.plan = NULL) [18:01:43.051] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.051] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.051] } [18:01:43.051] ...future.workdir <- getwd() [18:01:43.051] } [18:01:43.051] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.051] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.051] } [18:01:43.051] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.051] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.051] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.051] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.051] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.051] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.051] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.051] base::names(...future.oldOptions)) [18:01:43.051] } [18:01:43.051] if (FALSE) { [18:01:43.051] } [18:01:43.051] else { [18:01:43.051] if (TRUE) { [18:01:43.051] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.051] open = "w") [18:01:43.051] } [18:01:43.051] else { [18:01:43.051] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.051] windows = "NUL", "/dev/null"), open = "w") [18:01:43.051] } [18:01:43.051] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.051] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.051] base::sink(type = "output", split = FALSE) [18:01:43.051] base::close(...future.stdout) [18:01:43.051] }, add = TRUE) [18:01:43.051] } [18:01:43.051] ...future.frame <- base::sys.nframe() [18:01:43.051] ...future.conditions <- base::list() [18:01:43.051] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.051] if (FALSE) { [18:01:43.051] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.051] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.051] } [18:01:43.051] ...future.result <- base::tryCatch({ [18:01:43.051] base::withCallingHandlers({ [18:01:43.051] ...future.value <- base::withVisible(base::local({ [18:01:43.051] ...future.makeSendCondition <- local({ [18:01:43.051] sendCondition <- NULL [18:01:43.051] function(frame = 1L) { [18:01:43.051] if (is.function(sendCondition)) [18:01:43.051] return(sendCondition) [18:01:43.051] ns <- getNamespace("parallel") [18:01:43.051] if (exists("sendData", mode = "function", [18:01:43.051] envir = ns)) { [18:01:43.051] parallel_sendData <- get("sendData", mode = "function", [18:01:43.051] envir = ns) [18:01:43.051] envir <- sys.frame(frame) [18:01:43.051] master <- NULL [18:01:43.051] while (!identical(envir, .GlobalEnv) && [18:01:43.051] !identical(envir, emptyenv())) { [18:01:43.051] if (exists("master", mode = "list", envir = envir, [18:01:43.051] inherits = FALSE)) { [18:01:43.051] master <- get("master", mode = "list", [18:01:43.051] envir = envir, inherits = FALSE) [18:01:43.051] if (inherits(master, c("SOCKnode", [18:01:43.051] "SOCK0node"))) { [18:01:43.051] sendCondition <<- function(cond) { [18:01:43.051] data <- list(type = "VALUE", value = cond, [18:01:43.051] success = TRUE) [18:01:43.051] parallel_sendData(master, data) [18:01:43.051] } [18:01:43.051] return(sendCondition) [18:01:43.051] } [18:01:43.051] } [18:01:43.051] frame <- frame + 1L [18:01:43.051] envir <- sys.frame(frame) [18:01:43.051] } [18:01:43.051] } [18:01:43.051] sendCondition <<- function(cond) NULL [18:01:43.051] } [18:01:43.051] }) [18:01:43.051] withCallingHandlers({ [18:01:43.051] 2 [18:01:43.051] }, immediateCondition = function(cond) { [18:01:43.051] sendCondition <- ...future.makeSendCondition() [18:01:43.051] sendCondition(cond) [18:01:43.051] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.051] { [18:01:43.051] inherits <- base::inherits [18:01:43.051] invokeRestart <- base::invokeRestart [18:01:43.051] is.null <- base::is.null [18:01:43.051] muffled <- FALSE [18:01:43.051] if (inherits(cond, "message")) { [18:01:43.051] muffled <- grepl(pattern, "muffleMessage") [18:01:43.051] if (muffled) [18:01:43.051] invokeRestart("muffleMessage") [18:01:43.051] } [18:01:43.051] else if (inherits(cond, "warning")) { [18:01:43.051] muffled <- grepl(pattern, "muffleWarning") [18:01:43.051] if (muffled) [18:01:43.051] invokeRestart("muffleWarning") [18:01:43.051] } [18:01:43.051] else if (inherits(cond, "condition")) { [18:01:43.051] if (!is.null(pattern)) { [18:01:43.051] computeRestarts <- base::computeRestarts [18:01:43.051] grepl <- base::grepl [18:01:43.051] restarts <- computeRestarts(cond) [18:01:43.051] for (restart in restarts) { [18:01:43.051] name <- restart$name [18:01:43.051] if (is.null(name)) [18:01:43.051] next [18:01:43.051] if (!grepl(pattern, name)) [18:01:43.051] next [18:01:43.051] invokeRestart(restart) [18:01:43.051] muffled <- TRUE [18:01:43.051] break [18:01:43.051] } [18:01:43.051] } [18:01:43.051] } [18:01:43.051] invisible(muffled) [18:01:43.051] } [18:01:43.051] muffleCondition(cond) [18:01:43.051] }) [18:01:43.051] })) [18:01:43.051] future::FutureResult(value = ...future.value$value, [18:01:43.051] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.051] ...future.rng), globalenv = if (FALSE) [18:01:43.051] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.051] ...future.globalenv.names)) [18:01:43.051] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.051] }, condition = base::local({ [18:01:43.051] c <- base::c [18:01:43.051] inherits <- base::inherits [18:01:43.051] invokeRestart <- base::invokeRestart [18:01:43.051] length <- base::length [18:01:43.051] list <- base::list [18:01:43.051] seq.int <- base::seq.int [18:01:43.051] signalCondition <- base::signalCondition [18:01:43.051] sys.calls <- base::sys.calls [18:01:43.051] `[[` <- base::`[[` [18:01:43.051] `+` <- base::`+` [18:01:43.051] `<<-` <- base::`<<-` [18:01:43.051] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.051] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.051] 3L)] [18:01:43.051] } [18:01:43.051] function(cond) { [18:01:43.051] is_error <- inherits(cond, "error") [18:01:43.051] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.051] NULL) [18:01:43.051] if (is_error) { [18:01:43.051] sessionInformation <- function() { [18:01:43.051] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.051] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.051] search = base::search(), system = base::Sys.info()) [18:01:43.051] } [18:01:43.051] ...future.conditions[[length(...future.conditions) + [18:01:43.051] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.051] cond$call), session = sessionInformation(), [18:01:43.051] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.051] signalCondition(cond) [18:01:43.051] } [18:01:43.051] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.051] "immediateCondition"))) { [18:01:43.051] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.051] ...future.conditions[[length(...future.conditions) + [18:01:43.051] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.051] if (TRUE && !signal) { [18:01:43.051] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.051] { [18:01:43.051] inherits <- base::inherits [18:01:43.051] invokeRestart <- base::invokeRestart [18:01:43.051] is.null <- base::is.null [18:01:43.051] muffled <- FALSE [18:01:43.051] if (inherits(cond, "message")) { [18:01:43.051] muffled <- grepl(pattern, "muffleMessage") [18:01:43.051] if (muffled) [18:01:43.051] invokeRestart("muffleMessage") [18:01:43.051] } [18:01:43.051] else if (inherits(cond, "warning")) { [18:01:43.051] muffled <- grepl(pattern, "muffleWarning") [18:01:43.051] if (muffled) [18:01:43.051] invokeRestart("muffleWarning") [18:01:43.051] } [18:01:43.051] else if (inherits(cond, "condition")) { [18:01:43.051] if (!is.null(pattern)) { [18:01:43.051] computeRestarts <- base::computeRestarts [18:01:43.051] grepl <- base::grepl [18:01:43.051] restarts <- computeRestarts(cond) [18:01:43.051] for (restart in restarts) { [18:01:43.051] name <- restart$name [18:01:43.051] if (is.null(name)) [18:01:43.051] next [18:01:43.051] if (!grepl(pattern, name)) [18:01:43.051] next [18:01:43.051] invokeRestart(restart) [18:01:43.051] muffled <- TRUE [18:01:43.051] break [18:01:43.051] } [18:01:43.051] } [18:01:43.051] } [18:01:43.051] invisible(muffled) [18:01:43.051] } [18:01:43.051] muffleCondition(cond, pattern = "^muffle") [18:01:43.051] } [18:01:43.051] } [18:01:43.051] else { [18:01:43.051] if (TRUE) { [18:01:43.051] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.051] { [18:01:43.051] inherits <- base::inherits [18:01:43.051] invokeRestart <- base::invokeRestart [18:01:43.051] is.null <- base::is.null [18:01:43.051] muffled <- FALSE [18:01:43.051] if (inherits(cond, "message")) { [18:01:43.051] muffled <- grepl(pattern, "muffleMessage") [18:01:43.051] if (muffled) [18:01:43.051] invokeRestart("muffleMessage") [18:01:43.051] } [18:01:43.051] else if (inherits(cond, "warning")) { [18:01:43.051] muffled <- grepl(pattern, "muffleWarning") [18:01:43.051] if (muffled) [18:01:43.051] invokeRestart("muffleWarning") [18:01:43.051] } [18:01:43.051] else if (inherits(cond, "condition")) { [18:01:43.051] if (!is.null(pattern)) { [18:01:43.051] computeRestarts <- base::computeRestarts [18:01:43.051] grepl <- base::grepl [18:01:43.051] restarts <- computeRestarts(cond) [18:01:43.051] for (restart in restarts) { [18:01:43.051] name <- restart$name [18:01:43.051] if (is.null(name)) [18:01:43.051] next [18:01:43.051] if (!grepl(pattern, name)) [18:01:43.051] next [18:01:43.051] invokeRestart(restart) [18:01:43.051] muffled <- TRUE [18:01:43.051] break [18:01:43.051] } [18:01:43.051] } [18:01:43.051] } [18:01:43.051] invisible(muffled) [18:01:43.051] } [18:01:43.051] muffleCondition(cond, pattern = "^muffle") [18:01:43.051] } [18:01:43.051] } [18:01:43.051] } [18:01:43.051] })) [18:01:43.051] }, error = function(ex) { [18:01:43.051] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.051] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.051] ...future.rng), started = ...future.startTime, [18:01:43.051] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.051] version = "1.8"), class = "FutureResult") [18:01:43.051] }, finally = { [18:01:43.051] if (!identical(...future.workdir, getwd())) [18:01:43.051] setwd(...future.workdir) [18:01:43.051] { [18:01:43.051] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.051] ...future.oldOptions$nwarnings <- NULL [18:01:43.051] } [18:01:43.051] base::options(...future.oldOptions) [18:01:43.051] if (.Platform$OS.type == "windows") { [18:01:43.051] old_names <- names(...future.oldEnvVars) [18:01:43.051] envs <- base::Sys.getenv() [18:01:43.051] names <- names(envs) [18:01:43.051] common <- intersect(names, old_names) [18:01:43.051] added <- setdiff(names, old_names) [18:01:43.051] removed <- setdiff(old_names, names) [18:01:43.051] changed <- common[...future.oldEnvVars[common] != [18:01:43.051] envs[common]] [18:01:43.051] NAMES <- toupper(changed) [18:01:43.051] args <- list() [18:01:43.051] for (kk in seq_along(NAMES)) { [18:01:43.051] name <- changed[[kk]] [18:01:43.051] NAME <- NAMES[[kk]] [18:01:43.051] if (name != NAME && is.element(NAME, old_names)) [18:01:43.051] next [18:01:43.051] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.051] } [18:01:43.051] NAMES <- toupper(added) [18:01:43.051] for (kk in seq_along(NAMES)) { [18:01:43.051] name <- added[[kk]] [18:01:43.051] NAME <- NAMES[[kk]] [18:01:43.051] if (name != NAME && is.element(NAME, old_names)) [18:01:43.051] next [18:01:43.051] args[[name]] <- "" [18:01:43.051] } [18:01:43.051] NAMES <- toupper(removed) [18:01:43.051] for (kk in seq_along(NAMES)) { [18:01:43.051] name <- removed[[kk]] [18:01:43.051] NAME <- NAMES[[kk]] [18:01:43.051] if (name != NAME && is.element(NAME, old_names)) [18:01:43.051] next [18:01:43.051] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.051] } [18:01:43.051] if (length(args) > 0) [18:01:43.051] base::do.call(base::Sys.setenv, args = args) [18:01:43.051] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.051] } [18:01:43.051] else { [18:01:43.051] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.051] } [18:01:43.051] { [18:01:43.051] if (base::length(...future.futureOptionsAdded) > [18:01:43.051] 0L) { [18:01:43.051] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.051] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.051] base::options(opts) [18:01:43.051] } [18:01:43.051] { [18:01:43.051] { [18:01:43.051] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.051] NULL [18:01:43.051] } [18:01:43.051] options(future.plan = NULL) [18:01:43.051] if (is.na(NA_character_)) [18:01:43.051] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.051] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.051] future::plan(list(function (..., workers = availableCores(), [18:01:43.051] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.051] envir = parent.frame()) [18:01:43.051] { [18:01:43.051] if (is.function(workers)) [18:01:43.051] workers <- workers() [18:01:43.051] workers <- structure(as.integer(workers), [18:01:43.051] class = class(workers)) [18:01:43.051] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.051] workers >= 1) [18:01:43.051] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.051] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.051] } [18:01:43.051] future <- MultisessionFuture(..., workers = workers, [18:01:43.051] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.051] envir = envir) [18:01:43.051] if (!future$lazy) [18:01:43.051] future <- run(future) [18:01:43.051] invisible(future) [18:01:43.051] }), .cleanup = FALSE, .init = FALSE) [18:01:43.051] } [18:01:43.051] } [18:01:43.051] } [18:01:43.051] }) [18:01:43.051] if (TRUE) { [18:01:43.051] base::sink(type = "output", split = FALSE) [18:01:43.051] if (TRUE) { [18:01:43.051] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.051] } [18:01:43.051] else { [18:01:43.051] ...future.result["stdout"] <- base::list(NULL) [18:01:43.051] } [18:01:43.051] base::close(...future.stdout) [18:01:43.051] ...future.stdout <- NULL [18:01:43.051] } [18:01:43.051] ...future.result$conditions <- ...future.conditions [18:01:43.051] ...future.result$finished <- base::Sys.time() [18:01:43.051] ...future.result [18:01:43.051] } [18:01:43.057] MultisessionFuture started [18:01:43.057] - Launch lazy future ... done [18:01:43.057] run() for 'MultisessionFuture' ... done [18:01:43.057] getGlobalsAndPackages() ... [18:01:43.057] Searching for globals... [18:01:43.058] [18:01:43.058] Searching for globals ... DONE [18:01:43.058] - globals: [0] [18:01:43.058] getGlobalsAndPackages() ... DONE [18:01:43.059] run() for 'Future' ... [18:01:43.059] - state: 'created' [18:01:43.059] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.073] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.073] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.073] - Field: 'node' [18:01:43.073] - Field: 'label' [18:01:43.073] - Field: 'local' [18:01:43.074] - Field: 'owner' [18:01:43.074] - Field: 'envir' [18:01:43.074] - Field: 'workers' [18:01:43.074] - Field: 'packages' [18:01:43.074] - Field: 'gc' [18:01:43.074] - Field: 'conditions' [18:01:43.075] - Field: 'persistent' [18:01:43.075] - Field: 'expr' [18:01:43.075] - Field: 'uuid' [18:01:43.075] - Field: 'seed' [18:01:43.075] - Field: 'version' [18:01:43.075] - Field: 'result' [18:01:43.076] - Field: 'asynchronous' [18:01:43.076] - Field: 'calls' [18:01:43.076] - Field: 'globals' [18:01:43.076] - Field: 'stdout' [18:01:43.076] - Field: 'earlySignal' [18:01:43.077] - Field: 'lazy' [18:01:43.077] - Field: 'state' [18:01:43.077] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.077] - Launch lazy future ... [18:01:43.077] Packages needed by the future expression (n = 0): [18:01:43.078] Packages needed by future strategies (n = 0): [18:01:43.078] { [18:01:43.078] { [18:01:43.078] { [18:01:43.078] ...future.startTime <- base::Sys.time() [18:01:43.078] { [18:01:43.078] { [18:01:43.078] { [18:01:43.078] { [18:01:43.078] base::local({ [18:01:43.078] has_future <- base::requireNamespace("future", [18:01:43.078] quietly = TRUE) [18:01:43.078] if (has_future) { [18:01:43.078] ns <- base::getNamespace("future") [18:01:43.078] version <- ns[[".package"]][["version"]] [18:01:43.078] if (is.null(version)) [18:01:43.078] version <- utils::packageVersion("future") [18:01:43.078] } [18:01:43.078] else { [18:01:43.078] version <- NULL [18:01:43.078] } [18:01:43.078] if (!has_future || version < "1.8.0") { [18:01:43.078] info <- base::c(r_version = base::gsub("R version ", [18:01:43.078] "", base::R.version$version.string), [18:01:43.078] platform = base::sprintf("%s (%s-bit)", [18:01:43.078] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.078] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.078] "release", "version")], collapse = " "), [18:01:43.078] hostname = base::Sys.info()[["nodename"]]) [18:01:43.078] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.078] info) [18:01:43.078] info <- base::paste(info, collapse = "; ") [18:01:43.078] if (!has_future) { [18:01:43.078] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.078] info) [18:01:43.078] } [18:01:43.078] else { [18:01:43.078] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.078] info, version) [18:01:43.078] } [18:01:43.078] base::stop(msg) [18:01:43.078] } [18:01:43.078] }) [18:01:43.078] } [18:01:43.078] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.078] base::options(mc.cores = 1L) [18:01:43.078] } [18:01:43.078] options(future.plan = NULL) [18:01:43.078] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.078] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.078] } [18:01:43.078] ...future.workdir <- getwd() [18:01:43.078] } [18:01:43.078] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.078] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.078] } [18:01:43.078] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.078] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.078] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.078] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.078] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.078] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.078] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.078] base::names(...future.oldOptions)) [18:01:43.078] } [18:01:43.078] if (FALSE) { [18:01:43.078] } [18:01:43.078] else { [18:01:43.078] if (TRUE) { [18:01:43.078] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.078] open = "w") [18:01:43.078] } [18:01:43.078] else { [18:01:43.078] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.078] windows = "NUL", "/dev/null"), open = "w") [18:01:43.078] } [18:01:43.078] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.078] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.078] base::sink(type = "output", split = FALSE) [18:01:43.078] base::close(...future.stdout) [18:01:43.078] }, add = TRUE) [18:01:43.078] } [18:01:43.078] ...future.frame <- base::sys.nframe() [18:01:43.078] ...future.conditions <- base::list() [18:01:43.078] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.078] if (FALSE) { [18:01:43.078] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.078] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.078] } [18:01:43.078] ...future.result <- base::tryCatch({ [18:01:43.078] base::withCallingHandlers({ [18:01:43.078] ...future.value <- base::withVisible(base::local({ [18:01:43.078] ...future.makeSendCondition <- local({ [18:01:43.078] sendCondition <- NULL [18:01:43.078] function(frame = 1L) { [18:01:43.078] if (is.function(sendCondition)) [18:01:43.078] return(sendCondition) [18:01:43.078] ns <- getNamespace("parallel") [18:01:43.078] if (exists("sendData", mode = "function", [18:01:43.078] envir = ns)) { [18:01:43.078] parallel_sendData <- get("sendData", mode = "function", [18:01:43.078] envir = ns) [18:01:43.078] envir <- sys.frame(frame) [18:01:43.078] master <- NULL [18:01:43.078] while (!identical(envir, .GlobalEnv) && [18:01:43.078] !identical(envir, emptyenv())) { [18:01:43.078] if (exists("master", mode = "list", envir = envir, [18:01:43.078] inherits = FALSE)) { [18:01:43.078] master <- get("master", mode = "list", [18:01:43.078] envir = envir, inherits = FALSE) [18:01:43.078] if (inherits(master, c("SOCKnode", [18:01:43.078] "SOCK0node"))) { [18:01:43.078] sendCondition <<- function(cond) { [18:01:43.078] data <- list(type = "VALUE", value = cond, [18:01:43.078] success = TRUE) [18:01:43.078] parallel_sendData(master, data) [18:01:43.078] } [18:01:43.078] return(sendCondition) [18:01:43.078] } [18:01:43.078] } [18:01:43.078] frame <- frame + 1L [18:01:43.078] envir <- sys.frame(frame) [18:01:43.078] } [18:01:43.078] } [18:01:43.078] sendCondition <<- function(cond) NULL [18:01:43.078] } [18:01:43.078] }) [18:01:43.078] withCallingHandlers({ [18:01:43.078] NULL [18:01:43.078] }, immediateCondition = function(cond) { [18:01:43.078] sendCondition <- ...future.makeSendCondition() [18:01:43.078] sendCondition(cond) [18:01:43.078] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.078] { [18:01:43.078] inherits <- base::inherits [18:01:43.078] invokeRestart <- base::invokeRestart [18:01:43.078] is.null <- base::is.null [18:01:43.078] muffled <- FALSE [18:01:43.078] if (inherits(cond, "message")) { [18:01:43.078] muffled <- grepl(pattern, "muffleMessage") [18:01:43.078] if (muffled) [18:01:43.078] invokeRestart("muffleMessage") [18:01:43.078] } [18:01:43.078] else if (inherits(cond, "warning")) { [18:01:43.078] muffled <- grepl(pattern, "muffleWarning") [18:01:43.078] if (muffled) [18:01:43.078] invokeRestart("muffleWarning") [18:01:43.078] } [18:01:43.078] else if (inherits(cond, "condition")) { [18:01:43.078] if (!is.null(pattern)) { [18:01:43.078] computeRestarts <- base::computeRestarts [18:01:43.078] grepl <- base::grepl [18:01:43.078] restarts <- computeRestarts(cond) [18:01:43.078] for (restart in restarts) { [18:01:43.078] name <- restart$name [18:01:43.078] if (is.null(name)) [18:01:43.078] next [18:01:43.078] if (!grepl(pattern, name)) [18:01:43.078] next [18:01:43.078] invokeRestart(restart) [18:01:43.078] muffled <- TRUE [18:01:43.078] break [18:01:43.078] } [18:01:43.078] } [18:01:43.078] } [18:01:43.078] invisible(muffled) [18:01:43.078] } [18:01:43.078] muffleCondition(cond) [18:01:43.078] }) [18:01:43.078] })) [18:01:43.078] future::FutureResult(value = ...future.value$value, [18:01:43.078] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.078] ...future.rng), globalenv = if (FALSE) [18:01:43.078] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.078] ...future.globalenv.names)) [18:01:43.078] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.078] }, condition = base::local({ [18:01:43.078] c <- base::c [18:01:43.078] inherits <- base::inherits [18:01:43.078] invokeRestart <- base::invokeRestart [18:01:43.078] length <- base::length [18:01:43.078] list <- base::list [18:01:43.078] seq.int <- base::seq.int [18:01:43.078] signalCondition <- base::signalCondition [18:01:43.078] sys.calls <- base::sys.calls [18:01:43.078] `[[` <- base::`[[` [18:01:43.078] `+` <- base::`+` [18:01:43.078] `<<-` <- base::`<<-` [18:01:43.078] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.078] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.078] 3L)] [18:01:43.078] } [18:01:43.078] function(cond) { [18:01:43.078] is_error <- inherits(cond, "error") [18:01:43.078] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.078] NULL) [18:01:43.078] if (is_error) { [18:01:43.078] sessionInformation <- function() { [18:01:43.078] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.078] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.078] search = base::search(), system = base::Sys.info()) [18:01:43.078] } [18:01:43.078] ...future.conditions[[length(...future.conditions) + [18:01:43.078] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.078] cond$call), session = sessionInformation(), [18:01:43.078] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.078] signalCondition(cond) [18:01:43.078] } [18:01:43.078] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.078] "immediateCondition"))) { [18:01:43.078] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.078] ...future.conditions[[length(...future.conditions) + [18:01:43.078] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.078] if (TRUE && !signal) { [18:01:43.078] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.078] { [18:01:43.078] inherits <- base::inherits [18:01:43.078] invokeRestart <- base::invokeRestart [18:01:43.078] is.null <- base::is.null [18:01:43.078] muffled <- FALSE [18:01:43.078] if (inherits(cond, "message")) { [18:01:43.078] muffled <- grepl(pattern, "muffleMessage") [18:01:43.078] if (muffled) [18:01:43.078] invokeRestart("muffleMessage") [18:01:43.078] } [18:01:43.078] else if (inherits(cond, "warning")) { [18:01:43.078] muffled <- grepl(pattern, "muffleWarning") [18:01:43.078] if (muffled) [18:01:43.078] invokeRestart("muffleWarning") [18:01:43.078] } [18:01:43.078] else if (inherits(cond, "condition")) { [18:01:43.078] if (!is.null(pattern)) { [18:01:43.078] computeRestarts <- base::computeRestarts [18:01:43.078] grepl <- base::grepl [18:01:43.078] restarts <- computeRestarts(cond) [18:01:43.078] for (restart in restarts) { [18:01:43.078] name <- restart$name [18:01:43.078] if (is.null(name)) [18:01:43.078] next [18:01:43.078] if (!grepl(pattern, name)) [18:01:43.078] next [18:01:43.078] invokeRestart(restart) [18:01:43.078] muffled <- TRUE [18:01:43.078] break [18:01:43.078] } [18:01:43.078] } [18:01:43.078] } [18:01:43.078] invisible(muffled) [18:01:43.078] } [18:01:43.078] muffleCondition(cond, pattern = "^muffle") [18:01:43.078] } [18:01:43.078] } [18:01:43.078] else { [18:01:43.078] if (TRUE) { [18:01:43.078] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.078] { [18:01:43.078] inherits <- base::inherits [18:01:43.078] invokeRestart <- base::invokeRestart [18:01:43.078] is.null <- base::is.null [18:01:43.078] muffled <- FALSE [18:01:43.078] if (inherits(cond, "message")) { [18:01:43.078] muffled <- grepl(pattern, "muffleMessage") [18:01:43.078] if (muffled) [18:01:43.078] invokeRestart("muffleMessage") [18:01:43.078] } [18:01:43.078] else if (inherits(cond, "warning")) { [18:01:43.078] muffled <- grepl(pattern, "muffleWarning") [18:01:43.078] if (muffled) [18:01:43.078] invokeRestart("muffleWarning") [18:01:43.078] } [18:01:43.078] else if (inherits(cond, "condition")) { [18:01:43.078] if (!is.null(pattern)) { [18:01:43.078] computeRestarts <- base::computeRestarts [18:01:43.078] grepl <- base::grepl [18:01:43.078] restarts <- computeRestarts(cond) [18:01:43.078] for (restart in restarts) { [18:01:43.078] name <- restart$name [18:01:43.078] if (is.null(name)) [18:01:43.078] next [18:01:43.078] if (!grepl(pattern, name)) [18:01:43.078] next [18:01:43.078] invokeRestart(restart) [18:01:43.078] muffled <- TRUE [18:01:43.078] break [18:01:43.078] } [18:01:43.078] } [18:01:43.078] } [18:01:43.078] invisible(muffled) [18:01:43.078] } [18:01:43.078] muffleCondition(cond, pattern = "^muffle") [18:01:43.078] } [18:01:43.078] } [18:01:43.078] } [18:01:43.078] })) [18:01:43.078] }, error = function(ex) { [18:01:43.078] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.078] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.078] ...future.rng), started = ...future.startTime, [18:01:43.078] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.078] version = "1.8"), class = "FutureResult") [18:01:43.078] }, finally = { [18:01:43.078] if (!identical(...future.workdir, getwd())) [18:01:43.078] setwd(...future.workdir) [18:01:43.078] { [18:01:43.078] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.078] ...future.oldOptions$nwarnings <- NULL [18:01:43.078] } [18:01:43.078] base::options(...future.oldOptions) [18:01:43.078] if (.Platform$OS.type == "windows") { [18:01:43.078] old_names <- names(...future.oldEnvVars) [18:01:43.078] envs <- base::Sys.getenv() [18:01:43.078] names <- names(envs) [18:01:43.078] common <- intersect(names, old_names) [18:01:43.078] added <- setdiff(names, old_names) [18:01:43.078] removed <- setdiff(old_names, names) [18:01:43.078] changed <- common[...future.oldEnvVars[common] != [18:01:43.078] envs[common]] [18:01:43.078] NAMES <- toupper(changed) [18:01:43.078] args <- list() [18:01:43.078] for (kk in seq_along(NAMES)) { [18:01:43.078] name <- changed[[kk]] [18:01:43.078] NAME <- NAMES[[kk]] [18:01:43.078] if (name != NAME && is.element(NAME, old_names)) [18:01:43.078] next [18:01:43.078] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.078] } [18:01:43.078] NAMES <- toupper(added) [18:01:43.078] for (kk in seq_along(NAMES)) { [18:01:43.078] name <- added[[kk]] [18:01:43.078] NAME <- NAMES[[kk]] [18:01:43.078] if (name != NAME && is.element(NAME, old_names)) [18:01:43.078] next [18:01:43.078] args[[name]] <- "" [18:01:43.078] } [18:01:43.078] NAMES <- toupper(removed) [18:01:43.078] for (kk in seq_along(NAMES)) { [18:01:43.078] name <- removed[[kk]] [18:01:43.078] NAME <- NAMES[[kk]] [18:01:43.078] if (name != NAME && is.element(NAME, old_names)) [18:01:43.078] next [18:01:43.078] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.078] } [18:01:43.078] if (length(args) > 0) [18:01:43.078] base::do.call(base::Sys.setenv, args = args) [18:01:43.078] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.078] } [18:01:43.078] else { [18:01:43.078] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.078] } [18:01:43.078] { [18:01:43.078] if (base::length(...future.futureOptionsAdded) > [18:01:43.078] 0L) { [18:01:43.078] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.078] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.078] base::options(opts) [18:01:43.078] } [18:01:43.078] { [18:01:43.078] { [18:01:43.078] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.078] NULL [18:01:43.078] } [18:01:43.078] options(future.plan = NULL) [18:01:43.078] if (is.na(NA_character_)) [18:01:43.078] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.078] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.078] future::plan(list(function (..., workers = availableCores(), [18:01:43.078] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.078] envir = parent.frame()) [18:01:43.078] { [18:01:43.078] if (is.function(workers)) [18:01:43.078] workers <- workers() [18:01:43.078] workers <- structure(as.integer(workers), [18:01:43.078] class = class(workers)) [18:01:43.078] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.078] workers >= 1) [18:01:43.078] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.078] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.078] } [18:01:43.078] future <- MultisessionFuture(..., workers = workers, [18:01:43.078] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.078] envir = envir) [18:01:43.078] if (!future$lazy) [18:01:43.078] future <- run(future) [18:01:43.078] invisible(future) [18:01:43.078] }), .cleanup = FALSE, .init = FALSE) [18:01:43.078] } [18:01:43.078] } [18:01:43.078] } [18:01:43.078] }) [18:01:43.078] if (TRUE) { [18:01:43.078] base::sink(type = "output", split = FALSE) [18:01:43.078] if (TRUE) { [18:01:43.078] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.078] } [18:01:43.078] else { [18:01:43.078] ...future.result["stdout"] <- base::list(NULL) [18:01:43.078] } [18:01:43.078] base::close(...future.stdout) [18:01:43.078] ...future.stdout <- NULL [18:01:43.078] } [18:01:43.078] ...future.result$conditions <- ...future.conditions [18:01:43.078] ...future.result$finished <- base::Sys.time() [18:01:43.078] ...future.result [18:01:43.078] } [18:01:43.084] MultisessionFuture started [18:01:43.084] - Launch lazy future ... done [18:01:43.084] run() for 'MultisessionFuture' ... done [18:01:43.085] getGlobalsAndPackages() ... [18:01:43.085] Searching for globals... [18:01:43.086] - globals found: [1] '{' [18:01:43.086] Searching for globals ... DONE [18:01:43.086] Resolving globals: FALSE [18:01:43.087] [18:01:43.087] [18:01:43.087] getGlobalsAndPackages() ... DONE [18:01:43.087] run() for 'Future' ... [18:01:43.087] - state: 'created' [18:01:43.088] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.102] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.102] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.102] - Field: 'node' [18:01:43.102] - Field: 'label' [18:01:43.102] - Field: 'local' [18:01:43.103] - Field: 'owner' [18:01:43.103] - Field: 'envir' [18:01:43.103] - Field: 'workers' [18:01:43.103] - Field: 'packages' [18:01:43.103] - Field: 'gc' [18:01:43.104] - Field: 'conditions' [18:01:43.104] - Field: 'persistent' [18:01:43.104] - Field: 'expr' [18:01:43.104] - Field: 'uuid' [18:01:43.104] - Field: 'seed' [18:01:43.104] - Field: 'version' [18:01:43.105] - Field: 'result' [18:01:43.105] - Field: 'asynchronous' [18:01:43.105] - Field: 'calls' [18:01:43.105] - Field: 'globals' [18:01:43.105] - Field: 'stdout' [18:01:43.106] - Field: 'earlySignal' [18:01:43.106] - Field: 'lazy' [18:01:43.106] - Field: 'state' [18:01:43.106] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.106] - Launch lazy future ... [18:01:43.107] Packages needed by the future expression (n = 0): [18:01:43.107] Packages needed by future strategies (n = 0): [18:01:43.107] { [18:01:43.107] { [18:01:43.107] { [18:01:43.107] ...future.startTime <- base::Sys.time() [18:01:43.107] { [18:01:43.107] { [18:01:43.107] { [18:01:43.107] { [18:01:43.107] base::local({ [18:01:43.107] has_future <- base::requireNamespace("future", [18:01:43.107] quietly = TRUE) [18:01:43.107] if (has_future) { [18:01:43.107] ns <- base::getNamespace("future") [18:01:43.107] version <- ns[[".package"]][["version"]] [18:01:43.107] if (is.null(version)) [18:01:43.107] version <- utils::packageVersion("future") [18:01:43.107] } [18:01:43.107] else { [18:01:43.107] version <- NULL [18:01:43.107] } [18:01:43.107] if (!has_future || version < "1.8.0") { [18:01:43.107] info <- base::c(r_version = base::gsub("R version ", [18:01:43.107] "", base::R.version$version.string), [18:01:43.107] platform = base::sprintf("%s (%s-bit)", [18:01:43.107] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.107] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.107] "release", "version")], collapse = " "), [18:01:43.107] hostname = base::Sys.info()[["nodename"]]) [18:01:43.107] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.107] info) [18:01:43.107] info <- base::paste(info, collapse = "; ") [18:01:43.107] if (!has_future) { [18:01:43.107] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.107] info) [18:01:43.107] } [18:01:43.107] else { [18:01:43.107] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.107] info, version) [18:01:43.107] } [18:01:43.107] base::stop(msg) [18:01:43.107] } [18:01:43.107] }) [18:01:43.107] } [18:01:43.107] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.107] base::options(mc.cores = 1L) [18:01:43.107] } [18:01:43.107] options(future.plan = NULL) [18:01:43.107] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.107] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.107] } [18:01:43.107] ...future.workdir <- getwd() [18:01:43.107] } [18:01:43.107] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.107] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.107] } [18:01:43.107] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.107] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.107] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.107] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.107] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.107] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.107] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.107] base::names(...future.oldOptions)) [18:01:43.107] } [18:01:43.107] if (FALSE) { [18:01:43.107] } [18:01:43.107] else { [18:01:43.107] if (TRUE) { [18:01:43.107] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.107] open = "w") [18:01:43.107] } [18:01:43.107] else { [18:01:43.107] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.107] windows = "NUL", "/dev/null"), open = "w") [18:01:43.107] } [18:01:43.107] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.107] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.107] base::sink(type = "output", split = FALSE) [18:01:43.107] base::close(...future.stdout) [18:01:43.107] }, add = TRUE) [18:01:43.107] } [18:01:43.107] ...future.frame <- base::sys.nframe() [18:01:43.107] ...future.conditions <- base::list() [18:01:43.107] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.107] if (FALSE) { [18:01:43.107] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.107] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.107] } [18:01:43.107] ...future.result <- base::tryCatch({ [18:01:43.107] base::withCallingHandlers({ [18:01:43.107] ...future.value <- base::withVisible(base::local({ [18:01:43.107] ...future.makeSendCondition <- local({ [18:01:43.107] sendCondition <- NULL [18:01:43.107] function(frame = 1L) { [18:01:43.107] if (is.function(sendCondition)) [18:01:43.107] return(sendCondition) [18:01:43.107] ns <- getNamespace("parallel") [18:01:43.107] if (exists("sendData", mode = "function", [18:01:43.107] envir = ns)) { [18:01:43.107] parallel_sendData <- get("sendData", mode = "function", [18:01:43.107] envir = ns) [18:01:43.107] envir <- sys.frame(frame) [18:01:43.107] master <- NULL [18:01:43.107] while (!identical(envir, .GlobalEnv) && [18:01:43.107] !identical(envir, emptyenv())) { [18:01:43.107] if (exists("master", mode = "list", envir = envir, [18:01:43.107] inherits = FALSE)) { [18:01:43.107] master <- get("master", mode = "list", [18:01:43.107] envir = envir, inherits = FALSE) [18:01:43.107] if (inherits(master, c("SOCKnode", [18:01:43.107] "SOCK0node"))) { [18:01:43.107] sendCondition <<- function(cond) { [18:01:43.107] data <- list(type = "VALUE", value = cond, [18:01:43.107] success = TRUE) [18:01:43.107] parallel_sendData(master, data) [18:01:43.107] } [18:01:43.107] return(sendCondition) [18:01:43.107] } [18:01:43.107] } [18:01:43.107] frame <- frame + 1L [18:01:43.107] envir <- sys.frame(frame) [18:01:43.107] } [18:01:43.107] } [18:01:43.107] sendCondition <<- function(cond) NULL [18:01:43.107] } [18:01:43.107] }) [18:01:43.107] withCallingHandlers({ [18:01:43.107] { [18:01:43.107] 4 [18:01:43.107] } [18:01:43.107] }, immediateCondition = function(cond) { [18:01:43.107] sendCondition <- ...future.makeSendCondition() [18:01:43.107] sendCondition(cond) [18:01:43.107] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.107] { [18:01:43.107] inherits <- base::inherits [18:01:43.107] invokeRestart <- base::invokeRestart [18:01:43.107] is.null <- base::is.null [18:01:43.107] muffled <- FALSE [18:01:43.107] if (inherits(cond, "message")) { [18:01:43.107] muffled <- grepl(pattern, "muffleMessage") [18:01:43.107] if (muffled) [18:01:43.107] invokeRestart("muffleMessage") [18:01:43.107] } [18:01:43.107] else if (inherits(cond, "warning")) { [18:01:43.107] muffled <- grepl(pattern, "muffleWarning") [18:01:43.107] if (muffled) [18:01:43.107] invokeRestart("muffleWarning") [18:01:43.107] } [18:01:43.107] else if (inherits(cond, "condition")) { [18:01:43.107] if (!is.null(pattern)) { [18:01:43.107] computeRestarts <- base::computeRestarts [18:01:43.107] grepl <- base::grepl [18:01:43.107] restarts <- computeRestarts(cond) [18:01:43.107] for (restart in restarts) { [18:01:43.107] name <- restart$name [18:01:43.107] if (is.null(name)) [18:01:43.107] next [18:01:43.107] if (!grepl(pattern, name)) [18:01:43.107] next [18:01:43.107] invokeRestart(restart) [18:01:43.107] muffled <- TRUE [18:01:43.107] break [18:01:43.107] } [18:01:43.107] } [18:01:43.107] } [18:01:43.107] invisible(muffled) [18:01:43.107] } [18:01:43.107] muffleCondition(cond) [18:01:43.107] }) [18:01:43.107] })) [18:01:43.107] future::FutureResult(value = ...future.value$value, [18:01:43.107] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.107] ...future.rng), globalenv = if (FALSE) [18:01:43.107] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.107] ...future.globalenv.names)) [18:01:43.107] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.107] }, condition = base::local({ [18:01:43.107] c <- base::c [18:01:43.107] inherits <- base::inherits [18:01:43.107] invokeRestart <- base::invokeRestart [18:01:43.107] length <- base::length [18:01:43.107] list <- base::list [18:01:43.107] seq.int <- base::seq.int [18:01:43.107] signalCondition <- base::signalCondition [18:01:43.107] sys.calls <- base::sys.calls [18:01:43.107] `[[` <- base::`[[` [18:01:43.107] `+` <- base::`+` [18:01:43.107] `<<-` <- base::`<<-` [18:01:43.107] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.107] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.107] 3L)] [18:01:43.107] } [18:01:43.107] function(cond) { [18:01:43.107] is_error <- inherits(cond, "error") [18:01:43.107] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.107] NULL) [18:01:43.107] if (is_error) { [18:01:43.107] sessionInformation <- function() { [18:01:43.107] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.107] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.107] search = base::search(), system = base::Sys.info()) [18:01:43.107] } [18:01:43.107] ...future.conditions[[length(...future.conditions) + [18:01:43.107] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.107] cond$call), session = sessionInformation(), [18:01:43.107] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.107] signalCondition(cond) [18:01:43.107] } [18:01:43.107] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.107] "immediateCondition"))) { [18:01:43.107] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.107] ...future.conditions[[length(...future.conditions) + [18:01:43.107] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.107] if (TRUE && !signal) { [18:01:43.107] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.107] { [18:01:43.107] inherits <- base::inherits [18:01:43.107] invokeRestart <- base::invokeRestart [18:01:43.107] is.null <- base::is.null [18:01:43.107] muffled <- FALSE [18:01:43.107] if (inherits(cond, "message")) { [18:01:43.107] muffled <- grepl(pattern, "muffleMessage") [18:01:43.107] if (muffled) [18:01:43.107] invokeRestart("muffleMessage") [18:01:43.107] } [18:01:43.107] else if (inherits(cond, "warning")) { [18:01:43.107] muffled <- grepl(pattern, "muffleWarning") [18:01:43.107] if (muffled) [18:01:43.107] invokeRestart("muffleWarning") [18:01:43.107] } [18:01:43.107] else if (inherits(cond, "condition")) { [18:01:43.107] if (!is.null(pattern)) { [18:01:43.107] computeRestarts <- base::computeRestarts [18:01:43.107] grepl <- base::grepl [18:01:43.107] restarts <- computeRestarts(cond) [18:01:43.107] for (restart in restarts) { [18:01:43.107] name <- restart$name [18:01:43.107] if (is.null(name)) [18:01:43.107] next [18:01:43.107] if (!grepl(pattern, name)) [18:01:43.107] next [18:01:43.107] invokeRestart(restart) [18:01:43.107] muffled <- TRUE [18:01:43.107] break [18:01:43.107] } [18:01:43.107] } [18:01:43.107] } [18:01:43.107] invisible(muffled) [18:01:43.107] } [18:01:43.107] muffleCondition(cond, pattern = "^muffle") [18:01:43.107] } [18:01:43.107] } [18:01:43.107] else { [18:01:43.107] if (TRUE) { [18:01:43.107] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.107] { [18:01:43.107] inherits <- base::inherits [18:01:43.107] invokeRestart <- base::invokeRestart [18:01:43.107] is.null <- base::is.null [18:01:43.107] muffled <- FALSE [18:01:43.107] if (inherits(cond, "message")) { [18:01:43.107] muffled <- grepl(pattern, "muffleMessage") [18:01:43.107] if (muffled) [18:01:43.107] invokeRestart("muffleMessage") [18:01:43.107] } [18:01:43.107] else if (inherits(cond, "warning")) { [18:01:43.107] muffled <- grepl(pattern, "muffleWarning") [18:01:43.107] if (muffled) [18:01:43.107] invokeRestart("muffleWarning") [18:01:43.107] } [18:01:43.107] else if (inherits(cond, "condition")) { [18:01:43.107] if (!is.null(pattern)) { [18:01:43.107] computeRestarts <- base::computeRestarts [18:01:43.107] grepl <- base::grepl [18:01:43.107] restarts <- computeRestarts(cond) [18:01:43.107] for (restart in restarts) { [18:01:43.107] name <- restart$name [18:01:43.107] if (is.null(name)) [18:01:43.107] next [18:01:43.107] if (!grepl(pattern, name)) [18:01:43.107] next [18:01:43.107] invokeRestart(restart) [18:01:43.107] muffled <- TRUE [18:01:43.107] break [18:01:43.107] } [18:01:43.107] } [18:01:43.107] } [18:01:43.107] invisible(muffled) [18:01:43.107] } [18:01:43.107] muffleCondition(cond, pattern = "^muffle") [18:01:43.107] } [18:01:43.107] } [18:01:43.107] } [18:01:43.107] })) [18:01:43.107] }, error = function(ex) { [18:01:43.107] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.107] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.107] ...future.rng), started = ...future.startTime, [18:01:43.107] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.107] version = "1.8"), class = "FutureResult") [18:01:43.107] }, finally = { [18:01:43.107] if (!identical(...future.workdir, getwd())) [18:01:43.107] setwd(...future.workdir) [18:01:43.107] { [18:01:43.107] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.107] ...future.oldOptions$nwarnings <- NULL [18:01:43.107] } [18:01:43.107] base::options(...future.oldOptions) [18:01:43.107] if (.Platform$OS.type == "windows") { [18:01:43.107] old_names <- names(...future.oldEnvVars) [18:01:43.107] envs <- base::Sys.getenv() [18:01:43.107] names <- names(envs) [18:01:43.107] common <- intersect(names, old_names) [18:01:43.107] added <- setdiff(names, old_names) [18:01:43.107] removed <- setdiff(old_names, names) [18:01:43.107] changed <- common[...future.oldEnvVars[common] != [18:01:43.107] envs[common]] [18:01:43.107] NAMES <- toupper(changed) [18:01:43.107] args <- list() [18:01:43.107] for (kk in seq_along(NAMES)) { [18:01:43.107] name <- changed[[kk]] [18:01:43.107] NAME <- NAMES[[kk]] [18:01:43.107] if (name != NAME && is.element(NAME, old_names)) [18:01:43.107] next [18:01:43.107] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.107] } [18:01:43.107] NAMES <- toupper(added) [18:01:43.107] for (kk in seq_along(NAMES)) { [18:01:43.107] name <- added[[kk]] [18:01:43.107] NAME <- NAMES[[kk]] [18:01:43.107] if (name != NAME && is.element(NAME, old_names)) [18:01:43.107] next [18:01:43.107] args[[name]] <- "" [18:01:43.107] } [18:01:43.107] NAMES <- toupper(removed) [18:01:43.107] for (kk in seq_along(NAMES)) { [18:01:43.107] name <- removed[[kk]] [18:01:43.107] NAME <- NAMES[[kk]] [18:01:43.107] if (name != NAME && is.element(NAME, old_names)) [18:01:43.107] next [18:01:43.107] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.107] } [18:01:43.107] if (length(args) > 0) [18:01:43.107] base::do.call(base::Sys.setenv, args = args) [18:01:43.107] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.107] } [18:01:43.107] else { [18:01:43.107] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.107] } [18:01:43.107] { [18:01:43.107] if (base::length(...future.futureOptionsAdded) > [18:01:43.107] 0L) { [18:01:43.107] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.107] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.107] base::options(opts) [18:01:43.107] } [18:01:43.107] { [18:01:43.107] { [18:01:43.107] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.107] NULL [18:01:43.107] } [18:01:43.107] options(future.plan = NULL) [18:01:43.107] if (is.na(NA_character_)) [18:01:43.107] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.107] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.107] future::plan(list(function (..., workers = availableCores(), [18:01:43.107] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.107] envir = parent.frame()) [18:01:43.107] { [18:01:43.107] if (is.function(workers)) [18:01:43.107] workers <- workers() [18:01:43.107] workers <- structure(as.integer(workers), [18:01:43.107] class = class(workers)) [18:01:43.107] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.107] workers >= 1) [18:01:43.107] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.107] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.107] } [18:01:43.107] future <- MultisessionFuture(..., workers = workers, [18:01:43.107] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.107] envir = envir) [18:01:43.107] if (!future$lazy) [18:01:43.107] future <- run(future) [18:01:43.107] invisible(future) [18:01:43.107] }), .cleanup = FALSE, .init = FALSE) [18:01:43.107] } [18:01:43.107] } [18:01:43.107] } [18:01:43.107] }) [18:01:43.107] if (TRUE) { [18:01:43.107] base::sink(type = "output", split = FALSE) [18:01:43.107] if (TRUE) { [18:01:43.107] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.107] } [18:01:43.107] else { [18:01:43.107] ...future.result["stdout"] <- base::list(NULL) [18:01:43.107] } [18:01:43.107] base::close(...future.stdout) [18:01:43.107] ...future.stdout <- NULL [18:01:43.107] } [18:01:43.107] ...future.result$conditions <- ...future.conditions [18:01:43.107] ...future.result$finished <- base::Sys.time() [18:01:43.107] ...future.result [18:01:43.107] } [18:01:43.112] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:43.126] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.127] - Validating connection of MultisessionFuture [18:01:43.127] - received message: FutureResult [18:01:43.127] - Received FutureResult [18:01:43.127] - Erased future from FutureRegistry [18:01:43.128] result() for ClusterFuture ... [18:01:43.128] - result already collected: FutureResult [18:01:43.128] result() for ClusterFuture ... done [18:01:43.128] receiveMessageFromWorker() for ClusterFuture ... done [18:01:43.128] result() for ClusterFuture ... [18:01:43.128] - result already collected: FutureResult [18:01:43.129] result() for ClusterFuture ... done [18:01:43.129] result() for ClusterFuture ... [18:01:43.129] - result already collected: FutureResult [18:01:43.129] result() for ClusterFuture ... done [18:01:43.130] MultisessionFuture started [18:01:43.130] - Launch lazy future ... done [18:01:43.131] 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" [18:01:43.135] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.135] - Validating connection of MultisessionFuture [18:01:43.136] - received message: FutureResult [18:01:43.136] - Received FutureResult [18:01:43.136] - Erased future from FutureRegistry [18:01:43.136] result() for ClusterFuture ... [18:01:43.136] - result already collected: FutureResult [18:01:43.136] result() for ClusterFuture ... done [18:01:43.137] receiveMessageFromWorker() for ClusterFuture ... done [18:01:43.148] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.148] - Validating connection of MultisessionFuture [18:01:43.149] - received message: FutureResult [18:01:43.149] - Received FutureResult [18:01:43.149] - Erased future from FutureRegistry [18:01:43.149] result() for ClusterFuture ... [18:01:43.149] - result already collected: FutureResult [18:01:43.149] result() for ClusterFuture ... done [18:01:43.150] 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" ... [18:01:43.152] resolve() on list environment ... [18:01:43.153] recursive: 0 [18:01:43.154] length: 6 [18:01:43.154] elements: 'a', 'b', 'c', 'd', '', '' [18:01:43.154] signalConditionsASAP(numeric, pos=1) ... [18:01:43.154] - nx: 6 [18:01:43.154] - relay: TRUE [18:01:43.155] - stdout: TRUE [18:01:43.155] - signal: TRUE [18:01:43.155] - resignal: FALSE [18:01:43.155] - force: TRUE [18:01:43.155] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.155] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.156] - until=2 [18:01:43.156] - relaying element #2 [18:01:43.156] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.156] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.156] signalConditionsASAP(NULL, pos=1) ... done [18:01:43.156] length: 5 (resolved future 1) [18:01:43.157] Future #2 [18:01:43.157] result() for ClusterFuture ... [18:01:43.157] - result already collected: FutureResult [18:01:43.157] result() for ClusterFuture ... done [18:01:43.157] result() for ClusterFuture ... [18:01:43.157] - result already collected: FutureResult [18:01:43.158] result() for ClusterFuture ... done [18:01:43.158] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:43.158] - nx: 6 [18:01:43.158] - relay: TRUE [18:01:43.158] - stdout: TRUE [18:01:43.158] - signal: TRUE [18:01:43.159] - resignal: FALSE [18:01:43.159] - force: TRUE [18:01:43.159] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.159] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.159] - until=2 [18:01:43.159] - relaying element #2 [18:01:43.160] result() for ClusterFuture ... [18:01:43.160] - result already collected: FutureResult [18:01:43.160] result() for ClusterFuture ... done [18:01:43.160] result() for ClusterFuture ... [18:01:43.160] - result already collected: FutureResult [18:01:43.160] result() for ClusterFuture ... done [18:01:43.161] result() for ClusterFuture ... [18:01:43.161] - result already collected: FutureResult [18:01:43.161] result() for ClusterFuture ... done [18:01:43.161] result() for ClusterFuture ... [18:01:43.161] - result already collected: FutureResult [18:01:43.161] result() for ClusterFuture ... done [18:01:43.161] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.162] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.162] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:43.162] length: 4 (resolved future 2) [18:01:43.162] Future #3 [18:01:43.162] result() for ClusterFuture ... [18:01:43.163] - result already collected: FutureResult [18:01:43.163] result() for ClusterFuture ... done [18:01:43.163] result() for ClusterFuture ... [18:01:43.163] - result already collected: FutureResult [18:01:43.163] result() for ClusterFuture ... done [18:01:43.163] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:43.163] - nx: 6 [18:01:43.164] - relay: TRUE [18:01:43.164] - stdout: TRUE [18:01:43.164] - signal: TRUE [18:01:43.164] - resignal: FALSE [18:01:43.164] - force: TRUE [18:01:43.164] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.165] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.165] - until=3 [18:01:43.165] - relaying element #3 [18:01:43.165] result() for ClusterFuture ... [18:01:43.165] - result already collected: FutureResult [18:01:43.165] result() for ClusterFuture ... done [18:01:43.166] result() for ClusterFuture ... [18:01:43.166] - result already collected: FutureResult [18:01:43.166] result() for ClusterFuture ... done [18:01:43.166] result() for ClusterFuture ... [18:01:43.166] - result already collected: FutureResult [18:01:43.166] result() for ClusterFuture ... done [18:01:43.167] result() for ClusterFuture ... [18:01:43.167] - result already collected: FutureResult [18:01:43.167] result() for ClusterFuture ... done [18:01:43.167] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.167] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.167] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:43.168] length: 3 (resolved future 3) [18:01:43.168] Future #4 [18:01:43.168] result() for ClusterFuture ... [18:01:43.168] - result already collected: FutureResult [18:01:43.168] result() for ClusterFuture ... done [18:01:43.168] result() for ClusterFuture ... [18:01:43.169] - result already collected: FutureResult [18:01:43.169] result() for ClusterFuture ... done [18:01:43.169] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:43.169] - nx: 6 [18:01:43.169] - relay: TRUE [18:01:43.169] - stdout: TRUE [18:01:43.169] - signal: TRUE [18:01:43.170] - resignal: FALSE [18:01:43.170] - force: TRUE [18:01:43.170] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.170] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.170] - until=4 [18:01:43.170] - relaying element #4 [18:01:43.171] result() for ClusterFuture ... [18:01:43.171] - result already collected: FutureResult [18:01:43.171] result() for ClusterFuture ... done [18:01:43.171] result() for ClusterFuture ... [18:01:43.171] - result already collected: FutureResult [18:01:43.171] result() for ClusterFuture ... done [18:01:43.172] result() for ClusterFuture ... [18:01:43.172] - result already collected: FutureResult [18:01:43.172] result() for ClusterFuture ... done [18:01:43.172] result() for ClusterFuture ... [18:01:43.172] - result already collected: FutureResult [18:01:43.172] result() for ClusterFuture ... done [18:01:43.173] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.173] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.173] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:43.173] length: 2 (resolved future 4) [18:01:43.173] signalConditionsASAP(NULL, pos=5) ... [18:01:43.173] - nx: 6 [18:01:43.174] - relay: TRUE [18:01:43.174] - stdout: TRUE [18:01:43.174] - signal: TRUE [18:01:43.174] - resignal: FALSE [18:01:43.174] - force: TRUE [18:01:43.174] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.174] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.175] - until=6 [18:01:43.175] - relaying element #6 [18:01:43.175] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.175] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.175] signalConditionsASAP(NULL, pos=5) ... done [18:01:43.175] length: 1 (resolved future 5) [18:01:43.176] signalConditionsASAP(numeric, pos=6) ... [18:01:43.176] - nx: 6 [18:01:43.176] - relay: TRUE [18:01:43.176] - stdout: TRUE [18:01:43.176] - signal: TRUE [18:01:43.176] - resignal: FALSE [18:01:43.177] - force: TRUE [18:01:43.177] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.177] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.177] - until=6 [18:01:43.177] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.177] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.178] signalConditionsASAP(numeric, pos=6) ... done [18:01:43.178] length: 0 (resolved future 6) [18:01:43.178] Relaying remaining futures [18:01:43.178] signalConditionsASAP(NULL, pos=0) ... [18:01:43.178] - nx: 6 [18:01:43.178] - relay: TRUE [18:01:43.178] - stdout: TRUE [18:01:43.179] - signal: TRUE [18:01:43.179] - resignal: FALSE [18:01:43.179] - force: TRUE [18:01:43.179] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.179] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:43.180] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.180] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.180] signalConditionsASAP(NULL, pos=0) ... done [18:01:43.180] resolve() on list environment ... DONE [18:01:43.180] result() for ClusterFuture ... [18:01:43.180] - result already collected: FutureResult [18:01:43.181] result() for ClusterFuture ... done [18:01:43.181] result() for ClusterFuture ... [18:01:43.181] - result already collected: FutureResult [18:01:43.181] result() for ClusterFuture ... done [18:01:43.181] result() for ClusterFuture ... [18:01:43.181] - result already collected: FutureResult [18:01:43.182] result() for ClusterFuture ... done [18:01:43.182] result() for ClusterFuture ... [18:01:43.182] - result already collected: FutureResult [18:01:43.182] result() for ClusterFuture ... done [18:01:43.182] result() for ClusterFuture ... [18:01:43.182] - result already collected: FutureResult [18:01:43.183] result() for ClusterFuture ... done [18:01:43.183] result() for ClusterFuture ... [18:01:43.183] - result already collected: FutureResult [18:01:43.183] 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) [18:01:43.185] getGlobalsAndPackages() ... [18:01:43.185] Searching for globals... [18:01:43.186] [18:01:43.186] Searching for globals ... DONE [18:01:43.186] - globals: [0] [18:01:43.186] getGlobalsAndPackages() ... DONE [18:01:43.187] run() for 'Future' ... [18:01:43.187] - state: 'created' [18:01:43.187] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.201] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.201] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.201] - Field: 'node' [18:01:43.201] - Field: 'label' [18:01:43.201] - Field: 'local' [18:01:43.202] - Field: 'owner' [18:01:43.202] - Field: 'envir' [18:01:43.202] - Field: 'workers' [18:01:43.202] - Field: 'packages' [18:01:43.202] - Field: 'gc' [18:01:43.202] - Field: 'conditions' [18:01:43.203] - Field: 'persistent' [18:01:43.203] - Field: 'expr' [18:01:43.203] - Field: 'uuid' [18:01:43.203] - Field: 'seed' [18:01:43.203] - Field: 'version' [18:01:43.204] - Field: 'result' [18:01:43.204] - Field: 'asynchronous' [18:01:43.204] - Field: 'calls' [18:01:43.204] - Field: 'globals' [18:01:43.204] - Field: 'stdout' [18:01:43.204] - Field: 'earlySignal' [18:01:43.205] - Field: 'lazy' [18:01:43.205] - Field: 'state' [18:01:43.205] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.208] - Launch lazy future ... [18:01:43.208] Packages needed by the future expression (n = 0): [18:01:43.208] Packages needed by future strategies (n = 0): [18:01:43.209] { [18:01:43.209] { [18:01:43.209] { [18:01:43.209] ...future.startTime <- base::Sys.time() [18:01:43.209] { [18:01:43.209] { [18:01:43.209] { [18:01:43.209] { [18:01:43.209] base::local({ [18:01:43.209] has_future <- base::requireNamespace("future", [18:01:43.209] quietly = TRUE) [18:01:43.209] if (has_future) { [18:01:43.209] ns <- base::getNamespace("future") [18:01:43.209] version <- ns[[".package"]][["version"]] [18:01:43.209] if (is.null(version)) [18:01:43.209] version <- utils::packageVersion("future") [18:01:43.209] } [18:01:43.209] else { [18:01:43.209] version <- NULL [18:01:43.209] } [18:01:43.209] if (!has_future || version < "1.8.0") { [18:01:43.209] info <- base::c(r_version = base::gsub("R version ", [18:01:43.209] "", base::R.version$version.string), [18:01:43.209] platform = base::sprintf("%s (%s-bit)", [18:01:43.209] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.209] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.209] "release", "version")], collapse = " "), [18:01:43.209] hostname = base::Sys.info()[["nodename"]]) [18:01:43.209] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.209] info) [18:01:43.209] info <- base::paste(info, collapse = "; ") [18:01:43.209] if (!has_future) { [18:01:43.209] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.209] info) [18:01:43.209] } [18:01:43.209] else { [18:01:43.209] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.209] info, version) [18:01:43.209] } [18:01:43.209] base::stop(msg) [18:01:43.209] } [18:01:43.209] }) [18:01:43.209] } [18:01:43.209] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.209] base::options(mc.cores = 1L) [18:01:43.209] } [18:01:43.209] options(future.plan = NULL) [18:01:43.209] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.209] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.209] } [18:01:43.209] ...future.workdir <- getwd() [18:01:43.209] } [18:01:43.209] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.209] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.209] } [18:01:43.209] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.209] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.209] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.209] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.209] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.209] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.209] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.209] base::names(...future.oldOptions)) [18:01:43.209] } [18:01:43.209] if (FALSE) { [18:01:43.209] } [18:01:43.209] else { [18:01:43.209] if (TRUE) { [18:01:43.209] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.209] open = "w") [18:01:43.209] } [18:01:43.209] else { [18:01:43.209] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.209] windows = "NUL", "/dev/null"), open = "w") [18:01:43.209] } [18:01:43.209] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.209] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.209] base::sink(type = "output", split = FALSE) [18:01:43.209] base::close(...future.stdout) [18:01:43.209] }, add = TRUE) [18:01:43.209] } [18:01:43.209] ...future.frame <- base::sys.nframe() [18:01:43.209] ...future.conditions <- base::list() [18:01:43.209] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.209] if (FALSE) { [18:01:43.209] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.209] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.209] } [18:01:43.209] ...future.result <- base::tryCatch({ [18:01:43.209] base::withCallingHandlers({ [18:01:43.209] ...future.value <- base::withVisible(base::local({ [18:01:43.209] ...future.makeSendCondition <- local({ [18:01:43.209] sendCondition <- NULL [18:01:43.209] function(frame = 1L) { [18:01:43.209] if (is.function(sendCondition)) [18:01:43.209] return(sendCondition) [18:01:43.209] ns <- getNamespace("parallel") [18:01:43.209] if (exists("sendData", mode = "function", [18:01:43.209] envir = ns)) { [18:01:43.209] parallel_sendData <- get("sendData", mode = "function", [18:01:43.209] envir = ns) [18:01:43.209] envir <- sys.frame(frame) [18:01:43.209] master <- NULL [18:01:43.209] while (!identical(envir, .GlobalEnv) && [18:01:43.209] !identical(envir, emptyenv())) { [18:01:43.209] if (exists("master", mode = "list", envir = envir, [18:01:43.209] inherits = FALSE)) { [18:01:43.209] master <- get("master", mode = "list", [18:01:43.209] envir = envir, inherits = FALSE) [18:01:43.209] if (inherits(master, c("SOCKnode", [18:01:43.209] "SOCK0node"))) { [18:01:43.209] sendCondition <<- function(cond) { [18:01:43.209] data <- list(type = "VALUE", value = cond, [18:01:43.209] success = TRUE) [18:01:43.209] parallel_sendData(master, data) [18:01:43.209] } [18:01:43.209] return(sendCondition) [18:01:43.209] } [18:01:43.209] } [18:01:43.209] frame <- frame + 1L [18:01:43.209] envir <- sys.frame(frame) [18:01:43.209] } [18:01:43.209] } [18:01:43.209] sendCondition <<- function(cond) NULL [18:01:43.209] } [18:01:43.209] }) [18:01:43.209] withCallingHandlers({ [18:01:43.209] 2 [18:01:43.209] }, immediateCondition = function(cond) { [18:01:43.209] sendCondition <- ...future.makeSendCondition() [18:01:43.209] sendCondition(cond) [18:01:43.209] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.209] { [18:01:43.209] inherits <- base::inherits [18:01:43.209] invokeRestart <- base::invokeRestart [18:01:43.209] is.null <- base::is.null [18:01:43.209] muffled <- FALSE [18:01:43.209] if (inherits(cond, "message")) { [18:01:43.209] muffled <- grepl(pattern, "muffleMessage") [18:01:43.209] if (muffled) [18:01:43.209] invokeRestart("muffleMessage") [18:01:43.209] } [18:01:43.209] else if (inherits(cond, "warning")) { [18:01:43.209] muffled <- grepl(pattern, "muffleWarning") [18:01:43.209] if (muffled) [18:01:43.209] invokeRestart("muffleWarning") [18:01:43.209] } [18:01:43.209] else if (inherits(cond, "condition")) { [18:01:43.209] if (!is.null(pattern)) { [18:01:43.209] computeRestarts <- base::computeRestarts [18:01:43.209] grepl <- base::grepl [18:01:43.209] restarts <- computeRestarts(cond) [18:01:43.209] for (restart in restarts) { [18:01:43.209] name <- restart$name [18:01:43.209] if (is.null(name)) [18:01:43.209] next [18:01:43.209] if (!grepl(pattern, name)) [18:01:43.209] next [18:01:43.209] invokeRestart(restart) [18:01:43.209] muffled <- TRUE [18:01:43.209] break [18:01:43.209] } [18:01:43.209] } [18:01:43.209] } [18:01:43.209] invisible(muffled) [18:01:43.209] } [18:01:43.209] muffleCondition(cond) [18:01:43.209] }) [18:01:43.209] })) [18:01:43.209] future::FutureResult(value = ...future.value$value, [18:01:43.209] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.209] ...future.rng), globalenv = if (FALSE) [18:01:43.209] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.209] ...future.globalenv.names)) [18:01:43.209] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.209] }, condition = base::local({ [18:01:43.209] c <- base::c [18:01:43.209] inherits <- base::inherits [18:01:43.209] invokeRestart <- base::invokeRestart [18:01:43.209] length <- base::length [18:01:43.209] list <- base::list [18:01:43.209] seq.int <- base::seq.int [18:01:43.209] signalCondition <- base::signalCondition [18:01:43.209] sys.calls <- base::sys.calls [18:01:43.209] `[[` <- base::`[[` [18:01:43.209] `+` <- base::`+` [18:01:43.209] `<<-` <- base::`<<-` [18:01:43.209] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.209] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.209] 3L)] [18:01:43.209] } [18:01:43.209] function(cond) { [18:01:43.209] is_error <- inherits(cond, "error") [18:01:43.209] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.209] NULL) [18:01:43.209] if (is_error) { [18:01:43.209] sessionInformation <- function() { [18:01:43.209] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.209] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.209] search = base::search(), system = base::Sys.info()) [18:01:43.209] } [18:01:43.209] ...future.conditions[[length(...future.conditions) + [18:01:43.209] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.209] cond$call), session = sessionInformation(), [18:01:43.209] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.209] signalCondition(cond) [18:01:43.209] } [18:01:43.209] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.209] "immediateCondition"))) { [18:01:43.209] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.209] ...future.conditions[[length(...future.conditions) + [18:01:43.209] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.209] if (TRUE && !signal) { [18:01:43.209] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.209] { [18:01:43.209] inherits <- base::inherits [18:01:43.209] invokeRestart <- base::invokeRestart [18:01:43.209] is.null <- base::is.null [18:01:43.209] muffled <- FALSE [18:01:43.209] if (inherits(cond, "message")) { [18:01:43.209] muffled <- grepl(pattern, "muffleMessage") [18:01:43.209] if (muffled) [18:01:43.209] invokeRestart("muffleMessage") [18:01:43.209] } [18:01:43.209] else if (inherits(cond, "warning")) { [18:01:43.209] muffled <- grepl(pattern, "muffleWarning") [18:01:43.209] if (muffled) [18:01:43.209] invokeRestart("muffleWarning") [18:01:43.209] } [18:01:43.209] else if (inherits(cond, "condition")) { [18:01:43.209] if (!is.null(pattern)) { [18:01:43.209] computeRestarts <- base::computeRestarts [18:01:43.209] grepl <- base::grepl [18:01:43.209] restarts <- computeRestarts(cond) [18:01:43.209] for (restart in restarts) { [18:01:43.209] name <- restart$name [18:01:43.209] if (is.null(name)) [18:01:43.209] next [18:01:43.209] if (!grepl(pattern, name)) [18:01:43.209] next [18:01:43.209] invokeRestart(restart) [18:01:43.209] muffled <- TRUE [18:01:43.209] break [18:01:43.209] } [18:01:43.209] } [18:01:43.209] } [18:01:43.209] invisible(muffled) [18:01:43.209] } [18:01:43.209] muffleCondition(cond, pattern = "^muffle") [18:01:43.209] } [18:01:43.209] } [18:01:43.209] else { [18:01:43.209] if (TRUE) { [18:01:43.209] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.209] { [18:01:43.209] inherits <- base::inherits [18:01:43.209] invokeRestart <- base::invokeRestart [18:01:43.209] is.null <- base::is.null [18:01:43.209] muffled <- FALSE [18:01:43.209] if (inherits(cond, "message")) { [18:01:43.209] muffled <- grepl(pattern, "muffleMessage") [18:01:43.209] if (muffled) [18:01:43.209] invokeRestart("muffleMessage") [18:01:43.209] } [18:01:43.209] else if (inherits(cond, "warning")) { [18:01:43.209] muffled <- grepl(pattern, "muffleWarning") [18:01:43.209] if (muffled) [18:01:43.209] invokeRestart("muffleWarning") [18:01:43.209] } [18:01:43.209] else if (inherits(cond, "condition")) { [18:01:43.209] if (!is.null(pattern)) { [18:01:43.209] computeRestarts <- base::computeRestarts [18:01:43.209] grepl <- base::grepl [18:01:43.209] restarts <- computeRestarts(cond) [18:01:43.209] for (restart in restarts) { [18:01:43.209] name <- restart$name [18:01:43.209] if (is.null(name)) [18:01:43.209] next [18:01:43.209] if (!grepl(pattern, name)) [18:01:43.209] next [18:01:43.209] invokeRestart(restart) [18:01:43.209] muffled <- TRUE [18:01:43.209] break [18:01:43.209] } [18:01:43.209] } [18:01:43.209] } [18:01:43.209] invisible(muffled) [18:01:43.209] } [18:01:43.209] muffleCondition(cond, pattern = "^muffle") [18:01:43.209] } [18:01:43.209] } [18:01:43.209] } [18:01:43.209] })) [18:01:43.209] }, error = function(ex) { [18:01:43.209] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.209] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.209] ...future.rng), started = ...future.startTime, [18:01:43.209] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.209] version = "1.8"), class = "FutureResult") [18:01:43.209] }, finally = { [18:01:43.209] if (!identical(...future.workdir, getwd())) [18:01:43.209] setwd(...future.workdir) [18:01:43.209] { [18:01:43.209] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.209] ...future.oldOptions$nwarnings <- NULL [18:01:43.209] } [18:01:43.209] base::options(...future.oldOptions) [18:01:43.209] if (.Platform$OS.type == "windows") { [18:01:43.209] old_names <- names(...future.oldEnvVars) [18:01:43.209] envs <- base::Sys.getenv() [18:01:43.209] names <- names(envs) [18:01:43.209] common <- intersect(names, old_names) [18:01:43.209] added <- setdiff(names, old_names) [18:01:43.209] removed <- setdiff(old_names, names) [18:01:43.209] changed <- common[...future.oldEnvVars[common] != [18:01:43.209] envs[common]] [18:01:43.209] NAMES <- toupper(changed) [18:01:43.209] args <- list() [18:01:43.209] for (kk in seq_along(NAMES)) { [18:01:43.209] name <- changed[[kk]] [18:01:43.209] NAME <- NAMES[[kk]] [18:01:43.209] if (name != NAME && is.element(NAME, old_names)) [18:01:43.209] next [18:01:43.209] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.209] } [18:01:43.209] NAMES <- toupper(added) [18:01:43.209] for (kk in seq_along(NAMES)) { [18:01:43.209] name <- added[[kk]] [18:01:43.209] NAME <- NAMES[[kk]] [18:01:43.209] if (name != NAME && is.element(NAME, old_names)) [18:01:43.209] next [18:01:43.209] args[[name]] <- "" [18:01:43.209] } [18:01:43.209] NAMES <- toupper(removed) [18:01:43.209] for (kk in seq_along(NAMES)) { [18:01:43.209] name <- removed[[kk]] [18:01:43.209] NAME <- NAMES[[kk]] [18:01:43.209] if (name != NAME && is.element(NAME, old_names)) [18:01:43.209] next [18:01:43.209] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.209] } [18:01:43.209] if (length(args) > 0) [18:01:43.209] base::do.call(base::Sys.setenv, args = args) [18:01:43.209] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.209] } [18:01:43.209] else { [18:01:43.209] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.209] } [18:01:43.209] { [18:01:43.209] if (base::length(...future.futureOptionsAdded) > [18:01:43.209] 0L) { [18:01:43.209] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.209] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.209] base::options(opts) [18:01:43.209] } [18:01:43.209] { [18:01:43.209] { [18:01:43.209] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.209] NULL [18:01:43.209] } [18:01:43.209] options(future.plan = NULL) [18:01:43.209] if (is.na(NA_character_)) [18:01:43.209] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.209] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.209] future::plan(list(function (..., workers = availableCores(), [18:01:43.209] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.209] envir = parent.frame()) [18:01:43.209] { [18:01:43.209] if (is.function(workers)) [18:01:43.209] workers <- workers() [18:01:43.209] workers <- structure(as.integer(workers), [18:01:43.209] class = class(workers)) [18:01:43.209] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.209] workers >= 1) [18:01:43.209] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.209] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.209] } [18:01:43.209] future <- MultisessionFuture(..., workers = workers, [18:01:43.209] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.209] envir = envir) [18:01:43.209] if (!future$lazy) [18:01:43.209] future <- run(future) [18:01:43.209] invisible(future) [18:01:43.209] }), .cleanup = FALSE, .init = FALSE) [18:01:43.209] } [18:01:43.209] } [18:01:43.209] } [18:01:43.209] }) [18:01:43.209] if (TRUE) { [18:01:43.209] base::sink(type = "output", split = FALSE) [18:01:43.209] if (TRUE) { [18:01:43.209] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.209] } [18:01:43.209] else { [18:01:43.209] ...future.result["stdout"] <- base::list(NULL) [18:01:43.209] } [18:01:43.209] base::close(...future.stdout) [18:01:43.209] ...future.stdout <- NULL [18:01:43.209] } [18:01:43.209] ...future.result$conditions <- ...future.conditions [18:01:43.209] ...future.result$finished <- base::Sys.time() [18:01:43.209] ...future.result [18:01:43.209] } [18:01:43.215] MultisessionFuture started [18:01:43.215] - Launch lazy future ... done [18:01:43.215] run() for 'MultisessionFuture' ... done [18:01:43.215] getGlobalsAndPackages() ... [18:01:43.215] Searching for globals... [18:01:43.216] [18:01:43.216] Searching for globals ... DONE [18:01:43.216] - globals: [0] [18:01:43.216] getGlobalsAndPackages() ... DONE [18:01:43.216] run() for 'Future' ... [18:01:43.217] - state: 'created' [18:01:43.217] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.230] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.231] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.231] - Field: 'node' [18:01:43.231] - Field: 'label' [18:01:43.231] - Field: 'local' [18:01:43.231] - Field: 'owner' [18:01:43.231] - Field: 'envir' [18:01:43.232] - Field: 'workers' [18:01:43.232] - Field: 'packages' [18:01:43.232] - Field: 'gc' [18:01:43.232] - Field: 'conditions' [18:01:43.232] - Field: 'persistent' [18:01:43.233] - Field: 'expr' [18:01:43.233] - Field: 'uuid' [18:01:43.233] - Field: 'seed' [18:01:43.233] - Field: 'version' [18:01:43.233] - Field: 'result' [18:01:43.233] - Field: 'asynchronous' [18:01:43.234] - Field: 'calls' [18:01:43.234] - Field: 'globals' [18:01:43.234] - Field: 'stdout' [18:01:43.234] - Field: 'earlySignal' [18:01:43.234] - Field: 'lazy' [18:01:43.234] - Field: 'state' [18:01:43.235] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.235] - Launch lazy future ... [18:01:43.235] Packages needed by the future expression (n = 0): [18:01:43.235] Packages needed by future strategies (n = 0): [18:01:43.236] { [18:01:43.236] { [18:01:43.236] { [18:01:43.236] ...future.startTime <- base::Sys.time() [18:01:43.236] { [18:01:43.236] { [18:01:43.236] { [18:01:43.236] { [18:01:43.236] base::local({ [18:01:43.236] has_future <- base::requireNamespace("future", [18:01:43.236] quietly = TRUE) [18:01:43.236] if (has_future) { [18:01:43.236] ns <- base::getNamespace("future") [18:01:43.236] version <- ns[[".package"]][["version"]] [18:01:43.236] if (is.null(version)) [18:01:43.236] version <- utils::packageVersion("future") [18:01:43.236] } [18:01:43.236] else { [18:01:43.236] version <- NULL [18:01:43.236] } [18:01:43.236] if (!has_future || version < "1.8.0") { [18:01:43.236] info <- base::c(r_version = base::gsub("R version ", [18:01:43.236] "", base::R.version$version.string), [18:01:43.236] platform = base::sprintf("%s (%s-bit)", [18:01:43.236] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.236] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.236] "release", "version")], collapse = " "), [18:01:43.236] hostname = base::Sys.info()[["nodename"]]) [18:01:43.236] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.236] info) [18:01:43.236] info <- base::paste(info, collapse = "; ") [18:01:43.236] if (!has_future) { [18:01:43.236] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.236] info) [18:01:43.236] } [18:01:43.236] else { [18:01:43.236] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.236] info, version) [18:01:43.236] } [18:01:43.236] base::stop(msg) [18:01:43.236] } [18:01:43.236] }) [18:01:43.236] } [18:01:43.236] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.236] base::options(mc.cores = 1L) [18:01:43.236] } [18:01:43.236] options(future.plan = NULL) [18:01:43.236] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.236] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.236] } [18:01:43.236] ...future.workdir <- getwd() [18:01:43.236] } [18:01:43.236] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.236] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.236] } [18:01:43.236] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.236] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.236] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.236] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.236] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.236] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.236] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.236] base::names(...future.oldOptions)) [18:01:43.236] } [18:01:43.236] if (FALSE) { [18:01:43.236] } [18:01:43.236] else { [18:01:43.236] if (TRUE) { [18:01:43.236] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.236] open = "w") [18:01:43.236] } [18:01:43.236] else { [18:01:43.236] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.236] windows = "NUL", "/dev/null"), open = "w") [18:01:43.236] } [18:01:43.236] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.236] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.236] base::sink(type = "output", split = FALSE) [18:01:43.236] base::close(...future.stdout) [18:01:43.236] }, add = TRUE) [18:01:43.236] } [18:01:43.236] ...future.frame <- base::sys.nframe() [18:01:43.236] ...future.conditions <- base::list() [18:01:43.236] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.236] if (FALSE) { [18:01:43.236] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.236] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.236] } [18:01:43.236] ...future.result <- base::tryCatch({ [18:01:43.236] base::withCallingHandlers({ [18:01:43.236] ...future.value <- base::withVisible(base::local({ [18:01:43.236] ...future.makeSendCondition <- local({ [18:01:43.236] sendCondition <- NULL [18:01:43.236] function(frame = 1L) { [18:01:43.236] if (is.function(sendCondition)) [18:01:43.236] return(sendCondition) [18:01:43.236] ns <- getNamespace("parallel") [18:01:43.236] if (exists("sendData", mode = "function", [18:01:43.236] envir = ns)) { [18:01:43.236] parallel_sendData <- get("sendData", mode = "function", [18:01:43.236] envir = ns) [18:01:43.236] envir <- sys.frame(frame) [18:01:43.236] master <- NULL [18:01:43.236] while (!identical(envir, .GlobalEnv) && [18:01:43.236] !identical(envir, emptyenv())) { [18:01:43.236] if (exists("master", mode = "list", envir = envir, [18:01:43.236] inherits = FALSE)) { [18:01:43.236] master <- get("master", mode = "list", [18:01:43.236] envir = envir, inherits = FALSE) [18:01:43.236] if (inherits(master, c("SOCKnode", [18:01:43.236] "SOCK0node"))) { [18:01:43.236] sendCondition <<- function(cond) { [18:01:43.236] data <- list(type = "VALUE", value = cond, [18:01:43.236] success = TRUE) [18:01:43.236] parallel_sendData(master, data) [18:01:43.236] } [18:01:43.236] return(sendCondition) [18:01:43.236] } [18:01:43.236] } [18:01:43.236] frame <- frame + 1L [18:01:43.236] envir <- sys.frame(frame) [18:01:43.236] } [18:01:43.236] } [18:01:43.236] sendCondition <<- function(cond) NULL [18:01:43.236] } [18:01:43.236] }) [18:01:43.236] withCallingHandlers({ [18:01:43.236] NULL [18:01:43.236] }, immediateCondition = function(cond) { [18:01:43.236] sendCondition <- ...future.makeSendCondition() [18:01:43.236] sendCondition(cond) [18:01:43.236] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.236] { [18:01:43.236] inherits <- base::inherits [18:01:43.236] invokeRestart <- base::invokeRestart [18:01:43.236] is.null <- base::is.null [18:01:43.236] muffled <- FALSE [18:01:43.236] if (inherits(cond, "message")) { [18:01:43.236] muffled <- grepl(pattern, "muffleMessage") [18:01:43.236] if (muffled) [18:01:43.236] invokeRestart("muffleMessage") [18:01:43.236] } [18:01:43.236] else if (inherits(cond, "warning")) { [18:01:43.236] muffled <- grepl(pattern, "muffleWarning") [18:01:43.236] if (muffled) [18:01:43.236] invokeRestart("muffleWarning") [18:01:43.236] } [18:01:43.236] else if (inherits(cond, "condition")) { [18:01:43.236] if (!is.null(pattern)) { [18:01:43.236] computeRestarts <- base::computeRestarts [18:01:43.236] grepl <- base::grepl [18:01:43.236] restarts <- computeRestarts(cond) [18:01:43.236] for (restart in restarts) { [18:01:43.236] name <- restart$name [18:01:43.236] if (is.null(name)) [18:01:43.236] next [18:01:43.236] if (!grepl(pattern, name)) [18:01:43.236] next [18:01:43.236] invokeRestart(restart) [18:01:43.236] muffled <- TRUE [18:01:43.236] break [18:01:43.236] } [18:01:43.236] } [18:01:43.236] } [18:01:43.236] invisible(muffled) [18:01:43.236] } [18:01:43.236] muffleCondition(cond) [18:01:43.236] }) [18:01:43.236] })) [18:01:43.236] future::FutureResult(value = ...future.value$value, [18:01:43.236] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.236] ...future.rng), globalenv = if (FALSE) [18:01:43.236] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.236] ...future.globalenv.names)) [18:01:43.236] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.236] }, condition = base::local({ [18:01:43.236] c <- base::c [18:01:43.236] inherits <- base::inherits [18:01:43.236] invokeRestart <- base::invokeRestart [18:01:43.236] length <- base::length [18:01:43.236] list <- base::list [18:01:43.236] seq.int <- base::seq.int [18:01:43.236] signalCondition <- base::signalCondition [18:01:43.236] sys.calls <- base::sys.calls [18:01:43.236] `[[` <- base::`[[` [18:01:43.236] `+` <- base::`+` [18:01:43.236] `<<-` <- base::`<<-` [18:01:43.236] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.236] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.236] 3L)] [18:01:43.236] } [18:01:43.236] function(cond) { [18:01:43.236] is_error <- inherits(cond, "error") [18:01:43.236] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.236] NULL) [18:01:43.236] if (is_error) { [18:01:43.236] sessionInformation <- function() { [18:01:43.236] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.236] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.236] search = base::search(), system = base::Sys.info()) [18:01:43.236] } [18:01:43.236] ...future.conditions[[length(...future.conditions) + [18:01:43.236] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.236] cond$call), session = sessionInformation(), [18:01:43.236] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.236] signalCondition(cond) [18:01:43.236] } [18:01:43.236] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.236] "immediateCondition"))) { [18:01:43.236] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.236] ...future.conditions[[length(...future.conditions) + [18:01:43.236] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.236] if (TRUE && !signal) { [18:01:43.236] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.236] { [18:01:43.236] inherits <- base::inherits [18:01:43.236] invokeRestart <- base::invokeRestart [18:01:43.236] is.null <- base::is.null [18:01:43.236] muffled <- FALSE [18:01:43.236] if (inherits(cond, "message")) { [18:01:43.236] muffled <- grepl(pattern, "muffleMessage") [18:01:43.236] if (muffled) [18:01:43.236] invokeRestart("muffleMessage") [18:01:43.236] } [18:01:43.236] else if (inherits(cond, "warning")) { [18:01:43.236] muffled <- grepl(pattern, "muffleWarning") [18:01:43.236] if (muffled) [18:01:43.236] invokeRestart("muffleWarning") [18:01:43.236] } [18:01:43.236] else if (inherits(cond, "condition")) { [18:01:43.236] if (!is.null(pattern)) { [18:01:43.236] computeRestarts <- base::computeRestarts [18:01:43.236] grepl <- base::grepl [18:01:43.236] restarts <- computeRestarts(cond) [18:01:43.236] for (restart in restarts) { [18:01:43.236] name <- restart$name [18:01:43.236] if (is.null(name)) [18:01:43.236] next [18:01:43.236] if (!grepl(pattern, name)) [18:01:43.236] next [18:01:43.236] invokeRestart(restart) [18:01:43.236] muffled <- TRUE [18:01:43.236] break [18:01:43.236] } [18:01:43.236] } [18:01:43.236] } [18:01:43.236] invisible(muffled) [18:01:43.236] } [18:01:43.236] muffleCondition(cond, pattern = "^muffle") [18:01:43.236] } [18:01:43.236] } [18:01:43.236] else { [18:01:43.236] if (TRUE) { [18:01:43.236] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.236] { [18:01:43.236] inherits <- base::inherits [18:01:43.236] invokeRestart <- base::invokeRestart [18:01:43.236] is.null <- base::is.null [18:01:43.236] muffled <- FALSE [18:01:43.236] if (inherits(cond, "message")) { [18:01:43.236] muffled <- grepl(pattern, "muffleMessage") [18:01:43.236] if (muffled) [18:01:43.236] invokeRestart("muffleMessage") [18:01:43.236] } [18:01:43.236] else if (inherits(cond, "warning")) { [18:01:43.236] muffled <- grepl(pattern, "muffleWarning") [18:01:43.236] if (muffled) [18:01:43.236] invokeRestart("muffleWarning") [18:01:43.236] } [18:01:43.236] else if (inherits(cond, "condition")) { [18:01:43.236] if (!is.null(pattern)) { [18:01:43.236] computeRestarts <- base::computeRestarts [18:01:43.236] grepl <- base::grepl [18:01:43.236] restarts <- computeRestarts(cond) [18:01:43.236] for (restart in restarts) { [18:01:43.236] name <- restart$name [18:01:43.236] if (is.null(name)) [18:01:43.236] next [18:01:43.236] if (!grepl(pattern, name)) [18:01:43.236] next [18:01:43.236] invokeRestart(restart) [18:01:43.236] muffled <- TRUE [18:01:43.236] break [18:01:43.236] } [18:01:43.236] } [18:01:43.236] } [18:01:43.236] invisible(muffled) [18:01:43.236] } [18:01:43.236] muffleCondition(cond, pattern = "^muffle") [18:01:43.236] } [18:01:43.236] } [18:01:43.236] } [18:01:43.236] })) [18:01:43.236] }, error = function(ex) { [18:01:43.236] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.236] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.236] ...future.rng), started = ...future.startTime, [18:01:43.236] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.236] version = "1.8"), class = "FutureResult") [18:01:43.236] }, finally = { [18:01:43.236] if (!identical(...future.workdir, getwd())) [18:01:43.236] setwd(...future.workdir) [18:01:43.236] { [18:01:43.236] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.236] ...future.oldOptions$nwarnings <- NULL [18:01:43.236] } [18:01:43.236] base::options(...future.oldOptions) [18:01:43.236] if (.Platform$OS.type == "windows") { [18:01:43.236] old_names <- names(...future.oldEnvVars) [18:01:43.236] envs <- base::Sys.getenv() [18:01:43.236] names <- names(envs) [18:01:43.236] common <- intersect(names, old_names) [18:01:43.236] added <- setdiff(names, old_names) [18:01:43.236] removed <- setdiff(old_names, names) [18:01:43.236] changed <- common[...future.oldEnvVars[common] != [18:01:43.236] envs[common]] [18:01:43.236] NAMES <- toupper(changed) [18:01:43.236] args <- list() [18:01:43.236] for (kk in seq_along(NAMES)) { [18:01:43.236] name <- changed[[kk]] [18:01:43.236] NAME <- NAMES[[kk]] [18:01:43.236] if (name != NAME && is.element(NAME, old_names)) [18:01:43.236] next [18:01:43.236] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.236] } [18:01:43.236] NAMES <- toupper(added) [18:01:43.236] for (kk in seq_along(NAMES)) { [18:01:43.236] name <- added[[kk]] [18:01:43.236] NAME <- NAMES[[kk]] [18:01:43.236] if (name != NAME && is.element(NAME, old_names)) [18:01:43.236] next [18:01:43.236] args[[name]] <- "" [18:01:43.236] } [18:01:43.236] NAMES <- toupper(removed) [18:01:43.236] for (kk in seq_along(NAMES)) { [18:01:43.236] name <- removed[[kk]] [18:01:43.236] NAME <- NAMES[[kk]] [18:01:43.236] if (name != NAME && is.element(NAME, old_names)) [18:01:43.236] next [18:01:43.236] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.236] } [18:01:43.236] if (length(args) > 0) [18:01:43.236] base::do.call(base::Sys.setenv, args = args) [18:01:43.236] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.236] } [18:01:43.236] else { [18:01:43.236] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.236] } [18:01:43.236] { [18:01:43.236] if (base::length(...future.futureOptionsAdded) > [18:01:43.236] 0L) { [18:01:43.236] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.236] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.236] base::options(opts) [18:01:43.236] } [18:01:43.236] { [18:01:43.236] { [18:01:43.236] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.236] NULL [18:01:43.236] } [18:01:43.236] options(future.plan = NULL) [18:01:43.236] if (is.na(NA_character_)) [18:01:43.236] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.236] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.236] future::plan(list(function (..., workers = availableCores(), [18:01:43.236] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.236] envir = parent.frame()) [18:01:43.236] { [18:01:43.236] if (is.function(workers)) [18:01:43.236] workers <- workers() [18:01:43.236] workers <- structure(as.integer(workers), [18:01:43.236] class = class(workers)) [18:01:43.236] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.236] workers >= 1) [18:01:43.236] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.236] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.236] } [18:01:43.236] future <- MultisessionFuture(..., workers = workers, [18:01:43.236] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.236] envir = envir) [18:01:43.236] if (!future$lazy) [18:01:43.236] future <- run(future) [18:01:43.236] invisible(future) [18:01:43.236] }), .cleanup = FALSE, .init = FALSE) [18:01:43.236] } [18:01:43.236] } [18:01:43.236] } [18:01:43.236] }) [18:01:43.236] if (TRUE) { [18:01:43.236] base::sink(type = "output", split = FALSE) [18:01:43.236] if (TRUE) { [18:01:43.236] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.236] } [18:01:43.236] else { [18:01:43.236] ...future.result["stdout"] <- base::list(NULL) [18:01:43.236] } [18:01:43.236] base::close(...future.stdout) [18:01:43.236] ...future.stdout <- NULL [18:01:43.236] } [18:01:43.236] ...future.result$conditions <- ...future.conditions [18:01:43.236] ...future.result$finished <- base::Sys.time() [18:01:43.236] ...future.result [18:01:43.236] } [18:01:43.242] MultisessionFuture started [18:01:43.242] - Launch lazy future ... done [18:01:43.242] run() for 'MultisessionFuture' ... done [18:01:43.243] getGlobalsAndPackages() ... [18:01:43.243] Searching for globals... [18:01:43.244] - globals found: [1] '{' [18:01:43.244] Searching for globals ... DONE [18:01:43.244] Resolving globals: FALSE [18:01:43.244] [18:01:43.244] [18:01:43.245] getGlobalsAndPackages() ... DONE [18:01:43.245] run() for 'Future' ... [18:01:43.245] - state: 'created' [18:01:43.245] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.259] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.260] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.260] - Field: 'node' [18:01:43.260] - Field: 'label' [18:01:43.260] - Field: 'local' [18:01:43.260] - Field: 'owner' [18:01:43.261] - Field: 'envir' [18:01:43.261] - Field: 'workers' [18:01:43.261] - Field: 'packages' [18:01:43.261] - Field: 'gc' [18:01:43.261] - Field: 'conditions' [18:01:43.261] - Field: 'persistent' [18:01:43.262] - Field: 'expr' [18:01:43.262] - Field: 'uuid' [18:01:43.262] - Field: 'seed' [18:01:43.262] - Field: 'version' [18:01:43.262] - Field: 'result' [18:01:43.262] - Field: 'asynchronous' [18:01:43.263] - Field: 'calls' [18:01:43.263] - Field: 'globals' [18:01:43.263] - Field: 'stdout' [18:01:43.263] - Field: 'earlySignal' [18:01:43.263] - Field: 'lazy' [18:01:43.264] - Field: 'state' [18:01:43.264] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.264] - Launch lazy future ... [18:01:43.264] Packages needed by the future expression (n = 0): [18:01:43.264] Packages needed by future strategies (n = 0): [18:01:43.265] { [18:01:43.265] { [18:01:43.265] { [18:01:43.265] ...future.startTime <- base::Sys.time() [18:01:43.265] { [18:01:43.265] { [18:01:43.265] { [18:01:43.265] { [18:01:43.265] base::local({ [18:01:43.265] has_future <- base::requireNamespace("future", [18:01:43.265] quietly = TRUE) [18:01:43.265] if (has_future) { [18:01:43.265] ns <- base::getNamespace("future") [18:01:43.265] version <- ns[[".package"]][["version"]] [18:01:43.265] if (is.null(version)) [18:01:43.265] version <- utils::packageVersion("future") [18:01:43.265] } [18:01:43.265] else { [18:01:43.265] version <- NULL [18:01:43.265] } [18:01:43.265] if (!has_future || version < "1.8.0") { [18:01:43.265] info <- base::c(r_version = base::gsub("R version ", [18:01:43.265] "", base::R.version$version.string), [18:01:43.265] platform = base::sprintf("%s (%s-bit)", [18:01:43.265] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.265] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.265] "release", "version")], collapse = " "), [18:01:43.265] hostname = base::Sys.info()[["nodename"]]) [18:01:43.265] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.265] info) [18:01:43.265] info <- base::paste(info, collapse = "; ") [18:01:43.265] if (!has_future) { [18:01:43.265] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.265] info) [18:01:43.265] } [18:01:43.265] else { [18:01:43.265] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.265] info, version) [18:01:43.265] } [18:01:43.265] base::stop(msg) [18:01:43.265] } [18:01:43.265] }) [18:01:43.265] } [18:01:43.265] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.265] base::options(mc.cores = 1L) [18:01:43.265] } [18:01:43.265] options(future.plan = NULL) [18:01:43.265] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.265] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.265] } [18:01:43.265] ...future.workdir <- getwd() [18:01:43.265] } [18:01:43.265] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.265] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.265] } [18:01:43.265] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.265] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.265] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.265] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.265] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.265] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.265] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.265] base::names(...future.oldOptions)) [18:01:43.265] } [18:01:43.265] if (FALSE) { [18:01:43.265] } [18:01:43.265] else { [18:01:43.265] if (TRUE) { [18:01:43.265] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.265] open = "w") [18:01:43.265] } [18:01:43.265] else { [18:01:43.265] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.265] windows = "NUL", "/dev/null"), open = "w") [18:01:43.265] } [18:01:43.265] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.265] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.265] base::sink(type = "output", split = FALSE) [18:01:43.265] base::close(...future.stdout) [18:01:43.265] }, add = TRUE) [18:01:43.265] } [18:01:43.265] ...future.frame <- base::sys.nframe() [18:01:43.265] ...future.conditions <- base::list() [18:01:43.265] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.265] if (FALSE) { [18:01:43.265] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.265] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.265] } [18:01:43.265] ...future.result <- base::tryCatch({ [18:01:43.265] base::withCallingHandlers({ [18:01:43.265] ...future.value <- base::withVisible(base::local({ [18:01:43.265] ...future.makeSendCondition <- local({ [18:01:43.265] sendCondition <- NULL [18:01:43.265] function(frame = 1L) { [18:01:43.265] if (is.function(sendCondition)) [18:01:43.265] return(sendCondition) [18:01:43.265] ns <- getNamespace("parallel") [18:01:43.265] if (exists("sendData", mode = "function", [18:01:43.265] envir = ns)) { [18:01:43.265] parallel_sendData <- get("sendData", mode = "function", [18:01:43.265] envir = ns) [18:01:43.265] envir <- sys.frame(frame) [18:01:43.265] master <- NULL [18:01:43.265] while (!identical(envir, .GlobalEnv) && [18:01:43.265] !identical(envir, emptyenv())) { [18:01:43.265] if (exists("master", mode = "list", envir = envir, [18:01:43.265] inherits = FALSE)) { [18:01:43.265] master <- get("master", mode = "list", [18:01:43.265] envir = envir, inherits = FALSE) [18:01:43.265] if (inherits(master, c("SOCKnode", [18:01:43.265] "SOCK0node"))) { [18:01:43.265] sendCondition <<- function(cond) { [18:01:43.265] data <- list(type = "VALUE", value = cond, [18:01:43.265] success = TRUE) [18:01:43.265] parallel_sendData(master, data) [18:01:43.265] } [18:01:43.265] return(sendCondition) [18:01:43.265] } [18:01:43.265] } [18:01:43.265] frame <- frame + 1L [18:01:43.265] envir <- sys.frame(frame) [18:01:43.265] } [18:01:43.265] } [18:01:43.265] sendCondition <<- function(cond) NULL [18:01:43.265] } [18:01:43.265] }) [18:01:43.265] withCallingHandlers({ [18:01:43.265] { [18:01:43.265] 4 [18:01:43.265] } [18:01:43.265] }, immediateCondition = function(cond) { [18:01:43.265] sendCondition <- ...future.makeSendCondition() [18:01:43.265] sendCondition(cond) [18:01:43.265] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.265] { [18:01:43.265] inherits <- base::inherits [18:01:43.265] invokeRestart <- base::invokeRestart [18:01:43.265] is.null <- base::is.null [18:01:43.265] muffled <- FALSE [18:01:43.265] if (inherits(cond, "message")) { [18:01:43.265] muffled <- grepl(pattern, "muffleMessage") [18:01:43.265] if (muffled) [18:01:43.265] invokeRestart("muffleMessage") [18:01:43.265] } [18:01:43.265] else if (inherits(cond, "warning")) { [18:01:43.265] muffled <- grepl(pattern, "muffleWarning") [18:01:43.265] if (muffled) [18:01:43.265] invokeRestart("muffleWarning") [18:01:43.265] } [18:01:43.265] else if (inherits(cond, "condition")) { [18:01:43.265] if (!is.null(pattern)) { [18:01:43.265] computeRestarts <- base::computeRestarts [18:01:43.265] grepl <- base::grepl [18:01:43.265] restarts <- computeRestarts(cond) [18:01:43.265] for (restart in restarts) { [18:01:43.265] name <- restart$name [18:01:43.265] if (is.null(name)) [18:01:43.265] next [18:01:43.265] if (!grepl(pattern, name)) [18:01:43.265] next [18:01:43.265] invokeRestart(restart) [18:01:43.265] muffled <- TRUE [18:01:43.265] break [18:01:43.265] } [18:01:43.265] } [18:01:43.265] } [18:01:43.265] invisible(muffled) [18:01:43.265] } [18:01:43.265] muffleCondition(cond) [18:01:43.265] }) [18:01:43.265] })) [18:01:43.265] future::FutureResult(value = ...future.value$value, [18:01:43.265] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.265] ...future.rng), globalenv = if (FALSE) [18:01:43.265] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.265] ...future.globalenv.names)) [18:01:43.265] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.265] }, condition = base::local({ [18:01:43.265] c <- base::c [18:01:43.265] inherits <- base::inherits [18:01:43.265] invokeRestart <- base::invokeRestart [18:01:43.265] length <- base::length [18:01:43.265] list <- base::list [18:01:43.265] seq.int <- base::seq.int [18:01:43.265] signalCondition <- base::signalCondition [18:01:43.265] sys.calls <- base::sys.calls [18:01:43.265] `[[` <- base::`[[` [18:01:43.265] `+` <- base::`+` [18:01:43.265] `<<-` <- base::`<<-` [18:01:43.265] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.265] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.265] 3L)] [18:01:43.265] } [18:01:43.265] function(cond) { [18:01:43.265] is_error <- inherits(cond, "error") [18:01:43.265] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.265] NULL) [18:01:43.265] if (is_error) { [18:01:43.265] sessionInformation <- function() { [18:01:43.265] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.265] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.265] search = base::search(), system = base::Sys.info()) [18:01:43.265] } [18:01:43.265] ...future.conditions[[length(...future.conditions) + [18:01:43.265] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.265] cond$call), session = sessionInformation(), [18:01:43.265] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.265] signalCondition(cond) [18:01:43.265] } [18:01:43.265] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.265] "immediateCondition"))) { [18:01:43.265] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.265] ...future.conditions[[length(...future.conditions) + [18:01:43.265] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.265] if (TRUE && !signal) { [18:01:43.265] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.265] { [18:01:43.265] inherits <- base::inherits [18:01:43.265] invokeRestart <- base::invokeRestart [18:01:43.265] is.null <- base::is.null [18:01:43.265] muffled <- FALSE [18:01:43.265] if (inherits(cond, "message")) { [18:01:43.265] muffled <- grepl(pattern, "muffleMessage") [18:01:43.265] if (muffled) [18:01:43.265] invokeRestart("muffleMessage") [18:01:43.265] } [18:01:43.265] else if (inherits(cond, "warning")) { [18:01:43.265] muffled <- grepl(pattern, "muffleWarning") [18:01:43.265] if (muffled) [18:01:43.265] invokeRestart("muffleWarning") [18:01:43.265] } [18:01:43.265] else if (inherits(cond, "condition")) { [18:01:43.265] if (!is.null(pattern)) { [18:01:43.265] computeRestarts <- base::computeRestarts [18:01:43.265] grepl <- base::grepl [18:01:43.265] restarts <- computeRestarts(cond) [18:01:43.265] for (restart in restarts) { [18:01:43.265] name <- restart$name [18:01:43.265] if (is.null(name)) [18:01:43.265] next [18:01:43.265] if (!grepl(pattern, name)) [18:01:43.265] next [18:01:43.265] invokeRestart(restart) [18:01:43.265] muffled <- TRUE [18:01:43.265] break [18:01:43.265] } [18:01:43.265] } [18:01:43.265] } [18:01:43.265] invisible(muffled) [18:01:43.265] } [18:01:43.265] muffleCondition(cond, pattern = "^muffle") [18:01:43.265] } [18:01:43.265] } [18:01:43.265] else { [18:01:43.265] if (TRUE) { [18:01:43.265] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.265] { [18:01:43.265] inherits <- base::inherits [18:01:43.265] invokeRestart <- base::invokeRestart [18:01:43.265] is.null <- base::is.null [18:01:43.265] muffled <- FALSE [18:01:43.265] if (inherits(cond, "message")) { [18:01:43.265] muffled <- grepl(pattern, "muffleMessage") [18:01:43.265] if (muffled) [18:01:43.265] invokeRestart("muffleMessage") [18:01:43.265] } [18:01:43.265] else if (inherits(cond, "warning")) { [18:01:43.265] muffled <- grepl(pattern, "muffleWarning") [18:01:43.265] if (muffled) [18:01:43.265] invokeRestart("muffleWarning") [18:01:43.265] } [18:01:43.265] else if (inherits(cond, "condition")) { [18:01:43.265] if (!is.null(pattern)) { [18:01:43.265] computeRestarts <- base::computeRestarts [18:01:43.265] grepl <- base::grepl [18:01:43.265] restarts <- computeRestarts(cond) [18:01:43.265] for (restart in restarts) { [18:01:43.265] name <- restart$name [18:01:43.265] if (is.null(name)) [18:01:43.265] next [18:01:43.265] if (!grepl(pattern, name)) [18:01:43.265] next [18:01:43.265] invokeRestart(restart) [18:01:43.265] muffled <- TRUE [18:01:43.265] break [18:01:43.265] } [18:01:43.265] } [18:01:43.265] } [18:01:43.265] invisible(muffled) [18:01:43.265] } [18:01:43.265] muffleCondition(cond, pattern = "^muffle") [18:01:43.265] } [18:01:43.265] } [18:01:43.265] } [18:01:43.265] })) [18:01:43.265] }, error = function(ex) { [18:01:43.265] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.265] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.265] ...future.rng), started = ...future.startTime, [18:01:43.265] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.265] version = "1.8"), class = "FutureResult") [18:01:43.265] }, finally = { [18:01:43.265] if (!identical(...future.workdir, getwd())) [18:01:43.265] setwd(...future.workdir) [18:01:43.265] { [18:01:43.265] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.265] ...future.oldOptions$nwarnings <- NULL [18:01:43.265] } [18:01:43.265] base::options(...future.oldOptions) [18:01:43.265] if (.Platform$OS.type == "windows") { [18:01:43.265] old_names <- names(...future.oldEnvVars) [18:01:43.265] envs <- base::Sys.getenv() [18:01:43.265] names <- names(envs) [18:01:43.265] common <- intersect(names, old_names) [18:01:43.265] added <- setdiff(names, old_names) [18:01:43.265] removed <- setdiff(old_names, names) [18:01:43.265] changed <- common[...future.oldEnvVars[common] != [18:01:43.265] envs[common]] [18:01:43.265] NAMES <- toupper(changed) [18:01:43.265] args <- list() [18:01:43.265] for (kk in seq_along(NAMES)) { [18:01:43.265] name <- changed[[kk]] [18:01:43.265] NAME <- NAMES[[kk]] [18:01:43.265] if (name != NAME && is.element(NAME, old_names)) [18:01:43.265] next [18:01:43.265] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.265] } [18:01:43.265] NAMES <- toupper(added) [18:01:43.265] for (kk in seq_along(NAMES)) { [18:01:43.265] name <- added[[kk]] [18:01:43.265] NAME <- NAMES[[kk]] [18:01:43.265] if (name != NAME && is.element(NAME, old_names)) [18:01:43.265] next [18:01:43.265] args[[name]] <- "" [18:01:43.265] } [18:01:43.265] NAMES <- toupper(removed) [18:01:43.265] for (kk in seq_along(NAMES)) { [18:01:43.265] name <- removed[[kk]] [18:01:43.265] NAME <- NAMES[[kk]] [18:01:43.265] if (name != NAME && is.element(NAME, old_names)) [18:01:43.265] next [18:01:43.265] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.265] } [18:01:43.265] if (length(args) > 0) [18:01:43.265] base::do.call(base::Sys.setenv, args = args) [18:01:43.265] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.265] } [18:01:43.265] else { [18:01:43.265] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.265] } [18:01:43.265] { [18:01:43.265] if (base::length(...future.futureOptionsAdded) > [18:01:43.265] 0L) { [18:01:43.265] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.265] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.265] base::options(opts) [18:01:43.265] } [18:01:43.265] { [18:01:43.265] { [18:01:43.265] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.265] NULL [18:01:43.265] } [18:01:43.265] options(future.plan = NULL) [18:01:43.265] if (is.na(NA_character_)) [18:01:43.265] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.265] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.265] future::plan(list(function (..., workers = availableCores(), [18:01:43.265] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.265] envir = parent.frame()) [18:01:43.265] { [18:01:43.265] if (is.function(workers)) [18:01:43.265] workers <- workers() [18:01:43.265] workers <- structure(as.integer(workers), [18:01:43.265] class = class(workers)) [18:01:43.265] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.265] workers >= 1) [18:01:43.265] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.265] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.265] } [18:01:43.265] future <- MultisessionFuture(..., workers = workers, [18:01:43.265] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.265] envir = envir) [18:01:43.265] if (!future$lazy) [18:01:43.265] future <- run(future) [18:01:43.265] invisible(future) [18:01:43.265] }), .cleanup = FALSE, .init = FALSE) [18:01:43.265] } [18:01:43.265] } [18:01:43.265] } [18:01:43.265] }) [18:01:43.265] if (TRUE) { [18:01:43.265] base::sink(type = "output", split = FALSE) [18:01:43.265] if (TRUE) { [18:01:43.265] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.265] } [18:01:43.265] else { [18:01:43.265] ...future.result["stdout"] <- base::list(NULL) [18:01:43.265] } [18:01:43.265] base::close(...future.stdout) [18:01:43.265] ...future.stdout <- NULL [18:01:43.265] } [18:01:43.265] ...future.result$conditions <- ...future.conditions [18:01:43.265] ...future.result$finished <- base::Sys.time() [18:01:43.265] ...future.result [18:01:43.265] } [18:01:43.270] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:43.283] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.283] - Validating connection of MultisessionFuture [18:01:43.284] - received message: FutureResult [18:01:43.284] - Received FutureResult [18:01:43.284] - Erased future from FutureRegistry [18:01:43.284] result() for ClusterFuture ... [18:01:43.284] - result already collected: FutureResult [18:01:43.284] result() for ClusterFuture ... done [18:01:43.285] receiveMessageFromWorker() for ClusterFuture ... done [18:01:43.285] result() for ClusterFuture ... [18:01:43.285] - result already collected: FutureResult [18:01:43.285] result() for ClusterFuture ... done [18:01:43.285] result() for ClusterFuture ... [18:01:43.285] - result already collected: FutureResult [18:01:43.286] result() for ClusterFuture ... done [18:01:43.287] MultisessionFuture started [18:01:43.287] - Launch lazy future ... done [18:01:43.287] 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" [18:01:43.292] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.292] - Validating connection of MultisessionFuture [18:01:43.292] - received message: FutureResult [18:01:43.293] - Received FutureResult [18:01:43.293] - Erased future from FutureRegistry [18:01:43.293] result() for ClusterFuture ... [18:01:43.293] - result already collected: FutureResult [18:01:43.293] result() for ClusterFuture ... done [18:01:43.293] receiveMessageFromWorker() for ClusterFuture ... done [18:01:43.305] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.305] - Validating connection of MultisessionFuture [18:01:43.305] - received message: FutureResult [18:01:43.305] - Received FutureResult [18:01:43.305] - Erased future from FutureRegistry [18:01:43.306] result() for ClusterFuture ... [18:01:43.306] - result already collected: FutureResult [18:01:43.306] result() for ClusterFuture ... done [18:01:43.306] 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" ... [18:01:43.309] resolve() on list environment ... [18:01:43.309] recursive: 0 [18:01:43.310] length: 6 [18:01:43.311] elements: 'a', 'b', 'c', 'd', '', '' [18:01:43.311] signalConditionsASAP(numeric, pos=1) ... [18:01:43.311] - nx: 6 [18:01:43.311] - relay: TRUE [18:01:43.311] - stdout: TRUE [18:01:43.311] - signal: TRUE [18:01:43.312] - resignal: FALSE [18:01:43.312] - force: TRUE [18:01:43.312] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.312] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.312] - until=2 [18:01:43.312] - relaying element #2 [18:01:43.312] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.313] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.313] signalConditionsASAP(NULL, pos=1) ... done [18:01:43.313] length: 5 (resolved future 1) [18:01:43.313] Future #2 [18:01:43.313] result() for ClusterFuture ... [18:01:43.314] - result already collected: FutureResult [18:01:43.314] result() for ClusterFuture ... done [18:01:43.314] result() for ClusterFuture ... [18:01:43.314] - result already collected: FutureResult [18:01:43.314] result() for ClusterFuture ... done [18:01:43.315] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:43.315] - nx: 6 [18:01:43.315] - relay: TRUE [18:01:43.315] - stdout: TRUE [18:01:43.315] - signal: TRUE [18:01:43.315] - resignal: FALSE [18:01:43.315] - force: TRUE [18:01:43.316] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.316] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.316] - until=2 [18:01:43.316] - relaying element #2 [18:01:43.316] result() for ClusterFuture ... [18:01:43.316] - result already collected: FutureResult [18:01:43.317] result() for ClusterFuture ... done [18:01:43.317] result() for ClusterFuture ... [18:01:43.317] - result already collected: FutureResult [18:01:43.317] result() for ClusterFuture ... done [18:01:43.317] result() for ClusterFuture ... [18:01:43.317] - result already collected: FutureResult [18:01:43.318] result() for ClusterFuture ... done [18:01:43.318] result() for ClusterFuture ... [18:01:43.318] - result already collected: FutureResult [18:01:43.318] result() for ClusterFuture ... done [18:01:43.318] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.318] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.318] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:43.319] length: 4 (resolved future 2) [18:01:43.319] Future #3 [18:01:43.319] result() for ClusterFuture ... [18:01:43.319] - result already collected: FutureResult [18:01:43.319] result() for ClusterFuture ... done [18:01:43.319] result() for ClusterFuture ... [18:01:43.320] - result already collected: FutureResult [18:01:43.320] result() for ClusterFuture ... done [18:01:43.320] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:43.320] - nx: 6 [18:01:43.320] - relay: TRUE [18:01:43.320] - stdout: TRUE [18:01:43.321] - signal: TRUE [18:01:43.321] - resignal: FALSE [18:01:43.321] - force: TRUE [18:01:43.321] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.321] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.321] - until=3 [18:01:43.322] - relaying element #3 [18:01:43.322] result() for ClusterFuture ... [18:01:43.322] - result already collected: FutureResult [18:01:43.322] result() for ClusterFuture ... done [18:01:43.322] result() for ClusterFuture ... [18:01:43.322] - result already collected: FutureResult [18:01:43.322] result() for ClusterFuture ... done [18:01:43.323] result() for ClusterFuture ... [18:01:43.323] - result already collected: FutureResult [18:01:43.323] result() for ClusterFuture ... done [18:01:43.323] result() for ClusterFuture ... [18:01:43.323] - result already collected: FutureResult [18:01:43.323] result() for ClusterFuture ... done [18:01:43.324] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.324] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.324] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:43.324] length: 3 (resolved future 3) [18:01:43.324] Future #4 [18:01:43.324] result() for ClusterFuture ... [18:01:43.325] - result already collected: FutureResult [18:01:43.325] result() for ClusterFuture ... done [18:01:43.325] result() for ClusterFuture ... [18:01:43.325] - result already collected: FutureResult [18:01:43.325] result() for ClusterFuture ... done [18:01:43.325] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:43.326] - nx: 6 [18:01:43.326] - relay: TRUE [18:01:43.326] - stdout: TRUE [18:01:43.326] - signal: TRUE [18:01:43.326] - resignal: FALSE [18:01:43.326] - force: TRUE [18:01:43.326] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.327] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.327] - until=4 [18:01:43.327] - relaying element #4 [18:01:43.327] result() for ClusterFuture ... [18:01:43.327] - result already collected: FutureResult [18:01:43.327] result() for ClusterFuture ... done [18:01:43.328] result() for ClusterFuture ... [18:01:43.328] - result already collected: FutureResult [18:01:43.328] result() for ClusterFuture ... done [18:01:43.328] result() for ClusterFuture ... [18:01:43.328] - result already collected: FutureResult [18:01:43.328] result() for ClusterFuture ... done [18:01:43.329] result() for ClusterFuture ... [18:01:43.329] - result already collected: FutureResult [18:01:43.329] result() for ClusterFuture ... done [18:01:43.329] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.329] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.329] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:43.330] length: 2 (resolved future 4) [18:01:43.330] signalConditionsASAP(NULL, pos=5) ... [18:01:43.330] - nx: 6 [18:01:43.330] - relay: TRUE [18:01:43.330] - stdout: TRUE [18:01:43.330] - signal: TRUE [18:01:43.330] - resignal: FALSE [18:01:43.331] - force: TRUE [18:01:43.331] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.331] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.331] - until=6 [18:01:43.331] - relaying element #6 [18:01:43.331] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.332] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.332] signalConditionsASAP(NULL, pos=5) ... done [18:01:43.332] length: 1 (resolved future 5) [18:01:43.332] signalConditionsASAP(numeric, pos=6) ... [18:01:43.332] - nx: 6 [18:01:43.332] - relay: TRUE [18:01:43.333] - stdout: TRUE [18:01:43.333] - signal: TRUE [18:01:43.333] - resignal: FALSE [18:01:43.333] - force: TRUE [18:01:43.333] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.333] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.333] - until=6 [18:01:43.334] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.334] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.334] signalConditionsASAP(numeric, pos=6) ... done [18:01:43.334] length: 0 (resolved future 6) [18:01:43.334] Relaying remaining futures [18:01:43.334] signalConditionsASAP(NULL, pos=0) ... [18:01:43.335] - nx: 6 [18:01:43.335] - relay: TRUE [18:01:43.335] - stdout: TRUE [18:01:43.335] - signal: TRUE [18:01:43.335] - resignal: FALSE [18:01:43.335] - force: TRUE [18:01:43.335] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.336] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:43.336] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.336] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.336] signalConditionsASAP(NULL, pos=0) ... done [18:01:43.336] resolve() on list environment ... DONE [18:01:43.337] result() for ClusterFuture ... [18:01:43.337] - result already collected: FutureResult [18:01:43.337] result() for ClusterFuture ... done [18:01:43.337] result() for ClusterFuture ... [18:01:43.337] - result already collected: FutureResult [18:01:43.337] result() for ClusterFuture ... done [18:01:43.338] result() for ClusterFuture ... [18:01:43.338] - result already collected: FutureResult [18:01:43.338] result() for ClusterFuture ... done [18:01:43.338] result() for ClusterFuture ... [18:01:43.338] - result already collected: FutureResult [18:01:43.338] result() for ClusterFuture ... done [18:01:43.339] result() for ClusterFuture ... [18:01:43.339] - result already collected: FutureResult [18:01:43.339] result() for ClusterFuture ... done [18:01:43.339] result() for ClusterFuture ... [18:01:43.339] - result already collected: FutureResult [18:01:43.339] 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) [18:01:43.342] getGlobalsAndPackages() ... [18:01:43.342] Searching for globals... [18:01:43.342] [18:01:43.343] Searching for globals ... DONE [18:01:43.343] - globals: [0] [18:01:43.343] getGlobalsAndPackages() ... DONE [18:01:43.343] run() for 'Future' ... [18:01:43.343] - state: 'created' [18:01:43.344] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.357] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.358] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.358] - Field: 'node' [18:01:43.358] - Field: 'label' [18:01:43.358] - Field: 'local' [18:01:43.358] - Field: 'owner' [18:01:43.358] - Field: 'envir' [18:01:43.359] - Field: 'workers' [18:01:43.359] - Field: 'packages' [18:01:43.359] - Field: 'gc' [18:01:43.359] - Field: 'conditions' [18:01:43.359] - Field: 'persistent' [18:01:43.360] - Field: 'expr' [18:01:43.360] - Field: 'uuid' [18:01:43.360] - Field: 'seed' [18:01:43.360] - Field: 'version' [18:01:43.360] - Field: 'result' [18:01:43.360] - Field: 'asynchronous' [18:01:43.361] - Field: 'calls' [18:01:43.361] - Field: 'globals' [18:01:43.361] - Field: 'stdout' [18:01:43.361] - Field: 'earlySignal' [18:01:43.361] - Field: 'lazy' [18:01:43.362] - Field: 'state' [18:01:43.362] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.362] - Launch lazy future ... [18:01:43.362] Packages needed by the future expression (n = 0): [18:01:43.363] Packages needed by future strategies (n = 0): [18:01:43.363] { [18:01:43.363] { [18:01:43.363] { [18:01:43.363] ...future.startTime <- base::Sys.time() [18:01:43.363] { [18:01:43.363] { [18:01:43.363] { [18:01:43.363] { [18:01:43.363] base::local({ [18:01:43.363] has_future <- base::requireNamespace("future", [18:01:43.363] quietly = TRUE) [18:01:43.363] if (has_future) { [18:01:43.363] ns <- base::getNamespace("future") [18:01:43.363] version <- ns[[".package"]][["version"]] [18:01:43.363] if (is.null(version)) [18:01:43.363] version <- utils::packageVersion("future") [18:01:43.363] } [18:01:43.363] else { [18:01:43.363] version <- NULL [18:01:43.363] } [18:01:43.363] if (!has_future || version < "1.8.0") { [18:01:43.363] info <- base::c(r_version = base::gsub("R version ", [18:01:43.363] "", base::R.version$version.string), [18:01:43.363] platform = base::sprintf("%s (%s-bit)", [18:01:43.363] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.363] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.363] "release", "version")], collapse = " "), [18:01:43.363] hostname = base::Sys.info()[["nodename"]]) [18:01:43.363] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.363] info) [18:01:43.363] info <- base::paste(info, collapse = "; ") [18:01:43.363] if (!has_future) { [18:01:43.363] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.363] info) [18:01:43.363] } [18:01:43.363] else { [18:01:43.363] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.363] info, version) [18:01:43.363] } [18:01:43.363] base::stop(msg) [18:01:43.363] } [18:01:43.363] }) [18:01:43.363] } [18:01:43.363] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.363] base::options(mc.cores = 1L) [18:01:43.363] } [18:01:43.363] options(future.plan = NULL) [18:01:43.363] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.363] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.363] } [18:01:43.363] ...future.workdir <- getwd() [18:01:43.363] } [18:01:43.363] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.363] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.363] } [18:01:43.363] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.363] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.363] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.363] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.363] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.363] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.363] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.363] base::names(...future.oldOptions)) [18:01:43.363] } [18:01:43.363] if (FALSE) { [18:01:43.363] } [18:01:43.363] else { [18:01:43.363] if (TRUE) { [18:01:43.363] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.363] open = "w") [18:01:43.363] } [18:01:43.363] else { [18:01:43.363] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.363] windows = "NUL", "/dev/null"), open = "w") [18:01:43.363] } [18:01:43.363] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.363] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.363] base::sink(type = "output", split = FALSE) [18:01:43.363] base::close(...future.stdout) [18:01:43.363] }, add = TRUE) [18:01:43.363] } [18:01:43.363] ...future.frame <- base::sys.nframe() [18:01:43.363] ...future.conditions <- base::list() [18:01:43.363] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.363] if (FALSE) { [18:01:43.363] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.363] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.363] } [18:01:43.363] ...future.result <- base::tryCatch({ [18:01:43.363] base::withCallingHandlers({ [18:01:43.363] ...future.value <- base::withVisible(base::local({ [18:01:43.363] ...future.makeSendCondition <- local({ [18:01:43.363] sendCondition <- NULL [18:01:43.363] function(frame = 1L) { [18:01:43.363] if (is.function(sendCondition)) [18:01:43.363] return(sendCondition) [18:01:43.363] ns <- getNamespace("parallel") [18:01:43.363] if (exists("sendData", mode = "function", [18:01:43.363] envir = ns)) { [18:01:43.363] parallel_sendData <- get("sendData", mode = "function", [18:01:43.363] envir = ns) [18:01:43.363] envir <- sys.frame(frame) [18:01:43.363] master <- NULL [18:01:43.363] while (!identical(envir, .GlobalEnv) && [18:01:43.363] !identical(envir, emptyenv())) { [18:01:43.363] if (exists("master", mode = "list", envir = envir, [18:01:43.363] inherits = FALSE)) { [18:01:43.363] master <- get("master", mode = "list", [18:01:43.363] envir = envir, inherits = FALSE) [18:01:43.363] if (inherits(master, c("SOCKnode", [18:01:43.363] "SOCK0node"))) { [18:01:43.363] sendCondition <<- function(cond) { [18:01:43.363] data <- list(type = "VALUE", value = cond, [18:01:43.363] success = TRUE) [18:01:43.363] parallel_sendData(master, data) [18:01:43.363] } [18:01:43.363] return(sendCondition) [18:01:43.363] } [18:01:43.363] } [18:01:43.363] frame <- frame + 1L [18:01:43.363] envir <- sys.frame(frame) [18:01:43.363] } [18:01:43.363] } [18:01:43.363] sendCondition <<- function(cond) NULL [18:01:43.363] } [18:01:43.363] }) [18:01:43.363] withCallingHandlers({ [18:01:43.363] 2 [18:01:43.363] }, immediateCondition = function(cond) { [18:01:43.363] sendCondition <- ...future.makeSendCondition() [18:01:43.363] sendCondition(cond) [18:01:43.363] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.363] { [18:01:43.363] inherits <- base::inherits [18:01:43.363] invokeRestart <- base::invokeRestart [18:01:43.363] is.null <- base::is.null [18:01:43.363] muffled <- FALSE [18:01:43.363] if (inherits(cond, "message")) { [18:01:43.363] muffled <- grepl(pattern, "muffleMessage") [18:01:43.363] if (muffled) [18:01:43.363] invokeRestart("muffleMessage") [18:01:43.363] } [18:01:43.363] else if (inherits(cond, "warning")) { [18:01:43.363] muffled <- grepl(pattern, "muffleWarning") [18:01:43.363] if (muffled) [18:01:43.363] invokeRestart("muffleWarning") [18:01:43.363] } [18:01:43.363] else if (inherits(cond, "condition")) { [18:01:43.363] if (!is.null(pattern)) { [18:01:43.363] computeRestarts <- base::computeRestarts [18:01:43.363] grepl <- base::grepl [18:01:43.363] restarts <- computeRestarts(cond) [18:01:43.363] for (restart in restarts) { [18:01:43.363] name <- restart$name [18:01:43.363] if (is.null(name)) [18:01:43.363] next [18:01:43.363] if (!grepl(pattern, name)) [18:01:43.363] next [18:01:43.363] invokeRestart(restart) [18:01:43.363] muffled <- TRUE [18:01:43.363] break [18:01:43.363] } [18:01:43.363] } [18:01:43.363] } [18:01:43.363] invisible(muffled) [18:01:43.363] } [18:01:43.363] muffleCondition(cond) [18:01:43.363] }) [18:01:43.363] })) [18:01:43.363] future::FutureResult(value = ...future.value$value, [18:01:43.363] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.363] ...future.rng), globalenv = if (FALSE) [18:01:43.363] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.363] ...future.globalenv.names)) [18:01:43.363] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.363] }, condition = base::local({ [18:01:43.363] c <- base::c [18:01:43.363] inherits <- base::inherits [18:01:43.363] invokeRestart <- base::invokeRestart [18:01:43.363] length <- base::length [18:01:43.363] list <- base::list [18:01:43.363] seq.int <- base::seq.int [18:01:43.363] signalCondition <- base::signalCondition [18:01:43.363] sys.calls <- base::sys.calls [18:01:43.363] `[[` <- base::`[[` [18:01:43.363] `+` <- base::`+` [18:01:43.363] `<<-` <- base::`<<-` [18:01:43.363] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.363] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.363] 3L)] [18:01:43.363] } [18:01:43.363] function(cond) { [18:01:43.363] is_error <- inherits(cond, "error") [18:01:43.363] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.363] NULL) [18:01:43.363] if (is_error) { [18:01:43.363] sessionInformation <- function() { [18:01:43.363] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.363] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.363] search = base::search(), system = base::Sys.info()) [18:01:43.363] } [18:01:43.363] ...future.conditions[[length(...future.conditions) + [18:01:43.363] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.363] cond$call), session = sessionInformation(), [18:01:43.363] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.363] signalCondition(cond) [18:01:43.363] } [18:01:43.363] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.363] "immediateCondition"))) { [18:01:43.363] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.363] ...future.conditions[[length(...future.conditions) + [18:01:43.363] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.363] if (TRUE && !signal) { [18:01:43.363] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.363] { [18:01:43.363] inherits <- base::inherits [18:01:43.363] invokeRestart <- base::invokeRestart [18:01:43.363] is.null <- base::is.null [18:01:43.363] muffled <- FALSE [18:01:43.363] if (inherits(cond, "message")) { [18:01:43.363] muffled <- grepl(pattern, "muffleMessage") [18:01:43.363] if (muffled) [18:01:43.363] invokeRestart("muffleMessage") [18:01:43.363] } [18:01:43.363] else if (inherits(cond, "warning")) { [18:01:43.363] muffled <- grepl(pattern, "muffleWarning") [18:01:43.363] if (muffled) [18:01:43.363] invokeRestart("muffleWarning") [18:01:43.363] } [18:01:43.363] else if (inherits(cond, "condition")) { [18:01:43.363] if (!is.null(pattern)) { [18:01:43.363] computeRestarts <- base::computeRestarts [18:01:43.363] grepl <- base::grepl [18:01:43.363] restarts <- computeRestarts(cond) [18:01:43.363] for (restart in restarts) { [18:01:43.363] name <- restart$name [18:01:43.363] if (is.null(name)) [18:01:43.363] next [18:01:43.363] if (!grepl(pattern, name)) [18:01:43.363] next [18:01:43.363] invokeRestart(restart) [18:01:43.363] muffled <- TRUE [18:01:43.363] break [18:01:43.363] } [18:01:43.363] } [18:01:43.363] } [18:01:43.363] invisible(muffled) [18:01:43.363] } [18:01:43.363] muffleCondition(cond, pattern = "^muffle") [18:01:43.363] } [18:01:43.363] } [18:01:43.363] else { [18:01:43.363] if (TRUE) { [18:01:43.363] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.363] { [18:01:43.363] inherits <- base::inherits [18:01:43.363] invokeRestart <- base::invokeRestart [18:01:43.363] is.null <- base::is.null [18:01:43.363] muffled <- FALSE [18:01:43.363] if (inherits(cond, "message")) { [18:01:43.363] muffled <- grepl(pattern, "muffleMessage") [18:01:43.363] if (muffled) [18:01:43.363] invokeRestart("muffleMessage") [18:01:43.363] } [18:01:43.363] else if (inherits(cond, "warning")) { [18:01:43.363] muffled <- grepl(pattern, "muffleWarning") [18:01:43.363] if (muffled) [18:01:43.363] invokeRestart("muffleWarning") [18:01:43.363] } [18:01:43.363] else if (inherits(cond, "condition")) { [18:01:43.363] if (!is.null(pattern)) { [18:01:43.363] computeRestarts <- base::computeRestarts [18:01:43.363] grepl <- base::grepl [18:01:43.363] restarts <- computeRestarts(cond) [18:01:43.363] for (restart in restarts) { [18:01:43.363] name <- restart$name [18:01:43.363] if (is.null(name)) [18:01:43.363] next [18:01:43.363] if (!grepl(pattern, name)) [18:01:43.363] next [18:01:43.363] invokeRestart(restart) [18:01:43.363] muffled <- TRUE [18:01:43.363] break [18:01:43.363] } [18:01:43.363] } [18:01:43.363] } [18:01:43.363] invisible(muffled) [18:01:43.363] } [18:01:43.363] muffleCondition(cond, pattern = "^muffle") [18:01:43.363] } [18:01:43.363] } [18:01:43.363] } [18:01:43.363] })) [18:01:43.363] }, error = function(ex) { [18:01:43.363] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.363] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.363] ...future.rng), started = ...future.startTime, [18:01:43.363] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.363] version = "1.8"), class = "FutureResult") [18:01:43.363] }, finally = { [18:01:43.363] if (!identical(...future.workdir, getwd())) [18:01:43.363] setwd(...future.workdir) [18:01:43.363] { [18:01:43.363] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.363] ...future.oldOptions$nwarnings <- NULL [18:01:43.363] } [18:01:43.363] base::options(...future.oldOptions) [18:01:43.363] if (.Platform$OS.type == "windows") { [18:01:43.363] old_names <- names(...future.oldEnvVars) [18:01:43.363] envs <- base::Sys.getenv() [18:01:43.363] names <- names(envs) [18:01:43.363] common <- intersect(names, old_names) [18:01:43.363] added <- setdiff(names, old_names) [18:01:43.363] removed <- setdiff(old_names, names) [18:01:43.363] changed <- common[...future.oldEnvVars[common] != [18:01:43.363] envs[common]] [18:01:43.363] NAMES <- toupper(changed) [18:01:43.363] args <- list() [18:01:43.363] for (kk in seq_along(NAMES)) { [18:01:43.363] name <- changed[[kk]] [18:01:43.363] NAME <- NAMES[[kk]] [18:01:43.363] if (name != NAME && is.element(NAME, old_names)) [18:01:43.363] next [18:01:43.363] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.363] } [18:01:43.363] NAMES <- toupper(added) [18:01:43.363] for (kk in seq_along(NAMES)) { [18:01:43.363] name <- added[[kk]] [18:01:43.363] NAME <- NAMES[[kk]] [18:01:43.363] if (name != NAME && is.element(NAME, old_names)) [18:01:43.363] next [18:01:43.363] args[[name]] <- "" [18:01:43.363] } [18:01:43.363] NAMES <- toupper(removed) [18:01:43.363] for (kk in seq_along(NAMES)) { [18:01:43.363] name <- removed[[kk]] [18:01:43.363] NAME <- NAMES[[kk]] [18:01:43.363] if (name != NAME && is.element(NAME, old_names)) [18:01:43.363] next [18:01:43.363] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.363] } [18:01:43.363] if (length(args) > 0) [18:01:43.363] base::do.call(base::Sys.setenv, args = args) [18:01:43.363] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.363] } [18:01:43.363] else { [18:01:43.363] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.363] } [18:01:43.363] { [18:01:43.363] if (base::length(...future.futureOptionsAdded) > [18:01:43.363] 0L) { [18:01:43.363] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.363] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.363] base::options(opts) [18:01:43.363] } [18:01:43.363] { [18:01:43.363] { [18:01:43.363] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.363] NULL [18:01:43.363] } [18:01:43.363] options(future.plan = NULL) [18:01:43.363] if (is.na(NA_character_)) [18:01:43.363] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.363] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.363] future::plan(list(function (..., workers = availableCores(), [18:01:43.363] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.363] envir = parent.frame()) [18:01:43.363] { [18:01:43.363] if (is.function(workers)) [18:01:43.363] workers <- workers() [18:01:43.363] workers <- structure(as.integer(workers), [18:01:43.363] class = class(workers)) [18:01:43.363] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.363] workers >= 1) [18:01:43.363] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.363] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.363] } [18:01:43.363] future <- MultisessionFuture(..., workers = workers, [18:01:43.363] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.363] envir = envir) [18:01:43.363] if (!future$lazy) [18:01:43.363] future <- run(future) [18:01:43.363] invisible(future) [18:01:43.363] }), .cleanup = FALSE, .init = FALSE) [18:01:43.363] } [18:01:43.363] } [18:01:43.363] } [18:01:43.363] }) [18:01:43.363] if (TRUE) { [18:01:43.363] base::sink(type = "output", split = FALSE) [18:01:43.363] if (TRUE) { [18:01:43.363] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.363] } [18:01:43.363] else { [18:01:43.363] ...future.result["stdout"] <- base::list(NULL) [18:01:43.363] } [18:01:43.363] base::close(...future.stdout) [18:01:43.363] ...future.stdout <- NULL [18:01:43.363] } [18:01:43.363] ...future.result$conditions <- ...future.conditions [18:01:43.363] ...future.result$finished <- base::Sys.time() [18:01:43.363] ...future.result [18:01:43.363] } [18:01:43.369] MultisessionFuture started [18:01:43.369] - Launch lazy future ... done [18:01:43.369] run() for 'MultisessionFuture' ... done [18:01:43.370] getGlobalsAndPackages() ... [18:01:43.370] Searching for globals... [18:01:43.370] [18:01:43.370] Searching for globals ... DONE [18:01:43.371] - globals: [0] [18:01:43.371] getGlobalsAndPackages() ... DONE [18:01:43.371] run() for 'Future' ... [18:01:43.371] - state: 'created' [18:01:43.371] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.385] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.385] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.385] - Field: 'node' [18:01:43.386] - Field: 'label' [18:01:43.386] - Field: 'local' [18:01:43.386] - Field: 'owner' [18:01:43.386] - Field: 'envir' [18:01:43.386] - Field: 'workers' [18:01:43.387] - Field: 'packages' [18:01:43.387] - Field: 'gc' [18:01:43.387] - Field: 'conditions' [18:01:43.387] - Field: 'persistent' [18:01:43.387] - Field: 'expr' [18:01:43.387] - Field: 'uuid' [18:01:43.388] - Field: 'seed' [18:01:43.388] - Field: 'version' [18:01:43.388] - Field: 'result' [18:01:43.388] - Field: 'asynchronous' [18:01:43.394] - Field: 'calls' [18:01:43.395] - Field: 'globals' [18:01:43.395] - Field: 'stdout' [18:01:43.395] - Field: 'earlySignal' [18:01:43.395] - Field: 'lazy' [18:01:43.395] - Field: 'state' [18:01:43.396] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.396] - Launch lazy future ... [18:01:43.396] Packages needed by the future expression (n = 0): [18:01:43.396] Packages needed by future strategies (n = 0): [18:01:43.397] { [18:01:43.397] { [18:01:43.397] { [18:01:43.397] ...future.startTime <- base::Sys.time() [18:01:43.397] { [18:01:43.397] { [18:01:43.397] { [18:01:43.397] { [18:01:43.397] base::local({ [18:01:43.397] has_future <- base::requireNamespace("future", [18:01:43.397] quietly = TRUE) [18:01:43.397] if (has_future) { [18:01:43.397] ns <- base::getNamespace("future") [18:01:43.397] version <- ns[[".package"]][["version"]] [18:01:43.397] if (is.null(version)) [18:01:43.397] version <- utils::packageVersion("future") [18:01:43.397] } [18:01:43.397] else { [18:01:43.397] version <- NULL [18:01:43.397] } [18:01:43.397] if (!has_future || version < "1.8.0") { [18:01:43.397] info <- base::c(r_version = base::gsub("R version ", [18:01:43.397] "", base::R.version$version.string), [18:01:43.397] platform = base::sprintf("%s (%s-bit)", [18:01:43.397] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.397] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.397] "release", "version")], collapse = " "), [18:01:43.397] hostname = base::Sys.info()[["nodename"]]) [18:01:43.397] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.397] info) [18:01:43.397] info <- base::paste(info, collapse = "; ") [18:01:43.397] if (!has_future) { [18:01:43.397] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.397] info) [18:01:43.397] } [18:01:43.397] else { [18:01:43.397] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.397] info, version) [18:01:43.397] } [18:01:43.397] base::stop(msg) [18:01:43.397] } [18:01:43.397] }) [18:01:43.397] } [18:01:43.397] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.397] base::options(mc.cores = 1L) [18:01:43.397] } [18:01:43.397] options(future.plan = NULL) [18:01:43.397] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.397] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.397] } [18:01:43.397] ...future.workdir <- getwd() [18:01:43.397] } [18:01:43.397] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.397] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.397] } [18:01:43.397] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.397] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.397] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.397] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.397] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.397] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.397] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.397] base::names(...future.oldOptions)) [18:01:43.397] } [18:01:43.397] if (FALSE) { [18:01:43.397] } [18:01:43.397] else { [18:01:43.397] if (TRUE) { [18:01:43.397] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.397] open = "w") [18:01:43.397] } [18:01:43.397] else { [18:01:43.397] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.397] windows = "NUL", "/dev/null"), open = "w") [18:01:43.397] } [18:01:43.397] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.397] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.397] base::sink(type = "output", split = FALSE) [18:01:43.397] base::close(...future.stdout) [18:01:43.397] }, add = TRUE) [18:01:43.397] } [18:01:43.397] ...future.frame <- base::sys.nframe() [18:01:43.397] ...future.conditions <- base::list() [18:01:43.397] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.397] if (FALSE) { [18:01:43.397] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.397] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.397] } [18:01:43.397] ...future.result <- base::tryCatch({ [18:01:43.397] base::withCallingHandlers({ [18:01:43.397] ...future.value <- base::withVisible(base::local({ [18:01:43.397] ...future.makeSendCondition <- local({ [18:01:43.397] sendCondition <- NULL [18:01:43.397] function(frame = 1L) { [18:01:43.397] if (is.function(sendCondition)) [18:01:43.397] return(sendCondition) [18:01:43.397] ns <- getNamespace("parallel") [18:01:43.397] if (exists("sendData", mode = "function", [18:01:43.397] envir = ns)) { [18:01:43.397] parallel_sendData <- get("sendData", mode = "function", [18:01:43.397] envir = ns) [18:01:43.397] envir <- sys.frame(frame) [18:01:43.397] master <- NULL [18:01:43.397] while (!identical(envir, .GlobalEnv) && [18:01:43.397] !identical(envir, emptyenv())) { [18:01:43.397] if (exists("master", mode = "list", envir = envir, [18:01:43.397] inherits = FALSE)) { [18:01:43.397] master <- get("master", mode = "list", [18:01:43.397] envir = envir, inherits = FALSE) [18:01:43.397] if (inherits(master, c("SOCKnode", [18:01:43.397] "SOCK0node"))) { [18:01:43.397] sendCondition <<- function(cond) { [18:01:43.397] data <- list(type = "VALUE", value = cond, [18:01:43.397] success = TRUE) [18:01:43.397] parallel_sendData(master, data) [18:01:43.397] } [18:01:43.397] return(sendCondition) [18:01:43.397] } [18:01:43.397] } [18:01:43.397] frame <- frame + 1L [18:01:43.397] envir <- sys.frame(frame) [18:01:43.397] } [18:01:43.397] } [18:01:43.397] sendCondition <<- function(cond) NULL [18:01:43.397] } [18:01:43.397] }) [18:01:43.397] withCallingHandlers({ [18:01:43.397] NULL [18:01:43.397] }, immediateCondition = function(cond) { [18:01:43.397] sendCondition <- ...future.makeSendCondition() [18:01:43.397] sendCondition(cond) [18:01:43.397] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.397] { [18:01:43.397] inherits <- base::inherits [18:01:43.397] invokeRestart <- base::invokeRestart [18:01:43.397] is.null <- base::is.null [18:01:43.397] muffled <- FALSE [18:01:43.397] if (inherits(cond, "message")) { [18:01:43.397] muffled <- grepl(pattern, "muffleMessage") [18:01:43.397] if (muffled) [18:01:43.397] invokeRestart("muffleMessage") [18:01:43.397] } [18:01:43.397] else if (inherits(cond, "warning")) { [18:01:43.397] muffled <- grepl(pattern, "muffleWarning") [18:01:43.397] if (muffled) [18:01:43.397] invokeRestart("muffleWarning") [18:01:43.397] } [18:01:43.397] else if (inherits(cond, "condition")) { [18:01:43.397] if (!is.null(pattern)) { [18:01:43.397] computeRestarts <- base::computeRestarts [18:01:43.397] grepl <- base::grepl [18:01:43.397] restarts <- computeRestarts(cond) [18:01:43.397] for (restart in restarts) { [18:01:43.397] name <- restart$name [18:01:43.397] if (is.null(name)) [18:01:43.397] next [18:01:43.397] if (!grepl(pattern, name)) [18:01:43.397] next [18:01:43.397] invokeRestart(restart) [18:01:43.397] muffled <- TRUE [18:01:43.397] break [18:01:43.397] } [18:01:43.397] } [18:01:43.397] } [18:01:43.397] invisible(muffled) [18:01:43.397] } [18:01:43.397] muffleCondition(cond) [18:01:43.397] }) [18:01:43.397] })) [18:01:43.397] future::FutureResult(value = ...future.value$value, [18:01:43.397] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.397] ...future.rng), globalenv = if (FALSE) [18:01:43.397] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.397] ...future.globalenv.names)) [18:01:43.397] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.397] }, condition = base::local({ [18:01:43.397] c <- base::c [18:01:43.397] inherits <- base::inherits [18:01:43.397] invokeRestart <- base::invokeRestart [18:01:43.397] length <- base::length [18:01:43.397] list <- base::list [18:01:43.397] seq.int <- base::seq.int [18:01:43.397] signalCondition <- base::signalCondition [18:01:43.397] sys.calls <- base::sys.calls [18:01:43.397] `[[` <- base::`[[` [18:01:43.397] `+` <- base::`+` [18:01:43.397] `<<-` <- base::`<<-` [18:01:43.397] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.397] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.397] 3L)] [18:01:43.397] } [18:01:43.397] function(cond) { [18:01:43.397] is_error <- inherits(cond, "error") [18:01:43.397] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.397] NULL) [18:01:43.397] if (is_error) { [18:01:43.397] sessionInformation <- function() { [18:01:43.397] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.397] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.397] search = base::search(), system = base::Sys.info()) [18:01:43.397] } [18:01:43.397] ...future.conditions[[length(...future.conditions) + [18:01:43.397] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.397] cond$call), session = sessionInformation(), [18:01:43.397] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.397] signalCondition(cond) [18:01:43.397] } [18:01:43.397] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.397] "immediateCondition"))) { [18:01:43.397] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.397] ...future.conditions[[length(...future.conditions) + [18:01:43.397] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.397] if (TRUE && !signal) { [18:01:43.397] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.397] { [18:01:43.397] inherits <- base::inherits [18:01:43.397] invokeRestart <- base::invokeRestart [18:01:43.397] is.null <- base::is.null [18:01:43.397] muffled <- FALSE [18:01:43.397] if (inherits(cond, "message")) { [18:01:43.397] muffled <- grepl(pattern, "muffleMessage") [18:01:43.397] if (muffled) [18:01:43.397] invokeRestart("muffleMessage") [18:01:43.397] } [18:01:43.397] else if (inherits(cond, "warning")) { [18:01:43.397] muffled <- grepl(pattern, "muffleWarning") [18:01:43.397] if (muffled) [18:01:43.397] invokeRestart("muffleWarning") [18:01:43.397] } [18:01:43.397] else if (inherits(cond, "condition")) { [18:01:43.397] if (!is.null(pattern)) { [18:01:43.397] computeRestarts <- base::computeRestarts [18:01:43.397] grepl <- base::grepl [18:01:43.397] restarts <- computeRestarts(cond) [18:01:43.397] for (restart in restarts) { [18:01:43.397] name <- restart$name [18:01:43.397] if (is.null(name)) [18:01:43.397] next [18:01:43.397] if (!grepl(pattern, name)) [18:01:43.397] next [18:01:43.397] invokeRestart(restart) [18:01:43.397] muffled <- TRUE [18:01:43.397] break [18:01:43.397] } [18:01:43.397] } [18:01:43.397] } [18:01:43.397] invisible(muffled) [18:01:43.397] } [18:01:43.397] muffleCondition(cond, pattern = "^muffle") [18:01:43.397] } [18:01:43.397] } [18:01:43.397] else { [18:01:43.397] if (TRUE) { [18:01:43.397] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.397] { [18:01:43.397] inherits <- base::inherits [18:01:43.397] invokeRestart <- base::invokeRestart [18:01:43.397] is.null <- base::is.null [18:01:43.397] muffled <- FALSE [18:01:43.397] if (inherits(cond, "message")) { [18:01:43.397] muffled <- grepl(pattern, "muffleMessage") [18:01:43.397] if (muffled) [18:01:43.397] invokeRestart("muffleMessage") [18:01:43.397] } [18:01:43.397] else if (inherits(cond, "warning")) { [18:01:43.397] muffled <- grepl(pattern, "muffleWarning") [18:01:43.397] if (muffled) [18:01:43.397] invokeRestart("muffleWarning") [18:01:43.397] } [18:01:43.397] else if (inherits(cond, "condition")) { [18:01:43.397] if (!is.null(pattern)) { [18:01:43.397] computeRestarts <- base::computeRestarts [18:01:43.397] grepl <- base::grepl [18:01:43.397] restarts <- computeRestarts(cond) [18:01:43.397] for (restart in restarts) { [18:01:43.397] name <- restart$name [18:01:43.397] if (is.null(name)) [18:01:43.397] next [18:01:43.397] if (!grepl(pattern, name)) [18:01:43.397] next [18:01:43.397] invokeRestart(restart) [18:01:43.397] muffled <- TRUE [18:01:43.397] break [18:01:43.397] } [18:01:43.397] } [18:01:43.397] } [18:01:43.397] invisible(muffled) [18:01:43.397] } [18:01:43.397] muffleCondition(cond, pattern = "^muffle") [18:01:43.397] } [18:01:43.397] } [18:01:43.397] } [18:01:43.397] })) [18:01:43.397] }, error = function(ex) { [18:01:43.397] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.397] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.397] ...future.rng), started = ...future.startTime, [18:01:43.397] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.397] version = "1.8"), class = "FutureResult") [18:01:43.397] }, finally = { [18:01:43.397] if (!identical(...future.workdir, getwd())) [18:01:43.397] setwd(...future.workdir) [18:01:43.397] { [18:01:43.397] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.397] ...future.oldOptions$nwarnings <- NULL [18:01:43.397] } [18:01:43.397] base::options(...future.oldOptions) [18:01:43.397] if (.Platform$OS.type == "windows") { [18:01:43.397] old_names <- names(...future.oldEnvVars) [18:01:43.397] envs <- base::Sys.getenv() [18:01:43.397] names <- names(envs) [18:01:43.397] common <- intersect(names, old_names) [18:01:43.397] added <- setdiff(names, old_names) [18:01:43.397] removed <- setdiff(old_names, names) [18:01:43.397] changed <- common[...future.oldEnvVars[common] != [18:01:43.397] envs[common]] [18:01:43.397] NAMES <- toupper(changed) [18:01:43.397] args <- list() [18:01:43.397] for (kk in seq_along(NAMES)) { [18:01:43.397] name <- changed[[kk]] [18:01:43.397] NAME <- NAMES[[kk]] [18:01:43.397] if (name != NAME && is.element(NAME, old_names)) [18:01:43.397] next [18:01:43.397] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.397] } [18:01:43.397] NAMES <- toupper(added) [18:01:43.397] for (kk in seq_along(NAMES)) { [18:01:43.397] name <- added[[kk]] [18:01:43.397] NAME <- NAMES[[kk]] [18:01:43.397] if (name != NAME && is.element(NAME, old_names)) [18:01:43.397] next [18:01:43.397] args[[name]] <- "" [18:01:43.397] } [18:01:43.397] NAMES <- toupper(removed) [18:01:43.397] for (kk in seq_along(NAMES)) { [18:01:43.397] name <- removed[[kk]] [18:01:43.397] NAME <- NAMES[[kk]] [18:01:43.397] if (name != NAME && is.element(NAME, old_names)) [18:01:43.397] next [18:01:43.397] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.397] } [18:01:43.397] if (length(args) > 0) [18:01:43.397] base::do.call(base::Sys.setenv, args = args) [18:01:43.397] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.397] } [18:01:43.397] else { [18:01:43.397] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.397] } [18:01:43.397] { [18:01:43.397] if (base::length(...future.futureOptionsAdded) > [18:01:43.397] 0L) { [18:01:43.397] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.397] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.397] base::options(opts) [18:01:43.397] } [18:01:43.397] { [18:01:43.397] { [18:01:43.397] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.397] NULL [18:01:43.397] } [18:01:43.397] options(future.plan = NULL) [18:01:43.397] if (is.na(NA_character_)) [18:01:43.397] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.397] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.397] future::plan(list(function (..., workers = availableCores(), [18:01:43.397] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.397] envir = parent.frame()) [18:01:43.397] { [18:01:43.397] if (is.function(workers)) [18:01:43.397] workers <- workers() [18:01:43.397] workers <- structure(as.integer(workers), [18:01:43.397] class = class(workers)) [18:01:43.397] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.397] workers >= 1) [18:01:43.397] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.397] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.397] } [18:01:43.397] future <- MultisessionFuture(..., workers = workers, [18:01:43.397] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.397] envir = envir) [18:01:43.397] if (!future$lazy) [18:01:43.397] future <- run(future) [18:01:43.397] invisible(future) [18:01:43.397] }), .cleanup = FALSE, .init = FALSE) [18:01:43.397] } [18:01:43.397] } [18:01:43.397] } [18:01:43.397] }) [18:01:43.397] if (TRUE) { [18:01:43.397] base::sink(type = "output", split = FALSE) [18:01:43.397] if (TRUE) { [18:01:43.397] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.397] } [18:01:43.397] else { [18:01:43.397] ...future.result["stdout"] <- base::list(NULL) [18:01:43.397] } [18:01:43.397] base::close(...future.stdout) [18:01:43.397] ...future.stdout <- NULL [18:01:43.397] } [18:01:43.397] ...future.result$conditions <- ...future.conditions [18:01:43.397] ...future.result$finished <- base::Sys.time() [18:01:43.397] ...future.result [18:01:43.397] } [18:01:43.403] MultisessionFuture started [18:01:43.403] - Launch lazy future ... done [18:01:43.403] run() for 'MultisessionFuture' ... done [18:01:43.404] getGlobalsAndPackages() ... [18:01:43.404] Searching for globals... [18:01:43.405] - globals found: [1] '{' [18:01:43.405] Searching for globals ... DONE [18:01:43.405] Resolving globals: FALSE [18:01:43.405] [18:01:43.405] [18:01:43.406] getGlobalsAndPackages() ... DONE [18:01:43.406] run() for 'Future' ... [18:01:43.406] - state: 'created' [18:01:43.406] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:01:43.420] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:01:43.420] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:01:43.420] - Field: 'node' [18:01:43.420] - Field: 'label' [18:01:43.420] - Field: 'local' [18:01:43.421] - Field: 'owner' [18:01:43.421] - Field: 'envir' [18:01:43.421] - Field: 'workers' [18:01:43.421] - Field: 'packages' [18:01:43.421] - Field: 'gc' [18:01:43.422] - Field: 'conditions' [18:01:43.422] - Field: 'persistent' [18:01:43.422] - Field: 'expr' [18:01:43.422] - Field: 'uuid' [18:01:43.422] - Field: 'seed' [18:01:43.422] - Field: 'version' [18:01:43.423] - Field: 'result' [18:01:43.423] - Field: 'asynchronous' [18:01:43.423] - Field: 'calls' [18:01:43.423] - Field: 'globals' [18:01:43.423] - Field: 'stdout' [18:01:43.423] - Field: 'earlySignal' [18:01:43.424] - Field: 'lazy' [18:01:43.424] - Field: 'state' [18:01:43.424] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:01:43.424] - Launch lazy future ... [18:01:43.425] Packages needed by the future expression (n = 0): [18:01:43.425] Packages needed by future strategies (n = 0): [18:01:43.425] { [18:01:43.425] { [18:01:43.425] { [18:01:43.425] ...future.startTime <- base::Sys.time() [18:01:43.425] { [18:01:43.425] { [18:01:43.425] { [18:01:43.425] { [18:01:43.425] base::local({ [18:01:43.425] has_future <- base::requireNamespace("future", [18:01:43.425] quietly = TRUE) [18:01:43.425] if (has_future) { [18:01:43.425] ns <- base::getNamespace("future") [18:01:43.425] version <- ns[[".package"]][["version"]] [18:01:43.425] if (is.null(version)) [18:01:43.425] version <- utils::packageVersion("future") [18:01:43.425] } [18:01:43.425] else { [18:01:43.425] version <- NULL [18:01:43.425] } [18:01:43.425] if (!has_future || version < "1.8.0") { [18:01:43.425] info <- base::c(r_version = base::gsub("R version ", [18:01:43.425] "", base::R.version$version.string), [18:01:43.425] platform = base::sprintf("%s (%s-bit)", [18:01:43.425] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:43.425] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:43.425] "release", "version")], collapse = " "), [18:01:43.425] hostname = base::Sys.info()[["nodename"]]) [18:01:43.425] info <- base::sprintf("%s: %s", base::names(info), [18:01:43.425] info) [18:01:43.425] info <- base::paste(info, collapse = "; ") [18:01:43.425] if (!has_future) { [18:01:43.425] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:43.425] info) [18:01:43.425] } [18:01:43.425] else { [18:01:43.425] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:43.425] info, version) [18:01:43.425] } [18:01:43.425] base::stop(msg) [18:01:43.425] } [18:01:43.425] }) [18:01:43.425] } [18:01:43.425] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:43.425] base::options(mc.cores = 1L) [18:01:43.425] } [18:01:43.425] options(future.plan = NULL) [18:01:43.425] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.425] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:43.425] } [18:01:43.425] ...future.workdir <- getwd() [18:01:43.425] } [18:01:43.425] ...future.oldOptions <- base::as.list(base::.Options) [18:01:43.425] ...future.oldEnvVars <- base::Sys.getenv() [18:01:43.425] } [18:01:43.425] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:43.425] future.globals.maxSize = NULL, future.globals.method = NULL, [18:01:43.425] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:43.425] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:43.425] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:43.425] future.stdout.windows.reencode = NULL, width = 80L) [18:01:43.425] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:43.425] base::names(...future.oldOptions)) [18:01:43.425] } [18:01:43.425] if (FALSE) { [18:01:43.425] } [18:01:43.425] else { [18:01:43.425] if (TRUE) { [18:01:43.425] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:43.425] open = "w") [18:01:43.425] } [18:01:43.425] else { [18:01:43.425] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:43.425] windows = "NUL", "/dev/null"), open = "w") [18:01:43.425] } [18:01:43.425] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:43.425] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:43.425] base::sink(type = "output", split = FALSE) [18:01:43.425] base::close(...future.stdout) [18:01:43.425] }, add = TRUE) [18:01:43.425] } [18:01:43.425] ...future.frame <- base::sys.nframe() [18:01:43.425] ...future.conditions <- base::list() [18:01:43.425] ...future.rng <- base::globalenv()$.Random.seed [18:01:43.425] if (FALSE) { [18:01:43.425] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:43.425] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:43.425] } [18:01:43.425] ...future.result <- base::tryCatch({ [18:01:43.425] base::withCallingHandlers({ [18:01:43.425] ...future.value <- base::withVisible(base::local({ [18:01:43.425] ...future.makeSendCondition <- local({ [18:01:43.425] sendCondition <- NULL [18:01:43.425] function(frame = 1L) { [18:01:43.425] if (is.function(sendCondition)) [18:01:43.425] return(sendCondition) [18:01:43.425] ns <- getNamespace("parallel") [18:01:43.425] if (exists("sendData", mode = "function", [18:01:43.425] envir = ns)) { [18:01:43.425] parallel_sendData <- get("sendData", mode = "function", [18:01:43.425] envir = ns) [18:01:43.425] envir <- sys.frame(frame) [18:01:43.425] master <- NULL [18:01:43.425] while (!identical(envir, .GlobalEnv) && [18:01:43.425] !identical(envir, emptyenv())) { [18:01:43.425] if (exists("master", mode = "list", envir = envir, [18:01:43.425] inherits = FALSE)) { [18:01:43.425] master <- get("master", mode = "list", [18:01:43.425] envir = envir, inherits = FALSE) [18:01:43.425] if (inherits(master, c("SOCKnode", [18:01:43.425] "SOCK0node"))) { [18:01:43.425] sendCondition <<- function(cond) { [18:01:43.425] data <- list(type = "VALUE", value = cond, [18:01:43.425] success = TRUE) [18:01:43.425] parallel_sendData(master, data) [18:01:43.425] } [18:01:43.425] return(sendCondition) [18:01:43.425] } [18:01:43.425] } [18:01:43.425] frame <- frame + 1L [18:01:43.425] envir <- sys.frame(frame) [18:01:43.425] } [18:01:43.425] } [18:01:43.425] sendCondition <<- function(cond) NULL [18:01:43.425] } [18:01:43.425] }) [18:01:43.425] withCallingHandlers({ [18:01:43.425] { [18:01:43.425] 4 [18:01:43.425] } [18:01:43.425] }, immediateCondition = function(cond) { [18:01:43.425] sendCondition <- ...future.makeSendCondition() [18:01:43.425] sendCondition(cond) [18:01:43.425] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.425] { [18:01:43.425] inherits <- base::inherits [18:01:43.425] invokeRestart <- base::invokeRestart [18:01:43.425] is.null <- base::is.null [18:01:43.425] muffled <- FALSE [18:01:43.425] if (inherits(cond, "message")) { [18:01:43.425] muffled <- grepl(pattern, "muffleMessage") [18:01:43.425] if (muffled) [18:01:43.425] invokeRestart("muffleMessage") [18:01:43.425] } [18:01:43.425] else if (inherits(cond, "warning")) { [18:01:43.425] muffled <- grepl(pattern, "muffleWarning") [18:01:43.425] if (muffled) [18:01:43.425] invokeRestart("muffleWarning") [18:01:43.425] } [18:01:43.425] else if (inherits(cond, "condition")) { [18:01:43.425] if (!is.null(pattern)) { [18:01:43.425] computeRestarts <- base::computeRestarts [18:01:43.425] grepl <- base::grepl [18:01:43.425] restarts <- computeRestarts(cond) [18:01:43.425] for (restart in restarts) { [18:01:43.425] name <- restart$name [18:01:43.425] if (is.null(name)) [18:01:43.425] next [18:01:43.425] if (!grepl(pattern, name)) [18:01:43.425] next [18:01:43.425] invokeRestart(restart) [18:01:43.425] muffled <- TRUE [18:01:43.425] break [18:01:43.425] } [18:01:43.425] } [18:01:43.425] } [18:01:43.425] invisible(muffled) [18:01:43.425] } [18:01:43.425] muffleCondition(cond) [18:01:43.425] }) [18:01:43.425] })) [18:01:43.425] future::FutureResult(value = ...future.value$value, [18:01:43.425] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.425] ...future.rng), globalenv = if (FALSE) [18:01:43.425] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:43.425] ...future.globalenv.names)) [18:01:43.425] else NULL, started = ...future.startTime, version = "1.8") [18:01:43.425] }, condition = base::local({ [18:01:43.425] c <- base::c [18:01:43.425] inherits <- base::inherits [18:01:43.425] invokeRestart <- base::invokeRestart [18:01:43.425] length <- base::length [18:01:43.425] list <- base::list [18:01:43.425] seq.int <- base::seq.int [18:01:43.425] signalCondition <- base::signalCondition [18:01:43.425] sys.calls <- base::sys.calls [18:01:43.425] `[[` <- base::`[[` [18:01:43.425] `+` <- base::`+` [18:01:43.425] `<<-` <- base::`<<-` [18:01:43.425] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:43.425] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:43.425] 3L)] [18:01:43.425] } [18:01:43.425] function(cond) { [18:01:43.425] is_error <- inherits(cond, "error") [18:01:43.425] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:43.425] NULL) [18:01:43.425] if (is_error) { [18:01:43.425] sessionInformation <- function() { [18:01:43.425] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:43.425] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:43.425] search = base::search(), system = base::Sys.info()) [18:01:43.425] } [18:01:43.425] ...future.conditions[[length(...future.conditions) + [18:01:43.425] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:43.425] cond$call), session = sessionInformation(), [18:01:43.425] timestamp = base::Sys.time(), signaled = 0L) [18:01:43.425] signalCondition(cond) [18:01:43.425] } [18:01:43.425] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:43.425] "immediateCondition"))) { [18:01:43.425] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:43.425] ...future.conditions[[length(...future.conditions) + [18:01:43.425] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:43.425] if (TRUE && !signal) { [18:01:43.425] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.425] { [18:01:43.425] inherits <- base::inherits [18:01:43.425] invokeRestart <- base::invokeRestart [18:01:43.425] is.null <- base::is.null [18:01:43.425] muffled <- FALSE [18:01:43.425] if (inherits(cond, "message")) { [18:01:43.425] muffled <- grepl(pattern, "muffleMessage") [18:01:43.425] if (muffled) [18:01:43.425] invokeRestart("muffleMessage") [18:01:43.425] } [18:01:43.425] else if (inherits(cond, "warning")) { [18:01:43.425] muffled <- grepl(pattern, "muffleWarning") [18:01:43.425] if (muffled) [18:01:43.425] invokeRestart("muffleWarning") [18:01:43.425] } [18:01:43.425] else if (inherits(cond, "condition")) { [18:01:43.425] if (!is.null(pattern)) { [18:01:43.425] computeRestarts <- base::computeRestarts [18:01:43.425] grepl <- base::grepl [18:01:43.425] restarts <- computeRestarts(cond) [18:01:43.425] for (restart in restarts) { [18:01:43.425] name <- restart$name [18:01:43.425] if (is.null(name)) [18:01:43.425] next [18:01:43.425] if (!grepl(pattern, name)) [18:01:43.425] next [18:01:43.425] invokeRestart(restart) [18:01:43.425] muffled <- TRUE [18:01:43.425] break [18:01:43.425] } [18:01:43.425] } [18:01:43.425] } [18:01:43.425] invisible(muffled) [18:01:43.425] } [18:01:43.425] muffleCondition(cond, pattern = "^muffle") [18:01:43.425] } [18:01:43.425] } [18:01:43.425] else { [18:01:43.425] if (TRUE) { [18:01:43.425] muffleCondition <- function (cond, pattern = "^muffle") [18:01:43.425] { [18:01:43.425] inherits <- base::inherits [18:01:43.425] invokeRestart <- base::invokeRestart [18:01:43.425] is.null <- base::is.null [18:01:43.425] muffled <- FALSE [18:01:43.425] if (inherits(cond, "message")) { [18:01:43.425] muffled <- grepl(pattern, "muffleMessage") [18:01:43.425] if (muffled) [18:01:43.425] invokeRestart("muffleMessage") [18:01:43.425] } [18:01:43.425] else if (inherits(cond, "warning")) { [18:01:43.425] muffled <- grepl(pattern, "muffleWarning") [18:01:43.425] if (muffled) [18:01:43.425] invokeRestart("muffleWarning") [18:01:43.425] } [18:01:43.425] else if (inherits(cond, "condition")) { [18:01:43.425] if (!is.null(pattern)) { [18:01:43.425] computeRestarts <- base::computeRestarts [18:01:43.425] grepl <- base::grepl [18:01:43.425] restarts <- computeRestarts(cond) [18:01:43.425] for (restart in restarts) { [18:01:43.425] name <- restart$name [18:01:43.425] if (is.null(name)) [18:01:43.425] next [18:01:43.425] if (!grepl(pattern, name)) [18:01:43.425] next [18:01:43.425] invokeRestart(restart) [18:01:43.425] muffled <- TRUE [18:01:43.425] break [18:01:43.425] } [18:01:43.425] } [18:01:43.425] } [18:01:43.425] invisible(muffled) [18:01:43.425] } [18:01:43.425] muffleCondition(cond, pattern = "^muffle") [18:01:43.425] } [18:01:43.425] } [18:01:43.425] } [18:01:43.425] })) [18:01:43.425] }, error = function(ex) { [18:01:43.425] base::structure(base::list(value = NULL, visible = NULL, [18:01:43.425] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:43.425] ...future.rng), started = ...future.startTime, [18:01:43.425] finished = Sys.time(), session_uuid = NA_character_, [18:01:43.425] version = "1.8"), class = "FutureResult") [18:01:43.425] }, finally = { [18:01:43.425] if (!identical(...future.workdir, getwd())) [18:01:43.425] setwd(...future.workdir) [18:01:43.425] { [18:01:43.425] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:43.425] ...future.oldOptions$nwarnings <- NULL [18:01:43.425] } [18:01:43.425] base::options(...future.oldOptions) [18:01:43.425] if (.Platform$OS.type == "windows") { [18:01:43.425] old_names <- names(...future.oldEnvVars) [18:01:43.425] envs <- base::Sys.getenv() [18:01:43.425] names <- names(envs) [18:01:43.425] common <- intersect(names, old_names) [18:01:43.425] added <- setdiff(names, old_names) [18:01:43.425] removed <- setdiff(old_names, names) [18:01:43.425] changed <- common[...future.oldEnvVars[common] != [18:01:43.425] envs[common]] [18:01:43.425] NAMES <- toupper(changed) [18:01:43.425] args <- list() [18:01:43.425] for (kk in seq_along(NAMES)) { [18:01:43.425] name <- changed[[kk]] [18:01:43.425] NAME <- NAMES[[kk]] [18:01:43.425] if (name != NAME && is.element(NAME, old_names)) [18:01:43.425] next [18:01:43.425] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.425] } [18:01:43.425] NAMES <- toupper(added) [18:01:43.425] for (kk in seq_along(NAMES)) { [18:01:43.425] name <- added[[kk]] [18:01:43.425] NAME <- NAMES[[kk]] [18:01:43.425] if (name != NAME && is.element(NAME, old_names)) [18:01:43.425] next [18:01:43.425] args[[name]] <- "" [18:01:43.425] } [18:01:43.425] NAMES <- toupper(removed) [18:01:43.425] for (kk in seq_along(NAMES)) { [18:01:43.425] name <- removed[[kk]] [18:01:43.425] NAME <- NAMES[[kk]] [18:01:43.425] if (name != NAME && is.element(NAME, old_names)) [18:01:43.425] next [18:01:43.425] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:43.425] } [18:01:43.425] if (length(args) > 0) [18:01:43.425] base::do.call(base::Sys.setenv, args = args) [18:01:43.425] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:43.425] } [18:01:43.425] else { [18:01:43.425] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:43.425] } [18:01:43.425] { [18:01:43.425] if (base::length(...future.futureOptionsAdded) > [18:01:43.425] 0L) { [18:01:43.425] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:43.425] base::names(opts) <- ...future.futureOptionsAdded [18:01:43.425] base::options(opts) [18:01:43.425] } [18:01:43.425] { [18:01:43.425] { [18:01:43.425] base::options(mc.cores = ...future.mc.cores.old) [18:01:43.425] NULL [18:01:43.425] } [18:01:43.425] options(future.plan = NULL) [18:01:43.425] if (is.na(NA_character_)) [18:01:43.425] Sys.unsetenv("R_FUTURE_PLAN") [18:01:43.425] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:43.425] future::plan(list(function (..., workers = availableCores(), [18:01:43.425] lazy = FALSE, rscript_libs = .libPaths(), [18:01:43.425] envir = parent.frame()) [18:01:43.425] { [18:01:43.425] if (is.function(workers)) [18:01:43.425] workers <- workers() [18:01:43.425] workers <- structure(as.integer(workers), [18:01:43.425] class = class(workers)) [18:01:43.425] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:43.425] workers >= 1) [18:01:43.425] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:43.425] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:43.425] } [18:01:43.425] future <- MultisessionFuture(..., workers = workers, [18:01:43.425] lazy = lazy, rscript_libs = rscript_libs, [18:01:43.425] envir = envir) [18:01:43.425] if (!future$lazy) [18:01:43.425] future <- run(future) [18:01:43.425] invisible(future) [18:01:43.425] }), .cleanup = FALSE, .init = FALSE) [18:01:43.425] } [18:01:43.425] } [18:01:43.425] } [18:01:43.425] }) [18:01:43.425] if (TRUE) { [18:01:43.425] base::sink(type = "output", split = FALSE) [18:01:43.425] if (TRUE) { [18:01:43.425] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:43.425] } [18:01:43.425] else { [18:01:43.425] ...future.result["stdout"] <- base::list(NULL) [18:01:43.425] } [18:01:43.425] base::close(...future.stdout) [18:01:43.425] ...future.stdout <- NULL [18:01:43.425] } [18:01:43.425] ...future.result$conditions <- ...future.conditions [18:01:43.425] ...future.result$finished <- base::Sys.time() [18:01:43.425] ...future.result [18:01:43.425] } [18:01:43.430] Poll #1 (0): usedNodes() = 2, workers = 2 [18:01:43.455] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.455] - Validating connection of MultisessionFuture [18:01:43.455] - received message: FutureResult [18:01:43.455] - Received FutureResult [18:01:43.455] - Erased future from FutureRegistry [18:01:43.456] result() for ClusterFuture ... [18:01:43.456] - result already collected: FutureResult [18:01:43.456] result() for ClusterFuture ... done [18:01:43.456] receiveMessageFromWorker() for ClusterFuture ... done [18:01:43.456] result() for ClusterFuture ... [18:01:43.456] - result already collected: FutureResult [18:01:43.457] result() for ClusterFuture ... done [18:01:43.457] result() for ClusterFuture ... [18:01:43.457] - result already collected: FutureResult [18:01:43.457] result() for ClusterFuture ... done [18:01:43.458] MultisessionFuture started [18:01:43.458] - Launch lazy future ... done [18:01:43.459] 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" [18:01:43.464] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.464] - Validating connection of MultisessionFuture [18:01:43.464] - received message: FutureResult [18:01:43.464] - Received FutureResult [18:01:43.464] - Erased future from FutureRegistry [18:01:43.465] result() for ClusterFuture ... [18:01:43.465] - result already collected: FutureResult [18:01:43.465] result() for ClusterFuture ... done [18:01:43.465] receiveMessageFromWorker() for ClusterFuture ... done [18:01:43.477] receiveMessageFromWorker() for ClusterFuture ... [18:01:43.477] - Validating connection of MultisessionFuture [18:01:43.477] - received message: FutureResult [18:01:43.477] - Received FutureResult [18:01:43.478] - Erased future from FutureRegistry [18:01:43.478] result() for ClusterFuture ... [18:01:43.478] - result already collected: FutureResult [18:01:43.478] result() for ClusterFuture ... done [18:01:43.478] 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" ... [18:01:43.482] resolve() on list environment ... [18:01:43.482] recursive: 0 [18:01:43.483] length: 6 [18:01:43.483] elements: 'a', 'b', 'c', 'd', '', '' [18:01:43.484] signalConditionsASAP(numeric, pos=1) ... [18:01:43.484] - nx: 6 [18:01:43.484] - relay: TRUE [18:01:43.484] - stdout: TRUE [18:01:43.484] - signal: TRUE [18:01:43.484] - resignal: FALSE [18:01:43.484] - force: TRUE [18:01:43.485] - relayed: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.485] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.485] - until=2 [18:01:43.485] - relaying element #2 [18:01:43.485] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.485] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.486] signalConditionsASAP(NULL, pos=1) ... done [18:01:43.486] length: 5 (resolved future 1) [18:01:43.486] Future #2 [18:01:43.486] result() for ClusterFuture ... [18:01:43.486] - result already collected: FutureResult [18:01:43.487] result() for ClusterFuture ... done [18:01:43.487] result() for ClusterFuture ... [18:01:43.487] - result already collected: FutureResult [18:01:43.487] result() for ClusterFuture ... done [18:01:43.487] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:01:43.487] - nx: 6 [18:01:43.487] - relay: TRUE [18:01:43.488] - stdout: TRUE [18:01:43.488] - signal: TRUE [18:01:43.488] - resignal: FALSE [18:01:43.488] - force: TRUE [18:01:43.488] - relayed: [n=6] TRUE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.488] - queued futures: [n=6] FALSE, FALSE, FALSE, FALSE, FALSE, FALSE [18:01:43.489] - until=2 [18:01:43.489] - relaying element #2 [18:01:43.489] result() for ClusterFuture ... [18:01:43.489] - result already collected: FutureResult [18:01:43.489] result() for ClusterFuture ... done [18:01:43.489] result() for ClusterFuture ... [18:01:43.490] - result already collected: FutureResult [18:01:43.490] result() for ClusterFuture ... done [18:01:43.490] result() for ClusterFuture ... [18:01:43.490] - result already collected: FutureResult [18:01:43.490] result() for ClusterFuture ... done [18:01:43.490] result() for ClusterFuture ... [18:01:43.491] - result already collected: FutureResult [18:01:43.491] result() for ClusterFuture ... done [18:01:43.491] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.491] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.491] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:01:43.491] length: 4 (resolved future 2) [18:01:43.492] Future #3 [18:01:43.492] result() for ClusterFuture ... [18:01:43.492] - result already collected: FutureResult [18:01:43.492] result() for ClusterFuture ... done [18:01:43.492] result() for ClusterFuture ... [18:01:43.492] - result already collected: FutureResult [18:01:43.493] result() for ClusterFuture ... done [18:01:43.493] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:01:43.493] - nx: 6 [18:01:43.493] - relay: TRUE [18:01:43.493] - stdout: TRUE [18:01:43.493] - signal: TRUE [18:01:43.493] - resignal: FALSE [18:01:43.494] - force: TRUE [18:01:43.494] - relayed: [n=6] TRUE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.494] - queued futures: [n=6] FALSE, TRUE, FALSE, FALSE, FALSE, FALSE [18:01:43.494] - until=3 [18:01:43.494] - relaying element #3 [18:01:43.494] result() for ClusterFuture ... [18:01:43.495] - result already collected: FutureResult [18:01:43.495] result() for ClusterFuture ... done [18:01:43.495] result() for ClusterFuture ... [18:01:43.495] - result already collected: FutureResult [18:01:43.495] result() for ClusterFuture ... done [18:01:43.495] result() for ClusterFuture ... [18:01:43.496] - result already collected: FutureResult [18:01:43.496] result() for ClusterFuture ... done [18:01:43.496] result() for ClusterFuture ... [18:01:43.496] - result already collected: FutureResult [18:01:43.496] result() for ClusterFuture ... done [18:01:43.496] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.497] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.497] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:01:43.497] length: 3 (resolved future 3) [18:01:43.497] Future #4 [18:01:43.497] result() for ClusterFuture ... [18:01:43.497] - result already collected: FutureResult [18:01:43.498] result() for ClusterFuture ... done [18:01:43.498] result() for ClusterFuture ... [18:01:43.498] - result already collected: FutureResult [18:01:43.498] result() for ClusterFuture ... done [18:01:43.498] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:01:43.498] - nx: 6 [18:01:43.499] - relay: TRUE [18:01:43.499] - stdout: TRUE [18:01:43.499] - signal: TRUE [18:01:43.499] - resignal: FALSE [18:01:43.499] - force: TRUE [18:01:43.499] - relayed: [n=6] TRUE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.499] - queued futures: [n=6] FALSE, TRUE, TRUE, FALSE, FALSE, FALSE [18:01:43.500] - until=4 [18:01:43.500] - relaying element #4 [18:01:43.500] result() for ClusterFuture ... [18:01:43.500] - result already collected: FutureResult [18:01:43.500] result() for ClusterFuture ... done [18:01:43.500] result() for ClusterFuture ... [18:01:43.501] - result already collected: FutureResult [18:01:43.501] result() for ClusterFuture ... done [18:01:43.501] result() for ClusterFuture ... [18:01:43.501] - result already collected: FutureResult [18:01:43.501] result() for ClusterFuture ... done [18:01:43.501] result() for ClusterFuture ... [18:01:43.502] - result already collected: FutureResult [18:01:43.502] result() for ClusterFuture ... done [18:01:43.502] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.502] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.502] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:01:43.502] length: 2 (resolved future 4) [18:01:43.503] signalConditionsASAP(NULL, pos=5) ... [18:01:43.503] - nx: 6 [18:01:43.503] - relay: TRUE [18:01:43.503] - stdout: TRUE [18:01:43.503] - signal: TRUE [18:01:43.503] - resignal: FALSE [18:01:43.504] - force: TRUE [18:01:43.504] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.504] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.504] - until=6 [18:01:43.504] - relaying element #6 [18:01:43.504] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.504] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.505] signalConditionsASAP(NULL, pos=5) ... done [18:01:43.505] length: 1 (resolved future 5) [18:01:43.505] signalConditionsASAP(numeric, pos=6) ... [18:01:43.505] - nx: 6 [18:01:43.505] - relay: TRUE [18:01:43.505] - stdout: TRUE [18:01:43.506] - signal: TRUE [18:01:43.506] - resignal: FALSE [18:01:43.506] - force: TRUE [18:01:43.506] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, FALSE [18:01:43.506] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.506] - until=6 [18:01:43.507] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.507] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.507] signalConditionsASAP(numeric, pos=6) ... done [18:01:43.507] length: 0 (resolved future 6) [18:01:43.507] Relaying remaining futures [18:01:43.507] signalConditionsASAP(NULL, pos=0) ... [18:01:43.508] - nx: 6 [18:01:43.508] - relay: TRUE [18:01:43.508] - stdout: TRUE [18:01:43.508] - signal: TRUE [18:01:43.508] - resignal: FALSE [18:01:43.508] - force: TRUE [18:01:43.508] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.509] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE - flush all [18:01:43.509] - relayed: [n=6] TRUE, TRUE, TRUE, TRUE, TRUE, TRUE [18:01:43.509] - queued futures: [n=6] FALSE, TRUE, TRUE, TRUE, FALSE, FALSE [18:01:43.509] signalConditionsASAP(NULL, pos=0) ... done [18:01:43.509] resolve() on list environment ... DONE [18:01:43.510] result() for ClusterFuture ... [18:01:43.510] - result already collected: FutureResult [18:01:43.510] result() for ClusterFuture ... done [18:01:43.510] result() for ClusterFuture ... [18:01:43.510] - result already collected: FutureResult [18:01:43.510] result() for ClusterFuture ... done [18:01:43.511] result() for ClusterFuture ... [18:01:43.511] - result already collected: FutureResult [18:01:43.511] result() for ClusterFuture ... done [18:01:43.511] result() for ClusterFuture ... [18:01:43.511] - result already collected: FutureResult [18:01:43.511] result() for ClusterFuture ... done [18:01:43.512] result() for ClusterFuture ... [18:01:43.512] - result already collected: FutureResult [18:01:43.512] result() for ClusterFuture ... done [18:01:43.512] result() for ClusterFuture ... [18:01:43.512] - result already collected: FutureResult [18:01:43.512] 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") [18:01:43.516] plan(): Setting new future strategy stack: [18:01:43.516] List of future strategies: [18:01:43.516] 1. FutureStrategy: [18:01:43.516] - args: function (..., envir = parent.frame()) [18:01:43.516] - tweaked: FALSE [18:01:43.516] - call: future::plan(oplan) [18:01:43.517] plan(): nbrOfWorkers() = 1 Failed to undo environment variables: - Expected environment variables: [n=201] '!ExitCode', 'ALLUSERSPROFILE', 'APPDATA', 'BIBINPUTS', 'BINDIR', 'BSTINPUTS', 'COMMONPROGRAMFILES', 'COMPUTERNAME', 'COMSPEC', 'CURL_CA_BUNDLE', 'CYGWIN', 'CommonProgramFiles(x86)', 'CommonProgramW6432', 'DriverData', 'HOME', 'HOMEDRIVE', 'HOMEPATH', 'JAGS_ROOT', 'JAVA_HOME', 'LANGUAGE', 'LC_COLLATE', 'LC_MONETARY', 'LC_TIME', 'LOCALAPPDATA', 'LOGONSERVER', 'LS_HOME', 'LS_LICENSE_PATH', 'MAKE', 'MAKEFLAGS', 'MAKELEVEL', 'MFLAGS', 'MSMPI_BENCHMARKS', 'MSMPI_BIN', 'MSYS2_ENV_CONV_EXCL', 'NUMBER_OF_PROCESSORS', 'OMP_THREAD_LIMIT', 'OS', 'PATH', 'PATHEXT', 'PROCESSOR_ARCHITECTURE', 'PROCESSOR_IDENTIFIER', 'PROCESSOR_LEVEL', 'PROCESSOR_REVISION', 'PROGRAMFILES', 'PROMPT', 'PSModulePath', 'PUBLIC', 'PWD', 'ProgramData', 'ProgramFiles(x86)', 'ProgramW6432', 'RETICULATE_AUTOCONFIGURE', 'RTOOLS43_HOME', 'R_ARCH', 'R_BROWSER', 'R_BZIPCMD', 'R_CMD', 'R_COMPILED_BY', 'R_CRAN_WEB', 'R_CUSTOM_TOOLS_PATH', 'R_CUSTOM_TOOLS_SOFT', 'R_DOC_DIR', 'R_ENVIRON_USER', 'R_GSCMD', 'R_GZIPCMD', 'R_HOME', 'R_INCLUDE_DIR', 'R_INSTALL_TAR', 'R_LIBS', 'R_LIBS_SITE', 'R_LIBS_USER', 'R_MAX_NUM_DLLS', 'R_OSTYPE', 'R_PAPERSIZE', 'R_PAPERSIZE_USER', 'R_PARALLELLY_MAKENODEPSOCK_AUTOKILL', 'R_PARALLELLY_MAKENODEPSOCK_CONNECTTIMEOUT', 'R_PARALLELLY_MAKENODEPSOCK_RSCRIPT_LABEL', 'R_PARALLELLY_MAKENODEPSOCK_SESSIONINFO_PKGS', 'R_PARALLELLY_MAKENODEPSOCK_TIMEOUT', 'R_PARALLELLY_RANDOM_PORTS', 'R_PARALLEL_PORT', 'R_RD4PDF', 'R_RTOOLS43_PATH', 'R_SCRIPT_LEGACY', 'R_SHARE_DIR', 'R_TESTS', 'R_UNZIPCMD', 'R_USER', 'R_VERSION', 'R_ZIPCMD', 'SED', 'SHLVL', 'SYSTEMDRIVE', 'SYSTEMROOT', 'TAR', 'TAR_OPTIONS', 'TEMP', 'TERM', 'TEXINPUTS', 'TMP', 'TMPDIR', 'USERDOMAIN', 'USERDOMAIN_ROAMINGPROFILE', 'USERNAME', 'USERPROFILE', 'WINDIR', '_', '_R_CHECK_AUTOCONF_', '_R_CHECK_BOGUS_RETURN_', '_R_CHECK_BROWSER_NONINTERACTIVE_', '_R_CHECK_BUILD_VIGNETTES_SEPARATELY_', '_R_CHECK_CODETOOLS_PROFILE_', '_R_CHECK_CODE_ASSIGN_TO_GLOBALENV_', '_R_CHECK_CODE_ATTACH_', '_R_CHECK_CODE_CLASS_IS_STRING_', '_R_CHECK_CODE_DATA_INTO_GLOBALENV_', '_R_CHECK_CODE_USAGE_VIA_NAMESPACES_', '_R_CHECK_CODE_USAGE_WITHOUT_LOADING_', '_R_CHECK_CODE_USAGE_WITH_ONLY_BASE_ATTACHED_', '_R_CHECK_CODOC_VARIABLES_IN_USAGES_', '_R_CHECK_COMPACT_DATA2_', '_R_CHECK_COMPILATION_FLAGS_', '_R_CHECK_CONNECTIONS_LEFT_OPEN_', '_R_CHECK_CRAN_INCOMING_', '_R_CHECK_CRAN_INCOMING_CHECK_FILE_URIS_', '_R_CHECK_CRAN_INCOMING_CHECK_URLS_IN_PARALLEL_', '_R_CHECK_CRAN_INCOMING_NOTE_GNU_MAKE_', '_R_CHECK_CRAN_INCOMING_REMOTE_', '_R_CHECK_CRAN_INCOMING_USE_ASPELL_', '_R_CHECK_DATALIST_', '_R_CHECK_DEPRECATED_DEFUNCT_', '_R_CHECK_DOC_SIZES2_', '_R_CHECK_DOT_FIRSTLIB_', '_R_CHECK_DOT_INTERNAL_', '_R_CHECK_EXAMPLE_TIMING_THRESHOLD_', '_R_CHECK_EXECUTABLES_', '_R_CHECK_EXECUTABLES_EXCLUSIONS_', '_R_CHECK_FF_CALLS_', '_R_CHECK_FF_DUP_', '_R_CHECK_FORCE_SUGGESTS_', '_R_CHECK_FUTURE_FILE_TIMESTAMPS_', '_R_CHECK_FUTURE_FILE_TIMESTAMPS_LEEWAY_', '_R_CHECK_HAVE_MYSQL_', '_R_CHECK_HAVE_ODBC_', '_R_CHECK_HAVE_PERL_', '_R_CHECK_HAVE_POSTGRES_', '_R_CHECK_INSTALL_DEPENDS_', '_R_CHECK_INTERNALS2_', '_R_CHECK_LENGTH_1_CONDITION_', '_R_CHECK_LICENSE_', '_R_CHECK_LIMIT_CORES_', '_R_CHECK_MATRIX_DATA_', '_R_CHECK_NATIVE_ROUTINE_REGISTRATION_', '_R_CHECK_NEWS_IN_PLAIN_TEXT_', '_R_CHECK_NO_RECOMMENDED_', '_R_CHECK_NO_STOP_ON_TEST_ERROR_', '_R_CHECK_ORPHANED_', '_R_CHECK_OVERWRITE_REGISTERED_S3_METHODS_', '_R_CHECK_PACKAGES_USED_IGNORE_UNUSED_IMPORTS_', '_R_CHECK_PACKAGES_USED_IN_TESTS_USE_SUBDIRS_', '_R_CHECK_PACKAGE_DATASETS_SUPPRESS_NOTES_', '_R_CHECK_PACKAGE_NAME_', '_R_CHECK_PKG_SIZES_', '_R_CHECK_PKG_SIZES_THRESHOLD_', '_R_CHECK_PRAGMAS_', '_R_CHECK_RD_EXAMPLES_T_AND_F_', '_R_CHECK_RD_LINE_WIDTHS_', '_R_CHECK_RD_MATH_RENDERING_', '_R_CHECK_RD_VALIDATE_RD2HTML_', '_R_CHECK_REPLACING_IMPORTS_', '_R_CHECK_R_DEPENDS_', '_R_CHECK_S3_METHODS_SHOW_POSSIBLE_ISSUES_', '_R_CHECK_SCREEN_DEVICE_', '_R_CHECK_SERIALIZATION_', '_R_CHECK_SHLIB_OPENMP_FLAGS_', '_R_CHECK_SRC_MINUS_W_IMPLICIT_', '_R_CHECK_SUBDIRS_NOCASE_', '_R_CHECK_SUBDIRS_STRICT_', '_R_CHECK_SUGGESTS_ONLY_', '_R_CHECK_SYSTEM_CLOCK_', '_R_CHECK_TESTS_NLINES_', '_R_CHECK_TEST_TIMING_', '_R_CHECK_TIMINGS_', '_R_CHECK_TOPLEVEL_FILES_', '_R_CHECK_UNDOC_USE_ALL_NAMES_', '_R_CHECK_UNSAFE_CALLS_', '_R_CHECK_URLS_SHOW_301_STATUS_', '_R_CHECK_VC_DIRS_', '_R_CHECK_VIGNETTES_NLINES_', '_R_CHECK_VIGNETTES_SKIP_RUN_MAYBE_', '_R_CHECK_VIGNETTE_TIMING_', '_R_CHECK_VIGNETTE_TITLES_', '_R_CHECK_WINDOWS_DEVICE_', '_R_CHECK_XREFS_USE_ALIASES_FROM_CRAN_', '_R_CLASS_MATRIX_ARRAY_', '_R_INSTALL_TIME_PATCHES_', '_R_S3_METHOD_LOOKUP_BASEENV_AFTER_GLOBALENV_', '_R_SHLIB_BUILD_OBJECTS_SYMBOL_TABLES_', 'maj.version', 'nextArg--timingsnextArg--install' - Environment variables still there: [n=0] - Environment variables missing: [n=1] 'MAKEFLAGS' Differences environment variable by environment variable: List of 3 $ name : chr "MAKEFLAGS" $ expected: 'Dlist' chr "" $ actual : 'Dlist' chr NA > > proc.time() user system elapsed 3.15 0.26 5.51