R version 4.4.0 beta (2024-04-15 r86425 ucrt) -- "Puppy Cup" Copyright (C) 2024 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") Loading required package: future [13:10:33.783] plan(): Setting new future strategy stack: [13:10:33.784] List of future strategies: [13:10:33.784] 1. mirai_multisession: [13:10:33.784] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:10:33.784] - tweaked: FALSE [13:10:33.784] - call: future::plan(future.mirai::mirai_multisession) [13:10:33.796] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:10:33.797] < mirai | $data > [13:10:33.802] getGlobalsAndPackages() ... [13:10:33.802] Not searching for globals [13:10:33.802] - globals: [0] [13:10:33.802] getGlobalsAndPackages() ... DONE [13:10:33.803] getGlobalsAndPackages() ... [13:10:33.803] [13:10:33.803] - globals: [0] [13:10:33.803] getGlobalsAndPackages() ... DONE [13:10:34.081] Packages needed by the future expression (n = 0): [13:10:34.081] Packages needed by future strategies (n = 0): [13:10:34.082] { [13:10:34.082] { [13:10:34.082] { [13:10:34.082] ...future.startTime <- base::Sys.time() [13:10:34.082] { [13:10:34.082] { [13:10:34.082] { [13:10:34.082] base::local({ [13:10:34.082] has_future <- base::requireNamespace("future", [13:10:34.082] quietly = TRUE) [13:10:34.082] if (has_future) { [13:10:34.082] ns <- base::getNamespace("future") [13:10:34.082] version <- ns[[".package"]][["version"]] [13:10:34.082] if (is.null(version)) [13:10:34.082] version <- utils::packageVersion("future") [13:10:34.082] } [13:10:34.082] else { [13:10:34.082] version <- NULL [13:10:34.082] } [13:10:34.082] if (!has_future || version < "1.8.0") { [13:10:34.082] info <- base::c(r_version = base::gsub("R version ", [13:10:34.082] "", base::R.version$version.string), [13:10:34.082] platform = base::sprintf("%s (%s-bit)", [13:10:34.082] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.082] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.082] "release", "version")], collapse = " "), [13:10:34.082] hostname = base::Sys.info()[["nodename"]]) [13:10:34.082] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.082] info) [13:10:34.082] info <- base::paste(info, collapse = "; ") [13:10:34.082] if (!has_future) { [13:10:34.082] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.082] info) [13:10:34.082] } [13:10:34.082] else { [13:10:34.082] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.082] info, version) [13:10:34.082] } [13:10:34.082] base::stop(msg) [13:10:34.082] } [13:10:34.082] }) [13:10:34.082] } [13:10:34.082] ...future.strategy.old <- future::plan("list") [13:10:34.082] options(future.plan = NULL) [13:10:34.082] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.082] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.082] } [13:10:34.082] ...future.workdir <- getwd() [13:10:34.082] } [13:10:34.082] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.082] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.082] } [13:10:34.082] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.082] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.082] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.082] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.082] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.082] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.082] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.082] base::names(...future.oldOptions)) [13:10:34.082] } [13:10:34.082] if (FALSE) { [13:10:34.082] } [13:10:34.082] else { [13:10:34.082] if (TRUE) { [13:10:34.082] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.082] open = "w") [13:10:34.082] } [13:10:34.082] else { [13:10:34.082] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.082] windows = "NUL", "/dev/null"), open = "w") [13:10:34.082] } [13:10:34.082] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.082] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.082] base::sink(type = "output", split = FALSE) [13:10:34.082] base::close(...future.stdout) [13:10:34.082] }, add = TRUE) [13:10:34.082] } [13:10:34.082] ...future.frame <- base::sys.nframe() [13:10:34.082] ...future.conditions <- base::list() [13:10:34.082] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.082] if (FALSE) { [13:10:34.082] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.082] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.082] } [13:10:34.082] ...future.result <- base::tryCatch({ [13:10:34.082] base::withCallingHandlers({ [13:10:34.082] ...future.value <- base::withVisible(base::local(NA)) [13:10:34.082] future::FutureResult(value = ...future.value$value, [13:10:34.082] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.082] ...future.rng), globalenv = if (FALSE) [13:10:34.082] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.082] ...future.globalenv.names)) [13:10:34.082] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.082] }, condition = base::local({ [13:10:34.082] c <- base::c [13:10:34.082] inherits <- base::inherits [13:10:34.082] invokeRestart <- base::invokeRestart [13:10:34.082] length <- base::length [13:10:34.082] list <- base::list [13:10:34.082] seq.int <- base::seq.int [13:10:34.082] signalCondition <- base::signalCondition [13:10:34.082] sys.calls <- base::sys.calls [13:10:34.082] `[[` <- base::`[[` [13:10:34.082] `+` <- base::`+` [13:10:34.082] `<<-` <- base::`<<-` [13:10:34.082] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.082] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.082] 3L)] [13:10:34.082] } [13:10:34.082] function(cond) { [13:10:34.082] is_error <- inherits(cond, "error") [13:10:34.082] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.082] NULL) [13:10:34.082] if (is_error) { [13:10:34.082] sessionInformation <- function() { [13:10:34.082] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.082] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.082] search = base::search(), system = base::Sys.info()) [13:10:34.082] } [13:10:34.082] ...future.conditions[[length(...future.conditions) + [13:10:34.082] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.082] cond$call), session = sessionInformation(), [13:10:34.082] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.082] signalCondition(cond) [13:10:34.082] } [13:10:34.082] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.082] signal <- FALSE && inherits(cond, character(0)) [13:10:34.082] ...future.conditions[[length(...future.conditions) + [13:10:34.082] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.082] if (FALSE && !signal) { [13:10:34.082] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.082] { [13:10:34.082] inherits <- base::inherits [13:10:34.082] invokeRestart <- base::invokeRestart [13:10:34.082] is.null <- base::is.null [13:10:34.082] muffled <- FALSE [13:10:34.082] if (inherits(cond, "message")) { [13:10:34.082] muffled <- grepl(pattern, "muffleMessage") [13:10:34.082] if (muffled) [13:10:34.082] invokeRestart("muffleMessage") [13:10:34.082] } [13:10:34.082] else if (inherits(cond, "warning")) { [13:10:34.082] muffled <- grepl(pattern, "muffleWarning") [13:10:34.082] if (muffled) [13:10:34.082] invokeRestart("muffleWarning") [13:10:34.082] } [13:10:34.082] else if (inherits(cond, "condition")) { [13:10:34.082] if (!is.null(pattern)) { [13:10:34.082] computeRestarts <- base::computeRestarts [13:10:34.082] grepl <- base::grepl [13:10:34.082] restarts <- computeRestarts(cond) [13:10:34.082] for (restart in restarts) { [13:10:34.082] name <- restart$name [13:10:34.082] if (is.null(name)) [13:10:34.082] next [13:10:34.082] if (!grepl(pattern, name)) [13:10:34.082] next [13:10:34.082] invokeRestart(restart) [13:10:34.082] muffled <- TRUE [13:10:34.082] break [13:10:34.082] } [13:10:34.082] } [13:10:34.082] } [13:10:34.082] invisible(muffled) [13:10:34.082] } [13:10:34.082] muffleCondition(cond, pattern = "^muffle") [13:10:34.082] } [13:10:34.082] } [13:10:34.082] else { [13:10:34.082] if (TRUE) { [13:10:34.082] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.082] { [13:10:34.082] inherits <- base::inherits [13:10:34.082] invokeRestart <- base::invokeRestart [13:10:34.082] is.null <- base::is.null [13:10:34.082] muffled <- FALSE [13:10:34.082] if (inherits(cond, "message")) { [13:10:34.082] muffled <- grepl(pattern, "muffleMessage") [13:10:34.082] if (muffled) [13:10:34.082] invokeRestart("muffleMessage") [13:10:34.082] } [13:10:34.082] else if (inherits(cond, "warning")) { [13:10:34.082] muffled <- grepl(pattern, "muffleWarning") [13:10:34.082] if (muffled) [13:10:34.082] invokeRestart("muffleWarning") [13:10:34.082] } [13:10:34.082] else if (inherits(cond, "condition")) { [13:10:34.082] if (!is.null(pattern)) { [13:10:34.082] computeRestarts <- base::computeRestarts [13:10:34.082] grepl <- base::grepl [13:10:34.082] restarts <- computeRestarts(cond) [13:10:34.082] for (restart in restarts) { [13:10:34.082] name <- restart$name [13:10:34.082] if (is.null(name)) [13:10:34.082] next [13:10:34.082] if (!grepl(pattern, name)) [13:10:34.082] next [13:10:34.082] invokeRestart(restart) [13:10:34.082] muffled <- TRUE [13:10:34.082] break [13:10:34.082] } [13:10:34.082] } [13:10:34.082] } [13:10:34.082] invisible(muffled) [13:10:34.082] } [13:10:34.082] muffleCondition(cond, pattern = "^muffle") [13:10:34.082] } [13:10:34.082] } [13:10:34.082] } [13:10:34.082] })) [13:10:34.082] }, error = function(ex) { [13:10:34.082] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.082] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.082] ...future.rng), started = ...future.startTime, [13:10:34.082] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.082] version = "1.8"), class = "FutureResult") [13:10:34.082] }, finally = { [13:10:34.082] if (!identical(...future.workdir, getwd())) [13:10:34.082] setwd(...future.workdir) [13:10:34.082] { [13:10:34.082] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.082] ...future.oldOptions$nwarnings <- NULL [13:10:34.082] } [13:10:34.082] base::options(...future.oldOptions) [13:10:34.082] if (.Platform$OS.type == "windows") { [13:10:34.082] old_names <- names(...future.oldEnvVars) [13:10:34.082] envs <- base::Sys.getenv() [13:10:34.082] names <- names(envs) [13:10:34.082] common <- intersect(names, old_names) [13:10:34.082] added <- setdiff(names, old_names) [13:10:34.082] removed <- setdiff(old_names, names) [13:10:34.082] changed <- common[...future.oldEnvVars[common] != [13:10:34.082] envs[common]] [13:10:34.082] NAMES <- toupper(changed) [13:10:34.082] args <- list() [13:10:34.082] for (kk in seq_along(NAMES)) { [13:10:34.082] name <- changed[[kk]] [13:10:34.082] NAME <- NAMES[[kk]] [13:10:34.082] if (name != NAME && is.element(NAME, old_names)) [13:10:34.082] next [13:10:34.082] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.082] } [13:10:34.082] NAMES <- toupper(added) [13:10:34.082] for (kk in seq_along(NAMES)) { [13:10:34.082] name <- added[[kk]] [13:10:34.082] NAME <- NAMES[[kk]] [13:10:34.082] if (name != NAME && is.element(NAME, old_names)) [13:10:34.082] next [13:10:34.082] args[[name]] <- "" [13:10:34.082] } [13:10:34.082] NAMES <- toupper(removed) [13:10:34.082] for (kk in seq_along(NAMES)) { [13:10:34.082] name <- removed[[kk]] [13:10:34.082] NAME <- NAMES[[kk]] [13:10:34.082] if (name != NAME && is.element(NAME, old_names)) [13:10:34.082] next [13:10:34.082] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.082] } [13:10:34.082] if (length(args) > 0) [13:10:34.082] base::do.call(base::Sys.setenv, args = args) [13:10:34.082] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.082] } [13:10:34.082] else { [13:10:34.082] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.082] } [13:10:34.082] { [13:10:34.082] if (base::length(...future.futureOptionsAdded) > [13:10:34.082] 0L) { [13:10:34.082] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.082] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.082] base::options(opts) [13:10:34.082] } [13:10:34.082] { [13:10:34.082] NULL [13:10:34.082] options(future.plan = NULL) [13:10:34.082] if (is.na(NA_character_)) [13:10:34.082] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.082] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.082] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.082] .init = FALSE) [13:10:34.082] } [13:10:34.082] } [13:10:34.082] } [13:10:34.082] }) [13:10:34.082] if (TRUE) { [13:10:34.082] base::sink(type = "output", split = FALSE) [13:10:34.082] if (TRUE) { [13:10:34.082] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.082] } [13:10:34.082] else { [13:10:34.082] ...future.result["stdout"] <- base::list(NULL) [13:10:34.082] } [13:10:34.082] base::close(...future.stdout) [13:10:34.082] ...future.stdout <- NULL [13:10:34.082] } [13:10:34.082] ...future.result$conditions <- ...future.conditions [13:10:34.082] ...future.result$finished <- base::Sys.time() [13:10:34.082] ...future.result [13:10:34.082] } [13:10:34.185] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:10:34.186] plan(): nbrOfWorkers() = 2 > > message("*** Futures - labels ...") *** Futures - labels ... > > strategies <- c("mirai_cluster", "mirai_multisession") > > for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + + for (label in list(NULL, sprintf("strategy_%s", strategy))) { + fcn <- get(strategy, mode = "function") + stopifnot(inherits(fcn, strategy)) + f <- fcn(42, label = label) + print(f) + stopifnot(identical(f$label, label)) + v <- value(f) + stopifnot(v == 42) + + f <- future(42, label = label) + print(f) + stopifnot(identical(f$label, label)) + v <- value(f) + stopifnot(v == 42) + + v %<-% { 42 } %label% label + f <- futureOf(v) + print(f) + stopifnot(identical(f$label, label)) + stopifnot(v == 42) + + } ## for (label ...) + + mprintf("- plan('%s') ... DONE", strategy) + } ## for (strategy ...) [13:10:34.202] - plan('mirai_cluster') ...[13:10:34.202] plan(): Setting new future strategy stack: [13:10:34.202] List of future strategies: [13:10:34.202] 1. mirai_cluster: [13:10:34.202] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = "") [13:10:34.202] - tweaked: FALSE [13:10:34.202] - call: plan(strategy) [13:10:34.217] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:10:34.217] < mirai | $data > [13:10:34.217] getGlobalsAndPackages() ... [13:10:34.217] Not searching for globals [13:10:34.217] - globals: [0] [13:10:34.218] getGlobalsAndPackages() ... DONE [13:10:34.218] getGlobalsAndPackages() ... [13:10:34.218] [13:10:34.218] - globals: [0] [13:10:34.218] getGlobalsAndPackages() ... DONE [13:10:34.219] Packages needed by the future expression (n = 0): [13:10:34.219] Packages needed by future strategies (n = 0): [13:10:34.219] { [13:10:34.219] { [13:10:34.219] { [13:10:34.219] ...future.startTime <- base::Sys.time() [13:10:34.219] { [13:10:34.219] { [13:10:34.219] { [13:10:34.219] base::local({ [13:10:34.219] has_future <- base::requireNamespace("future", [13:10:34.219] quietly = TRUE) [13:10:34.219] if (has_future) { [13:10:34.219] ns <- base::getNamespace("future") [13:10:34.219] version <- ns[[".package"]][["version"]] [13:10:34.219] if (is.null(version)) [13:10:34.219] version <- utils::packageVersion("future") [13:10:34.219] } [13:10:34.219] else { [13:10:34.219] version <- NULL [13:10:34.219] } [13:10:34.219] if (!has_future || version < "1.8.0") { [13:10:34.219] info <- base::c(r_version = base::gsub("R version ", [13:10:34.219] "", base::R.version$version.string), [13:10:34.219] platform = base::sprintf("%s (%s-bit)", [13:10:34.219] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.219] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.219] "release", "version")], collapse = " "), [13:10:34.219] hostname = base::Sys.info()[["nodename"]]) [13:10:34.219] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.219] info) [13:10:34.219] info <- base::paste(info, collapse = "; ") [13:10:34.219] if (!has_future) { [13:10:34.219] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.219] info) [13:10:34.219] } [13:10:34.219] else { [13:10:34.219] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.219] info, version) [13:10:34.219] } [13:10:34.219] base::stop(msg) [13:10:34.219] } [13:10:34.219] }) [13:10:34.219] } [13:10:34.219] ...future.strategy.old <- future::plan("list") [13:10:34.219] options(future.plan = NULL) [13:10:34.219] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.219] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.219] } [13:10:34.219] ...future.workdir <- getwd() [13:10:34.219] } [13:10:34.219] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.219] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.219] } [13:10:34.219] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.219] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.219] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.219] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.219] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.219] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.219] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.219] base::names(...future.oldOptions)) [13:10:34.219] } [13:10:34.219] if (FALSE) { [13:10:34.219] } [13:10:34.219] else { [13:10:34.219] if (TRUE) { [13:10:34.219] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.219] open = "w") [13:10:34.219] } [13:10:34.219] else { [13:10:34.219] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.219] windows = "NUL", "/dev/null"), open = "w") [13:10:34.219] } [13:10:34.219] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.219] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.219] base::sink(type = "output", split = FALSE) [13:10:34.219] base::close(...future.stdout) [13:10:34.219] }, add = TRUE) [13:10:34.219] } [13:10:34.219] ...future.frame <- base::sys.nframe() [13:10:34.219] ...future.conditions <- base::list() [13:10:34.219] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.219] if (FALSE) { [13:10:34.219] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.219] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.219] } [13:10:34.219] ...future.result <- base::tryCatch({ [13:10:34.219] base::withCallingHandlers({ [13:10:34.219] ...future.value <- base::withVisible(base::local(NA)) [13:10:34.219] future::FutureResult(value = ...future.value$value, [13:10:34.219] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.219] ...future.rng), globalenv = if (FALSE) [13:10:34.219] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.219] ...future.globalenv.names)) [13:10:34.219] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.219] }, condition = base::local({ [13:10:34.219] c <- base::c [13:10:34.219] inherits <- base::inherits [13:10:34.219] invokeRestart <- base::invokeRestart [13:10:34.219] length <- base::length [13:10:34.219] list <- base::list [13:10:34.219] seq.int <- base::seq.int [13:10:34.219] signalCondition <- base::signalCondition [13:10:34.219] sys.calls <- base::sys.calls [13:10:34.219] `[[` <- base::`[[` [13:10:34.219] `+` <- base::`+` [13:10:34.219] `<<-` <- base::`<<-` [13:10:34.219] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.219] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.219] 3L)] [13:10:34.219] } [13:10:34.219] function(cond) { [13:10:34.219] is_error <- inherits(cond, "error") [13:10:34.219] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.219] NULL) [13:10:34.219] if (is_error) { [13:10:34.219] sessionInformation <- function() { [13:10:34.219] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.219] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.219] search = base::search(), system = base::Sys.info()) [13:10:34.219] } [13:10:34.219] ...future.conditions[[length(...future.conditions) + [13:10:34.219] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.219] cond$call), session = sessionInformation(), [13:10:34.219] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.219] signalCondition(cond) [13:10:34.219] } [13:10:34.219] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.219] signal <- FALSE && inherits(cond, character(0)) [13:10:34.219] ...future.conditions[[length(...future.conditions) + [13:10:34.219] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.219] if (FALSE && !signal) { [13:10:34.219] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.219] { [13:10:34.219] inherits <- base::inherits [13:10:34.219] invokeRestart <- base::invokeRestart [13:10:34.219] is.null <- base::is.null [13:10:34.219] muffled <- FALSE [13:10:34.219] if (inherits(cond, "message")) { [13:10:34.219] muffled <- grepl(pattern, "muffleMessage") [13:10:34.219] if (muffled) [13:10:34.219] invokeRestart("muffleMessage") [13:10:34.219] } [13:10:34.219] else if (inherits(cond, "warning")) { [13:10:34.219] muffled <- grepl(pattern, "muffleWarning") [13:10:34.219] if (muffled) [13:10:34.219] invokeRestart("muffleWarning") [13:10:34.219] } [13:10:34.219] else if (inherits(cond, "condition")) { [13:10:34.219] if (!is.null(pattern)) { [13:10:34.219] computeRestarts <- base::computeRestarts [13:10:34.219] grepl <- base::grepl [13:10:34.219] restarts <- computeRestarts(cond) [13:10:34.219] for (restart in restarts) { [13:10:34.219] name <- restart$name [13:10:34.219] if (is.null(name)) [13:10:34.219] next [13:10:34.219] if (!grepl(pattern, name)) [13:10:34.219] next [13:10:34.219] invokeRestart(restart) [13:10:34.219] muffled <- TRUE [13:10:34.219] break [13:10:34.219] } [13:10:34.219] } [13:10:34.219] } [13:10:34.219] invisible(muffled) [13:10:34.219] } [13:10:34.219] muffleCondition(cond, pattern = "^muffle") [13:10:34.219] } [13:10:34.219] } [13:10:34.219] else { [13:10:34.219] if (TRUE) { [13:10:34.219] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.219] { [13:10:34.219] inherits <- base::inherits [13:10:34.219] invokeRestart <- base::invokeRestart [13:10:34.219] is.null <- base::is.null [13:10:34.219] muffled <- FALSE [13:10:34.219] if (inherits(cond, "message")) { [13:10:34.219] muffled <- grepl(pattern, "muffleMessage") [13:10:34.219] if (muffled) [13:10:34.219] invokeRestart("muffleMessage") [13:10:34.219] } [13:10:34.219] else if (inherits(cond, "warning")) { [13:10:34.219] muffled <- grepl(pattern, "muffleWarning") [13:10:34.219] if (muffled) [13:10:34.219] invokeRestart("muffleWarning") [13:10:34.219] } [13:10:34.219] else if (inherits(cond, "condition")) { [13:10:34.219] if (!is.null(pattern)) { [13:10:34.219] computeRestarts <- base::computeRestarts [13:10:34.219] grepl <- base::grepl [13:10:34.219] restarts <- computeRestarts(cond) [13:10:34.219] for (restart in restarts) { [13:10:34.219] name <- restart$name [13:10:34.219] if (is.null(name)) [13:10:34.219] next [13:10:34.219] if (!grepl(pattern, name)) [13:10:34.219] next [13:10:34.219] invokeRestart(restart) [13:10:34.219] muffled <- TRUE [13:10:34.219] break [13:10:34.219] } [13:10:34.219] } [13:10:34.219] } [13:10:34.219] invisible(muffled) [13:10:34.219] } [13:10:34.219] muffleCondition(cond, pattern = "^muffle") [13:10:34.219] } [13:10:34.219] } [13:10:34.219] } [13:10:34.219] })) [13:10:34.219] }, error = function(ex) { [13:10:34.219] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.219] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.219] ...future.rng), started = ...future.startTime, [13:10:34.219] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.219] version = "1.8"), class = "FutureResult") [13:10:34.219] }, finally = { [13:10:34.219] if (!identical(...future.workdir, getwd())) [13:10:34.219] setwd(...future.workdir) [13:10:34.219] { [13:10:34.219] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.219] ...future.oldOptions$nwarnings <- NULL [13:10:34.219] } [13:10:34.219] base::options(...future.oldOptions) [13:10:34.219] if (.Platform$OS.type == "windows") { [13:10:34.219] old_names <- names(...future.oldEnvVars) [13:10:34.219] envs <- base::Sys.getenv() [13:10:34.219] names <- names(envs) [13:10:34.219] common <- intersect(names, old_names) [13:10:34.219] added <- setdiff(names, old_names) [13:10:34.219] removed <- setdiff(old_names, names) [13:10:34.219] changed <- common[...future.oldEnvVars[common] != [13:10:34.219] envs[common]] [13:10:34.219] NAMES <- toupper(changed) [13:10:34.219] args <- list() [13:10:34.219] for (kk in seq_along(NAMES)) { [13:10:34.219] name <- changed[[kk]] [13:10:34.219] NAME <- NAMES[[kk]] [13:10:34.219] if (name != NAME && is.element(NAME, old_names)) [13:10:34.219] next [13:10:34.219] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.219] } [13:10:34.219] NAMES <- toupper(added) [13:10:34.219] for (kk in seq_along(NAMES)) { [13:10:34.219] name <- added[[kk]] [13:10:34.219] NAME <- NAMES[[kk]] [13:10:34.219] if (name != NAME && is.element(NAME, old_names)) [13:10:34.219] next [13:10:34.219] args[[name]] <- "" [13:10:34.219] } [13:10:34.219] NAMES <- toupper(removed) [13:10:34.219] for (kk in seq_along(NAMES)) { [13:10:34.219] name <- removed[[kk]] [13:10:34.219] NAME <- NAMES[[kk]] [13:10:34.219] if (name != NAME && is.element(NAME, old_names)) [13:10:34.219] next [13:10:34.219] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.219] } [13:10:34.219] if (length(args) > 0) [13:10:34.219] base::do.call(base::Sys.setenv, args = args) [13:10:34.219] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.219] } [13:10:34.219] else { [13:10:34.219] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.219] } [13:10:34.219] { [13:10:34.219] if (base::length(...future.futureOptionsAdded) > [13:10:34.219] 0L) { [13:10:34.219] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.219] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.219] base::options(opts) [13:10:34.219] } [13:10:34.219] { [13:10:34.219] NULL [13:10:34.219] options(future.plan = NULL) [13:10:34.219] if (is.na(NA_character_)) [13:10:34.219] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.219] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.219] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.219] .init = FALSE) [13:10:34.219] } [13:10:34.219] } [13:10:34.219] } [13:10:34.219] }) [13:10:34.219] if (TRUE) { [13:10:34.219] base::sink(type = "output", split = FALSE) [13:10:34.219] if (TRUE) { [13:10:34.219] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.219] } [13:10:34.219] else { [13:10:34.219] ...future.result["stdout"] <- base::list(NULL) [13:10:34.219] } [13:10:34.219] base::close(...future.stdout) [13:10:34.219] ...future.stdout <- NULL [13:10:34.219] } [13:10:34.219] ...future.result$conditions <- ...future.conditions [13:10:34.219] ...future.result$finished <- base::Sys.time() [13:10:34.219] ...future.result [13:10:34.219] } [13:10:34.321] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:10:34.321] plan(): nbrOfWorkers() = 2 [13:10:34.321] getGlobalsAndPackages() ... [13:10:34.321] Searching for globals... [13:10:34.324] [13:10:34.324] Searching for globals ... DONE [13:10:34.324] - globals: [0] [13:10:34.324] getGlobalsAndPackages() ... DONE [13:10:34.324] getGlobalsAndPackages() ... [13:10:34.324] [13:10:34.325] - globals: [0] [13:10:34.325] getGlobalsAndPackages() ... DONE [13:10:34.325] Packages needed by the future expression (n = 0): [13:10:34.325] Packages needed by future strategies (n = 0): [13:10:34.326] { [13:10:34.326] { [13:10:34.326] { [13:10:34.326] ...future.startTime <- base::Sys.time() [13:10:34.326] { [13:10:34.326] { [13:10:34.326] { [13:10:34.326] base::local({ [13:10:34.326] has_future <- base::requireNamespace("future", [13:10:34.326] quietly = TRUE) [13:10:34.326] if (has_future) { [13:10:34.326] ns <- base::getNamespace("future") [13:10:34.326] version <- ns[[".package"]][["version"]] [13:10:34.326] if (is.null(version)) [13:10:34.326] version <- utils::packageVersion("future") [13:10:34.326] } [13:10:34.326] else { [13:10:34.326] version <- NULL [13:10:34.326] } [13:10:34.326] if (!has_future || version < "1.8.0") { [13:10:34.326] info <- base::c(r_version = base::gsub("R version ", [13:10:34.326] "", base::R.version$version.string), [13:10:34.326] platform = base::sprintf("%s (%s-bit)", [13:10:34.326] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.326] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.326] "release", "version")], collapse = " "), [13:10:34.326] hostname = base::Sys.info()[["nodename"]]) [13:10:34.326] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.326] info) [13:10:34.326] info <- base::paste(info, collapse = "; ") [13:10:34.326] if (!has_future) { [13:10:34.326] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.326] info) [13:10:34.326] } [13:10:34.326] else { [13:10:34.326] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.326] info, version) [13:10:34.326] } [13:10:34.326] base::stop(msg) [13:10:34.326] } [13:10:34.326] }) [13:10:34.326] } [13:10:34.326] ...future.strategy.old <- future::plan("list") [13:10:34.326] options(future.plan = NULL) [13:10:34.326] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.326] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.326] } [13:10:34.326] ...future.workdir <- getwd() [13:10:34.326] } [13:10:34.326] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.326] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.326] } [13:10:34.326] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.326] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.326] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.326] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.326] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.326] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.326] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.326] base::names(...future.oldOptions)) [13:10:34.326] } [13:10:34.326] if (FALSE) { [13:10:34.326] } [13:10:34.326] else { [13:10:34.326] if (TRUE) { [13:10:34.326] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.326] open = "w") [13:10:34.326] } [13:10:34.326] else { [13:10:34.326] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.326] windows = "NUL", "/dev/null"), open = "w") [13:10:34.326] } [13:10:34.326] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.326] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.326] base::sink(type = "output", split = FALSE) [13:10:34.326] base::close(...future.stdout) [13:10:34.326] }, add = TRUE) [13:10:34.326] } [13:10:34.326] ...future.frame <- base::sys.nframe() [13:10:34.326] ...future.conditions <- base::list() [13:10:34.326] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.326] if (FALSE) { [13:10:34.326] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.326] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.326] } [13:10:34.326] ...future.result <- base::tryCatch({ [13:10:34.326] base::withCallingHandlers({ [13:10:34.326] ...future.value <- base::withVisible(base::local(42)) [13:10:34.326] future::FutureResult(value = ...future.value$value, [13:10:34.326] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.326] ...future.rng), globalenv = if (FALSE) [13:10:34.326] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.326] ...future.globalenv.names)) [13:10:34.326] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.326] }, condition = base::local({ [13:10:34.326] c <- base::c [13:10:34.326] inherits <- base::inherits [13:10:34.326] invokeRestart <- base::invokeRestart [13:10:34.326] length <- base::length [13:10:34.326] list <- base::list [13:10:34.326] seq.int <- base::seq.int [13:10:34.326] signalCondition <- base::signalCondition [13:10:34.326] sys.calls <- base::sys.calls [13:10:34.326] `[[` <- base::`[[` [13:10:34.326] `+` <- base::`+` [13:10:34.326] `<<-` <- base::`<<-` [13:10:34.326] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.326] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.326] 3L)] [13:10:34.326] } [13:10:34.326] function(cond) { [13:10:34.326] is_error <- inherits(cond, "error") [13:10:34.326] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.326] NULL) [13:10:34.326] if (is_error) { [13:10:34.326] sessionInformation <- function() { [13:10:34.326] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.326] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.326] search = base::search(), system = base::Sys.info()) [13:10:34.326] } [13:10:34.326] ...future.conditions[[length(...future.conditions) + [13:10:34.326] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.326] cond$call), session = sessionInformation(), [13:10:34.326] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.326] signalCondition(cond) [13:10:34.326] } [13:10:34.326] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.326] signal <- FALSE && inherits(cond, character(0)) [13:10:34.326] ...future.conditions[[length(...future.conditions) + [13:10:34.326] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.326] if (FALSE && !signal) { [13:10:34.326] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.326] { [13:10:34.326] inherits <- base::inherits [13:10:34.326] invokeRestart <- base::invokeRestart [13:10:34.326] is.null <- base::is.null [13:10:34.326] muffled <- FALSE [13:10:34.326] if (inherits(cond, "message")) { [13:10:34.326] muffled <- grepl(pattern, "muffleMessage") [13:10:34.326] if (muffled) [13:10:34.326] invokeRestart("muffleMessage") [13:10:34.326] } [13:10:34.326] else if (inherits(cond, "warning")) { [13:10:34.326] muffled <- grepl(pattern, "muffleWarning") [13:10:34.326] if (muffled) [13:10:34.326] invokeRestart("muffleWarning") [13:10:34.326] } [13:10:34.326] else if (inherits(cond, "condition")) { [13:10:34.326] if (!is.null(pattern)) { [13:10:34.326] computeRestarts <- base::computeRestarts [13:10:34.326] grepl <- base::grepl [13:10:34.326] restarts <- computeRestarts(cond) [13:10:34.326] for (restart in restarts) { [13:10:34.326] name <- restart$name [13:10:34.326] if (is.null(name)) [13:10:34.326] next [13:10:34.326] if (!grepl(pattern, name)) [13:10:34.326] next [13:10:34.326] invokeRestart(restart) [13:10:34.326] muffled <- TRUE [13:10:34.326] break [13:10:34.326] } [13:10:34.326] } [13:10:34.326] } [13:10:34.326] invisible(muffled) [13:10:34.326] } [13:10:34.326] muffleCondition(cond, pattern = "^muffle") [13:10:34.326] } [13:10:34.326] } [13:10:34.326] else { [13:10:34.326] if (TRUE) { [13:10:34.326] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.326] { [13:10:34.326] inherits <- base::inherits [13:10:34.326] invokeRestart <- base::invokeRestart [13:10:34.326] is.null <- base::is.null [13:10:34.326] muffled <- FALSE [13:10:34.326] if (inherits(cond, "message")) { [13:10:34.326] muffled <- grepl(pattern, "muffleMessage") [13:10:34.326] if (muffled) [13:10:34.326] invokeRestart("muffleMessage") [13:10:34.326] } [13:10:34.326] else if (inherits(cond, "warning")) { [13:10:34.326] muffled <- grepl(pattern, "muffleWarning") [13:10:34.326] if (muffled) [13:10:34.326] invokeRestart("muffleWarning") [13:10:34.326] } [13:10:34.326] else if (inherits(cond, "condition")) { [13:10:34.326] if (!is.null(pattern)) { [13:10:34.326] computeRestarts <- base::computeRestarts [13:10:34.326] grepl <- base::grepl [13:10:34.326] restarts <- computeRestarts(cond) [13:10:34.326] for (restart in restarts) { [13:10:34.326] name <- restart$name [13:10:34.326] if (is.null(name)) [13:10:34.326] next [13:10:34.326] if (!grepl(pattern, name)) [13:10:34.326] next [13:10:34.326] invokeRestart(restart) [13:10:34.326] muffled <- TRUE [13:10:34.326] break [13:10:34.326] } [13:10:34.326] } [13:10:34.326] } [13:10:34.326] invisible(muffled) [13:10:34.326] } [13:10:34.326] muffleCondition(cond, pattern = "^muffle") [13:10:34.326] } [13:10:34.326] } [13:10:34.326] } [13:10:34.326] })) [13:10:34.326] }, error = function(ex) { [13:10:34.326] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.326] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.326] ...future.rng), started = ...future.startTime, [13:10:34.326] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.326] version = "1.8"), class = "FutureResult") [13:10:34.326] }, finally = { [13:10:34.326] if (!identical(...future.workdir, getwd())) [13:10:34.326] setwd(...future.workdir) [13:10:34.326] { [13:10:34.326] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.326] ...future.oldOptions$nwarnings <- NULL [13:10:34.326] } [13:10:34.326] base::options(...future.oldOptions) [13:10:34.326] if (.Platform$OS.type == "windows") { [13:10:34.326] old_names <- names(...future.oldEnvVars) [13:10:34.326] envs <- base::Sys.getenv() [13:10:34.326] names <- names(envs) [13:10:34.326] common <- intersect(names, old_names) [13:10:34.326] added <- setdiff(names, old_names) [13:10:34.326] removed <- setdiff(old_names, names) [13:10:34.326] changed <- common[...future.oldEnvVars[common] != [13:10:34.326] envs[common]] [13:10:34.326] NAMES <- toupper(changed) [13:10:34.326] args <- list() [13:10:34.326] for (kk in seq_along(NAMES)) { [13:10:34.326] name <- changed[[kk]] [13:10:34.326] NAME <- NAMES[[kk]] [13:10:34.326] if (name != NAME && is.element(NAME, old_names)) [13:10:34.326] next [13:10:34.326] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.326] } [13:10:34.326] NAMES <- toupper(added) [13:10:34.326] for (kk in seq_along(NAMES)) { [13:10:34.326] name <- added[[kk]] [13:10:34.326] NAME <- NAMES[[kk]] [13:10:34.326] if (name != NAME && is.element(NAME, old_names)) [13:10:34.326] next [13:10:34.326] args[[name]] <- "" [13:10:34.326] } [13:10:34.326] NAMES <- toupper(removed) [13:10:34.326] for (kk in seq_along(NAMES)) { [13:10:34.326] name <- removed[[kk]] [13:10:34.326] NAME <- NAMES[[kk]] [13:10:34.326] if (name != NAME && is.element(NAME, old_names)) [13:10:34.326] next [13:10:34.326] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.326] } [13:10:34.326] if (length(args) > 0) [13:10:34.326] base::do.call(base::Sys.setenv, args = args) [13:10:34.326] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.326] } [13:10:34.326] else { [13:10:34.326] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.326] } [13:10:34.326] { [13:10:34.326] if (base::length(...future.futureOptionsAdded) > [13:10:34.326] 0L) { [13:10:34.326] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.326] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.326] base::options(opts) [13:10:34.326] } [13:10:34.326] { [13:10:34.326] NULL [13:10:34.326] options(future.plan = NULL) [13:10:34.326] if (is.na(NA_character_)) [13:10:34.326] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.326] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.326] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.326] .init = FALSE) [13:10:34.326] } [13:10:34.326] } [13:10:34.326] } [13:10:34.326] }) [13:10:34.326] if (TRUE) { [13:10:34.326] base::sink(type = "output", split = FALSE) [13:10:34.326] if (TRUE) { [13:10:34.326] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.326] } [13:10:34.326] else { [13:10:34.326] ...future.result["stdout"] <- base::list(NULL) [13:10:34.326] } [13:10:34.326] base::close(...future.stdout) [13:10:34.326] ...future.stdout <- NULL [13:10:34.326] } [13:10:34.326] ...future.result$conditions <- ...future.conditions [13:10:34.326] ...future.result$finished <- base::Sys.time() [13:10:34.326] ...future.result [13:10:34.326] } MiraiFuture: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.331] resolved() for 'MiraiFuture' ... [13:10:34.331] - state: 'running' [13:10:34.331] - run: TRUE [13:10:34.331] - result: 'NULL' [13:10:34.331] - resolved: FALSE [13:10:34.332] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.332] getGlobalsAndPackages() ... [13:10:34.332] Searching for globals... [13:10:34.333] [13:10:34.333] Searching for globals ... DONE [13:10:34.333] - globals: [0] [13:10:34.333] getGlobalsAndPackages() ... DONE [13:10:34.334] run() for 'Future' ... [13:10:34.334] - state: 'created' [13:10:34.334] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.335] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.335] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.335] - Field: 'label' [13:10:34.335] - Field: 'local' [13:10:34.335] - Field: 'owner' [13:10:34.336] - Field: 'envir' [13:10:34.336] - Field: 'packages' [13:10:34.336] - Field: 'gc' [13:10:34.336] - Field: 'conditions' [13:10:34.336] - Field: 'expr' [13:10:34.336] - Field: 'uuid' [13:10:34.337] - Field: 'seed' [13:10:34.337] - Field: 'version' [13:10:34.337] - Field: 'result' [13:10:34.337] - Field: 'asynchronous' [13:10:34.337] - Field: 'calls' [13:10:34.337] - Field: 'globals' [13:10:34.338] - Field: 'stdout' [13:10:34.338] - Field: 'earlySignal' [13:10:34.338] - Field: 'lazy' [13:10:34.338] - Field: 'state' [13:10:34.338] - Field: '.cluster' [13:10:34.338] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.339] - Launch lazy future ... [13:10:34.339] Packages needed by the future expression (n = 0): [13:10:34.339] Packages needed by future strategies (n = 0): [13:10:34.340] { [13:10:34.340] { [13:10:34.340] { [13:10:34.340] ...future.startTime <- base::Sys.time() [13:10:34.340] { [13:10:34.340] { [13:10:34.340] { [13:10:34.340] base::local({ [13:10:34.340] has_future <- base::requireNamespace("future", [13:10:34.340] quietly = TRUE) [13:10:34.340] if (has_future) { [13:10:34.340] ns <- base::getNamespace("future") [13:10:34.340] version <- ns[[".package"]][["version"]] [13:10:34.340] if (is.null(version)) [13:10:34.340] version <- utils::packageVersion("future") [13:10:34.340] } [13:10:34.340] else { [13:10:34.340] version <- NULL [13:10:34.340] } [13:10:34.340] if (!has_future || version < "1.8.0") { [13:10:34.340] info <- base::c(r_version = base::gsub("R version ", [13:10:34.340] "", base::R.version$version.string), [13:10:34.340] platform = base::sprintf("%s (%s-bit)", [13:10:34.340] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.340] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.340] "release", "version")], collapse = " "), [13:10:34.340] hostname = base::Sys.info()[["nodename"]]) [13:10:34.340] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.340] info) [13:10:34.340] info <- base::paste(info, collapse = "; ") [13:10:34.340] if (!has_future) { [13:10:34.340] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.340] info) [13:10:34.340] } [13:10:34.340] else { [13:10:34.340] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.340] info, version) [13:10:34.340] } [13:10:34.340] base::stop(msg) [13:10:34.340] } [13:10:34.340] }) [13:10:34.340] } [13:10:34.340] ...future.strategy.old <- future::plan("list") [13:10:34.340] options(future.plan = NULL) [13:10:34.340] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.340] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.340] } [13:10:34.340] ...future.workdir <- getwd() [13:10:34.340] } [13:10:34.340] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.340] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.340] } [13:10:34.340] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.340] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.340] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.340] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.340] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.340] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.340] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.340] base::names(...future.oldOptions)) [13:10:34.340] } [13:10:34.340] if (FALSE) { [13:10:34.340] } [13:10:34.340] else { [13:10:34.340] if (TRUE) { [13:10:34.340] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.340] open = "w") [13:10:34.340] } [13:10:34.340] else { [13:10:34.340] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.340] windows = "NUL", "/dev/null"), open = "w") [13:10:34.340] } [13:10:34.340] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.340] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.340] base::sink(type = "output", split = FALSE) [13:10:34.340] base::close(...future.stdout) [13:10:34.340] }, add = TRUE) [13:10:34.340] } [13:10:34.340] ...future.frame <- base::sys.nframe() [13:10:34.340] ...future.conditions <- base::list() [13:10:34.340] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.340] if (FALSE) { [13:10:34.340] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.340] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.340] } [13:10:34.340] ...future.result <- base::tryCatch({ [13:10:34.340] base::withCallingHandlers({ [13:10:34.340] ...future.value <- base::withVisible(base::local(42)) [13:10:34.340] future::FutureResult(value = ...future.value$value, [13:10:34.340] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.340] ...future.rng), globalenv = if (FALSE) [13:10:34.340] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.340] ...future.globalenv.names)) [13:10:34.340] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.340] }, condition = base::local({ [13:10:34.340] c <- base::c [13:10:34.340] inherits <- base::inherits [13:10:34.340] invokeRestart <- base::invokeRestart [13:10:34.340] length <- base::length [13:10:34.340] list <- base::list [13:10:34.340] seq.int <- base::seq.int [13:10:34.340] signalCondition <- base::signalCondition [13:10:34.340] sys.calls <- base::sys.calls [13:10:34.340] `[[` <- base::`[[` [13:10:34.340] `+` <- base::`+` [13:10:34.340] `<<-` <- base::`<<-` [13:10:34.340] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.340] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.340] 3L)] [13:10:34.340] } [13:10:34.340] function(cond) { [13:10:34.340] is_error <- inherits(cond, "error") [13:10:34.340] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.340] NULL) [13:10:34.340] if (is_error) { [13:10:34.340] sessionInformation <- function() { [13:10:34.340] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.340] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.340] search = base::search(), system = base::Sys.info()) [13:10:34.340] } [13:10:34.340] ...future.conditions[[length(...future.conditions) + [13:10:34.340] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.340] cond$call), session = sessionInformation(), [13:10:34.340] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.340] signalCondition(cond) [13:10:34.340] } [13:10:34.340] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.340] signal <- FALSE && inherits(cond, character(0)) [13:10:34.340] ...future.conditions[[length(...future.conditions) + [13:10:34.340] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.340] if (FALSE && !signal) { [13:10:34.340] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.340] { [13:10:34.340] inherits <- base::inherits [13:10:34.340] invokeRestart <- base::invokeRestart [13:10:34.340] is.null <- base::is.null [13:10:34.340] muffled <- FALSE [13:10:34.340] if (inherits(cond, "message")) { [13:10:34.340] muffled <- grepl(pattern, "muffleMessage") [13:10:34.340] if (muffled) [13:10:34.340] invokeRestart("muffleMessage") [13:10:34.340] } [13:10:34.340] else if (inherits(cond, "warning")) { [13:10:34.340] muffled <- grepl(pattern, "muffleWarning") [13:10:34.340] if (muffled) [13:10:34.340] invokeRestart("muffleWarning") [13:10:34.340] } [13:10:34.340] else if (inherits(cond, "condition")) { [13:10:34.340] if (!is.null(pattern)) { [13:10:34.340] computeRestarts <- base::computeRestarts [13:10:34.340] grepl <- base::grepl [13:10:34.340] restarts <- computeRestarts(cond) [13:10:34.340] for (restart in restarts) { [13:10:34.340] name <- restart$name [13:10:34.340] if (is.null(name)) [13:10:34.340] next [13:10:34.340] if (!grepl(pattern, name)) [13:10:34.340] next [13:10:34.340] invokeRestart(restart) [13:10:34.340] muffled <- TRUE [13:10:34.340] break [13:10:34.340] } [13:10:34.340] } [13:10:34.340] } [13:10:34.340] invisible(muffled) [13:10:34.340] } [13:10:34.340] muffleCondition(cond, pattern = "^muffle") [13:10:34.340] } [13:10:34.340] } [13:10:34.340] else { [13:10:34.340] if (TRUE) { [13:10:34.340] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.340] { [13:10:34.340] inherits <- base::inherits [13:10:34.340] invokeRestart <- base::invokeRestart [13:10:34.340] is.null <- base::is.null [13:10:34.340] muffled <- FALSE [13:10:34.340] if (inherits(cond, "message")) { [13:10:34.340] muffled <- grepl(pattern, "muffleMessage") [13:10:34.340] if (muffled) [13:10:34.340] invokeRestart("muffleMessage") [13:10:34.340] } [13:10:34.340] else if (inherits(cond, "warning")) { [13:10:34.340] muffled <- grepl(pattern, "muffleWarning") [13:10:34.340] if (muffled) [13:10:34.340] invokeRestart("muffleWarning") [13:10:34.340] } [13:10:34.340] else if (inherits(cond, "condition")) { [13:10:34.340] if (!is.null(pattern)) { [13:10:34.340] computeRestarts <- base::computeRestarts [13:10:34.340] grepl <- base::grepl [13:10:34.340] restarts <- computeRestarts(cond) [13:10:34.340] for (restart in restarts) { [13:10:34.340] name <- restart$name [13:10:34.340] if (is.null(name)) [13:10:34.340] next [13:10:34.340] if (!grepl(pattern, name)) [13:10:34.340] next [13:10:34.340] invokeRestart(restart) [13:10:34.340] muffled <- TRUE [13:10:34.340] break [13:10:34.340] } [13:10:34.340] } [13:10:34.340] } [13:10:34.340] invisible(muffled) [13:10:34.340] } [13:10:34.340] muffleCondition(cond, pattern = "^muffle") [13:10:34.340] } [13:10:34.340] } [13:10:34.340] } [13:10:34.340] })) [13:10:34.340] }, error = function(ex) { [13:10:34.340] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.340] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.340] ...future.rng), started = ...future.startTime, [13:10:34.340] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.340] version = "1.8"), class = "FutureResult") [13:10:34.340] }, finally = { [13:10:34.340] if (!identical(...future.workdir, getwd())) [13:10:34.340] setwd(...future.workdir) [13:10:34.340] { [13:10:34.340] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.340] ...future.oldOptions$nwarnings <- NULL [13:10:34.340] } [13:10:34.340] base::options(...future.oldOptions) [13:10:34.340] if (.Platform$OS.type == "windows") { [13:10:34.340] old_names <- names(...future.oldEnvVars) [13:10:34.340] envs <- base::Sys.getenv() [13:10:34.340] names <- names(envs) [13:10:34.340] common <- intersect(names, old_names) [13:10:34.340] added <- setdiff(names, old_names) [13:10:34.340] removed <- setdiff(old_names, names) [13:10:34.340] changed <- common[...future.oldEnvVars[common] != [13:10:34.340] envs[common]] [13:10:34.340] NAMES <- toupper(changed) [13:10:34.340] args <- list() [13:10:34.340] for (kk in seq_along(NAMES)) { [13:10:34.340] name <- changed[[kk]] [13:10:34.340] NAME <- NAMES[[kk]] [13:10:34.340] if (name != NAME && is.element(NAME, old_names)) [13:10:34.340] next [13:10:34.340] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.340] } [13:10:34.340] NAMES <- toupper(added) [13:10:34.340] for (kk in seq_along(NAMES)) { [13:10:34.340] name <- added[[kk]] [13:10:34.340] NAME <- NAMES[[kk]] [13:10:34.340] if (name != NAME && is.element(NAME, old_names)) [13:10:34.340] next [13:10:34.340] args[[name]] <- "" [13:10:34.340] } [13:10:34.340] NAMES <- toupper(removed) [13:10:34.340] for (kk in seq_along(NAMES)) { [13:10:34.340] name <- removed[[kk]] [13:10:34.340] NAME <- NAMES[[kk]] [13:10:34.340] if (name != NAME && is.element(NAME, old_names)) [13:10:34.340] next [13:10:34.340] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.340] } [13:10:34.340] if (length(args) > 0) [13:10:34.340] base::do.call(base::Sys.setenv, args = args) [13:10:34.340] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.340] } [13:10:34.340] else { [13:10:34.340] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.340] } [13:10:34.340] { [13:10:34.340] if (base::length(...future.futureOptionsAdded) > [13:10:34.340] 0L) { [13:10:34.340] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.340] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.340] base::options(opts) [13:10:34.340] } [13:10:34.340] { [13:10:34.340] NULL [13:10:34.340] options(future.plan = NULL) [13:10:34.340] if (is.na(NA_character_)) [13:10:34.340] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.340] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.340] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.340] .init = FALSE) [13:10:34.340] } [13:10:34.340] } [13:10:34.340] } [13:10:34.340] }) [13:10:34.340] if (TRUE) { [13:10:34.340] base::sink(type = "output", split = FALSE) [13:10:34.340] if (TRUE) { [13:10:34.340] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.340] } [13:10:34.340] else { [13:10:34.340] ...future.result["stdout"] <- base::list(NULL) [13:10:34.340] } [13:10:34.340] base::close(...future.stdout) [13:10:34.340] ...future.stdout <- NULL [13:10:34.340] } [13:10:34.340] ...future.result$conditions <- ...future.conditions [13:10:34.340] ...future.result$finished <- base::Sys.time() [13:10:34.340] ...future.result [13:10:34.340] } [13:10:34.343] - Launch lazy future ... done [13:10:34.344] run() for 'MiraiFuture' ... done MiraiFuture: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.344] resolved() for 'MiraiFuture' ... [13:10:34.344] - state: 'running' [13:10:34.345] - run: TRUE [13:10:34.345] - result: 'NULL' [13:10:34.345] - resolved: FALSE [13:10:34.345] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.347] getGlobalsAndPackages() ... [13:10:34.347] Searching for globals... [13:10:34.349] - globals found: [1] '{' [13:10:34.350] Searching for globals ... DONE [13:10:34.350] Resolving globals: FALSE [13:10:34.350] [13:10:34.351] [13:10:34.351] getGlobalsAndPackages() ... DONE [13:10:34.351] run() for 'Future' ... [13:10:34.351] - state: 'created' [13:10:34.351] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.352] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.352] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.352] - Field: 'label' [13:10:34.352] - Field: 'local' [13:10:34.352] - Field: 'owner' [13:10:34.353] - Field: 'envir' [13:10:34.353] - Field: 'packages' [13:10:34.353] - Field: 'gc' [13:10:34.353] - Field: 'conditions' [13:10:34.353] - Field: 'expr' [13:10:34.353] - Field: 'uuid' [13:10:34.354] - Field: 'seed' [13:10:34.354] - Field: 'version' [13:10:34.354] - Field: 'result' [13:10:34.354] - Field: 'asynchronous' [13:10:34.354] - Field: 'calls' [13:10:34.354] - Field: 'globals' [13:10:34.355] - Field: 'stdout' [13:10:34.355] - Field: 'earlySignal' [13:10:34.355] - Field: 'lazy' [13:10:34.355] - Field: 'state' [13:10:34.355] - Field: '.cluster' [13:10:34.355] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.356] - Launch lazy future ... [13:10:34.356] Packages needed by the future expression (n = 0): [13:10:34.356] Packages needed by future strategies (n = 0): [13:10:34.357] { [13:10:34.357] { [13:10:34.357] { [13:10:34.357] ...future.startTime <- base::Sys.time() [13:10:34.357] { [13:10:34.357] { [13:10:34.357] { [13:10:34.357] base::local({ [13:10:34.357] has_future <- base::requireNamespace("future", [13:10:34.357] quietly = TRUE) [13:10:34.357] if (has_future) { [13:10:34.357] ns <- base::getNamespace("future") [13:10:34.357] version <- ns[[".package"]][["version"]] [13:10:34.357] if (is.null(version)) [13:10:34.357] version <- utils::packageVersion("future") [13:10:34.357] } [13:10:34.357] else { [13:10:34.357] version <- NULL [13:10:34.357] } [13:10:34.357] if (!has_future || version < "1.8.0") { [13:10:34.357] info <- base::c(r_version = base::gsub("R version ", [13:10:34.357] "", base::R.version$version.string), [13:10:34.357] platform = base::sprintf("%s (%s-bit)", [13:10:34.357] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.357] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.357] "release", "version")], collapse = " "), [13:10:34.357] hostname = base::Sys.info()[["nodename"]]) [13:10:34.357] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.357] info) [13:10:34.357] info <- base::paste(info, collapse = "; ") [13:10:34.357] if (!has_future) { [13:10:34.357] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.357] info) [13:10:34.357] } [13:10:34.357] else { [13:10:34.357] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.357] info, version) [13:10:34.357] } [13:10:34.357] base::stop(msg) [13:10:34.357] } [13:10:34.357] }) [13:10:34.357] } [13:10:34.357] ...future.strategy.old <- future::plan("list") [13:10:34.357] options(future.plan = NULL) [13:10:34.357] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.357] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.357] } [13:10:34.357] ...future.workdir <- getwd() [13:10:34.357] } [13:10:34.357] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.357] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.357] } [13:10:34.357] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.357] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.357] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.357] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.357] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.357] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.357] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.357] base::names(...future.oldOptions)) [13:10:34.357] } [13:10:34.357] if (FALSE) { [13:10:34.357] } [13:10:34.357] else { [13:10:34.357] if (TRUE) { [13:10:34.357] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.357] open = "w") [13:10:34.357] } [13:10:34.357] else { [13:10:34.357] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.357] windows = "NUL", "/dev/null"), open = "w") [13:10:34.357] } [13:10:34.357] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.357] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.357] base::sink(type = "output", split = FALSE) [13:10:34.357] base::close(...future.stdout) [13:10:34.357] }, add = TRUE) [13:10:34.357] } [13:10:34.357] ...future.frame <- base::sys.nframe() [13:10:34.357] ...future.conditions <- base::list() [13:10:34.357] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.357] if (FALSE) { [13:10:34.357] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.357] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.357] } [13:10:34.357] ...future.result <- base::tryCatch({ [13:10:34.357] base::withCallingHandlers({ [13:10:34.357] ...future.value <- base::withVisible(base::local({ [13:10:34.357] 42 [13:10:34.357] })) [13:10:34.357] future::FutureResult(value = ...future.value$value, [13:10:34.357] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.357] ...future.rng), globalenv = if (FALSE) [13:10:34.357] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.357] ...future.globalenv.names)) [13:10:34.357] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.357] }, condition = base::local({ [13:10:34.357] c <- base::c [13:10:34.357] inherits <- base::inherits [13:10:34.357] invokeRestart <- base::invokeRestart [13:10:34.357] length <- base::length [13:10:34.357] list <- base::list [13:10:34.357] seq.int <- base::seq.int [13:10:34.357] signalCondition <- base::signalCondition [13:10:34.357] sys.calls <- base::sys.calls [13:10:34.357] `[[` <- base::`[[` [13:10:34.357] `+` <- base::`+` [13:10:34.357] `<<-` <- base::`<<-` [13:10:34.357] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.357] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.357] 3L)] [13:10:34.357] } [13:10:34.357] function(cond) { [13:10:34.357] is_error <- inherits(cond, "error") [13:10:34.357] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.357] NULL) [13:10:34.357] if (is_error) { [13:10:34.357] sessionInformation <- function() { [13:10:34.357] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.357] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.357] search = base::search(), system = base::Sys.info()) [13:10:34.357] } [13:10:34.357] ...future.conditions[[length(...future.conditions) + [13:10:34.357] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.357] cond$call), session = sessionInformation(), [13:10:34.357] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.357] signalCondition(cond) [13:10:34.357] } [13:10:34.357] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.357] signal <- FALSE && inherits(cond, character(0)) [13:10:34.357] ...future.conditions[[length(...future.conditions) + [13:10:34.357] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.357] if (FALSE && !signal) { [13:10:34.357] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.357] { [13:10:34.357] inherits <- base::inherits [13:10:34.357] invokeRestart <- base::invokeRestart [13:10:34.357] is.null <- base::is.null [13:10:34.357] muffled <- FALSE [13:10:34.357] if (inherits(cond, "message")) { [13:10:34.357] muffled <- grepl(pattern, "muffleMessage") [13:10:34.357] if (muffled) [13:10:34.357] invokeRestart("muffleMessage") [13:10:34.357] } [13:10:34.357] else if (inherits(cond, "warning")) { [13:10:34.357] muffled <- grepl(pattern, "muffleWarning") [13:10:34.357] if (muffled) [13:10:34.357] invokeRestart("muffleWarning") [13:10:34.357] } [13:10:34.357] else if (inherits(cond, "condition")) { [13:10:34.357] if (!is.null(pattern)) { [13:10:34.357] computeRestarts <- base::computeRestarts [13:10:34.357] grepl <- base::grepl [13:10:34.357] restarts <- computeRestarts(cond) [13:10:34.357] for (restart in restarts) { [13:10:34.357] name <- restart$name [13:10:34.357] if (is.null(name)) [13:10:34.357] next [13:10:34.357] if (!grepl(pattern, name)) [13:10:34.357] next [13:10:34.357] invokeRestart(restart) [13:10:34.357] muffled <- TRUE [13:10:34.357] break [13:10:34.357] } [13:10:34.357] } [13:10:34.357] } [13:10:34.357] invisible(muffled) [13:10:34.357] } [13:10:34.357] muffleCondition(cond, pattern = "^muffle") [13:10:34.357] } [13:10:34.357] } [13:10:34.357] else { [13:10:34.357] if (TRUE) { [13:10:34.357] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.357] { [13:10:34.357] inherits <- base::inherits [13:10:34.357] invokeRestart <- base::invokeRestart [13:10:34.357] is.null <- base::is.null [13:10:34.357] muffled <- FALSE [13:10:34.357] if (inherits(cond, "message")) { [13:10:34.357] muffled <- grepl(pattern, "muffleMessage") [13:10:34.357] if (muffled) [13:10:34.357] invokeRestart("muffleMessage") [13:10:34.357] } [13:10:34.357] else if (inherits(cond, "warning")) { [13:10:34.357] muffled <- grepl(pattern, "muffleWarning") [13:10:34.357] if (muffled) [13:10:34.357] invokeRestart("muffleWarning") [13:10:34.357] } [13:10:34.357] else if (inherits(cond, "condition")) { [13:10:34.357] if (!is.null(pattern)) { [13:10:34.357] computeRestarts <- base::computeRestarts [13:10:34.357] grepl <- base::grepl [13:10:34.357] restarts <- computeRestarts(cond) [13:10:34.357] for (restart in restarts) { [13:10:34.357] name <- restart$name [13:10:34.357] if (is.null(name)) [13:10:34.357] next [13:10:34.357] if (!grepl(pattern, name)) [13:10:34.357] next [13:10:34.357] invokeRestart(restart) [13:10:34.357] muffled <- TRUE [13:10:34.357] break [13:10:34.357] } [13:10:34.357] } [13:10:34.357] } [13:10:34.357] invisible(muffled) [13:10:34.357] } [13:10:34.357] muffleCondition(cond, pattern = "^muffle") [13:10:34.357] } [13:10:34.357] } [13:10:34.357] } [13:10:34.357] })) [13:10:34.357] }, error = function(ex) { [13:10:34.357] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.357] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.357] ...future.rng), started = ...future.startTime, [13:10:34.357] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.357] version = "1.8"), class = "FutureResult") [13:10:34.357] }, finally = { [13:10:34.357] if (!identical(...future.workdir, getwd())) [13:10:34.357] setwd(...future.workdir) [13:10:34.357] { [13:10:34.357] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.357] ...future.oldOptions$nwarnings <- NULL [13:10:34.357] } [13:10:34.357] base::options(...future.oldOptions) [13:10:34.357] if (.Platform$OS.type == "windows") { [13:10:34.357] old_names <- names(...future.oldEnvVars) [13:10:34.357] envs <- base::Sys.getenv() [13:10:34.357] names <- names(envs) [13:10:34.357] common <- intersect(names, old_names) [13:10:34.357] added <- setdiff(names, old_names) [13:10:34.357] removed <- setdiff(old_names, names) [13:10:34.357] changed <- common[...future.oldEnvVars[common] != [13:10:34.357] envs[common]] [13:10:34.357] NAMES <- toupper(changed) [13:10:34.357] args <- list() [13:10:34.357] for (kk in seq_along(NAMES)) { [13:10:34.357] name <- changed[[kk]] [13:10:34.357] NAME <- NAMES[[kk]] [13:10:34.357] if (name != NAME && is.element(NAME, old_names)) [13:10:34.357] next [13:10:34.357] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.357] } [13:10:34.357] NAMES <- toupper(added) [13:10:34.357] for (kk in seq_along(NAMES)) { [13:10:34.357] name <- added[[kk]] [13:10:34.357] NAME <- NAMES[[kk]] [13:10:34.357] if (name != NAME && is.element(NAME, old_names)) [13:10:34.357] next [13:10:34.357] args[[name]] <- "" [13:10:34.357] } [13:10:34.357] NAMES <- toupper(removed) [13:10:34.357] for (kk in seq_along(NAMES)) { [13:10:34.357] name <- removed[[kk]] [13:10:34.357] NAME <- NAMES[[kk]] [13:10:34.357] if (name != NAME && is.element(NAME, old_names)) [13:10:34.357] next [13:10:34.357] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.357] } [13:10:34.357] if (length(args) > 0) [13:10:34.357] base::do.call(base::Sys.setenv, args = args) [13:10:34.357] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.357] } [13:10:34.357] else { [13:10:34.357] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.357] } [13:10:34.357] { [13:10:34.357] if (base::length(...future.futureOptionsAdded) > [13:10:34.357] 0L) { [13:10:34.357] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.357] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.357] base::options(opts) [13:10:34.357] } [13:10:34.357] { [13:10:34.357] NULL [13:10:34.357] options(future.plan = NULL) [13:10:34.357] if (is.na(NA_character_)) [13:10:34.357] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.357] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.357] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.357] .init = FALSE) [13:10:34.357] } [13:10:34.357] } [13:10:34.357] } [13:10:34.357] }) [13:10:34.357] if (TRUE) { [13:10:34.357] base::sink(type = "output", split = FALSE) [13:10:34.357] if (TRUE) { [13:10:34.357] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.357] } [13:10:34.357] else { [13:10:34.357] ...future.result["stdout"] <- base::list(NULL) [13:10:34.357] } [13:10:34.357] base::close(...future.stdout) [13:10:34.357] ...future.stdout <- NULL [13:10:34.357] } [13:10:34.357] ...future.result$conditions <- ...future.conditions [13:10:34.357] ...future.result$finished <- base::Sys.time() [13:10:34.357] ...future.result [13:10:34.357] } [13:10:34.360] - Launch lazy future ... done [13:10:34.361] run() for 'MiraiFuture' ... done MiraiFuture: Label: '' Expression: { 42 } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.361] resolved() for 'MiraiFuture' ... [13:10:34.362] - state: 'running' [13:10:34.362] - run: TRUE [13:10:34.362] - result: 'NULL' [13:10:34.362] - resolved: FALSE [13:10:34.362] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.363] getGlobalsAndPackages() ... [13:10:34.363] Searching for globals... [13:10:34.363] [13:10:34.363] Searching for globals ... DONE [13:10:34.364] - globals: [0] [13:10:34.364] getGlobalsAndPackages() ... DONE [13:10:34.364] getGlobalsAndPackages() ... [13:10:34.364] [13:10:34.364] - globals: [0] [13:10:34.364] getGlobalsAndPackages() ... DONE [13:10:34.365] Packages needed by the future expression (n = 0): [13:10:34.365] Packages needed by future strategies (n = 0): [13:10:34.365] { [13:10:34.365] { [13:10:34.365] { [13:10:34.365] ...future.startTime <- base::Sys.time() [13:10:34.365] { [13:10:34.365] { [13:10:34.365] { [13:10:34.365] base::local({ [13:10:34.365] has_future <- base::requireNamespace("future", [13:10:34.365] quietly = TRUE) [13:10:34.365] if (has_future) { [13:10:34.365] ns <- base::getNamespace("future") [13:10:34.365] version <- ns[[".package"]][["version"]] [13:10:34.365] if (is.null(version)) [13:10:34.365] version <- utils::packageVersion("future") [13:10:34.365] } [13:10:34.365] else { [13:10:34.365] version <- NULL [13:10:34.365] } [13:10:34.365] if (!has_future || version < "1.8.0") { [13:10:34.365] info <- base::c(r_version = base::gsub("R version ", [13:10:34.365] "", base::R.version$version.string), [13:10:34.365] platform = base::sprintf("%s (%s-bit)", [13:10:34.365] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.365] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.365] "release", "version")], collapse = " "), [13:10:34.365] hostname = base::Sys.info()[["nodename"]]) [13:10:34.365] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.365] info) [13:10:34.365] info <- base::paste(info, collapse = "; ") [13:10:34.365] if (!has_future) { [13:10:34.365] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.365] info) [13:10:34.365] } [13:10:34.365] else { [13:10:34.365] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.365] info, version) [13:10:34.365] } [13:10:34.365] base::stop(msg) [13:10:34.365] } [13:10:34.365] }) [13:10:34.365] } [13:10:34.365] ...future.strategy.old <- future::plan("list") [13:10:34.365] options(future.plan = NULL) [13:10:34.365] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.365] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.365] } [13:10:34.365] ...future.workdir <- getwd() [13:10:34.365] } [13:10:34.365] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.365] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.365] } [13:10:34.365] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.365] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.365] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.365] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.365] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.365] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.365] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.365] base::names(...future.oldOptions)) [13:10:34.365] } [13:10:34.365] if (FALSE) { [13:10:34.365] } [13:10:34.365] else { [13:10:34.365] if (TRUE) { [13:10:34.365] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.365] open = "w") [13:10:34.365] } [13:10:34.365] else { [13:10:34.365] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.365] windows = "NUL", "/dev/null"), open = "w") [13:10:34.365] } [13:10:34.365] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.365] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.365] base::sink(type = "output", split = FALSE) [13:10:34.365] base::close(...future.stdout) [13:10:34.365] }, add = TRUE) [13:10:34.365] } [13:10:34.365] ...future.frame <- base::sys.nframe() [13:10:34.365] ...future.conditions <- base::list() [13:10:34.365] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.365] if (FALSE) { [13:10:34.365] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.365] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.365] } [13:10:34.365] ...future.result <- base::tryCatch({ [13:10:34.365] base::withCallingHandlers({ [13:10:34.365] ...future.value <- base::withVisible(base::local(42)) [13:10:34.365] future::FutureResult(value = ...future.value$value, [13:10:34.365] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.365] ...future.rng), globalenv = if (FALSE) [13:10:34.365] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.365] ...future.globalenv.names)) [13:10:34.365] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.365] }, condition = base::local({ [13:10:34.365] c <- base::c [13:10:34.365] inherits <- base::inherits [13:10:34.365] invokeRestart <- base::invokeRestart [13:10:34.365] length <- base::length [13:10:34.365] list <- base::list [13:10:34.365] seq.int <- base::seq.int [13:10:34.365] signalCondition <- base::signalCondition [13:10:34.365] sys.calls <- base::sys.calls [13:10:34.365] `[[` <- base::`[[` [13:10:34.365] `+` <- base::`+` [13:10:34.365] `<<-` <- base::`<<-` [13:10:34.365] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.365] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.365] 3L)] [13:10:34.365] } [13:10:34.365] function(cond) { [13:10:34.365] is_error <- inherits(cond, "error") [13:10:34.365] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.365] NULL) [13:10:34.365] if (is_error) { [13:10:34.365] sessionInformation <- function() { [13:10:34.365] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.365] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.365] search = base::search(), system = base::Sys.info()) [13:10:34.365] } [13:10:34.365] ...future.conditions[[length(...future.conditions) + [13:10:34.365] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.365] cond$call), session = sessionInformation(), [13:10:34.365] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.365] signalCondition(cond) [13:10:34.365] } [13:10:34.365] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.365] signal <- FALSE && inherits(cond, character(0)) [13:10:34.365] ...future.conditions[[length(...future.conditions) + [13:10:34.365] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.365] if (FALSE && !signal) { [13:10:34.365] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.365] { [13:10:34.365] inherits <- base::inherits [13:10:34.365] invokeRestart <- base::invokeRestart [13:10:34.365] is.null <- base::is.null [13:10:34.365] muffled <- FALSE [13:10:34.365] if (inherits(cond, "message")) { [13:10:34.365] muffled <- grepl(pattern, "muffleMessage") [13:10:34.365] if (muffled) [13:10:34.365] invokeRestart("muffleMessage") [13:10:34.365] } [13:10:34.365] else if (inherits(cond, "warning")) { [13:10:34.365] muffled <- grepl(pattern, "muffleWarning") [13:10:34.365] if (muffled) [13:10:34.365] invokeRestart("muffleWarning") [13:10:34.365] } [13:10:34.365] else if (inherits(cond, "condition")) { [13:10:34.365] if (!is.null(pattern)) { [13:10:34.365] computeRestarts <- base::computeRestarts [13:10:34.365] grepl <- base::grepl [13:10:34.365] restarts <- computeRestarts(cond) [13:10:34.365] for (restart in restarts) { [13:10:34.365] name <- restart$name [13:10:34.365] if (is.null(name)) [13:10:34.365] next [13:10:34.365] if (!grepl(pattern, name)) [13:10:34.365] next [13:10:34.365] invokeRestart(restart) [13:10:34.365] muffled <- TRUE [13:10:34.365] break [13:10:34.365] } [13:10:34.365] } [13:10:34.365] } [13:10:34.365] invisible(muffled) [13:10:34.365] } [13:10:34.365] muffleCondition(cond, pattern = "^muffle") [13:10:34.365] } [13:10:34.365] } [13:10:34.365] else { [13:10:34.365] if (TRUE) { [13:10:34.365] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.365] { [13:10:34.365] inherits <- base::inherits [13:10:34.365] invokeRestart <- base::invokeRestart [13:10:34.365] is.null <- base::is.null [13:10:34.365] muffled <- FALSE [13:10:34.365] if (inherits(cond, "message")) { [13:10:34.365] muffled <- grepl(pattern, "muffleMessage") [13:10:34.365] if (muffled) [13:10:34.365] invokeRestart("muffleMessage") [13:10:34.365] } [13:10:34.365] else if (inherits(cond, "warning")) { [13:10:34.365] muffled <- grepl(pattern, "muffleWarning") [13:10:34.365] if (muffled) [13:10:34.365] invokeRestart("muffleWarning") [13:10:34.365] } [13:10:34.365] else if (inherits(cond, "condition")) { [13:10:34.365] if (!is.null(pattern)) { [13:10:34.365] computeRestarts <- base::computeRestarts [13:10:34.365] grepl <- base::grepl [13:10:34.365] restarts <- computeRestarts(cond) [13:10:34.365] for (restart in restarts) { [13:10:34.365] name <- restart$name [13:10:34.365] if (is.null(name)) [13:10:34.365] next [13:10:34.365] if (!grepl(pattern, name)) [13:10:34.365] next [13:10:34.365] invokeRestart(restart) [13:10:34.365] muffled <- TRUE [13:10:34.365] break [13:10:34.365] } [13:10:34.365] } [13:10:34.365] } [13:10:34.365] invisible(muffled) [13:10:34.365] } [13:10:34.365] muffleCondition(cond, pattern = "^muffle") [13:10:34.365] } [13:10:34.365] } [13:10:34.365] } [13:10:34.365] })) [13:10:34.365] }, error = function(ex) { [13:10:34.365] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.365] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.365] ...future.rng), started = ...future.startTime, [13:10:34.365] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.365] version = "1.8"), class = "FutureResult") [13:10:34.365] }, finally = { [13:10:34.365] if (!identical(...future.workdir, getwd())) [13:10:34.365] setwd(...future.workdir) [13:10:34.365] { [13:10:34.365] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.365] ...future.oldOptions$nwarnings <- NULL [13:10:34.365] } [13:10:34.365] base::options(...future.oldOptions) [13:10:34.365] if (.Platform$OS.type == "windows") { [13:10:34.365] old_names <- names(...future.oldEnvVars) [13:10:34.365] envs <- base::Sys.getenv() [13:10:34.365] names <- names(envs) [13:10:34.365] common <- intersect(names, old_names) [13:10:34.365] added <- setdiff(names, old_names) [13:10:34.365] removed <- setdiff(old_names, names) [13:10:34.365] changed <- common[...future.oldEnvVars[common] != [13:10:34.365] envs[common]] [13:10:34.365] NAMES <- toupper(changed) [13:10:34.365] args <- list() [13:10:34.365] for (kk in seq_along(NAMES)) { [13:10:34.365] name <- changed[[kk]] [13:10:34.365] NAME <- NAMES[[kk]] [13:10:34.365] if (name != NAME && is.element(NAME, old_names)) [13:10:34.365] next [13:10:34.365] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.365] } [13:10:34.365] NAMES <- toupper(added) [13:10:34.365] for (kk in seq_along(NAMES)) { [13:10:34.365] name <- added[[kk]] [13:10:34.365] NAME <- NAMES[[kk]] [13:10:34.365] if (name != NAME && is.element(NAME, old_names)) [13:10:34.365] next [13:10:34.365] args[[name]] <- "" [13:10:34.365] } [13:10:34.365] NAMES <- toupper(removed) [13:10:34.365] for (kk in seq_along(NAMES)) { [13:10:34.365] name <- removed[[kk]] [13:10:34.365] NAME <- NAMES[[kk]] [13:10:34.365] if (name != NAME && is.element(NAME, old_names)) [13:10:34.365] next [13:10:34.365] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.365] } [13:10:34.365] if (length(args) > 0) [13:10:34.365] base::do.call(base::Sys.setenv, args = args) [13:10:34.365] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.365] } [13:10:34.365] else { [13:10:34.365] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.365] } [13:10:34.365] { [13:10:34.365] if (base::length(...future.futureOptionsAdded) > [13:10:34.365] 0L) { [13:10:34.365] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.365] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.365] base::options(opts) [13:10:34.365] } [13:10:34.365] { [13:10:34.365] NULL [13:10:34.365] options(future.plan = NULL) [13:10:34.365] if (is.na(NA_character_)) [13:10:34.365] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.365] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.365] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.365] .init = FALSE) [13:10:34.365] } [13:10:34.365] } [13:10:34.365] } [13:10:34.365] }) [13:10:34.365] if (TRUE) { [13:10:34.365] base::sink(type = "output", split = FALSE) [13:10:34.365] if (TRUE) { [13:10:34.365] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.365] } [13:10:34.365] else { [13:10:34.365] ...future.result["stdout"] <- base::list(NULL) [13:10:34.365] } [13:10:34.365] base::close(...future.stdout) [13:10:34.365] ...future.stdout <- NULL [13:10:34.365] } [13:10:34.365] ...future.result$conditions <- ...future.conditions [13:10:34.365] ...future.result$finished <- base::Sys.time() [13:10:34.365] ...future.result [13:10:34.365] } MiraiFuture: Label: 'strategy_mirai_cluster' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.369] resolved() for 'MiraiFuture' ... [13:10:34.370] - state: 'running' [13:10:34.370] - run: TRUE [13:10:34.370] - result: 'NULL' [13:10:34.370] - resolved: FALSE [13:10:34.370] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.371] getGlobalsAndPackages() ... [13:10:34.371] Searching for globals... [13:10:34.372] [13:10:34.372] Searching for globals ... DONE [13:10:34.372] - globals: [0] [13:10:34.372] getGlobalsAndPackages() ... DONE [13:10:34.372] run() for 'Future' ... [13:10:34.373] - state: 'created' [13:10:34.373] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.373] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.373] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.374] - Field: 'label' [13:10:34.374] - Field: 'local' [13:10:34.374] - Field: 'owner' [13:10:34.374] - Field: 'envir' [13:10:34.374] - Field: 'packages' [13:10:34.374] - Field: 'gc' [13:10:34.375] - Field: 'conditions' [13:10:34.375] - Field: 'expr' [13:10:34.375] - Field: 'uuid' [13:10:34.375] - Field: 'seed' [13:10:34.375] - Field: 'version' [13:10:34.375] - Field: 'result' [13:10:34.376] - Field: 'asynchronous' [13:10:34.376] - Field: 'calls' [13:10:34.376] - Field: 'globals' [13:10:34.376] - Field: 'stdout' [13:10:34.376] - Field: 'earlySignal' [13:10:34.376] - Field: 'lazy' [13:10:34.377] - Field: 'state' [13:10:34.377] - Field: '.cluster' [13:10:34.377] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.377] - Launch lazy future ... [13:10:34.377] Packages needed by the future expression (n = 0): [13:10:34.377] Packages needed by future strategies (n = 0): [13:10:34.378] { [13:10:34.378] { [13:10:34.378] { [13:10:34.378] ...future.startTime <- base::Sys.time() [13:10:34.378] { [13:10:34.378] { [13:10:34.378] { [13:10:34.378] base::local({ [13:10:34.378] has_future <- base::requireNamespace("future", [13:10:34.378] quietly = TRUE) [13:10:34.378] if (has_future) { [13:10:34.378] ns <- base::getNamespace("future") [13:10:34.378] version <- ns[[".package"]][["version"]] [13:10:34.378] if (is.null(version)) [13:10:34.378] version <- utils::packageVersion("future") [13:10:34.378] } [13:10:34.378] else { [13:10:34.378] version <- NULL [13:10:34.378] } [13:10:34.378] if (!has_future || version < "1.8.0") { [13:10:34.378] info <- base::c(r_version = base::gsub("R version ", [13:10:34.378] "", base::R.version$version.string), [13:10:34.378] platform = base::sprintf("%s (%s-bit)", [13:10:34.378] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.378] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.378] "release", "version")], collapse = " "), [13:10:34.378] hostname = base::Sys.info()[["nodename"]]) [13:10:34.378] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.378] info) [13:10:34.378] info <- base::paste(info, collapse = "; ") [13:10:34.378] if (!has_future) { [13:10:34.378] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.378] info) [13:10:34.378] } [13:10:34.378] else { [13:10:34.378] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.378] info, version) [13:10:34.378] } [13:10:34.378] base::stop(msg) [13:10:34.378] } [13:10:34.378] }) [13:10:34.378] } [13:10:34.378] ...future.strategy.old <- future::plan("list") [13:10:34.378] options(future.plan = NULL) [13:10:34.378] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.378] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.378] } [13:10:34.378] ...future.workdir <- getwd() [13:10:34.378] } [13:10:34.378] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.378] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.378] } [13:10:34.378] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.378] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.378] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.378] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.378] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.378] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.378] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.378] base::names(...future.oldOptions)) [13:10:34.378] } [13:10:34.378] if (FALSE) { [13:10:34.378] } [13:10:34.378] else { [13:10:34.378] if (TRUE) { [13:10:34.378] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.378] open = "w") [13:10:34.378] } [13:10:34.378] else { [13:10:34.378] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.378] windows = "NUL", "/dev/null"), open = "w") [13:10:34.378] } [13:10:34.378] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.378] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.378] base::sink(type = "output", split = FALSE) [13:10:34.378] base::close(...future.stdout) [13:10:34.378] }, add = TRUE) [13:10:34.378] } [13:10:34.378] ...future.frame <- base::sys.nframe() [13:10:34.378] ...future.conditions <- base::list() [13:10:34.378] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.378] if (FALSE) { [13:10:34.378] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.378] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.378] } [13:10:34.378] ...future.result <- base::tryCatch({ [13:10:34.378] base::withCallingHandlers({ [13:10:34.378] ...future.value <- base::withVisible(base::local(42)) [13:10:34.378] future::FutureResult(value = ...future.value$value, [13:10:34.378] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.378] ...future.rng), globalenv = if (FALSE) [13:10:34.378] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.378] ...future.globalenv.names)) [13:10:34.378] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.378] }, condition = base::local({ [13:10:34.378] c <- base::c [13:10:34.378] inherits <- base::inherits [13:10:34.378] invokeRestart <- base::invokeRestart [13:10:34.378] length <- base::length [13:10:34.378] list <- base::list [13:10:34.378] seq.int <- base::seq.int [13:10:34.378] signalCondition <- base::signalCondition [13:10:34.378] sys.calls <- base::sys.calls [13:10:34.378] `[[` <- base::`[[` [13:10:34.378] `+` <- base::`+` [13:10:34.378] `<<-` <- base::`<<-` [13:10:34.378] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.378] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.378] 3L)] [13:10:34.378] } [13:10:34.378] function(cond) { [13:10:34.378] is_error <- inherits(cond, "error") [13:10:34.378] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.378] NULL) [13:10:34.378] if (is_error) { [13:10:34.378] sessionInformation <- function() { [13:10:34.378] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.378] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.378] search = base::search(), system = base::Sys.info()) [13:10:34.378] } [13:10:34.378] ...future.conditions[[length(...future.conditions) + [13:10:34.378] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.378] cond$call), session = sessionInformation(), [13:10:34.378] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.378] signalCondition(cond) [13:10:34.378] } [13:10:34.378] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.378] signal <- FALSE && inherits(cond, character(0)) [13:10:34.378] ...future.conditions[[length(...future.conditions) + [13:10:34.378] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.378] if (FALSE && !signal) { [13:10:34.378] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.378] { [13:10:34.378] inherits <- base::inherits [13:10:34.378] invokeRestart <- base::invokeRestart [13:10:34.378] is.null <- base::is.null [13:10:34.378] muffled <- FALSE [13:10:34.378] if (inherits(cond, "message")) { [13:10:34.378] muffled <- grepl(pattern, "muffleMessage") [13:10:34.378] if (muffled) [13:10:34.378] invokeRestart("muffleMessage") [13:10:34.378] } [13:10:34.378] else if (inherits(cond, "warning")) { [13:10:34.378] muffled <- grepl(pattern, "muffleWarning") [13:10:34.378] if (muffled) [13:10:34.378] invokeRestart("muffleWarning") [13:10:34.378] } [13:10:34.378] else if (inherits(cond, "condition")) { [13:10:34.378] if (!is.null(pattern)) { [13:10:34.378] computeRestarts <- base::computeRestarts [13:10:34.378] grepl <- base::grepl [13:10:34.378] restarts <- computeRestarts(cond) [13:10:34.378] for (restart in restarts) { [13:10:34.378] name <- restart$name [13:10:34.378] if (is.null(name)) [13:10:34.378] next [13:10:34.378] if (!grepl(pattern, name)) [13:10:34.378] next [13:10:34.378] invokeRestart(restart) [13:10:34.378] muffled <- TRUE [13:10:34.378] break [13:10:34.378] } [13:10:34.378] } [13:10:34.378] } [13:10:34.378] invisible(muffled) [13:10:34.378] } [13:10:34.378] muffleCondition(cond, pattern = "^muffle") [13:10:34.378] } [13:10:34.378] } [13:10:34.378] else { [13:10:34.378] if (TRUE) { [13:10:34.378] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.378] { [13:10:34.378] inherits <- base::inherits [13:10:34.378] invokeRestart <- base::invokeRestart [13:10:34.378] is.null <- base::is.null [13:10:34.378] muffled <- FALSE [13:10:34.378] if (inherits(cond, "message")) { [13:10:34.378] muffled <- grepl(pattern, "muffleMessage") [13:10:34.378] if (muffled) [13:10:34.378] invokeRestart("muffleMessage") [13:10:34.378] } [13:10:34.378] else if (inherits(cond, "warning")) { [13:10:34.378] muffled <- grepl(pattern, "muffleWarning") [13:10:34.378] if (muffled) [13:10:34.378] invokeRestart("muffleWarning") [13:10:34.378] } [13:10:34.378] else if (inherits(cond, "condition")) { [13:10:34.378] if (!is.null(pattern)) { [13:10:34.378] computeRestarts <- base::computeRestarts [13:10:34.378] grepl <- base::grepl [13:10:34.378] restarts <- computeRestarts(cond) [13:10:34.378] for (restart in restarts) { [13:10:34.378] name <- restart$name [13:10:34.378] if (is.null(name)) [13:10:34.378] next [13:10:34.378] if (!grepl(pattern, name)) [13:10:34.378] next [13:10:34.378] invokeRestart(restart) [13:10:34.378] muffled <- TRUE [13:10:34.378] break [13:10:34.378] } [13:10:34.378] } [13:10:34.378] } [13:10:34.378] invisible(muffled) [13:10:34.378] } [13:10:34.378] muffleCondition(cond, pattern = "^muffle") [13:10:34.378] } [13:10:34.378] } [13:10:34.378] } [13:10:34.378] })) [13:10:34.378] }, error = function(ex) { [13:10:34.378] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.378] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.378] ...future.rng), started = ...future.startTime, [13:10:34.378] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.378] version = "1.8"), class = "FutureResult") [13:10:34.378] }, finally = { [13:10:34.378] if (!identical(...future.workdir, getwd())) [13:10:34.378] setwd(...future.workdir) [13:10:34.378] { [13:10:34.378] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.378] ...future.oldOptions$nwarnings <- NULL [13:10:34.378] } [13:10:34.378] base::options(...future.oldOptions) [13:10:34.378] if (.Platform$OS.type == "windows") { [13:10:34.378] old_names <- names(...future.oldEnvVars) [13:10:34.378] envs <- base::Sys.getenv() [13:10:34.378] names <- names(envs) [13:10:34.378] common <- intersect(names, old_names) [13:10:34.378] added <- setdiff(names, old_names) [13:10:34.378] removed <- setdiff(old_names, names) [13:10:34.378] changed <- common[...future.oldEnvVars[common] != [13:10:34.378] envs[common]] [13:10:34.378] NAMES <- toupper(changed) [13:10:34.378] args <- list() [13:10:34.378] for (kk in seq_along(NAMES)) { [13:10:34.378] name <- changed[[kk]] [13:10:34.378] NAME <- NAMES[[kk]] [13:10:34.378] if (name != NAME && is.element(NAME, old_names)) [13:10:34.378] next [13:10:34.378] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.378] } [13:10:34.378] NAMES <- toupper(added) [13:10:34.378] for (kk in seq_along(NAMES)) { [13:10:34.378] name <- added[[kk]] [13:10:34.378] NAME <- NAMES[[kk]] [13:10:34.378] if (name != NAME && is.element(NAME, old_names)) [13:10:34.378] next [13:10:34.378] args[[name]] <- "" [13:10:34.378] } [13:10:34.378] NAMES <- toupper(removed) [13:10:34.378] for (kk in seq_along(NAMES)) { [13:10:34.378] name <- removed[[kk]] [13:10:34.378] NAME <- NAMES[[kk]] [13:10:34.378] if (name != NAME && is.element(NAME, old_names)) [13:10:34.378] next [13:10:34.378] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.378] } [13:10:34.378] if (length(args) > 0) [13:10:34.378] base::do.call(base::Sys.setenv, args = args) [13:10:34.378] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.378] } [13:10:34.378] else { [13:10:34.378] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.378] } [13:10:34.378] { [13:10:34.378] if (base::length(...future.futureOptionsAdded) > [13:10:34.378] 0L) { [13:10:34.378] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.378] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.378] base::options(opts) [13:10:34.378] } [13:10:34.378] { [13:10:34.378] NULL [13:10:34.378] options(future.plan = NULL) [13:10:34.378] if (is.na(NA_character_)) [13:10:34.378] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.378] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.378] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.378] .init = FALSE) [13:10:34.378] } [13:10:34.378] } [13:10:34.378] } [13:10:34.378] }) [13:10:34.378] if (TRUE) { [13:10:34.378] base::sink(type = "output", split = FALSE) [13:10:34.378] if (TRUE) { [13:10:34.378] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.378] } [13:10:34.378] else { [13:10:34.378] ...future.result["stdout"] <- base::list(NULL) [13:10:34.378] } [13:10:34.378] base::close(...future.stdout) [13:10:34.378] ...future.stdout <- NULL [13:10:34.378] } [13:10:34.378] ...future.result$conditions <- ...future.conditions [13:10:34.378] ...future.result$finished <- base::Sys.time() [13:10:34.378] ...future.result [13:10:34.378] } [13:10:34.382] - Launch lazy future ... done [13:10:34.382] run() for 'MiraiFuture' ... done MiraiFuture: Label: 'strategy_mirai_cluster' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.383] resolved() for 'MiraiFuture' ... [13:10:34.383] - state: 'running' [13:10:34.383] - run: TRUE [13:10:34.383] - result: 'NULL' [13:10:34.383] - resolved: FALSE [13:10:34.384] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.384] getGlobalsAndPackages() ... [13:10:34.384] Searching for globals... [13:10:34.385] - globals found: [1] '{' [13:10:34.385] Searching for globals ... DONE [13:10:34.385] Resolving globals: FALSE [13:10:34.386] [13:10:34.386] [13:10:34.386] getGlobalsAndPackages() ... DONE [13:10:34.386] run() for 'Future' ... [13:10:34.386] - state: 'created' [13:10:34.387] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.387] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.387] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.387] - Field: 'label' [13:10:34.388] - Field: 'local' [13:10:34.388] - Field: 'owner' [13:10:34.388] - Field: 'envir' [13:10:34.388] - Field: 'packages' [13:10:34.388] - Field: 'gc' [13:10:34.388] - Field: 'conditions' [13:10:34.389] - Field: 'expr' [13:10:34.389] - Field: 'uuid' [13:10:34.389] - Field: 'seed' [13:10:34.389] - Field: 'version' [13:10:34.389] - Field: 'result' [13:10:34.389] - Field: 'asynchronous' [13:10:34.390] - Field: 'calls' [13:10:34.390] - Field: 'globals' [13:10:34.390] - Field: 'stdout' [13:10:34.390] - Field: 'earlySignal' [13:10:34.390] - Field: 'lazy' [13:10:34.390] - Field: 'state' [13:10:34.391] - Field: '.cluster' [13:10:34.391] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.391] - Launch lazy future ... [13:10:34.391] Packages needed by the future expression (n = 0): [13:10:34.391] Packages needed by future strategies (n = 0): [13:10:34.393] { [13:10:34.393] { [13:10:34.393] { [13:10:34.393] ...future.startTime <- base::Sys.time() [13:10:34.393] { [13:10:34.393] { [13:10:34.393] { [13:10:34.393] base::local({ [13:10:34.393] has_future <- base::requireNamespace("future", [13:10:34.393] quietly = TRUE) [13:10:34.393] if (has_future) { [13:10:34.393] ns <- base::getNamespace("future") [13:10:34.393] version <- ns[[".package"]][["version"]] [13:10:34.393] if (is.null(version)) [13:10:34.393] version <- utils::packageVersion("future") [13:10:34.393] } [13:10:34.393] else { [13:10:34.393] version <- NULL [13:10:34.393] } [13:10:34.393] if (!has_future || version < "1.8.0") { [13:10:34.393] info <- base::c(r_version = base::gsub("R version ", [13:10:34.393] "", base::R.version$version.string), [13:10:34.393] platform = base::sprintf("%s (%s-bit)", [13:10:34.393] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.393] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.393] "release", "version")], collapse = " "), [13:10:34.393] hostname = base::Sys.info()[["nodename"]]) [13:10:34.393] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.393] info) [13:10:34.393] info <- base::paste(info, collapse = "; ") [13:10:34.393] if (!has_future) { [13:10:34.393] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.393] info) [13:10:34.393] } [13:10:34.393] else { [13:10:34.393] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.393] info, version) [13:10:34.393] } [13:10:34.393] base::stop(msg) [13:10:34.393] } [13:10:34.393] }) [13:10:34.393] } [13:10:34.393] ...future.strategy.old <- future::plan("list") [13:10:34.393] options(future.plan = NULL) [13:10:34.393] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.393] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.393] } [13:10:34.393] ...future.workdir <- getwd() [13:10:34.393] } [13:10:34.393] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.393] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.393] } [13:10:34.393] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.393] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.393] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.393] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.393] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.393] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.393] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.393] base::names(...future.oldOptions)) [13:10:34.393] } [13:10:34.393] if (FALSE) { [13:10:34.393] } [13:10:34.393] else { [13:10:34.393] if (TRUE) { [13:10:34.393] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.393] open = "w") [13:10:34.393] } [13:10:34.393] else { [13:10:34.393] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.393] windows = "NUL", "/dev/null"), open = "w") [13:10:34.393] } [13:10:34.393] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.393] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.393] base::sink(type = "output", split = FALSE) [13:10:34.393] base::close(...future.stdout) [13:10:34.393] }, add = TRUE) [13:10:34.393] } [13:10:34.393] ...future.frame <- base::sys.nframe() [13:10:34.393] ...future.conditions <- base::list() [13:10:34.393] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.393] if (FALSE) { [13:10:34.393] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.393] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.393] } [13:10:34.393] ...future.result <- base::tryCatch({ [13:10:34.393] base::withCallingHandlers({ [13:10:34.393] ...future.value <- base::withVisible(base::local({ [13:10:34.393] 42 [13:10:34.393] })) [13:10:34.393] future::FutureResult(value = ...future.value$value, [13:10:34.393] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.393] ...future.rng), globalenv = if (FALSE) [13:10:34.393] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.393] ...future.globalenv.names)) [13:10:34.393] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.393] }, condition = base::local({ [13:10:34.393] c <- base::c [13:10:34.393] inherits <- base::inherits [13:10:34.393] invokeRestart <- base::invokeRestart [13:10:34.393] length <- base::length [13:10:34.393] list <- base::list [13:10:34.393] seq.int <- base::seq.int [13:10:34.393] signalCondition <- base::signalCondition [13:10:34.393] sys.calls <- base::sys.calls [13:10:34.393] `[[` <- base::`[[` [13:10:34.393] `+` <- base::`+` [13:10:34.393] `<<-` <- base::`<<-` [13:10:34.393] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.393] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.393] 3L)] [13:10:34.393] } [13:10:34.393] function(cond) { [13:10:34.393] is_error <- inherits(cond, "error") [13:10:34.393] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.393] NULL) [13:10:34.393] if (is_error) { [13:10:34.393] sessionInformation <- function() { [13:10:34.393] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.393] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.393] search = base::search(), system = base::Sys.info()) [13:10:34.393] } [13:10:34.393] ...future.conditions[[length(...future.conditions) + [13:10:34.393] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.393] cond$call), session = sessionInformation(), [13:10:34.393] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.393] signalCondition(cond) [13:10:34.393] } [13:10:34.393] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.393] signal <- FALSE && inherits(cond, character(0)) [13:10:34.393] ...future.conditions[[length(...future.conditions) + [13:10:34.393] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.393] if (FALSE && !signal) { [13:10:34.393] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.393] { [13:10:34.393] inherits <- base::inherits [13:10:34.393] invokeRestart <- base::invokeRestart [13:10:34.393] is.null <- base::is.null [13:10:34.393] muffled <- FALSE [13:10:34.393] if (inherits(cond, "message")) { [13:10:34.393] muffled <- grepl(pattern, "muffleMessage") [13:10:34.393] if (muffled) [13:10:34.393] invokeRestart("muffleMessage") [13:10:34.393] } [13:10:34.393] else if (inherits(cond, "warning")) { [13:10:34.393] muffled <- grepl(pattern, "muffleWarning") [13:10:34.393] if (muffled) [13:10:34.393] invokeRestart("muffleWarning") [13:10:34.393] } [13:10:34.393] else if (inherits(cond, "condition")) { [13:10:34.393] if (!is.null(pattern)) { [13:10:34.393] computeRestarts <- base::computeRestarts [13:10:34.393] grepl <- base::grepl [13:10:34.393] restarts <- computeRestarts(cond) [13:10:34.393] for (restart in restarts) { [13:10:34.393] name <- restart$name [13:10:34.393] if (is.null(name)) [13:10:34.393] next [13:10:34.393] if (!grepl(pattern, name)) [13:10:34.393] next [13:10:34.393] invokeRestart(restart) [13:10:34.393] muffled <- TRUE [13:10:34.393] break [13:10:34.393] } [13:10:34.393] } [13:10:34.393] } [13:10:34.393] invisible(muffled) [13:10:34.393] } [13:10:34.393] muffleCondition(cond, pattern = "^muffle") [13:10:34.393] } [13:10:34.393] } [13:10:34.393] else { [13:10:34.393] if (TRUE) { [13:10:34.393] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.393] { [13:10:34.393] inherits <- base::inherits [13:10:34.393] invokeRestart <- base::invokeRestart [13:10:34.393] is.null <- base::is.null [13:10:34.393] muffled <- FALSE [13:10:34.393] if (inherits(cond, "message")) { [13:10:34.393] muffled <- grepl(pattern, "muffleMessage") [13:10:34.393] if (muffled) [13:10:34.393] invokeRestart("muffleMessage") [13:10:34.393] } [13:10:34.393] else if (inherits(cond, "warning")) { [13:10:34.393] muffled <- grepl(pattern, "muffleWarning") [13:10:34.393] if (muffled) [13:10:34.393] invokeRestart("muffleWarning") [13:10:34.393] } [13:10:34.393] else if (inherits(cond, "condition")) { [13:10:34.393] if (!is.null(pattern)) { [13:10:34.393] computeRestarts <- base::computeRestarts [13:10:34.393] grepl <- base::grepl [13:10:34.393] restarts <- computeRestarts(cond) [13:10:34.393] for (restart in restarts) { [13:10:34.393] name <- restart$name [13:10:34.393] if (is.null(name)) [13:10:34.393] next [13:10:34.393] if (!grepl(pattern, name)) [13:10:34.393] next [13:10:34.393] invokeRestart(restart) [13:10:34.393] muffled <- TRUE [13:10:34.393] break [13:10:34.393] } [13:10:34.393] } [13:10:34.393] } [13:10:34.393] invisible(muffled) [13:10:34.393] } [13:10:34.393] muffleCondition(cond, pattern = "^muffle") [13:10:34.393] } [13:10:34.393] } [13:10:34.393] } [13:10:34.393] })) [13:10:34.393] }, error = function(ex) { [13:10:34.393] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.393] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.393] ...future.rng), started = ...future.startTime, [13:10:34.393] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.393] version = "1.8"), class = "FutureResult") [13:10:34.393] }, finally = { [13:10:34.393] if (!identical(...future.workdir, getwd())) [13:10:34.393] setwd(...future.workdir) [13:10:34.393] { [13:10:34.393] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.393] ...future.oldOptions$nwarnings <- NULL [13:10:34.393] } [13:10:34.393] base::options(...future.oldOptions) [13:10:34.393] if (.Platform$OS.type == "windows") { [13:10:34.393] old_names <- names(...future.oldEnvVars) [13:10:34.393] envs <- base::Sys.getenv() [13:10:34.393] names <- names(envs) [13:10:34.393] common <- intersect(names, old_names) [13:10:34.393] added <- setdiff(names, old_names) [13:10:34.393] removed <- setdiff(old_names, names) [13:10:34.393] changed <- common[...future.oldEnvVars[common] != [13:10:34.393] envs[common]] [13:10:34.393] NAMES <- toupper(changed) [13:10:34.393] args <- list() [13:10:34.393] for (kk in seq_along(NAMES)) { [13:10:34.393] name <- changed[[kk]] [13:10:34.393] NAME <- NAMES[[kk]] [13:10:34.393] if (name != NAME && is.element(NAME, old_names)) [13:10:34.393] next [13:10:34.393] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.393] } [13:10:34.393] NAMES <- toupper(added) [13:10:34.393] for (kk in seq_along(NAMES)) { [13:10:34.393] name <- added[[kk]] [13:10:34.393] NAME <- NAMES[[kk]] [13:10:34.393] if (name != NAME && is.element(NAME, old_names)) [13:10:34.393] next [13:10:34.393] args[[name]] <- "" [13:10:34.393] } [13:10:34.393] NAMES <- toupper(removed) [13:10:34.393] for (kk in seq_along(NAMES)) { [13:10:34.393] name <- removed[[kk]] [13:10:34.393] NAME <- NAMES[[kk]] [13:10:34.393] if (name != NAME && is.element(NAME, old_names)) [13:10:34.393] next [13:10:34.393] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.393] } [13:10:34.393] if (length(args) > 0) [13:10:34.393] base::do.call(base::Sys.setenv, args = args) [13:10:34.393] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.393] } [13:10:34.393] else { [13:10:34.393] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.393] } [13:10:34.393] { [13:10:34.393] if (base::length(...future.futureOptionsAdded) > [13:10:34.393] 0L) { [13:10:34.393] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.393] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.393] base::options(opts) [13:10:34.393] } [13:10:34.393] { [13:10:34.393] NULL [13:10:34.393] options(future.plan = NULL) [13:10:34.393] if (is.na(NA_character_)) [13:10:34.393] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.393] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.393] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.393] .init = FALSE) [13:10:34.393] } [13:10:34.393] } [13:10:34.393] } [13:10:34.393] }) [13:10:34.393] if (TRUE) { [13:10:34.393] base::sink(type = "output", split = FALSE) [13:10:34.393] if (TRUE) { [13:10:34.393] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.393] } [13:10:34.393] else { [13:10:34.393] ...future.result["stdout"] <- base::list(NULL) [13:10:34.393] } [13:10:34.393] base::close(...future.stdout) [13:10:34.393] ...future.stdout <- NULL [13:10:34.393] } [13:10:34.393] ...future.result$conditions <- ...future.conditions [13:10:34.393] ...future.result$finished <- base::Sys.time() [13:10:34.393] ...future.result [13:10:34.393] } [13:10:34.397] - Launch lazy future ... done [13:10:34.397] run() for 'MiraiFuture' ... done MiraiFuture: Label: 'strategy_mirai_cluster' Expression: { 42 } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.398] resolved() for 'MiraiFuture' ... [13:10:34.398] - state: 'running' [13:10:34.398] - run: TRUE [13:10:34.398] - result: 'NULL' [13:10:34.398] - resolved: FALSE [13:10:34.398] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.399] - plan('mirai_cluster') ... DONE[13:10:34.399] - plan('mirai_multisession') ...[13:10:34.399] plan(): Setting new future strategy stack: [13:10:34.399] List of future strategies: [13:10:34.399] 1. mirai_multisession: [13:10:34.399] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:10:34.399] - tweaked: FALSE [13:10:34.399] - call: plan(strategy) [13:10:34.400] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:10:34.400] < mirai | $data > [13:10:34.402] getGlobalsAndPackages() ... [13:10:34.402] Not searching for globals [13:10:34.403] - globals: [0] [13:10:34.403] getGlobalsAndPackages() ... DONE [13:10:34.403] getGlobalsAndPackages() ... [13:10:34.403] [13:10:34.403] - globals: [0] [13:10:34.403] getGlobalsAndPackages() ... DONE [13:10:34.404] Packages needed by the future expression (n = 0): [13:10:34.404] Packages needed by future strategies (n = 0): [13:10:34.404] { [13:10:34.404] { [13:10:34.404] { [13:10:34.404] ...future.startTime <- base::Sys.time() [13:10:34.404] { [13:10:34.404] { [13:10:34.404] { [13:10:34.404] base::local({ [13:10:34.404] has_future <- base::requireNamespace("future", [13:10:34.404] quietly = TRUE) [13:10:34.404] if (has_future) { [13:10:34.404] ns <- base::getNamespace("future") [13:10:34.404] version <- ns[[".package"]][["version"]] [13:10:34.404] if (is.null(version)) [13:10:34.404] version <- utils::packageVersion("future") [13:10:34.404] } [13:10:34.404] else { [13:10:34.404] version <- NULL [13:10:34.404] } [13:10:34.404] if (!has_future || version < "1.8.0") { [13:10:34.404] info <- base::c(r_version = base::gsub("R version ", [13:10:34.404] "", base::R.version$version.string), [13:10:34.404] platform = base::sprintf("%s (%s-bit)", [13:10:34.404] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.404] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.404] "release", "version")], collapse = " "), [13:10:34.404] hostname = base::Sys.info()[["nodename"]]) [13:10:34.404] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.404] info) [13:10:34.404] info <- base::paste(info, collapse = "; ") [13:10:34.404] if (!has_future) { [13:10:34.404] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.404] info) [13:10:34.404] } [13:10:34.404] else { [13:10:34.404] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.404] info, version) [13:10:34.404] } [13:10:34.404] base::stop(msg) [13:10:34.404] } [13:10:34.404] }) [13:10:34.404] } [13:10:34.404] ...future.strategy.old <- future::plan("list") [13:10:34.404] options(future.plan = NULL) [13:10:34.404] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.404] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.404] } [13:10:34.404] ...future.workdir <- getwd() [13:10:34.404] } [13:10:34.404] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.404] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.404] } [13:10:34.404] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.404] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.404] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.404] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.404] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.404] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.404] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.404] base::names(...future.oldOptions)) [13:10:34.404] } [13:10:34.404] if (FALSE) { [13:10:34.404] } [13:10:34.404] else { [13:10:34.404] if (TRUE) { [13:10:34.404] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.404] open = "w") [13:10:34.404] } [13:10:34.404] else { [13:10:34.404] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.404] windows = "NUL", "/dev/null"), open = "w") [13:10:34.404] } [13:10:34.404] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.404] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.404] base::sink(type = "output", split = FALSE) [13:10:34.404] base::close(...future.stdout) [13:10:34.404] }, add = TRUE) [13:10:34.404] } [13:10:34.404] ...future.frame <- base::sys.nframe() [13:10:34.404] ...future.conditions <- base::list() [13:10:34.404] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.404] if (FALSE) { [13:10:34.404] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.404] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.404] } [13:10:34.404] ...future.result <- base::tryCatch({ [13:10:34.404] base::withCallingHandlers({ [13:10:34.404] ...future.value <- base::withVisible(base::local(NA)) [13:10:34.404] future::FutureResult(value = ...future.value$value, [13:10:34.404] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.404] ...future.rng), globalenv = if (FALSE) [13:10:34.404] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.404] ...future.globalenv.names)) [13:10:34.404] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.404] }, condition = base::local({ [13:10:34.404] c <- base::c [13:10:34.404] inherits <- base::inherits [13:10:34.404] invokeRestart <- base::invokeRestart [13:10:34.404] length <- base::length [13:10:34.404] list <- base::list [13:10:34.404] seq.int <- base::seq.int [13:10:34.404] signalCondition <- base::signalCondition [13:10:34.404] sys.calls <- base::sys.calls [13:10:34.404] `[[` <- base::`[[` [13:10:34.404] `+` <- base::`+` [13:10:34.404] `<<-` <- base::`<<-` [13:10:34.404] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.404] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.404] 3L)] [13:10:34.404] } [13:10:34.404] function(cond) { [13:10:34.404] is_error <- inherits(cond, "error") [13:10:34.404] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.404] NULL) [13:10:34.404] if (is_error) { [13:10:34.404] sessionInformation <- function() { [13:10:34.404] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.404] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.404] search = base::search(), system = base::Sys.info()) [13:10:34.404] } [13:10:34.404] ...future.conditions[[length(...future.conditions) + [13:10:34.404] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.404] cond$call), session = sessionInformation(), [13:10:34.404] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.404] signalCondition(cond) [13:10:34.404] } [13:10:34.404] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.404] signal <- FALSE && inherits(cond, character(0)) [13:10:34.404] ...future.conditions[[length(...future.conditions) + [13:10:34.404] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.404] if (FALSE && !signal) { [13:10:34.404] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.404] { [13:10:34.404] inherits <- base::inherits [13:10:34.404] invokeRestart <- base::invokeRestart [13:10:34.404] is.null <- base::is.null [13:10:34.404] muffled <- FALSE [13:10:34.404] if (inherits(cond, "message")) { [13:10:34.404] muffled <- grepl(pattern, "muffleMessage") [13:10:34.404] if (muffled) [13:10:34.404] invokeRestart("muffleMessage") [13:10:34.404] } [13:10:34.404] else if (inherits(cond, "warning")) { [13:10:34.404] muffled <- grepl(pattern, "muffleWarning") [13:10:34.404] if (muffled) [13:10:34.404] invokeRestart("muffleWarning") [13:10:34.404] } [13:10:34.404] else if (inherits(cond, "condition")) { [13:10:34.404] if (!is.null(pattern)) { [13:10:34.404] computeRestarts <- base::computeRestarts [13:10:34.404] grepl <- base::grepl [13:10:34.404] restarts <- computeRestarts(cond) [13:10:34.404] for (restart in restarts) { [13:10:34.404] name <- restart$name [13:10:34.404] if (is.null(name)) [13:10:34.404] next [13:10:34.404] if (!grepl(pattern, name)) [13:10:34.404] next [13:10:34.404] invokeRestart(restart) [13:10:34.404] muffled <- TRUE [13:10:34.404] break [13:10:34.404] } [13:10:34.404] } [13:10:34.404] } [13:10:34.404] invisible(muffled) [13:10:34.404] } [13:10:34.404] muffleCondition(cond, pattern = "^muffle") [13:10:34.404] } [13:10:34.404] } [13:10:34.404] else { [13:10:34.404] if (TRUE) { [13:10:34.404] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.404] { [13:10:34.404] inherits <- base::inherits [13:10:34.404] invokeRestart <- base::invokeRestart [13:10:34.404] is.null <- base::is.null [13:10:34.404] muffled <- FALSE [13:10:34.404] if (inherits(cond, "message")) { [13:10:34.404] muffled <- grepl(pattern, "muffleMessage") [13:10:34.404] if (muffled) [13:10:34.404] invokeRestart("muffleMessage") [13:10:34.404] } [13:10:34.404] else if (inherits(cond, "warning")) { [13:10:34.404] muffled <- grepl(pattern, "muffleWarning") [13:10:34.404] if (muffled) [13:10:34.404] invokeRestart("muffleWarning") [13:10:34.404] } [13:10:34.404] else if (inherits(cond, "condition")) { [13:10:34.404] if (!is.null(pattern)) { [13:10:34.404] computeRestarts <- base::computeRestarts [13:10:34.404] grepl <- base::grepl [13:10:34.404] restarts <- computeRestarts(cond) [13:10:34.404] for (restart in restarts) { [13:10:34.404] name <- restart$name [13:10:34.404] if (is.null(name)) [13:10:34.404] next [13:10:34.404] if (!grepl(pattern, name)) [13:10:34.404] next [13:10:34.404] invokeRestart(restart) [13:10:34.404] muffled <- TRUE [13:10:34.404] break [13:10:34.404] } [13:10:34.404] } [13:10:34.404] } [13:10:34.404] invisible(muffled) [13:10:34.404] } [13:10:34.404] muffleCondition(cond, pattern = "^muffle") [13:10:34.404] } [13:10:34.404] } [13:10:34.404] } [13:10:34.404] })) [13:10:34.404] }, error = function(ex) { [13:10:34.404] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.404] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.404] ...future.rng), started = ...future.startTime, [13:10:34.404] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.404] version = "1.8"), class = "FutureResult") [13:10:34.404] }, finally = { [13:10:34.404] if (!identical(...future.workdir, getwd())) [13:10:34.404] setwd(...future.workdir) [13:10:34.404] { [13:10:34.404] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.404] ...future.oldOptions$nwarnings <- NULL [13:10:34.404] } [13:10:34.404] base::options(...future.oldOptions) [13:10:34.404] if (.Platform$OS.type == "windows") { [13:10:34.404] old_names <- names(...future.oldEnvVars) [13:10:34.404] envs <- base::Sys.getenv() [13:10:34.404] names <- names(envs) [13:10:34.404] common <- intersect(names, old_names) [13:10:34.404] added <- setdiff(names, old_names) [13:10:34.404] removed <- setdiff(old_names, names) [13:10:34.404] changed <- common[...future.oldEnvVars[common] != [13:10:34.404] envs[common]] [13:10:34.404] NAMES <- toupper(changed) [13:10:34.404] args <- list() [13:10:34.404] for (kk in seq_along(NAMES)) { [13:10:34.404] name <- changed[[kk]] [13:10:34.404] NAME <- NAMES[[kk]] [13:10:34.404] if (name != NAME && is.element(NAME, old_names)) [13:10:34.404] next [13:10:34.404] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.404] } [13:10:34.404] NAMES <- toupper(added) [13:10:34.404] for (kk in seq_along(NAMES)) { [13:10:34.404] name <- added[[kk]] [13:10:34.404] NAME <- NAMES[[kk]] [13:10:34.404] if (name != NAME && is.element(NAME, old_names)) [13:10:34.404] next [13:10:34.404] args[[name]] <- "" [13:10:34.404] } [13:10:34.404] NAMES <- toupper(removed) [13:10:34.404] for (kk in seq_along(NAMES)) { [13:10:34.404] name <- removed[[kk]] [13:10:34.404] NAME <- NAMES[[kk]] [13:10:34.404] if (name != NAME && is.element(NAME, old_names)) [13:10:34.404] next [13:10:34.404] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.404] } [13:10:34.404] if (length(args) > 0) [13:10:34.404] base::do.call(base::Sys.setenv, args = args) [13:10:34.404] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.404] } [13:10:34.404] else { [13:10:34.404] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.404] } [13:10:34.404] { [13:10:34.404] if (base::length(...future.futureOptionsAdded) > [13:10:34.404] 0L) { [13:10:34.404] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.404] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.404] base::options(opts) [13:10:34.404] } [13:10:34.404] { [13:10:34.404] NULL [13:10:34.404] options(future.plan = NULL) [13:10:34.404] if (is.na(NA_character_)) [13:10:34.404] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.404] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.404] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.404] .init = FALSE) [13:10:34.404] } [13:10:34.404] } [13:10:34.404] } [13:10:34.404] }) [13:10:34.404] if (TRUE) { [13:10:34.404] base::sink(type = "output", split = FALSE) [13:10:34.404] if (TRUE) { [13:10:34.404] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.404] } [13:10:34.404] else { [13:10:34.404] ...future.result["stdout"] <- base::list(NULL) [13:10:34.404] } [13:10:34.404] base::close(...future.stdout) [13:10:34.404] ...future.stdout <- NULL [13:10:34.404] } [13:10:34.404] ...future.result$conditions <- ...future.conditions [13:10:34.404] ...future.result$finished <- base::Sys.time() [13:10:34.404] ...future.result [13:10:34.404] } [13:10:34.410] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:10:34.411] plan(): nbrOfWorkers() = 2 [13:10:34.413] getGlobalsAndPackages() ... [13:10:34.413] Searching for globals... [13:10:34.413] [13:10:34.413] Searching for globals ... DONE [13:10:34.414] - globals: [0] [13:10:34.414] getGlobalsAndPackages() ... DONE [13:10:34.414] getGlobalsAndPackages() ... [13:10:34.414] [13:10:34.414] - globals: [0] [13:10:34.414] getGlobalsAndPackages() ... DONE [13:10:34.415] Packages needed by the future expression (n = 0): [13:10:34.415] Packages needed by future strategies (n = 0): [13:10:34.415] { [13:10:34.415] { [13:10:34.415] { [13:10:34.415] ...future.startTime <- base::Sys.time() [13:10:34.415] { [13:10:34.415] { [13:10:34.415] { [13:10:34.415] base::local({ [13:10:34.415] has_future <- base::requireNamespace("future", [13:10:34.415] quietly = TRUE) [13:10:34.415] if (has_future) { [13:10:34.415] ns <- base::getNamespace("future") [13:10:34.415] version <- ns[[".package"]][["version"]] [13:10:34.415] if (is.null(version)) [13:10:34.415] version <- utils::packageVersion("future") [13:10:34.415] } [13:10:34.415] else { [13:10:34.415] version <- NULL [13:10:34.415] } [13:10:34.415] if (!has_future || version < "1.8.0") { [13:10:34.415] info <- base::c(r_version = base::gsub("R version ", [13:10:34.415] "", base::R.version$version.string), [13:10:34.415] platform = base::sprintf("%s (%s-bit)", [13:10:34.415] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.415] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.415] "release", "version")], collapse = " "), [13:10:34.415] hostname = base::Sys.info()[["nodename"]]) [13:10:34.415] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.415] info) [13:10:34.415] info <- base::paste(info, collapse = "; ") [13:10:34.415] if (!has_future) { [13:10:34.415] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.415] info) [13:10:34.415] } [13:10:34.415] else { [13:10:34.415] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.415] info, version) [13:10:34.415] } [13:10:34.415] base::stop(msg) [13:10:34.415] } [13:10:34.415] }) [13:10:34.415] } [13:10:34.415] ...future.strategy.old <- future::plan("list") [13:10:34.415] options(future.plan = NULL) [13:10:34.415] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.415] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.415] } [13:10:34.415] ...future.workdir <- getwd() [13:10:34.415] } [13:10:34.415] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.415] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.415] } [13:10:34.415] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.415] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.415] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.415] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.415] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.415] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.415] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.415] base::names(...future.oldOptions)) [13:10:34.415] } [13:10:34.415] if (FALSE) { [13:10:34.415] } [13:10:34.415] else { [13:10:34.415] if (TRUE) { [13:10:34.415] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.415] open = "w") [13:10:34.415] } [13:10:34.415] else { [13:10:34.415] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.415] windows = "NUL", "/dev/null"), open = "w") [13:10:34.415] } [13:10:34.415] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.415] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.415] base::sink(type = "output", split = FALSE) [13:10:34.415] base::close(...future.stdout) [13:10:34.415] }, add = TRUE) [13:10:34.415] } [13:10:34.415] ...future.frame <- base::sys.nframe() [13:10:34.415] ...future.conditions <- base::list() [13:10:34.415] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.415] if (FALSE) { [13:10:34.415] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.415] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.415] } [13:10:34.415] ...future.result <- base::tryCatch({ [13:10:34.415] base::withCallingHandlers({ [13:10:34.415] ...future.value <- base::withVisible(base::local(42)) [13:10:34.415] future::FutureResult(value = ...future.value$value, [13:10:34.415] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.415] ...future.rng), globalenv = if (FALSE) [13:10:34.415] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.415] ...future.globalenv.names)) [13:10:34.415] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.415] }, condition = base::local({ [13:10:34.415] c <- base::c [13:10:34.415] inherits <- base::inherits [13:10:34.415] invokeRestart <- base::invokeRestart [13:10:34.415] length <- base::length [13:10:34.415] list <- base::list [13:10:34.415] seq.int <- base::seq.int [13:10:34.415] signalCondition <- base::signalCondition [13:10:34.415] sys.calls <- base::sys.calls [13:10:34.415] `[[` <- base::`[[` [13:10:34.415] `+` <- base::`+` [13:10:34.415] `<<-` <- base::`<<-` [13:10:34.415] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.415] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.415] 3L)] [13:10:34.415] } [13:10:34.415] function(cond) { [13:10:34.415] is_error <- inherits(cond, "error") [13:10:34.415] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.415] NULL) [13:10:34.415] if (is_error) { [13:10:34.415] sessionInformation <- function() { [13:10:34.415] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.415] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.415] search = base::search(), system = base::Sys.info()) [13:10:34.415] } [13:10:34.415] ...future.conditions[[length(...future.conditions) + [13:10:34.415] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.415] cond$call), session = sessionInformation(), [13:10:34.415] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.415] signalCondition(cond) [13:10:34.415] } [13:10:34.415] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.415] signal <- FALSE && inherits(cond, character(0)) [13:10:34.415] ...future.conditions[[length(...future.conditions) + [13:10:34.415] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.415] if (FALSE && !signal) { [13:10:34.415] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.415] { [13:10:34.415] inherits <- base::inherits [13:10:34.415] invokeRestart <- base::invokeRestart [13:10:34.415] is.null <- base::is.null [13:10:34.415] muffled <- FALSE [13:10:34.415] if (inherits(cond, "message")) { [13:10:34.415] muffled <- grepl(pattern, "muffleMessage") [13:10:34.415] if (muffled) [13:10:34.415] invokeRestart("muffleMessage") [13:10:34.415] } [13:10:34.415] else if (inherits(cond, "warning")) { [13:10:34.415] muffled <- grepl(pattern, "muffleWarning") [13:10:34.415] if (muffled) [13:10:34.415] invokeRestart("muffleWarning") [13:10:34.415] } [13:10:34.415] else if (inherits(cond, "condition")) { [13:10:34.415] if (!is.null(pattern)) { [13:10:34.415] computeRestarts <- base::computeRestarts [13:10:34.415] grepl <- base::grepl [13:10:34.415] restarts <- computeRestarts(cond) [13:10:34.415] for (restart in restarts) { [13:10:34.415] name <- restart$name [13:10:34.415] if (is.null(name)) [13:10:34.415] next [13:10:34.415] if (!grepl(pattern, name)) [13:10:34.415] next [13:10:34.415] invokeRestart(restart) [13:10:34.415] muffled <- TRUE [13:10:34.415] break [13:10:34.415] } [13:10:34.415] } [13:10:34.415] } [13:10:34.415] invisible(muffled) [13:10:34.415] } [13:10:34.415] muffleCondition(cond, pattern = "^muffle") [13:10:34.415] } [13:10:34.415] } [13:10:34.415] else { [13:10:34.415] if (TRUE) { [13:10:34.415] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.415] { [13:10:34.415] inherits <- base::inherits [13:10:34.415] invokeRestart <- base::invokeRestart [13:10:34.415] is.null <- base::is.null [13:10:34.415] muffled <- FALSE [13:10:34.415] if (inherits(cond, "message")) { [13:10:34.415] muffled <- grepl(pattern, "muffleMessage") [13:10:34.415] if (muffled) [13:10:34.415] invokeRestart("muffleMessage") [13:10:34.415] } [13:10:34.415] else if (inherits(cond, "warning")) { [13:10:34.415] muffled <- grepl(pattern, "muffleWarning") [13:10:34.415] if (muffled) [13:10:34.415] invokeRestart("muffleWarning") [13:10:34.415] } [13:10:34.415] else if (inherits(cond, "condition")) { [13:10:34.415] if (!is.null(pattern)) { [13:10:34.415] computeRestarts <- base::computeRestarts [13:10:34.415] grepl <- base::grepl [13:10:34.415] restarts <- computeRestarts(cond) [13:10:34.415] for (restart in restarts) { [13:10:34.415] name <- restart$name [13:10:34.415] if (is.null(name)) [13:10:34.415] next [13:10:34.415] if (!grepl(pattern, name)) [13:10:34.415] next [13:10:34.415] invokeRestart(restart) [13:10:34.415] muffled <- TRUE [13:10:34.415] break [13:10:34.415] } [13:10:34.415] } [13:10:34.415] } [13:10:34.415] invisible(muffled) [13:10:34.415] } [13:10:34.415] muffleCondition(cond, pattern = "^muffle") [13:10:34.415] } [13:10:34.415] } [13:10:34.415] } [13:10:34.415] })) [13:10:34.415] }, error = function(ex) { [13:10:34.415] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.415] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.415] ...future.rng), started = ...future.startTime, [13:10:34.415] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.415] version = "1.8"), class = "FutureResult") [13:10:34.415] }, finally = { [13:10:34.415] if (!identical(...future.workdir, getwd())) [13:10:34.415] setwd(...future.workdir) [13:10:34.415] { [13:10:34.415] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.415] ...future.oldOptions$nwarnings <- NULL [13:10:34.415] } [13:10:34.415] base::options(...future.oldOptions) [13:10:34.415] if (.Platform$OS.type == "windows") { [13:10:34.415] old_names <- names(...future.oldEnvVars) [13:10:34.415] envs <- base::Sys.getenv() [13:10:34.415] names <- names(envs) [13:10:34.415] common <- intersect(names, old_names) [13:10:34.415] added <- setdiff(names, old_names) [13:10:34.415] removed <- setdiff(old_names, names) [13:10:34.415] changed <- common[...future.oldEnvVars[common] != [13:10:34.415] envs[common]] [13:10:34.415] NAMES <- toupper(changed) [13:10:34.415] args <- list() [13:10:34.415] for (kk in seq_along(NAMES)) { [13:10:34.415] name <- changed[[kk]] [13:10:34.415] NAME <- NAMES[[kk]] [13:10:34.415] if (name != NAME && is.element(NAME, old_names)) [13:10:34.415] next [13:10:34.415] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.415] } [13:10:34.415] NAMES <- toupper(added) [13:10:34.415] for (kk in seq_along(NAMES)) { [13:10:34.415] name <- added[[kk]] [13:10:34.415] NAME <- NAMES[[kk]] [13:10:34.415] if (name != NAME && is.element(NAME, old_names)) [13:10:34.415] next [13:10:34.415] args[[name]] <- "" [13:10:34.415] } [13:10:34.415] NAMES <- toupper(removed) [13:10:34.415] for (kk in seq_along(NAMES)) { [13:10:34.415] name <- removed[[kk]] [13:10:34.415] NAME <- NAMES[[kk]] [13:10:34.415] if (name != NAME && is.element(NAME, old_names)) [13:10:34.415] next [13:10:34.415] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.415] } [13:10:34.415] if (length(args) > 0) [13:10:34.415] base::do.call(base::Sys.setenv, args = args) [13:10:34.415] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.415] } [13:10:34.415] else { [13:10:34.415] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.415] } [13:10:34.415] { [13:10:34.415] if (base::length(...future.futureOptionsAdded) > [13:10:34.415] 0L) { [13:10:34.415] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.415] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.415] base::options(opts) [13:10:34.415] } [13:10:34.415] { [13:10:34.415] NULL [13:10:34.415] options(future.plan = NULL) [13:10:34.415] if (is.na(NA_character_)) [13:10:34.415] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.415] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.415] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.415] .init = FALSE) [13:10:34.415] } [13:10:34.415] } [13:10:34.415] } [13:10:34.415] }) [13:10:34.415] if (TRUE) { [13:10:34.415] base::sink(type = "output", split = FALSE) [13:10:34.415] if (TRUE) { [13:10:34.415] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.415] } [13:10:34.415] else { [13:10:34.415] ...future.result["stdout"] <- base::list(NULL) [13:10:34.415] } [13:10:34.415] base::close(...future.stdout) [13:10:34.415] ...future.stdout <- NULL [13:10:34.415] } [13:10:34.415] ...future.result$conditions <- ...future.conditions [13:10:34.415] ...future.result$finished <- base::Sys.time() [13:10:34.415] ...future.result [13:10:34.415] } MiraiFuture: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.419] resolved() for 'MiraiFuture' ... [13:10:34.420] - state: 'running' [13:10:34.420] - run: TRUE [13:10:34.420] - result: 'NULL' [13:10:34.420] - resolved: FALSE [13:10:34.420] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.421] getGlobalsAndPackages() ... [13:10:34.421] Searching for globals... [13:10:34.422] [13:10:34.422] Searching for globals ... DONE [13:10:34.422] - globals: [0] [13:10:34.422] getGlobalsAndPackages() ... DONE [13:10:34.422] run() for 'Future' ... [13:10:34.423] - state: 'created' [13:10:34.423] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.425] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.425] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.425] - Field: 'label' [13:10:34.426] - Field: 'local' [13:10:34.426] - Field: 'owner' [13:10:34.426] - Field: 'envir' [13:10:34.426] - Field: 'packages' [13:10:34.426] - Field: 'gc' [13:10:34.427] - Field: 'conditions' [13:10:34.427] - Field: 'expr' [13:10:34.427] - Field: 'uuid' [13:10:34.427] - Field: 'seed' [13:10:34.427] - Field: 'version' [13:10:34.427] - Field: 'result' [13:10:34.428] - Field: 'asynchronous' [13:10:34.428] - Field: 'calls' [13:10:34.428] - Field: 'globals' [13:10:34.428] - Field: 'stdout' [13:10:34.428] - Field: 'earlySignal' [13:10:34.428] - Field: 'lazy' [13:10:34.429] - Field: 'state' [13:10:34.429] - Field: '.cluster' [13:10:34.429] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.429] - Launch lazy future ... [13:10:34.429] Packages needed by the future expression (n = 0): [13:10:34.429] Packages needed by future strategies (n = 0): [13:10:34.430] { [13:10:34.430] { [13:10:34.430] { [13:10:34.430] ...future.startTime <- base::Sys.time() [13:10:34.430] { [13:10:34.430] { [13:10:34.430] { [13:10:34.430] base::local({ [13:10:34.430] has_future <- base::requireNamespace("future", [13:10:34.430] quietly = TRUE) [13:10:34.430] if (has_future) { [13:10:34.430] ns <- base::getNamespace("future") [13:10:34.430] version <- ns[[".package"]][["version"]] [13:10:34.430] if (is.null(version)) [13:10:34.430] version <- utils::packageVersion("future") [13:10:34.430] } [13:10:34.430] else { [13:10:34.430] version <- NULL [13:10:34.430] } [13:10:34.430] if (!has_future || version < "1.8.0") { [13:10:34.430] info <- base::c(r_version = base::gsub("R version ", [13:10:34.430] "", base::R.version$version.string), [13:10:34.430] platform = base::sprintf("%s (%s-bit)", [13:10:34.430] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.430] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.430] "release", "version")], collapse = " "), [13:10:34.430] hostname = base::Sys.info()[["nodename"]]) [13:10:34.430] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.430] info) [13:10:34.430] info <- base::paste(info, collapse = "; ") [13:10:34.430] if (!has_future) { [13:10:34.430] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.430] info) [13:10:34.430] } [13:10:34.430] else { [13:10:34.430] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.430] info, version) [13:10:34.430] } [13:10:34.430] base::stop(msg) [13:10:34.430] } [13:10:34.430] }) [13:10:34.430] } [13:10:34.430] ...future.strategy.old <- future::plan("list") [13:10:34.430] options(future.plan = NULL) [13:10:34.430] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.430] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.430] } [13:10:34.430] ...future.workdir <- getwd() [13:10:34.430] } [13:10:34.430] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.430] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.430] } [13:10:34.430] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.430] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.430] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.430] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.430] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.430] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.430] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.430] base::names(...future.oldOptions)) [13:10:34.430] } [13:10:34.430] if (FALSE) { [13:10:34.430] } [13:10:34.430] else { [13:10:34.430] if (TRUE) { [13:10:34.430] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.430] open = "w") [13:10:34.430] } [13:10:34.430] else { [13:10:34.430] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.430] windows = "NUL", "/dev/null"), open = "w") [13:10:34.430] } [13:10:34.430] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.430] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.430] base::sink(type = "output", split = FALSE) [13:10:34.430] base::close(...future.stdout) [13:10:34.430] }, add = TRUE) [13:10:34.430] } [13:10:34.430] ...future.frame <- base::sys.nframe() [13:10:34.430] ...future.conditions <- base::list() [13:10:34.430] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.430] if (FALSE) { [13:10:34.430] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.430] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.430] } [13:10:34.430] ...future.result <- base::tryCatch({ [13:10:34.430] base::withCallingHandlers({ [13:10:34.430] ...future.value <- base::withVisible(base::local(42)) [13:10:34.430] future::FutureResult(value = ...future.value$value, [13:10:34.430] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.430] ...future.rng), globalenv = if (FALSE) [13:10:34.430] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.430] ...future.globalenv.names)) [13:10:34.430] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.430] }, condition = base::local({ [13:10:34.430] c <- base::c [13:10:34.430] inherits <- base::inherits [13:10:34.430] invokeRestart <- base::invokeRestart [13:10:34.430] length <- base::length [13:10:34.430] list <- base::list [13:10:34.430] seq.int <- base::seq.int [13:10:34.430] signalCondition <- base::signalCondition [13:10:34.430] sys.calls <- base::sys.calls [13:10:34.430] `[[` <- base::`[[` [13:10:34.430] `+` <- base::`+` [13:10:34.430] `<<-` <- base::`<<-` [13:10:34.430] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.430] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.430] 3L)] [13:10:34.430] } [13:10:34.430] function(cond) { [13:10:34.430] is_error <- inherits(cond, "error") [13:10:34.430] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.430] NULL) [13:10:34.430] if (is_error) { [13:10:34.430] sessionInformation <- function() { [13:10:34.430] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.430] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.430] search = base::search(), system = base::Sys.info()) [13:10:34.430] } [13:10:34.430] ...future.conditions[[length(...future.conditions) + [13:10:34.430] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.430] cond$call), session = sessionInformation(), [13:10:34.430] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.430] signalCondition(cond) [13:10:34.430] } [13:10:34.430] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.430] signal <- FALSE && inherits(cond, character(0)) [13:10:34.430] ...future.conditions[[length(...future.conditions) + [13:10:34.430] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.430] if (FALSE && !signal) { [13:10:34.430] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.430] { [13:10:34.430] inherits <- base::inherits [13:10:34.430] invokeRestart <- base::invokeRestart [13:10:34.430] is.null <- base::is.null [13:10:34.430] muffled <- FALSE [13:10:34.430] if (inherits(cond, "message")) { [13:10:34.430] muffled <- grepl(pattern, "muffleMessage") [13:10:34.430] if (muffled) [13:10:34.430] invokeRestart("muffleMessage") [13:10:34.430] } [13:10:34.430] else if (inherits(cond, "warning")) { [13:10:34.430] muffled <- grepl(pattern, "muffleWarning") [13:10:34.430] if (muffled) [13:10:34.430] invokeRestart("muffleWarning") [13:10:34.430] } [13:10:34.430] else if (inherits(cond, "condition")) { [13:10:34.430] if (!is.null(pattern)) { [13:10:34.430] computeRestarts <- base::computeRestarts [13:10:34.430] grepl <- base::grepl [13:10:34.430] restarts <- computeRestarts(cond) [13:10:34.430] for (restart in restarts) { [13:10:34.430] name <- restart$name [13:10:34.430] if (is.null(name)) [13:10:34.430] next [13:10:34.430] if (!grepl(pattern, name)) [13:10:34.430] next [13:10:34.430] invokeRestart(restart) [13:10:34.430] muffled <- TRUE [13:10:34.430] break [13:10:34.430] } [13:10:34.430] } [13:10:34.430] } [13:10:34.430] invisible(muffled) [13:10:34.430] } [13:10:34.430] muffleCondition(cond, pattern = "^muffle") [13:10:34.430] } [13:10:34.430] } [13:10:34.430] else { [13:10:34.430] if (TRUE) { [13:10:34.430] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.430] { [13:10:34.430] inherits <- base::inherits [13:10:34.430] invokeRestart <- base::invokeRestart [13:10:34.430] is.null <- base::is.null [13:10:34.430] muffled <- FALSE [13:10:34.430] if (inherits(cond, "message")) { [13:10:34.430] muffled <- grepl(pattern, "muffleMessage") [13:10:34.430] if (muffled) [13:10:34.430] invokeRestart("muffleMessage") [13:10:34.430] } [13:10:34.430] else if (inherits(cond, "warning")) { [13:10:34.430] muffled <- grepl(pattern, "muffleWarning") [13:10:34.430] if (muffled) [13:10:34.430] invokeRestart("muffleWarning") [13:10:34.430] } [13:10:34.430] else if (inherits(cond, "condition")) { [13:10:34.430] if (!is.null(pattern)) { [13:10:34.430] computeRestarts <- base::computeRestarts [13:10:34.430] grepl <- base::grepl [13:10:34.430] restarts <- computeRestarts(cond) [13:10:34.430] for (restart in restarts) { [13:10:34.430] name <- restart$name [13:10:34.430] if (is.null(name)) [13:10:34.430] next [13:10:34.430] if (!grepl(pattern, name)) [13:10:34.430] next [13:10:34.430] invokeRestart(restart) [13:10:34.430] muffled <- TRUE [13:10:34.430] break [13:10:34.430] } [13:10:34.430] } [13:10:34.430] } [13:10:34.430] invisible(muffled) [13:10:34.430] } [13:10:34.430] muffleCondition(cond, pattern = "^muffle") [13:10:34.430] } [13:10:34.430] } [13:10:34.430] } [13:10:34.430] })) [13:10:34.430] }, error = function(ex) { [13:10:34.430] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.430] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.430] ...future.rng), started = ...future.startTime, [13:10:34.430] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.430] version = "1.8"), class = "FutureResult") [13:10:34.430] }, finally = { [13:10:34.430] if (!identical(...future.workdir, getwd())) [13:10:34.430] setwd(...future.workdir) [13:10:34.430] { [13:10:34.430] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.430] ...future.oldOptions$nwarnings <- NULL [13:10:34.430] } [13:10:34.430] base::options(...future.oldOptions) [13:10:34.430] if (.Platform$OS.type == "windows") { [13:10:34.430] old_names <- names(...future.oldEnvVars) [13:10:34.430] envs <- base::Sys.getenv() [13:10:34.430] names <- names(envs) [13:10:34.430] common <- intersect(names, old_names) [13:10:34.430] added <- setdiff(names, old_names) [13:10:34.430] removed <- setdiff(old_names, names) [13:10:34.430] changed <- common[...future.oldEnvVars[common] != [13:10:34.430] envs[common]] [13:10:34.430] NAMES <- toupper(changed) [13:10:34.430] args <- list() [13:10:34.430] for (kk in seq_along(NAMES)) { [13:10:34.430] name <- changed[[kk]] [13:10:34.430] NAME <- NAMES[[kk]] [13:10:34.430] if (name != NAME && is.element(NAME, old_names)) [13:10:34.430] next [13:10:34.430] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.430] } [13:10:34.430] NAMES <- toupper(added) [13:10:34.430] for (kk in seq_along(NAMES)) { [13:10:34.430] name <- added[[kk]] [13:10:34.430] NAME <- NAMES[[kk]] [13:10:34.430] if (name != NAME && is.element(NAME, old_names)) [13:10:34.430] next [13:10:34.430] args[[name]] <- "" [13:10:34.430] } [13:10:34.430] NAMES <- toupper(removed) [13:10:34.430] for (kk in seq_along(NAMES)) { [13:10:34.430] name <- removed[[kk]] [13:10:34.430] NAME <- NAMES[[kk]] [13:10:34.430] if (name != NAME && is.element(NAME, old_names)) [13:10:34.430] next [13:10:34.430] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.430] } [13:10:34.430] if (length(args) > 0) [13:10:34.430] base::do.call(base::Sys.setenv, args = args) [13:10:34.430] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.430] } [13:10:34.430] else { [13:10:34.430] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.430] } [13:10:34.430] { [13:10:34.430] if (base::length(...future.futureOptionsAdded) > [13:10:34.430] 0L) { [13:10:34.430] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.430] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.430] base::options(opts) [13:10:34.430] } [13:10:34.430] { [13:10:34.430] NULL [13:10:34.430] options(future.plan = NULL) [13:10:34.430] if (is.na(NA_character_)) [13:10:34.430] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.430] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.430] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.430] .init = FALSE) [13:10:34.430] } [13:10:34.430] } [13:10:34.430] } [13:10:34.430] }) [13:10:34.430] if (TRUE) { [13:10:34.430] base::sink(type = "output", split = FALSE) [13:10:34.430] if (TRUE) { [13:10:34.430] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.430] } [13:10:34.430] else { [13:10:34.430] ...future.result["stdout"] <- base::list(NULL) [13:10:34.430] } [13:10:34.430] base::close(...future.stdout) [13:10:34.430] ...future.stdout <- NULL [13:10:34.430] } [13:10:34.430] ...future.result$conditions <- ...future.conditions [13:10:34.430] ...future.result$finished <- base::Sys.time() [13:10:34.430] ...future.result [13:10:34.430] } [13:10:34.434] - Launch lazy future ... done [13:10:34.434] run() for 'MiraiFuture' ... done MiraiFuture: Label: '' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.434] resolved() for 'MiraiFuture' ... [13:10:34.435] - state: 'running' [13:10:34.435] - run: TRUE [13:10:34.435] - result: 'NULL' [13:10:34.435] - resolved: FALSE [13:10:34.435] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.436] getGlobalsAndPackages() ... [13:10:34.436] Searching for globals... [13:10:34.437] - globals found: [1] '{' [13:10:34.437] Searching for globals ... DONE [13:10:34.437] Resolving globals: FALSE [13:10:34.438] [13:10:34.438] [13:10:34.438] getGlobalsAndPackages() ... DONE [13:10:34.438] run() for 'Future' ... [13:10:34.438] - state: 'created' [13:10:34.439] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.441] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.441] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.441] - Field: 'label' [13:10:34.441] - Field: 'local' [13:10:34.442] - Field: 'owner' [13:10:34.442] - Field: 'envir' [13:10:34.443] - Field: 'packages' [13:10:34.443] - Field: 'gc' [13:10:34.443] - Field: 'conditions' [13:10:34.444] - Field: 'expr' [13:10:34.444] - Field: 'uuid' [13:10:34.444] - Field: 'seed' [13:10:34.444] - Field: 'version' [13:10:34.444] - Field: 'result' [13:10:34.444] - Field: 'asynchronous' [13:10:34.445] - Field: 'calls' [13:10:34.445] - Field: 'globals' [13:10:34.445] - Field: 'stdout' [13:10:34.445] - Field: 'earlySignal' [13:10:34.445] - Field: 'lazy' [13:10:34.445] - Field: 'state' [13:10:34.446] - Field: '.cluster' [13:10:34.446] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.446] - Launch lazy future ... [13:10:34.446] Packages needed by the future expression (n = 0): [13:10:34.446] Packages needed by future strategies (n = 0): [13:10:34.447] { [13:10:34.447] { [13:10:34.447] { [13:10:34.447] ...future.startTime <- base::Sys.time() [13:10:34.447] { [13:10:34.447] { [13:10:34.447] { [13:10:34.447] base::local({ [13:10:34.447] has_future <- base::requireNamespace("future", [13:10:34.447] quietly = TRUE) [13:10:34.447] if (has_future) { [13:10:34.447] ns <- base::getNamespace("future") [13:10:34.447] version <- ns[[".package"]][["version"]] [13:10:34.447] if (is.null(version)) [13:10:34.447] version <- utils::packageVersion("future") [13:10:34.447] } [13:10:34.447] else { [13:10:34.447] version <- NULL [13:10:34.447] } [13:10:34.447] if (!has_future || version < "1.8.0") { [13:10:34.447] info <- base::c(r_version = base::gsub("R version ", [13:10:34.447] "", base::R.version$version.string), [13:10:34.447] platform = base::sprintf("%s (%s-bit)", [13:10:34.447] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.447] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.447] "release", "version")], collapse = " "), [13:10:34.447] hostname = base::Sys.info()[["nodename"]]) [13:10:34.447] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.447] info) [13:10:34.447] info <- base::paste(info, collapse = "; ") [13:10:34.447] if (!has_future) { [13:10:34.447] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.447] info) [13:10:34.447] } [13:10:34.447] else { [13:10:34.447] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.447] info, version) [13:10:34.447] } [13:10:34.447] base::stop(msg) [13:10:34.447] } [13:10:34.447] }) [13:10:34.447] } [13:10:34.447] ...future.strategy.old <- future::plan("list") [13:10:34.447] options(future.plan = NULL) [13:10:34.447] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.447] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.447] } [13:10:34.447] ...future.workdir <- getwd() [13:10:34.447] } [13:10:34.447] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.447] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.447] } [13:10:34.447] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.447] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.447] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.447] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.447] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.447] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.447] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.447] base::names(...future.oldOptions)) [13:10:34.447] } [13:10:34.447] if (FALSE) { [13:10:34.447] } [13:10:34.447] else { [13:10:34.447] if (TRUE) { [13:10:34.447] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.447] open = "w") [13:10:34.447] } [13:10:34.447] else { [13:10:34.447] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.447] windows = "NUL", "/dev/null"), open = "w") [13:10:34.447] } [13:10:34.447] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.447] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.447] base::sink(type = "output", split = FALSE) [13:10:34.447] base::close(...future.stdout) [13:10:34.447] }, add = TRUE) [13:10:34.447] } [13:10:34.447] ...future.frame <- base::sys.nframe() [13:10:34.447] ...future.conditions <- base::list() [13:10:34.447] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.447] if (FALSE) { [13:10:34.447] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.447] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.447] } [13:10:34.447] ...future.result <- base::tryCatch({ [13:10:34.447] base::withCallingHandlers({ [13:10:34.447] ...future.value <- base::withVisible(base::local({ [13:10:34.447] 42 [13:10:34.447] })) [13:10:34.447] future::FutureResult(value = ...future.value$value, [13:10:34.447] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.447] ...future.rng), globalenv = if (FALSE) [13:10:34.447] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.447] ...future.globalenv.names)) [13:10:34.447] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.447] }, condition = base::local({ [13:10:34.447] c <- base::c [13:10:34.447] inherits <- base::inherits [13:10:34.447] invokeRestart <- base::invokeRestart [13:10:34.447] length <- base::length [13:10:34.447] list <- base::list [13:10:34.447] seq.int <- base::seq.int [13:10:34.447] signalCondition <- base::signalCondition [13:10:34.447] sys.calls <- base::sys.calls [13:10:34.447] `[[` <- base::`[[` [13:10:34.447] `+` <- base::`+` [13:10:34.447] `<<-` <- base::`<<-` [13:10:34.447] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.447] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.447] 3L)] [13:10:34.447] } [13:10:34.447] function(cond) { [13:10:34.447] is_error <- inherits(cond, "error") [13:10:34.447] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.447] NULL) [13:10:34.447] if (is_error) { [13:10:34.447] sessionInformation <- function() { [13:10:34.447] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.447] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.447] search = base::search(), system = base::Sys.info()) [13:10:34.447] } [13:10:34.447] ...future.conditions[[length(...future.conditions) + [13:10:34.447] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.447] cond$call), session = sessionInformation(), [13:10:34.447] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.447] signalCondition(cond) [13:10:34.447] } [13:10:34.447] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.447] signal <- FALSE && inherits(cond, character(0)) [13:10:34.447] ...future.conditions[[length(...future.conditions) + [13:10:34.447] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.447] if (FALSE && !signal) { [13:10:34.447] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.447] { [13:10:34.447] inherits <- base::inherits [13:10:34.447] invokeRestart <- base::invokeRestart [13:10:34.447] is.null <- base::is.null [13:10:34.447] muffled <- FALSE [13:10:34.447] if (inherits(cond, "message")) { [13:10:34.447] muffled <- grepl(pattern, "muffleMessage") [13:10:34.447] if (muffled) [13:10:34.447] invokeRestart("muffleMessage") [13:10:34.447] } [13:10:34.447] else if (inherits(cond, "warning")) { [13:10:34.447] muffled <- grepl(pattern, "muffleWarning") [13:10:34.447] if (muffled) [13:10:34.447] invokeRestart("muffleWarning") [13:10:34.447] } [13:10:34.447] else if (inherits(cond, "condition")) { [13:10:34.447] if (!is.null(pattern)) { [13:10:34.447] computeRestarts <- base::computeRestarts [13:10:34.447] grepl <- base::grepl [13:10:34.447] restarts <- computeRestarts(cond) [13:10:34.447] for (restart in restarts) { [13:10:34.447] name <- restart$name [13:10:34.447] if (is.null(name)) [13:10:34.447] next [13:10:34.447] if (!grepl(pattern, name)) [13:10:34.447] next [13:10:34.447] invokeRestart(restart) [13:10:34.447] muffled <- TRUE [13:10:34.447] break [13:10:34.447] } [13:10:34.447] } [13:10:34.447] } [13:10:34.447] invisible(muffled) [13:10:34.447] } [13:10:34.447] muffleCondition(cond, pattern = "^muffle") [13:10:34.447] } [13:10:34.447] } [13:10:34.447] else { [13:10:34.447] if (TRUE) { [13:10:34.447] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.447] { [13:10:34.447] inherits <- base::inherits [13:10:34.447] invokeRestart <- base::invokeRestart [13:10:34.447] is.null <- base::is.null [13:10:34.447] muffled <- FALSE [13:10:34.447] if (inherits(cond, "message")) { [13:10:34.447] muffled <- grepl(pattern, "muffleMessage") [13:10:34.447] if (muffled) [13:10:34.447] invokeRestart("muffleMessage") [13:10:34.447] } [13:10:34.447] else if (inherits(cond, "warning")) { [13:10:34.447] muffled <- grepl(pattern, "muffleWarning") [13:10:34.447] if (muffled) [13:10:34.447] invokeRestart("muffleWarning") [13:10:34.447] } [13:10:34.447] else if (inherits(cond, "condition")) { [13:10:34.447] if (!is.null(pattern)) { [13:10:34.447] computeRestarts <- base::computeRestarts [13:10:34.447] grepl <- base::grepl [13:10:34.447] restarts <- computeRestarts(cond) [13:10:34.447] for (restart in restarts) { [13:10:34.447] name <- restart$name [13:10:34.447] if (is.null(name)) [13:10:34.447] next [13:10:34.447] if (!grepl(pattern, name)) [13:10:34.447] next [13:10:34.447] invokeRestart(restart) [13:10:34.447] muffled <- TRUE [13:10:34.447] break [13:10:34.447] } [13:10:34.447] } [13:10:34.447] } [13:10:34.447] invisible(muffled) [13:10:34.447] } [13:10:34.447] muffleCondition(cond, pattern = "^muffle") [13:10:34.447] } [13:10:34.447] } [13:10:34.447] } [13:10:34.447] })) [13:10:34.447] }, error = function(ex) { [13:10:34.447] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.447] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.447] ...future.rng), started = ...future.startTime, [13:10:34.447] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.447] version = "1.8"), class = "FutureResult") [13:10:34.447] }, finally = { [13:10:34.447] if (!identical(...future.workdir, getwd())) [13:10:34.447] setwd(...future.workdir) [13:10:34.447] { [13:10:34.447] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.447] ...future.oldOptions$nwarnings <- NULL [13:10:34.447] } [13:10:34.447] base::options(...future.oldOptions) [13:10:34.447] if (.Platform$OS.type == "windows") { [13:10:34.447] old_names <- names(...future.oldEnvVars) [13:10:34.447] envs <- base::Sys.getenv() [13:10:34.447] names <- names(envs) [13:10:34.447] common <- intersect(names, old_names) [13:10:34.447] added <- setdiff(names, old_names) [13:10:34.447] removed <- setdiff(old_names, names) [13:10:34.447] changed <- common[...future.oldEnvVars[common] != [13:10:34.447] envs[common]] [13:10:34.447] NAMES <- toupper(changed) [13:10:34.447] args <- list() [13:10:34.447] for (kk in seq_along(NAMES)) { [13:10:34.447] name <- changed[[kk]] [13:10:34.447] NAME <- NAMES[[kk]] [13:10:34.447] if (name != NAME && is.element(NAME, old_names)) [13:10:34.447] next [13:10:34.447] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.447] } [13:10:34.447] NAMES <- toupper(added) [13:10:34.447] for (kk in seq_along(NAMES)) { [13:10:34.447] name <- added[[kk]] [13:10:34.447] NAME <- NAMES[[kk]] [13:10:34.447] if (name != NAME && is.element(NAME, old_names)) [13:10:34.447] next [13:10:34.447] args[[name]] <- "" [13:10:34.447] } [13:10:34.447] NAMES <- toupper(removed) [13:10:34.447] for (kk in seq_along(NAMES)) { [13:10:34.447] name <- removed[[kk]] [13:10:34.447] NAME <- NAMES[[kk]] [13:10:34.447] if (name != NAME && is.element(NAME, old_names)) [13:10:34.447] next [13:10:34.447] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.447] } [13:10:34.447] if (length(args) > 0) [13:10:34.447] base::do.call(base::Sys.setenv, args = args) [13:10:34.447] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.447] } [13:10:34.447] else { [13:10:34.447] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.447] } [13:10:34.447] { [13:10:34.447] if (base::length(...future.futureOptionsAdded) > [13:10:34.447] 0L) { [13:10:34.447] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.447] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.447] base::options(opts) [13:10:34.447] } [13:10:34.447] { [13:10:34.447] NULL [13:10:34.447] options(future.plan = NULL) [13:10:34.447] if (is.na(NA_character_)) [13:10:34.447] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.447] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.447] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.447] .init = FALSE) [13:10:34.447] } [13:10:34.447] } [13:10:34.447] } [13:10:34.447] }) [13:10:34.447] if (TRUE) { [13:10:34.447] base::sink(type = "output", split = FALSE) [13:10:34.447] if (TRUE) { [13:10:34.447] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.447] } [13:10:34.447] else { [13:10:34.447] ...future.result["stdout"] <- base::list(NULL) [13:10:34.447] } [13:10:34.447] base::close(...future.stdout) [13:10:34.447] ...future.stdout <- NULL [13:10:34.447] } [13:10:34.447] ...future.result$conditions <- ...future.conditions [13:10:34.447] ...future.result$finished <- base::Sys.time() [13:10:34.447] ...future.result [13:10:34.447] } [13:10:34.450] - Launch lazy future ... done [13:10:34.451] run() for 'MiraiFuture' ... done MiraiFuture: Label: '' Expression: { 42 } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.451] resolved() for 'MiraiFuture' ... [13:10:34.452] - state: 'running' [13:10:34.452] - run: TRUE [13:10:34.452] - result: 'NULL' [13:10:34.452] - resolved: FALSE [13:10:34.452] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.455] getGlobalsAndPackages() ... [13:10:34.455] Searching for globals... [13:10:34.455] [13:10:34.455] Searching for globals ... DONE [13:10:34.456] - globals: [0] [13:10:34.456] getGlobalsAndPackages() ... DONE [13:10:34.456] getGlobalsAndPackages() ... [13:10:34.456] [13:10:34.456] - globals: [0] [13:10:34.456] getGlobalsAndPackages() ... DONE [13:10:34.457] Packages needed by the future expression (n = 0): [13:10:34.457] Packages needed by future strategies (n = 0): [13:10:34.457] { [13:10:34.457] { [13:10:34.457] { [13:10:34.457] ...future.startTime <- base::Sys.time() [13:10:34.457] { [13:10:34.457] { [13:10:34.457] { [13:10:34.457] base::local({ [13:10:34.457] has_future <- base::requireNamespace("future", [13:10:34.457] quietly = TRUE) [13:10:34.457] if (has_future) { [13:10:34.457] ns <- base::getNamespace("future") [13:10:34.457] version <- ns[[".package"]][["version"]] [13:10:34.457] if (is.null(version)) [13:10:34.457] version <- utils::packageVersion("future") [13:10:34.457] } [13:10:34.457] else { [13:10:34.457] version <- NULL [13:10:34.457] } [13:10:34.457] if (!has_future || version < "1.8.0") { [13:10:34.457] info <- base::c(r_version = base::gsub("R version ", [13:10:34.457] "", base::R.version$version.string), [13:10:34.457] platform = base::sprintf("%s (%s-bit)", [13:10:34.457] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.457] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.457] "release", "version")], collapse = " "), [13:10:34.457] hostname = base::Sys.info()[["nodename"]]) [13:10:34.457] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.457] info) [13:10:34.457] info <- base::paste(info, collapse = "; ") [13:10:34.457] if (!has_future) { [13:10:34.457] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.457] info) [13:10:34.457] } [13:10:34.457] else { [13:10:34.457] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.457] info, version) [13:10:34.457] } [13:10:34.457] base::stop(msg) [13:10:34.457] } [13:10:34.457] }) [13:10:34.457] } [13:10:34.457] ...future.strategy.old <- future::plan("list") [13:10:34.457] options(future.plan = NULL) [13:10:34.457] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.457] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.457] } [13:10:34.457] ...future.workdir <- getwd() [13:10:34.457] } [13:10:34.457] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.457] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.457] } [13:10:34.457] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.457] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.457] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.457] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.457] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.457] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.457] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.457] base::names(...future.oldOptions)) [13:10:34.457] } [13:10:34.457] if (FALSE) { [13:10:34.457] } [13:10:34.457] else { [13:10:34.457] if (TRUE) { [13:10:34.457] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.457] open = "w") [13:10:34.457] } [13:10:34.457] else { [13:10:34.457] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.457] windows = "NUL", "/dev/null"), open = "w") [13:10:34.457] } [13:10:34.457] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.457] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.457] base::sink(type = "output", split = FALSE) [13:10:34.457] base::close(...future.stdout) [13:10:34.457] }, add = TRUE) [13:10:34.457] } [13:10:34.457] ...future.frame <- base::sys.nframe() [13:10:34.457] ...future.conditions <- base::list() [13:10:34.457] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.457] if (FALSE) { [13:10:34.457] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.457] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.457] } [13:10:34.457] ...future.result <- base::tryCatch({ [13:10:34.457] base::withCallingHandlers({ [13:10:34.457] ...future.value <- base::withVisible(base::local(42)) [13:10:34.457] future::FutureResult(value = ...future.value$value, [13:10:34.457] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.457] ...future.rng), globalenv = if (FALSE) [13:10:34.457] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.457] ...future.globalenv.names)) [13:10:34.457] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.457] }, condition = base::local({ [13:10:34.457] c <- base::c [13:10:34.457] inherits <- base::inherits [13:10:34.457] invokeRestart <- base::invokeRestart [13:10:34.457] length <- base::length [13:10:34.457] list <- base::list [13:10:34.457] seq.int <- base::seq.int [13:10:34.457] signalCondition <- base::signalCondition [13:10:34.457] sys.calls <- base::sys.calls [13:10:34.457] `[[` <- base::`[[` [13:10:34.457] `+` <- base::`+` [13:10:34.457] `<<-` <- base::`<<-` [13:10:34.457] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.457] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.457] 3L)] [13:10:34.457] } [13:10:34.457] function(cond) { [13:10:34.457] is_error <- inherits(cond, "error") [13:10:34.457] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.457] NULL) [13:10:34.457] if (is_error) { [13:10:34.457] sessionInformation <- function() { [13:10:34.457] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.457] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.457] search = base::search(), system = base::Sys.info()) [13:10:34.457] } [13:10:34.457] ...future.conditions[[length(...future.conditions) + [13:10:34.457] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.457] cond$call), session = sessionInformation(), [13:10:34.457] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.457] signalCondition(cond) [13:10:34.457] } [13:10:34.457] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.457] signal <- FALSE && inherits(cond, character(0)) [13:10:34.457] ...future.conditions[[length(...future.conditions) + [13:10:34.457] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.457] if (FALSE && !signal) { [13:10:34.457] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.457] { [13:10:34.457] inherits <- base::inherits [13:10:34.457] invokeRestart <- base::invokeRestart [13:10:34.457] is.null <- base::is.null [13:10:34.457] muffled <- FALSE [13:10:34.457] if (inherits(cond, "message")) { [13:10:34.457] muffled <- grepl(pattern, "muffleMessage") [13:10:34.457] if (muffled) [13:10:34.457] invokeRestart("muffleMessage") [13:10:34.457] } [13:10:34.457] else if (inherits(cond, "warning")) { [13:10:34.457] muffled <- grepl(pattern, "muffleWarning") [13:10:34.457] if (muffled) [13:10:34.457] invokeRestart("muffleWarning") [13:10:34.457] } [13:10:34.457] else if (inherits(cond, "condition")) { [13:10:34.457] if (!is.null(pattern)) { [13:10:34.457] computeRestarts <- base::computeRestarts [13:10:34.457] grepl <- base::grepl [13:10:34.457] restarts <- computeRestarts(cond) [13:10:34.457] for (restart in restarts) { [13:10:34.457] name <- restart$name [13:10:34.457] if (is.null(name)) [13:10:34.457] next [13:10:34.457] if (!grepl(pattern, name)) [13:10:34.457] next [13:10:34.457] invokeRestart(restart) [13:10:34.457] muffled <- TRUE [13:10:34.457] break [13:10:34.457] } [13:10:34.457] } [13:10:34.457] } [13:10:34.457] invisible(muffled) [13:10:34.457] } [13:10:34.457] muffleCondition(cond, pattern = "^muffle") [13:10:34.457] } [13:10:34.457] } [13:10:34.457] else { [13:10:34.457] if (TRUE) { [13:10:34.457] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.457] { [13:10:34.457] inherits <- base::inherits [13:10:34.457] invokeRestart <- base::invokeRestart [13:10:34.457] is.null <- base::is.null [13:10:34.457] muffled <- FALSE [13:10:34.457] if (inherits(cond, "message")) { [13:10:34.457] muffled <- grepl(pattern, "muffleMessage") [13:10:34.457] if (muffled) [13:10:34.457] invokeRestart("muffleMessage") [13:10:34.457] } [13:10:34.457] else if (inherits(cond, "warning")) { [13:10:34.457] muffled <- grepl(pattern, "muffleWarning") [13:10:34.457] if (muffled) [13:10:34.457] invokeRestart("muffleWarning") [13:10:34.457] } [13:10:34.457] else if (inherits(cond, "condition")) { [13:10:34.457] if (!is.null(pattern)) { [13:10:34.457] computeRestarts <- base::computeRestarts [13:10:34.457] grepl <- base::grepl [13:10:34.457] restarts <- computeRestarts(cond) [13:10:34.457] for (restart in restarts) { [13:10:34.457] name <- restart$name [13:10:34.457] if (is.null(name)) [13:10:34.457] next [13:10:34.457] if (!grepl(pattern, name)) [13:10:34.457] next [13:10:34.457] invokeRestart(restart) [13:10:34.457] muffled <- TRUE [13:10:34.457] break [13:10:34.457] } [13:10:34.457] } [13:10:34.457] } [13:10:34.457] invisible(muffled) [13:10:34.457] } [13:10:34.457] muffleCondition(cond, pattern = "^muffle") [13:10:34.457] } [13:10:34.457] } [13:10:34.457] } [13:10:34.457] })) [13:10:34.457] }, error = function(ex) { [13:10:34.457] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.457] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.457] ...future.rng), started = ...future.startTime, [13:10:34.457] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.457] version = "1.8"), class = "FutureResult") [13:10:34.457] }, finally = { [13:10:34.457] if (!identical(...future.workdir, getwd())) [13:10:34.457] setwd(...future.workdir) [13:10:34.457] { [13:10:34.457] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.457] ...future.oldOptions$nwarnings <- NULL [13:10:34.457] } [13:10:34.457] base::options(...future.oldOptions) [13:10:34.457] if (.Platform$OS.type == "windows") { [13:10:34.457] old_names <- names(...future.oldEnvVars) [13:10:34.457] envs <- base::Sys.getenv() [13:10:34.457] names <- names(envs) [13:10:34.457] common <- intersect(names, old_names) [13:10:34.457] added <- setdiff(names, old_names) [13:10:34.457] removed <- setdiff(old_names, names) [13:10:34.457] changed <- common[...future.oldEnvVars[common] != [13:10:34.457] envs[common]] [13:10:34.457] NAMES <- toupper(changed) [13:10:34.457] args <- list() [13:10:34.457] for (kk in seq_along(NAMES)) { [13:10:34.457] name <- changed[[kk]] [13:10:34.457] NAME <- NAMES[[kk]] [13:10:34.457] if (name != NAME && is.element(NAME, old_names)) [13:10:34.457] next [13:10:34.457] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.457] } [13:10:34.457] NAMES <- toupper(added) [13:10:34.457] for (kk in seq_along(NAMES)) { [13:10:34.457] name <- added[[kk]] [13:10:34.457] NAME <- NAMES[[kk]] [13:10:34.457] if (name != NAME && is.element(NAME, old_names)) [13:10:34.457] next [13:10:34.457] args[[name]] <- "" [13:10:34.457] } [13:10:34.457] NAMES <- toupper(removed) [13:10:34.457] for (kk in seq_along(NAMES)) { [13:10:34.457] name <- removed[[kk]] [13:10:34.457] NAME <- NAMES[[kk]] [13:10:34.457] if (name != NAME && is.element(NAME, old_names)) [13:10:34.457] next [13:10:34.457] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.457] } [13:10:34.457] if (length(args) > 0) [13:10:34.457] base::do.call(base::Sys.setenv, args = args) [13:10:34.457] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.457] } [13:10:34.457] else { [13:10:34.457] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.457] } [13:10:34.457] { [13:10:34.457] if (base::length(...future.futureOptionsAdded) > [13:10:34.457] 0L) { [13:10:34.457] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.457] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.457] base::options(opts) [13:10:34.457] } [13:10:34.457] { [13:10:34.457] NULL [13:10:34.457] options(future.plan = NULL) [13:10:34.457] if (is.na(NA_character_)) [13:10:34.457] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.457] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.457] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.457] .init = FALSE) [13:10:34.457] } [13:10:34.457] } [13:10:34.457] } [13:10:34.457] }) [13:10:34.457] if (TRUE) { [13:10:34.457] base::sink(type = "output", split = FALSE) [13:10:34.457] if (TRUE) { [13:10:34.457] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.457] } [13:10:34.457] else { [13:10:34.457] ...future.result["stdout"] <- base::list(NULL) [13:10:34.457] } [13:10:34.457] base::close(...future.stdout) [13:10:34.457] ...future.stdout <- NULL [13:10:34.457] } [13:10:34.457] ...future.result$conditions <- ...future.conditions [13:10:34.457] ...future.result$finished <- base::Sys.time() [13:10:34.457] ...future.result [13:10:34.457] } MiraiFuture: Label: 'strategy_mirai_multisession' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.462] resolved() for 'MiraiFuture' ... [13:10:34.462] - state: 'running' [13:10:34.462] - run: TRUE [13:10:34.462] - result: 'NULL' [13:10:34.462] - resolved: FALSE [13:10:34.462] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.463] getGlobalsAndPackages() ... [13:10:34.463] Searching for globals... [13:10:34.464] [13:10:34.464] Searching for globals ... DONE [13:10:34.464] - globals: [0] [13:10:34.464] getGlobalsAndPackages() ... DONE [13:10:34.465] run() for 'Future' ... [13:10:34.465] - state: 'created' [13:10:34.465] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.467] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.467] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.468] - Field: 'label' [13:10:34.468] - Field: 'local' [13:10:34.468] - Field: 'owner' [13:10:34.468] - Field: 'envir' [13:10:34.468] - Field: 'packages' [13:10:34.468] - Field: 'gc' [13:10:34.469] - Field: 'conditions' [13:10:34.469] - Field: 'expr' [13:10:34.469] - Field: 'uuid' [13:10:34.469] - Field: 'seed' [13:10:34.469] - Field: 'version' [13:10:34.469] - Field: 'result' [13:10:34.470] - Field: 'asynchronous' [13:10:34.470] - Field: 'calls' [13:10:34.470] - Field: 'globals' [13:10:34.470] - Field: 'stdout' [13:10:34.470] - Field: 'earlySignal' [13:10:34.470] - Field: 'lazy' [13:10:34.471] - Field: 'state' [13:10:34.471] - Field: '.cluster' [13:10:34.471] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.471] - Launch lazy future ... [13:10:34.471] Packages needed by the future expression (n = 0): [13:10:34.472] Packages needed by future strategies (n = 0): [13:10:34.472] { [13:10:34.472] { [13:10:34.472] { [13:10:34.472] ...future.startTime <- base::Sys.time() [13:10:34.472] { [13:10:34.472] { [13:10:34.472] { [13:10:34.472] base::local({ [13:10:34.472] has_future <- base::requireNamespace("future", [13:10:34.472] quietly = TRUE) [13:10:34.472] if (has_future) { [13:10:34.472] ns <- base::getNamespace("future") [13:10:34.472] version <- ns[[".package"]][["version"]] [13:10:34.472] if (is.null(version)) [13:10:34.472] version <- utils::packageVersion("future") [13:10:34.472] } [13:10:34.472] else { [13:10:34.472] version <- NULL [13:10:34.472] } [13:10:34.472] if (!has_future || version < "1.8.0") { [13:10:34.472] info <- base::c(r_version = base::gsub("R version ", [13:10:34.472] "", base::R.version$version.string), [13:10:34.472] platform = base::sprintf("%s (%s-bit)", [13:10:34.472] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.472] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.472] "release", "version")], collapse = " "), [13:10:34.472] hostname = base::Sys.info()[["nodename"]]) [13:10:34.472] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.472] info) [13:10:34.472] info <- base::paste(info, collapse = "; ") [13:10:34.472] if (!has_future) { [13:10:34.472] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.472] info) [13:10:34.472] } [13:10:34.472] else { [13:10:34.472] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.472] info, version) [13:10:34.472] } [13:10:34.472] base::stop(msg) [13:10:34.472] } [13:10:34.472] }) [13:10:34.472] } [13:10:34.472] ...future.strategy.old <- future::plan("list") [13:10:34.472] options(future.plan = NULL) [13:10:34.472] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.472] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.472] } [13:10:34.472] ...future.workdir <- getwd() [13:10:34.472] } [13:10:34.472] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.472] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.472] } [13:10:34.472] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.472] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.472] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.472] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.472] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.472] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.472] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.472] base::names(...future.oldOptions)) [13:10:34.472] } [13:10:34.472] if (FALSE) { [13:10:34.472] } [13:10:34.472] else { [13:10:34.472] if (TRUE) { [13:10:34.472] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.472] open = "w") [13:10:34.472] } [13:10:34.472] else { [13:10:34.472] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.472] windows = "NUL", "/dev/null"), open = "w") [13:10:34.472] } [13:10:34.472] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.472] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.472] base::sink(type = "output", split = FALSE) [13:10:34.472] base::close(...future.stdout) [13:10:34.472] }, add = TRUE) [13:10:34.472] } [13:10:34.472] ...future.frame <- base::sys.nframe() [13:10:34.472] ...future.conditions <- base::list() [13:10:34.472] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.472] if (FALSE) { [13:10:34.472] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.472] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.472] } [13:10:34.472] ...future.result <- base::tryCatch({ [13:10:34.472] base::withCallingHandlers({ [13:10:34.472] ...future.value <- base::withVisible(base::local(42)) [13:10:34.472] future::FutureResult(value = ...future.value$value, [13:10:34.472] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.472] ...future.rng), globalenv = if (FALSE) [13:10:34.472] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.472] ...future.globalenv.names)) [13:10:34.472] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.472] }, condition = base::local({ [13:10:34.472] c <- base::c [13:10:34.472] inherits <- base::inherits [13:10:34.472] invokeRestart <- base::invokeRestart [13:10:34.472] length <- base::length [13:10:34.472] list <- base::list [13:10:34.472] seq.int <- base::seq.int [13:10:34.472] signalCondition <- base::signalCondition [13:10:34.472] sys.calls <- base::sys.calls [13:10:34.472] `[[` <- base::`[[` [13:10:34.472] `+` <- base::`+` [13:10:34.472] `<<-` <- base::`<<-` [13:10:34.472] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.472] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.472] 3L)] [13:10:34.472] } [13:10:34.472] function(cond) { [13:10:34.472] is_error <- inherits(cond, "error") [13:10:34.472] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.472] NULL) [13:10:34.472] if (is_error) { [13:10:34.472] sessionInformation <- function() { [13:10:34.472] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.472] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.472] search = base::search(), system = base::Sys.info()) [13:10:34.472] } [13:10:34.472] ...future.conditions[[length(...future.conditions) + [13:10:34.472] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.472] cond$call), session = sessionInformation(), [13:10:34.472] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.472] signalCondition(cond) [13:10:34.472] } [13:10:34.472] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.472] signal <- FALSE && inherits(cond, character(0)) [13:10:34.472] ...future.conditions[[length(...future.conditions) + [13:10:34.472] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.472] if (FALSE && !signal) { [13:10:34.472] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.472] { [13:10:34.472] inherits <- base::inherits [13:10:34.472] invokeRestart <- base::invokeRestart [13:10:34.472] is.null <- base::is.null [13:10:34.472] muffled <- FALSE [13:10:34.472] if (inherits(cond, "message")) { [13:10:34.472] muffled <- grepl(pattern, "muffleMessage") [13:10:34.472] if (muffled) [13:10:34.472] invokeRestart("muffleMessage") [13:10:34.472] } [13:10:34.472] else if (inherits(cond, "warning")) { [13:10:34.472] muffled <- grepl(pattern, "muffleWarning") [13:10:34.472] if (muffled) [13:10:34.472] invokeRestart("muffleWarning") [13:10:34.472] } [13:10:34.472] else if (inherits(cond, "condition")) { [13:10:34.472] if (!is.null(pattern)) { [13:10:34.472] computeRestarts <- base::computeRestarts [13:10:34.472] grepl <- base::grepl [13:10:34.472] restarts <- computeRestarts(cond) [13:10:34.472] for (restart in restarts) { [13:10:34.472] name <- restart$name [13:10:34.472] if (is.null(name)) [13:10:34.472] next [13:10:34.472] if (!grepl(pattern, name)) [13:10:34.472] next [13:10:34.472] invokeRestart(restart) [13:10:34.472] muffled <- TRUE [13:10:34.472] break [13:10:34.472] } [13:10:34.472] } [13:10:34.472] } [13:10:34.472] invisible(muffled) [13:10:34.472] } [13:10:34.472] muffleCondition(cond, pattern = "^muffle") [13:10:34.472] } [13:10:34.472] } [13:10:34.472] else { [13:10:34.472] if (TRUE) { [13:10:34.472] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.472] { [13:10:34.472] inherits <- base::inherits [13:10:34.472] invokeRestart <- base::invokeRestart [13:10:34.472] is.null <- base::is.null [13:10:34.472] muffled <- FALSE [13:10:34.472] if (inherits(cond, "message")) { [13:10:34.472] muffled <- grepl(pattern, "muffleMessage") [13:10:34.472] if (muffled) [13:10:34.472] invokeRestart("muffleMessage") [13:10:34.472] } [13:10:34.472] else if (inherits(cond, "warning")) { [13:10:34.472] muffled <- grepl(pattern, "muffleWarning") [13:10:34.472] if (muffled) [13:10:34.472] invokeRestart("muffleWarning") [13:10:34.472] } [13:10:34.472] else if (inherits(cond, "condition")) { [13:10:34.472] if (!is.null(pattern)) { [13:10:34.472] computeRestarts <- base::computeRestarts [13:10:34.472] grepl <- base::grepl [13:10:34.472] restarts <- computeRestarts(cond) [13:10:34.472] for (restart in restarts) { [13:10:34.472] name <- restart$name [13:10:34.472] if (is.null(name)) [13:10:34.472] next [13:10:34.472] if (!grepl(pattern, name)) [13:10:34.472] next [13:10:34.472] invokeRestart(restart) [13:10:34.472] muffled <- TRUE [13:10:34.472] break [13:10:34.472] } [13:10:34.472] } [13:10:34.472] } [13:10:34.472] invisible(muffled) [13:10:34.472] } [13:10:34.472] muffleCondition(cond, pattern = "^muffle") [13:10:34.472] } [13:10:34.472] } [13:10:34.472] } [13:10:34.472] })) [13:10:34.472] }, error = function(ex) { [13:10:34.472] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.472] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.472] ...future.rng), started = ...future.startTime, [13:10:34.472] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.472] version = "1.8"), class = "FutureResult") [13:10:34.472] }, finally = { [13:10:34.472] if (!identical(...future.workdir, getwd())) [13:10:34.472] setwd(...future.workdir) [13:10:34.472] { [13:10:34.472] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.472] ...future.oldOptions$nwarnings <- NULL [13:10:34.472] } [13:10:34.472] base::options(...future.oldOptions) [13:10:34.472] if (.Platform$OS.type == "windows") { [13:10:34.472] old_names <- names(...future.oldEnvVars) [13:10:34.472] envs <- base::Sys.getenv() [13:10:34.472] names <- names(envs) [13:10:34.472] common <- intersect(names, old_names) [13:10:34.472] added <- setdiff(names, old_names) [13:10:34.472] removed <- setdiff(old_names, names) [13:10:34.472] changed <- common[...future.oldEnvVars[common] != [13:10:34.472] envs[common]] [13:10:34.472] NAMES <- toupper(changed) [13:10:34.472] args <- list() [13:10:34.472] for (kk in seq_along(NAMES)) { [13:10:34.472] name <- changed[[kk]] [13:10:34.472] NAME <- NAMES[[kk]] [13:10:34.472] if (name != NAME && is.element(NAME, old_names)) [13:10:34.472] next [13:10:34.472] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.472] } [13:10:34.472] NAMES <- toupper(added) [13:10:34.472] for (kk in seq_along(NAMES)) { [13:10:34.472] name <- added[[kk]] [13:10:34.472] NAME <- NAMES[[kk]] [13:10:34.472] if (name != NAME && is.element(NAME, old_names)) [13:10:34.472] next [13:10:34.472] args[[name]] <- "" [13:10:34.472] } [13:10:34.472] NAMES <- toupper(removed) [13:10:34.472] for (kk in seq_along(NAMES)) { [13:10:34.472] name <- removed[[kk]] [13:10:34.472] NAME <- NAMES[[kk]] [13:10:34.472] if (name != NAME && is.element(NAME, old_names)) [13:10:34.472] next [13:10:34.472] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.472] } [13:10:34.472] if (length(args) > 0) [13:10:34.472] base::do.call(base::Sys.setenv, args = args) [13:10:34.472] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.472] } [13:10:34.472] else { [13:10:34.472] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.472] } [13:10:34.472] { [13:10:34.472] if (base::length(...future.futureOptionsAdded) > [13:10:34.472] 0L) { [13:10:34.472] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.472] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.472] base::options(opts) [13:10:34.472] } [13:10:34.472] { [13:10:34.472] NULL [13:10:34.472] options(future.plan = NULL) [13:10:34.472] if (is.na(NA_character_)) [13:10:34.472] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.472] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.472] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.472] .init = FALSE) [13:10:34.472] } [13:10:34.472] } [13:10:34.472] } [13:10:34.472] }) [13:10:34.472] if (TRUE) { [13:10:34.472] base::sink(type = "output", split = FALSE) [13:10:34.472] if (TRUE) { [13:10:34.472] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.472] } [13:10:34.472] else { [13:10:34.472] ...future.result["stdout"] <- base::list(NULL) [13:10:34.472] } [13:10:34.472] base::close(...future.stdout) [13:10:34.472] ...future.stdout <- NULL [13:10:34.472] } [13:10:34.472] ...future.result$conditions <- ...future.conditions [13:10:34.472] ...future.result$finished <- base::Sys.time() [13:10:34.472] ...future.result [13:10:34.472] } [13:10:34.476] - Launch lazy future ... done [13:10:34.476] run() for 'MiraiFuture' ... done MiraiFuture: Label: 'strategy_mirai_multisession' Expression: [1] 42 Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.477] resolved() for 'MiraiFuture' ... [13:10:34.477] - state: 'running' [13:10:34.477] - run: TRUE [13:10:34.477] - result: 'NULL' [13:10:34.477] - resolved: FALSE [13:10:34.477] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.478] getGlobalsAndPackages() ... [13:10:34.478] Searching for globals... [13:10:34.479] - globals found: [1] '{' [13:10:34.479] Searching for globals ... DONE [13:10:34.479] Resolving globals: FALSE [13:10:34.480] [13:10:34.480] [13:10:34.480] getGlobalsAndPackages() ... DONE [13:10:34.480] run() for 'Future' ... [13:10:34.480] - state: 'created' [13:10:34.481] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:34.483] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.483] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:34.483] - Field: 'label' [13:10:34.483] - Field: 'local' [13:10:34.483] - Field: 'owner' [13:10:34.484] - Field: 'envir' [13:10:34.484] - Field: 'packages' [13:10:34.484] - Field: 'gc' [13:10:34.484] - Field: 'conditions' [13:10:34.484] - Field: 'expr' [13:10:34.484] - Field: 'uuid' [13:10:34.485] - Field: 'seed' [13:10:34.485] - Field: 'version' [13:10:34.485] - Field: 'result' [13:10:34.485] - Field: 'asynchronous' [13:10:34.485] - Field: 'calls' [13:10:34.486] - Field: 'globals' [13:10:34.486] - Field: 'stdout' [13:10:34.486] - Field: 'earlySignal' [13:10:34.486] - Field: 'lazy' [13:10:34.486] - Field: 'state' [13:10:34.487] - Field: '.cluster' [13:10:34.488] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:34.488] - Launch lazy future ... [13:10:34.488] Packages needed by the future expression (n = 0): [13:10:34.488] Packages needed by future strategies (n = 0): [13:10:34.489] { [13:10:34.489] { [13:10:34.489] { [13:10:34.489] ...future.startTime <- base::Sys.time() [13:10:34.489] { [13:10:34.489] { [13:10:34.489] { [13:10:34.489] base::local({ [13:10:34.489] has_future <- base::requireNamespace("future", [13:10:34.489] quietly = TRUE) [13:10:34.489] if (has_future) { [13:10:34.489] ns <- base::getNamespace("future") [13:10:34.489] version <- ns[[".package"]][["version"]] [13:10:34.489] if (is.null(version)) [13:10:34.489] version <- utils::packageVersion("future") [13:10:34.489] } [13:10:34.489] else { [13:10:34.489] version <- NULL [13:10:34.489] } [13:10:34.489] if (!has_future || version < "1.8.0") { [13:10:34.489] info <- base::c(r_version = base::gsub("R version ", [13:10:34.489] "", base::R.version$version.string), [13:10:34.489] platform = base::sprintf("%s (%s-bit)", [13:10:34.489] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:34.489] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:34.489] "release", "version")], collapse = " "), [13:10:34.489] hostname = base::Sys.info()[["nodename"]]) [13:10:34.489] info <- base::sprintf("%s: %s", base::names(info), [13:10:34.489] info) [13:10:34.489] info <- base::paste(info, collapse = "; ") [13:10:34.489] if (!has_future) { [13:10:34.489] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:34.489] info) [13:10:34.489] } [13:10:34.489] else { [13:10:34.489] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:34.489] info, version) [13:10:34.489] } [13:10:34.489] base::stop(msg) [13:10:34.489] } [13:10:34.489] }) [13:10:34.489] } [13:10:34.489] ...future.strategy.old <- future::plan("list") [13:10:34.489] options(future.plan = NULL) [13:10:34.489] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.489] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:34.489] } [13:10:34.489] ...future.workdir <- getwd() [13:10:34.489] } [13:10:34.489] ...future.oldOptions <- base::as.list(base::.Options) [13:10:34.489] ...future.oldEnvVars <- base::Sys.getenv() [13:10:34.489] } [13:10:34.489] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:34.489] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:34.489] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:34.489] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:34.489] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:34.489] future.stdout.windows.reencode = NULL, width = 80L) [13:10:34.489] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:34.489] base::names(...future.oldOptions)) [13:10:34.489] } [13:10:34.489] if (FALSE) { [13:10:34.489] } [13:10:34.489] else { [13:10:34.489] if (TRUE) { [13:10:34.489] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:34.489] open = "w") [13:10:34.489] } [13:10:34.489] else { [13:10:34.489] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:34.489] windows = "NUL", "/dev/null"), open = "w") [13:10:34.489] } [13:10:34.489] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:34.489] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:34.489] base::sink(type = "output", split = FALSE) [13:10:34.489] base::close(...future.stdout) [13:10:34.489] }, add = TRUE) [13:10:34.489] } [13:10:34.489] ...future.frame <- base::sys.nframe() [13:10:34.489] ...future.conditions <- base::list() [13:10:34.489] ...future.rng <- base::globalenv()$.Random.seed [13:10:34.489] if (FALSE) { [13:10:34.489] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:34.489] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:34.489] } [13:10:34.489] ...future.result <- base::tryCatch({ [13:10:34.489] base::withCallingHandlers({ [13:10:34.489] ...future.value <- base::withVisible(base::local({ [13:10:34.489] 42 [13:10:34.489] })) [13:10:34.489] future::FutureResult(value = ...future.value$value, [13:10:34.489] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.489] ...future.rng), globalenv = if (FALSE) [13:10:34.489] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:34.489] ...future.globalenv.names)) [13:10:34.489] else NULL, started = ...future.startTime, version = "1.8") [13:10:34.489] }, condition = base::local({ [13:10:34.489] c <- base::c [13:10:34.489] inherits <- base::inherits [13:10:34.489] invokeRestart <- base::invokeRestart [13:10:34.489] length <- base::length [13:10:34.489] list <- base::list [13:10:34.489] seq.int <- base::seq.int [13:10:34.489] signalCondition <- base::signalCondition [13:10:34.489] sys.calls <- base::sys.calls [13:10:34.489] `[[` <- base::`[[` [13:10:34.489] `+` <- base::`+` [13:10:34.489] `<<-` <- base::`<<-` [13:10:34.489] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:34.489] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:34.489] 3L)] [13:10:34.489] } [13:10:34.489] function(cond) { [13:10:34.489] is_error <- inherits(cond, "error") [13:10:34.489] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:34.489] NULL) [13:10:34.489] if (is_error) { [13:10:34.489] sessionInformation <- function() { [13:10:34.489] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:34.489] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:34.489] search = base::search(), system = base::Sys.info()) [13:10:34.489] } [13:10:34.489] ...future.conditions[[length(...future.conditions) + [13:10:34.489] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:34.489] cond$call), session = sessionInformation(), [13:10:34.489] timestamp = base::Sys.time(), signaled = 0L) [13:10:34.489] signalCondition(cond) [13:10:34.489] } [13:10:34.489] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:34.489] signal <- FALSE && inherits(cond, character(0)) [13:10:34.489] ...future.conditions[[length(...future.conditions) + [13:10:34.489] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:34.489] if (FALSE && !signal) { [13:10:34.489] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.489] { [13:10:34.489] inherits <- base::inherits [13:10:34.489] invokeRestart <- base::invokeRestart [13:10:34.489] is.null <- base::is.null [13:10:34.489] muffled <- FALSE [13:10:34.489] if (inherits(cond, "message")) { [13:10:34.489] muffled <- grepl(pattern, "muffleMessage") [13:10:34.489] if (muffled) [13:10:34.489] invokeRestart("muffleMessage") [13:10:34.489] } [13:10:34.489] else if (inherits(cond, "warning")) { [13:10:34.489] muffled <- grepl(pattern, "muffleWarning") [13:10:34.489] if (muffled) [13:10:34.489] invokeRestart("muffleWarning") [13:10:34.489] } [13:10:34.489] else if (inherits(cond, "condition")) { [13:10:34.489] if (!is.null(pattern)) { [13:10:34.489] computeRestarts <- base::computeRestarts [13:10:34.489] grepl <- base::grepl [13:10:34.489] restarts <- computeRestarts(cond) [13:10:34.489] for (restart in restarts) { [13:10:34.489] name <- restart$name [13:10:34.489] if (is.null(name)) [13:10:34.489] next [13:10:34.489] if (!grepl(pattern, name)) [13:10:34.489] next [13:10:34.489] invokeRestart(restart) [13:10:34.489] muffled <- TRUE [13:10:34.489] break [13:10:34.489] } [13:10:34.489] } [13:10:34.489] } [13:10:34.489] invisible(muffled) [13:10:34.489] } [13:10:34.489] muffleCondition(cond, pattern = "^muffle") [13:10:34.489] } [13:10:34.489] } [13:10:34.489] else { [13:10:34.489] if (TRUE) { [13:10:34.489] muffleCondition <- function (cond, pattern = "^muffle") [13:10:34.489] { [13:10:34.489] inherits <- base::inherits [13:10:34.489] invokeRestart <- base::invokeRestart [13:10:34.489] is.null <- base::is.null [13:10:34.489] muffled <- FALSE [13:10:34.489] if (inherits(cond, "message")) { [13:10:34.489] muffled <- grepl(pattern, "muffleMessage") [13:10:34.489] if (muffled) [13:10:34.489] invokeRestart("muffleMessage") [13:10:34.489] } [13:10:34.489] else if (inherits(cond, "warning")) { [13:10:34.489] muffled <- grepl(pattern, "muffleWarning") [13:10:34.489] if (muffled) [13:10:34.489] invokeRestart("muffleWarning") [13:10:34.489] } [13:10:34.489] else if (inherits(cond, "condition")) { [13:10:34.489] if (!is.null(pattern)) { [13:10:34.489] computeRestarts <- base::computeRestarts [13:10:34.489] grepl <- base::grepl [13:10:34.489] restarts <- computeRestarts(cond) [13:10:34.489] for (restart in restarts) { [13:10:34.489] name <- restart$name [13:10:34.489] if (is.null(name)) [13:10:34.489] next [13:10:34.489] if (!grepl(pattern, name)) [13:10:34.489] next [13:10:34.489] invokeRestart(restart) [13:10:34.489] muffled <- TRUE [13:10:34.489] break [13:10:34.489] } [13:10:34.489] } [13:10:34.489] } [13:10:34.489] invisible(muffled) [13:10:34.489] } [13:10:34.489] muffleCondition(cond, pattern = "^muffle") [13:10:34.489] } [13:10:34.489] } [13:10:34.489] } [13:10:34.489] })) [13:10:34.489] }, error = function(ex) { [13:10:34.489] base::structure(base::list(value = NULL, visible = NULL, [13:10:34.489] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:34.489] ...future.rng), started = ...future.startTime, [13:10:34.489] finished = Sys.time(), session_uuid = NA_character_, [13:10:34.489] version = "1.8"), class = "FutureResult") [13:10:34.489] }, finally = { [13:10:34.489] if (!identical(...future.workdir, getwd())) [13:10:34.489] setwd(...future.workdir) [13:10:34.489] { [13:10:34.489] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:34.489] ...future.oldOptions$nwarnings <- NULL [13:10:34.489] } [13:10:34.489] base::options(...future.oldOptions) [13:10:34.489] if (.Platform$OS.type == "windows") { [13:10:34.489] old_names <- names(...future.oldEnvVars) [13:10:34.489] envs <- base::Sys.getenv() [13:10:34.489] names <- names(envs) [13:10:34.489] common <- intersect(names, old_names) [13:10:34.489] added <- setdiff(names, old_names) [13:10:34.489] removed <- setdiff(old_names, names) [13:10:34.489] changed <- common[...future.oldEnvVars[common] != [13:10:34.489] envs[common]] [13:10:34.489] NAMES <- toupper(changed) [13:10:34.489] args <- list() [13:10:34.489] for (kk in seq_along(NAMES)) { [13:10:34.489] name <- changed[[kk]] [13:10:34.489] NAME <- NAMES[[kk]] [13:10:34.489] if (name != NAME && is.element(NAME, old_names)) [13:10:34.489] next [13:10:34.489] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.489] } [13:10:34.489] NAMES <- toupper(added) [13:10:34.489] for (kk in seq_along(NAMES)) { [13:10:34.489] name <- added[[kk]] [13:10:34.489] NAME <- NAMES[[kk]] [13:10:34.489] if (name != NAME && is.element(NAME, old_names)) [13:10:34.489] next [13:10:34.489] args[[name]] <- "" [13:10:34.489] } [13:10:34.489] NAMES <- toupper(removed) [13:10:34.489] for (kk in seq_along(NAMES)) { [13:10:34.489] name <- removed[[kk]] [13:10:34.489] NAME <- NAMES[[kk]] [13:10:34.489] if (name != NAME && is.element(NAME, old_names)) [13:10:34.489] next [13:10:34.489] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:34.489] } [13:10:34.489] if (length(args) > 0) [13:10:34.489] base::do.call(base::Sys.setenv, args = args) [13:10:34.489] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:34.489] } [13:10:34.489] else { [13:10:34.489] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:34.489] } [13:10:34.489] { [13:10:34.489] if (base::length(...future.futureOptionsAdded) > [13:10:34.489] 0L) { [13:10:34.489] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:34.489] base::names(opts) <- ...future.futureOptionsAdded [13:10:34.489] base::options(opts) [13:10:34.489] } [13:10:34.489] { [13:10:34.489] NULL [13:10:34.489] options(future.plan = NULL) [13:10:34.489] if (is.na(NA_character_)) [13:10:34.489] Sys.unsetenv("R_FUTURE_PLAN") [13:10:34.489] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:34.489] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:34.489] .init = FALSE) [13:10:34.489] } [13:10:34.489] } [13:10:34.489] } [13:10:34.489] }) [13:10:34.489] if (TRUE) { [13:10:34.489] base::sink(type = "output", split = FALSE) [13:10:34.489] if (TRUE) { [13:10:34.489] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:34.489] } [13:10:34.489] else { [13:10:34.489] ...future.result["stdout"] <- base::list(NULL) [13:10:34.489] } [13:10:34.489] base::close(...future.stdout) [13:10:34.489] ...future.stdout <- NULL [13:10:34.489] } [13:10:34.489] ...future.result$conditions <- ...future.conditions [13:10:34.489] ...future.result$finished <- base::Sys.time() [13:10:34.489] ...future.result [13:10:34.489] } [13:10:34.492] - Launch lazy future ... done [13:10:34.492] run() for 'MiraiFuture' ... done MiraiFuture: Label: 'strategy_mirai_multisession' Expression: { 42 } Lazy evaluation: FALSE Asynchronous evaluation: TRUE Local evaluation: TRUE Environment: R_GlobalEnv Capture standard output: TRUE Capture condition classes: 'condition' (excluding 'nothing') Globals: Packages: L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:10:34.493] resolved() for 'MiraiFuture' ... [13:10:34.493] - state: 'running' [13:10:34.494] - run: TRUE [13:10:34.494] - result: 'NULL' [13:10:34.494] - resolved: FALSE [13:10:34.494] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 3edf8ee3-f338-75bf-70e8-577baef6a3e7 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:34.494] - plan('mirai_multisession') ... DONE> > message("*** Futures - labels ... DONE") *** Futures - labels ... DONE > > source("incl/end.R") > > proc.time() user system elapsed 0.43 0.10 1.00