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:30:34.646] plan(): Setting new future strategy stack: [13:30:34.647] List of future strategies: [13:30:34.647] 1. mirai_multisession: [13:30:34.647] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:30:34.647] - tweaked: FALSE [13:30:34.647] - call: future::plan(future.mirai::mirai_multisession) [13:30:34.659] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:30:34.660] < mirai | $data > [13:30:34.664] getGlobalsAndPackages() ... [13:30:34.665] Not searching for globals [13:30:34.665] - globals: [0] [13:30:34.665] getGlobalsAndPackages() ... DONE [13:30:34.666] getGlobalsAndPackages() ... [13:30:34.666] [13:30:34.666] - globals: [0] [13:30:34.666] getGlobalsAndPackages() ... DONE [13:30:34.942] Packages needed by the future expression (n = 0): [13:30:34.942] Packages needed by future strategies (n = 0): [13:30:34.943] { [13:30:34.943] { [13:30:34.943] { [13:30:34.943] ...future.startTime <- base::Sys.time() [13:30:34.943] { [13:30:34.943] { [13:30:34.943] { [13:30:34.943] base::local({ [13:30:34.943] has_future <- base::requireNamespace("future", [13:30:34.943] quietly = TRUE) [13:30:34.943] if (has_future) { [13:30:34.943] ns <- base::getNamespace("future") [13:30:34.943] version <- ns[[".package"]][["version"]] [13:30:34.943] if (is.null(version)) [13:30:34.943] version <- utils::packageVersion("future") [13:30:34.943] } [13:30:34.943] else { [13:30:34.943] version <- NULL [13:30:34.943] } [13:30:34.943] if (!has_future || version < "1.8.0") { [13:30:34.943] info <- base::c(r_version = base::gsub("R version ", [13:30:34.943] "", base::R.version$version.string), [13:30:34.943] platform = base::sprintf("%s (%s-bit)", [13:30:34.943] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:34.943] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:34.943] "release", "version")], collapse = " "), [13:30:34.943] hostname = base::Sys.info()[["nodename"]]) [13:30:34.943] info <- base::sprintf("%s: %s", base::names(info), [13:30:34.943] info) [13:30:34.943] info <- base::paste(info, collapse = "; ") [13:30:34.943] if (!has_future) { [13:30:34.943] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:34.943] info) [13:30:34.943] } [13:30:34.943] else { [13:30:34.943] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:34.943] info, version) [13:30:34.943] } [13:30:34.943] base::stop(msg) [13:30:34.943] } [13:30:34.943] }) [13:30:34.943] } [13:30:34.943] ...future.strategy.old <- future::plan("list") [13:30:34.943] options(future.plan = NULL) [13:30:34.943] Sys.unsetenv("R_FUTURE_PLAN") [13:30:34.943] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:34.943] } [13:30:34.943] ...future.workdir <- getwd() [13:30:34.943] } [13:30:34.943] ...future.oldOptions <- base::as.list(base::.Options) [13:30:34.943] ...future.oldEnvVars <- base::Sys.getenv() [13:30:34.943] } [13:30:34.943] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:34.943] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:34.943] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:34.943] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:34.943] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:34.943] future.stdout.windows.reencode = NULL, width = 80L) [13:30:34.943] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:34.943] base::names(...future.oldOptions)) [13:30:34.943] } [13:30:34.943] if (FALSE) { [13:30:34.943] } [13:30:34.943] else { [13:30:34.943] if (TRUE) { [13:30:34.943] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:34.943] open = "w") [13:30:34.943] } [13:30:34.943] else { [13:30:34.943] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:34.943] windows = "NUL", "/dev/null"), open = "w") [13:30:34.943] } [13:30:34.943] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:34.943] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:34.943] base::sink(type = "output", split = FALSE) [13:30:34.943] base::close(...future.stdout) [13:30:34.943] }, add = TRUE) [13:30:34.943] } [13:30:34.943] ...future.frame <- base::sys.nframe() [13:30:34.943] ...future.conditions <- base::list() [13:30:34.943] ...future.rng <- base::globalenv()$.Random.seed [13:30:34.943] if (FALSE) { [13:30:34.943] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:34.943] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:34.943] } [13:30:34.943] ...future.result <- base::tryCatch({ [13:30:34.943] base::withCallingHandlers({ [13:30:34.943] ...future.value <- base::withVisible(base::local(NA)) [13:30:34.943] future::FutureResult(value = ...future.value$value, [13:30:34.943] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:34.943] ...future.rng), globalenv = if (FALSE) [13:30:34.943] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:34.943] ...future.globalenv.names)) [13:30:34.943] else NULL, started = ...future.startTime, version = "1.8") [13:30:34.943] }, condition = base::local({ [13:30:34.943] c <- base::c [13:30:34.943] inherits <- base::inherits [13:30:34.943] invokeRestart <- base::invokeRestart [13:30:34.943] length <- base::length [13:30:34.943] list <- base::list [13:30:34.943] seq.int <- base::seq.int [13:30:34.943] signalCondition <- base::signalCondition [13:30:34.943] sys.calls <- base::sys.calls [13:30:34.943] `[[` <- base::`[[` [13:30:34.943] `+` <- base::`+` [13:30:34.943] `<<-` <- base::`<<-` [13:30:34.943] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:34.943] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:34.943] 3L)] [13:30:34.943] } [13:30:34.943] function(cond) { [13:30:34.943] is_error <- inherits(cond, "error") [13:30:34.943] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:34.943] NULL) [13:30:34.943] if (is_error) { [13:30:34.943] sessionInformation <- function() { [13:30:34.943] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:34.943] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:34.943] search = base::search(), system = base::Sys.info()) [13:30:34.943] } [13:30:34.943] ...future.conditions[[length(...future.conditions) + [13:30:34.943] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:34.943] cond$call), session = sessionInformation(), [13:30:34.943] timestamp = base::Sys.time(), signaled = 0L) [13:30:34.943] signalCondition(cond) [13:30:34.943] } [13:30:34.943] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:34.943] signal <- FALSE && inherits(cond, character(0)) [13:30:34.943] ...future.conditions[[length(...future.conditions) + [13:30:34.943] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:34.943] if (FALSE && !signal) { [13:30:34.943] muffleCondition <- function (cond, pattern = "^muffle") [13:30:34.943] { [13:30:34.943] inherits <- base::inherits [13:30:34.943] invokeRestart <- base::invokeRestart [13:30:34.943] is.null <- base::is.null [13:30:34.943] muffled <- FALSE [13:30:34.943] if (inherits(cond, "message")) { [13:30:34.943] muffled <- grepl(pattern, "muffleMessage") [13:30:34.943] if (muffled) [13:30:34.943] invokeRestart("muffleMessage") [13:30:34.943] } [13:30:34.943] else if (inherits(cond, "warning")) { [13:30:34.943] muffled <- grepl(pattern, "muffleWarning") [13:30:34.943] if (muffled) [13:30:34.943] invokeRestart("muffleWarning") [13:30:34.943] } [13:30:34.943] else if (inherits(cond, "condition")) { [13:30:34.943] if (!is.null(pattern)) { [13:30:34.943] computeRestarts <- base::computeRestarts [13:30:34.943] grepl <- base::grepl [13:30:34.943] restarts <- computeRestarts(cond) [13:30:34.943] for (restart in restarts) { [13:30:34.943] name <- restart$name [13:30:34.943] if (is.null(name)) [13:30:34.943] next [13:30:34.943] if (!grepl(pattern, name)) [13:30:34.943] next [13:30:34.943] invokeRestart(restart) [13:30:34.943] muffled <- TRUE [13:30:34.943] break [13:30:34.943] } [13:30:34.943] } [13:30:34.943] } [13:30:34.943] invisible(muffled) [13:30:34.943] } [13:30:34.943] muffleCondition(cond, pattern = "^muffle") [13:30:34.943] } [13:30:34.943] } [13:30:34.943] else { [13:30:34.943] if (TRUE) { [13:30:34.943] muffleCondition <- function (cond, pattern = "^muffle") [13:30:34.943] { [13:30:34.943] inherits <- base::inherits [13:30:34.943] invokeRestart <- base::invokeRestart [13:30:34.943] is.null <- base::is.null [13:30:34.943] muffled <- FALSE [13:30:34.943] if (inherits(cond, "message")) { [13:30:34.943] muffled <- grepl(pattern, "muffleMessage") [13:30:34.943] if (muffled) [13:30:34.943] invokeRestart("muffleMessage") [13:30:34.943] } [13:30:34.943] else if (inherits(cond, "warning")) { [13:30:34.943] muffled <- grepl(pattern, "muffleWarning") [13:30:34.943] if (muffled) [13:30:34.943] invokeRestart("muffleWarning") [13:30:34.943] } [13:30:34.943] else if (inherits(cond, "condition")) { [13:30:34.943] if (!is.null(pattern)) { [13:30:34.943] computeRestarts <- base::computeRestarts [13:30:34.943] grepl <- base::grepl [13:30:34.943] restarts <- computeRestarts(cond) [13:30:34.943] for (restart in restarts) { [13:30:34.943] name <- restart$name [13:30:34.943] if (is.null(name)) [13:30:34.943] next [13:30:34.943] if (!grepl(pattern, name)) [13:30:34.943] next [13:30:34.943] invokeRestart(restart) [13:30:34.943] muffled <- TRUE [13:30:34.943] break [13:30:34.943] } [13:30:34.943] } [13:30:34.943] } [13:30:34.943] invisible(muffled) [13:30:34.943] } [13:30:34.943] muffleCondition(cond, pattern = "^muffle") [13:30:34.943] } [13:30:34.943] } [13:30:34.943] } [13:30:34.943] })) [13:30:34.943] }, error = function(ex) { [13:30:34.943] base::structure(base::list(value = NULL, visible = NULL, [13:30:34.943] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:34.943] ...future.rng), started = ...future.startTime, [13:30:34.943] finished = Sys.time(), session_uuid = NA_character_, [13:30:34.943] version = "1.8"), class = "FutureResult") [13:30:34.943] }, finally = { [13:30:34.943] if (!identical(...future.workdir, getwd())) [13:30:34.943] setwd(...future.workdir) [13:30:34.943] { [13:30:34.943] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:34.943] ...future.oldOptions$nwarnings <- NULL [13:30:34.943] } [13:30:34.943] base::options(...future.oldOptions) [13:30:34.943] if (.Platform$OS.type == "windows") { [13:30:34.943] old_names <- names(...future.oldEnvVars) [13:30:34.943] envs <- base::Sys.getenv() [13:30:34.943] names <- names(envs) [13:30:34.943] common <- intersect(names, old_names) [13:30:34.943] added <- setdiff(names, old_names) [13:30:34.943] removed <- setdiff(old_names, names) [13:30:34.943] changed <- common[...future.oldEnvVars[common] != [13:30:34.943] envs[common]] [13:30:34.943] NAMES <- toupper(changed) [13:30:34.943] args <- list() [13:30:34.943] for (kk in seq_along(NAMES)) { [13:30:34.943] name <- changed[[kk]] [13:30:34.943] NAME <- NAMES[[kk]] [13:30:34.943] if (name != NAME && is.element(NAME, old_names)) [13:30:34.943] next [13:30:34.943] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:34.943] } [13:30:34.943] NAMES <- toupper(added) [13:30:34.943] for (kk in seq_along(NAMES)) { [13:30:34.943] name <- added[[kk]] [13:30:34.943] NAME <- NAMES[[kk]] [13:30:34.943] if (name != NAME && is.element(NAME, old_names)) [13:30:34.943] next [13:30:34.943] args[[name]] <- "" [13:30:34.943] } [13:30:34.943] NAMES <- toupper(removed) [13:30:34.943] for (kk in seq_along(NAMES)) { [13:30:34.943] name <- removed[[kk]] [13:30:34.943] NAME <- NAMES[[kk]] [13:30:34.943] if (name != NAME && is.element(NAME, old_names)) [13:30:34.943] next [13:30:34.943] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:34.943] } [13:30:34.943] if (length(args) > 0) [13:30:34.943] base::do.call(base::Sys.setenv, args = args) [13:30:34.943] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:34.943] } [13:30:34.943] else { [13:30:34.943] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:34.943] } [13:30:34.943] { [13:30:34.943] if (base::length(...future.futureOptionsAdded) > [13:30:34.943] 0L) { [13:30:34.943] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:34.943] base::names(opts) <- ...future.futureOptionsAdded [13:30:34.943] base::options(opts) [13:30:34.943] } [13:30:34.943] { [13:30:34.943] NULL [13:30:34.943] options(future.plan = NULL) [13:30:34.943] if (is.na(NA_character_)) [13:30:34.943] Sys.unsetenv("R_FUTURE_PLAN") [13:30:34.943] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:34.943] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:34.943] .init = FALSE) [13:30:34.943] } [13:30:34.943] } [13:30:34.943] } [13:30:34.943] }) [13:30:34.943] if (TRUE) { [13:30:34.943] base::sink(type = "output", split = FALSE) [13:30:34.943] if (TRUE) { [13:30:34.943] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:34.943] } [13:30:34.943] else { [13:30:34.943] ...future.result["stdout"] <- base::list(NULL) [13:30:34.943] } [13:30:34.943] base::close(...future.stdout) [13:30:34.943] ...future.stdout <- NULL [13:30:34.943] } [13:30:34.943] ...future.result$conditions <- ...future.conditions [13:30:34.943] ...future.result$finished <- base::Sys.time() [13:30:34.943] ...future.result [13:30:34.943] } [13:30:35.044] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:30:35.045] 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:30:35.061] - plan('mirai_cluster') ...[13:30:35.061] plan(): Setting new future strategy stack: [13:30:35.062] List of future strategies: [13:30:35.062] 1. mirai_cluster: [13:30:35.062] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = "") [13:30:35.062] - tweaked: FALSE [13:30:35.062] - call: plan(strategy) [13:30:35.076] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:30:35.076] < mirai | $data > [13:30:35.076] getGlobalsAndPackages() ... [13:30:35.076] Not searching for globals [13:30:35.077] - globals: [0] [13:30:35.077] getGlobalsAndPackages() ... DONE [13:30:35.077] getGlobalsAndPackages() ... [13:30:35.077] [13:30:35.077] - globals: [0] [13:30:35.077] getGlobalsAndPackages() ... DONE [13:30:35.078] Packages needed by the future expression (n = 0): [13:30:35.078] Packages needed by future strategies (n = 0): [13:30:35.078] { [13:30:35.078] { [13:30:35.078] { [13:30:35.078] ...future.startTime <- base::Sys.time() [13:30:35.078] { [13:30:35.078] { [13:30:35.078] { [13:30:35.078] base::local({ [13:30:35.078] has_future <- base::requireNamespace("future", [13:30:35.078] quietly = TRUE) [13:30:35.078] if (has_future) { [13:30:35.078] ns <- base::getNamespace("future") [13:30:35.078] version <- ns[[".package"]][["version"]] [13:30:35.078] if (is.null(version)) [13:30:35.078] version <- utils::packageVersion("future") [13:30:35.078] } [13:30:35.078] else { [13:30:35.078] version <- NULL [13:30:35.078] } [13:30:35.078] if (!has_future || version < "1.8.0") { [13:30:35.078] info <- base::c(r_version = base::gsub("R version ", [13:30:35.078] "", base::R.version$version.string), [13:30:35.078] platform = base::sprintf("%s (%s-bit)", [13:30:35.078] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.078] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.078] "release", "version")], collapse = " "), [13:30:35.078] hostname = base::Sys.info()[["nodename"]]) [13:30:35.078] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.078] info) [13:30:35.078] info <- base::paste(info, collapse = "; ") [13:30:35.078] if (!has_future) { [13:30:35.078] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.078] info) [13:30:35.078] } [13:30:35.078] else { [13:30:35.078] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.078] info, version) [13:30:35.078] } [13:30:35.078] base::stop(msg) [13:30:35.078] } [13:30:35.078] }) [13:30:35.078] } [13:30:35.078] ...future.strategy.old <- future::plan("list") [13:30:35.078] options(future.plan = NULL) [13:30:35.078] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.078] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.078] } [13:30:35.078] ...future.workdir <- getwd() [13:30:35.078] } [13:30:35.078] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.078] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.078] } [13:30:35.078] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.078] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.078] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.078] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.078] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.078] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.078] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.078] base::names(...future.oldOptions)) [13:30:35.078] } [13:30:35.078] if (FALSE) { [13:30:35.078] } [13:30:35.078] else { [13:30:35.078] if (TRUE) { [13:30:35.078] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.078] open = "w") [13:30:35.078] } [13:30:35.078] else { [13:30:35.078] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.078] windows = "NUL", "/dev/null"), open = "w") [13:30:35.078] } [13:30:35.078] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.078] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.078] base::sink(type = "output", split = FALSE) [13:30:35.078] base::close(...future.stdout) [13:30:35.078] }, add = TRUE) [13:30:35.078] } [13:30:35.078] ...future.frame <- base::sys.nframe() [13:30:35.078] ...future.conditions <- base::list() [13:30:35.078] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.078] if (FALSE) { [13:30:35.078] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.078] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.078] } [13:30:35.078] ...future.result <- base::tryCatch({ [13:30:35.078] base::withCallingHandlers({ [13:30:35.078] ...future.value <- base::withVisible(base::local(NA)) [13:30:35.078] future::FutureResult(value = ...future.value$value, [13:30:35.078] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.078] ...future.rng), globalenv = if (FALSE) [13:30:35.078] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.078] ...future.globalenv.names)) [13:30:35.078] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.078] }, condition = base::local({ [13:30:35.078] c <- base::c [13:30:35.078] inherits <- base::inherits [13:30:35.078] invokeRestart <- base::invokeRestart [13:30:35.078] length <- base::length [13:30:35.078] list <- base::list [13:30:35.078] seq.int <- base::seq.int [13:30:35.078] signalCondition <- base::signalCondition [13:30:35.078] sys.calls <- base::sys.calls [13:30:35.078] `[[` <- base::`[[` [13:30:35.078] `+` <- base::`+` [13:30:35.078] `<<-` <- base::`<<-` [13:30:35.078] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.078] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.078] 3L)] [13:30:35.078] } [13:30:35.078] function(cond) { [13:30:35.078] is_error <- inherits(cond, "error") [13:30:35.078] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.078] NULL) [13:30:35.078] if (is_error) { [13:30:35.078] sessionInformation <- function() { [13:30:35.078] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.078] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.078] search = base::search(), system = base::Sys.info()) [13:30:35.078] } [13:30:35.078] ...future.conditions[[length(...future.conditions) + [13:30:35.078] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.078] cond$call), session = sessionInformation(), [13:30:35.078] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.078] signalCondition(cond) [13:30:35.078] } [13:30:35.078] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.078] signal <- FALSE && inherits(cond, character(0)) [13:30:35.078] ...future.conditions[[length(...future.conditions) + [13:30:35.078] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.078] if (FALSE && !signal) { [13:30:35.078] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.078] { [13:30:35.078] inherits <- base::inherits [13:30:35.078] invokeRestart <- base::invokeRestart [13:30:35.078] is.null <- base::is.null [13:30:35.078] muffled <- FALSE [13:30:35.078] if (inherits(cond, "message")) { [13:30:35.078] muffled <- grepl(pattern, "muffleMessage") [13:30:35.078] if (muffled) [13:30:35.078] invokeRestart("muffleMessage") [13:30:35.078] } [13:30:35.078] else if (inherits(cond, "warning")) { [13:30:35.078] muffled <- grepl(pattern, "muffleWarning") [13:30:35.078] if (muffled) [13:30:35.078] invokeRestart("muffleWarning") [13:30:35.078] } [13:30:35.078] else if (inherits(cond, "condition")) { [13:30:35.078] if (!is.null(pattern)) { [13:30:35.078] computeRestarts <- base::computeRestarts [13:30:35.078] grepl <- base::grepl [13:30:35.078] restarts <- computeRestarts(cond) [13:30:35.078] for (restart in restarts) { [13:30:35.078] name <- restart$name [13:30:35.078] if (is.null(name)) [13:30:35.078] next [13:30:35.078] if (!grepl(pattern, name)) [13:30:35.078] next [13:30:35.078] invokeRestart(restart) [13:30:35.078] muffled <- TRUE [13:30:35.078] break [13:30:35.078] } [13:30:35.078] } [13:30:35.078] } [13:30:35.078] invisible(muffled) [13:30:35.078] } [13:30:35.078] muffleCondition(cond, pattern = "^muffle") [13:30:35.078] } [13:30:35.078] } [13:30:35.078] else { [13:30:35.078] if (TRUE) { [13:30:35.078] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.078] { [13:30:35.078] inherits <- base::inherits [13:30:35.078] invokeRestart <- base::invokeRestart [13:30:35.078] is.null <- base::is.null [13:30:35.078] muffled <- FALSE [13:30:35.078] if (inherits(cond, "message")) { [13:30:35.078] muffled <- grepl(pattern, "muffleMessage") [13:30:35.078] if (muffled) [13:30:35.078] invokeRestart("muffleMessage") [13:30:35.078] } [13:30:35.078] else if (inherits(cond, "warning")) { [13:30:35.078] muffled <- grepl(pattern, "muffleWarning") [13:30:35.078] if (muffled) [13:30:35.078] invokeRestart("muffleWarning") [13:30:35.078] } [13:30:35.078] else if (inherits(cond, "condition")) { [13:30:35.078] if (!is.null(pattern)) { [13:30:35.078] computeRestarts <- base::computeRestarts [13:30:35.078] grepl <- base::grepl [13:30:35.078] restarts <- computeRestarts(cond) [13:30:35.078] for (restart in restarts) { [13:30:35.078] name <- restart$name [13:30:35.078] if (is.null(name)) [13:30:35.078] next [13:30:35.078] if (!grepl(pattern, name)) [13:30:35.078] next [13:30:35.078] invokeRestart(restart) [13:30:35.078] muffled <- TRUE [13:30:35.078] break [13:30:35.078] } [13:30:35.078] } [13:30:35.078] } [13:30:35.078] invisible(muffled) [13:30:35.078] } [13:30:35.078] muffleCondition(cond, pattern = "^muffle") [13:30:35.078] } [13:30:35.078] } [13:30:35.078] } [13:30:35.078] })) [13:30:35.078] }, error = function(ex) { [13:30:35.078] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.078] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.078] ...future.rng), started = ...future.startTime, [13:30:35.078] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.078] version = "1.8"), class = "FutureResult") [13:30:35.078] }, finally = { [13:30:35.078] if (!identical(...future.workdir, getwd())) [13:30:35.078] setwd(...future.workdir) [13:30:35.078] { [13:30:35.078] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.078] ...future.oldOptions$nwarnings <- NULL [13:30:35.078] } [13:30:35.078] base::options(...future.oldOptions) [13:30:35.078] if (.Platform$OS.type == "windows") { [13:30:35.078] old_names <- names(...future.oldEnvVars) [13:30:35.078] envs <- base::Sys.getenv() [13:30:35.078] names <- names(envs) [13:30:35.078] common <- intersect(names, old_names) [13:30:35.078] added <- setdiff(names, old_names) [13:30:35.078] removed <- setdiff(old_names, names) [13:30:35.078] changed <- common[...future.oldEnvVars[common] != [13:30:35.078] envs[common]] [13:30:35.078] NAMES <- toupper(changed) [13:30:35.078] args <- list() [13:30:35.078] for (kk in seq_along(NAMES)) { [13:30:35.078] name <- changed[[kk]] [13:30:35.078] NAME <- NAMES[[kk]] [13:30:35.078] if (name != NAME && is.element(NAME, old_names)) [13:30:35.078] next [13:30:35.078] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.078] } [13:30:35.078] NAMES <- toupper(added) [13:30:35.078] for (kk in seq_along(NAMES)) { [13:30:35.078] name <- added[[kk]] [13:30:35.078] NAME <- NAMES[[kk]] [13:30:35.078] if (name != NAME && is.element(NAME, old_names)) [13:30:35.078] next [13:30:35.078] args[[name]] <- "" [13:30:35.078] } [13:30:35.078] NAMES <- toupper(removed) [13:30:35.078] for (kk in seq_along(NAMES)) { [13:30:35.078] name <- removed[[kk]] [13:30:35.078] NAME <- NAMES[[kk]] [13:30:35.078] if (name != NAME && is.element(NAME, old_names)) [13:30:35.078] next [13:30:35.078] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.078] } [13:30:35.078] if (length(args) > 0) [13:30:35.078] base::do.call(base::Sys.setenv, args = args) [13:30:35.078] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.078] } [13:30:35.078] else { [13:30:35.078] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.078] } [13:30:35.078] { [13:30:35.078] if (base::length(...future.futureOptionsAdded) > [13:30:35.078] 0L) { [13:30:35.078] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.078] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.078] base::options(opts) [13:30:35.078] } [13:30:35.078] { [13:30:35.078] NULL [13:30:35.078] options(future.plan = NULL) [13:30:35.078] if (is.na(NA_character_)) [13:30:35.078] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.078] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.078] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.078] .init = FALSE) [13:30:35.078] } [13:30:35.078] } [13:30:35.078] } [13:30:35.078] }) [13:30:35.078] if (TRUE) { [13:30:35.078] base::sink(type = "output", split = FALSE) [13:30:35.078] if (TRUE) { [13:30:35.078] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.078] } [13:30:35.078] else { [13:30:35.078] ...future.result["stdout"] <- base::list(NULL) [13:30:35.078] } [13:30:35.078] base::close(...future.stdout) [13:30:35.078] ...future.stdout <- NULL [13:30:35.078] } [13:30:35.078] ...future.result$conditions <- ...future.conditions [13:30:35.078] ...future.result$finished <- base::Sys.time() [13:30:35.078] ...future.result [13:30:35.078] } [13:30:35.180] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:30:35.180] plan(): nbrOfWorkers() = 2 [13:30:35.181] getGlobalsAndPackages() ... [13:30:35.181] Searching for globals... [13:30:35.183] [13:30:35.183] Searching for globals ... DONE [13:30:35.184] - globals: [0] [13:30:35.184] getGlobalsAndPackages() ... DONE [13:30:35.184] getGlobalsAndPackages() ... [13:30:35.184] [13:30:35.184] - globals: [0] [13:30:35.184] getGlobalsAndPackages() ... DONE [13:30:35.185] Packages needed by the future expression (n = 0): [13:30:35.185] Packages needed by future strategies (n = 0): [13:30:35.185] { [13:30:35.185] { [13:30:35.185] { [13:30:35.185] ...future.startTime <- base::Sys.time() [13:30:35.185] { [13:30:35.185] { [13:30:35.185] { [13:30:35.185] base::local({ [13:30:35.185] has_future <- base::requireNamespace("future", [13:30:35.185] quietly = TRUE) [13:30:35.185] if (has_future) { [13:30:35.185] ns <- base::getNamespace("future") [13:30:35.185] version <- ns[[".package"]][["version"]] [13:30:35.185] if (is.null(version)) [13:30:35.185] version <- utils::packageVersion("future") [13:30:35.185] } [13:30:35.185] else { [13:30:35.185] version <- NULL [13:30:35.185] } [13:30:35.185] if (!has_future || version < "1.8.0") { [13:30:35.185] info <- base::c(r_version = base::gsub("R version ", [13:30:35.185] "", base::R.version$version.string), [13:30:35.185] platform = base::sprintf("%s (%s-bit)", [13:30:35.185] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.185] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.185] "release", "version")], collapse = " "), [13:30:35.185] hostname = base::Sys.info()[["nodename"]]) [13:30:35.185] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.185] info) [13:30:35.185] info <- base::paste(info, collapse = "; ") [13:30:35.185] if (!has_future) { [13:30:35.185] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.185] info) [13:30:35.185] } [13:30:35.185] else { [13:30:35.185] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.185] info, version) [13:30:35.185] } [13:30:35.185] base::stop(msg) [13:30:35.185] } [13:30:35.185] }) [13:30:35.185] } [13:30:35.185] ...future.strategy.old <- future::plan("list") [13:30:35.185] options(future.plan = NULL) [13:30:35.185] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.185] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.185] } [13:30:35.185] ...future.workdir <- getwd() [13:30:35.185] } [13:30:35.185] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.185] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.185] } [13:30:35.185] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.185] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.185] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.185] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.185] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.185] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.185] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.185] base::names(...future.oldOptions)) [13:30:35.185] } [13:30:35.185] if (FALSE) { [13:30:35.185] } [13:30:35.185] else { [13:30:35.185] if (TRUE) { [13:30:35.185] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.185] open = "w") [13:30:35.185] } [13:30:35.185] else { [13:30:35.185] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.185] windows = "NUL", "/dev/null"), open = "w") [13:30:35.185] } [13:30:35.185] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.185] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.185] base::sink(type = "output", split = FALSE) [13:30:35.185] base::close(...future.stdout) [13:30:35.185] }, add = TRUE) [13:30:35.185] } [13:30:35.185] ...future.frame <- base::sys.nframe() [13:30:35.185] ...future.conditions <- base::list() [13:30:35.185] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.185] if (FALSE) { [13:30:35.185] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.185] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.185] } [13:30:35.185] ...future.result <- base::tryCatch({ [13:30:35.185] base::withCallingHandlers({ [13:30:35.185] ...future.value <- base::withVisible(base::local(42)) [13:30:35.185] future::FutureResult(value = ...future.value$value, [13:30:35.185] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.185] ...future.rng), globalenv = if (FALSE) [13:30:35.185] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.185] ...future.globalenv.names)) [13:30:35.185] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.185] }, condition = base::local({ [13:30:35.185] c <- base::c [13:30:35.185] inherits <- base::inherits [13:30:35.185] invokeRestart <- base::invokeRestart [13:30:35.185] length <- base::length [13:30:35.185] list <- base::list [13:30:35.185] seq.int <- base::seq.int [13:30:35.185] signalCondition <- base::signalCondition [13:30:35.185] sys.calls <- base::sys.calls [13:30:35.185] `[[` <- base::`[[` [13:30:35.185] `+` <- base::`+` [13:30:35.185] `<<-` <- base::`<<-` [13:30:35.185] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.185] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.185] 3L)] [13:30:35.185] } [13:30:35.185] function(cond) { [13:30:35.185] is_error <- inherits(cond, "error") [13:30:35.185] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.185] NULL) [13:30:35.185] if (is_error) { [13:30:35.185] sessionInformation <- function() { [13:30:35.185] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.185] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.185] search = base::search(), system = base::Sys.info()) [13:30:35.185] } [13:30:35.185] ...future.conditions[[length(...future.conditions) + [13:30:35.185] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.185] cond$call), session = sessionInformation(), [13:30:35.185] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.185] signalCondition(cond) [13:30:35.185] } [13:30:35.185] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.185] signal <- FALSE && inherits(cond, character(0)) [13:30:35.185] ...future.conditions[[length(...future.conditions) + [13:30:35.185] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.185] if (FALSE && !signal) { [13:30:35.185] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.185] { [13:30:35.185] inherits <- base::inherits [13:30:35.185] invokeRestart <- base::invokeRestart [13:30:35.185] is.null <- base::is.null [13:30:35.185] muffled <- FALSE [13:30:35.185] if (inherits(cond, "message")) { [13:30:35.185] muffled <- grepl(pattern, "muffleMessage") [13:30:35.185] if (muffled) [13:30:35.185] invokeRestart("muffleMessage") [13:30:35.185] } [13:30:35.185] else if (inherits(cond, "warning")) { [13:30:35.185] muffled <- grepl(pattern, "muffleWarning") [13:30:35.185] if (muffled) [13:30:35.185] invokeRestart("muffleWarning") [13:30:35.185] } [13:30:35.185] else if (inherits(cond, "condition")) { [13:30:35.185] if (!is.null(pattern)) { [13:30:35.185] computeRestarts <- base::computeRestarts [13:30:35.185] grepl <- base::grepl [13:30:35.185] restarts <- computeRestarts(cond) [13:30:35.185] for (restart in restarts) { [13:30:35.185] name <- restart$name [13:30:35.185] if (is.null(name)) [13:30:35.185] next [13:30:35.185] if (!grepl(pattern, name)) [13:30:35.185] next [13:30:35.185] invokeRestart(restart) [13:30:35.185] muffled <- TRUE [13:30:35.185] break [13:30:35.185] } [13:30:35.185] } [13:30:35.185] } [13:30:35.185] invisible(muffled) [13:30:35.185] } [13:30:35.185] muffleCondition(cond, pattern = "^muffle") [13:30:35.185] } [13:30:35.185] } [13:30:35.185] else { [13:30:35.185] if (TRUE) { [13:30:35.185] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.185] { [13:30:35.185] inherits <- base::inherits [13:30:35.185] invokeRestart <- base::invokeRestart [13:30:35.185] is.null <- base::is.null [13:30:35.185] muffled <- FALSE [13:30:35.185] if (inherits(cond, "message")) { [13:30:35.185] muffled <- grepl(pattern, "muffleMessage") [13:30:35.185] if (muffled) [13:30:35.185] invokeRestart("muffleMessage") [13:30:35.185] } [13:30:35.185] else if (inherits(cond, "warning")) { [13:30:35.185] muffled <- grepl(pattern, "muffleWarning") [13:30:35.185] if (muffled) [13:30:35.185] invokeRestart("muffleWarning") [13:30:35.185] } [13:30:35.185] else if (inherits(cond, "condition")) { [13:30:35.185] if (!is.null(pattern)) { [13:30:35.185] computeRestarts <- base::computeRestarts [13:30:35.185] grepl <- base::grepl [13:30:35.185] restarts <- computeRestarts(cond) [13:30:35.185] for (restart in restarts) { [13:30:35.185] name <- restart$name [13:30:35.185] if (is.null(name)) [13:30:35.185] next [13:30:35.185] if (!grepl(pattern, name)) [13:30:35.185] next [13:30:35.185] invokeRestart(restart) [13:30:35.185] muffled <- TRUE [13:30:35.185] break [13:30:35.185] } [13:30:35.185] } [13:30:35.185] } [13:30:35.185] invisible(muffled) [13:30:35.185] } [13:30:35.185] muffleCondition(cond, pattern = "^muffle") [13:30:35.185] } [13:30:35.185] } [13:30:35.185] } [13:30:35.185] })) [13:30:35.185] }, error = function(ex) { [13:30:35.185] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.185] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.185] ...future.rng), started = ...future.startTime, [13:30:35.185] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.185] version = "1.8"), class = "FutureResult") [13:30:35.185] }, finally = { [13:30:35.185] if (!identical(...future.workdir, getwd())) [13:30:35.185] setwd(...future.workdir) [13:30:35.185] { [13:30:35.185] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.185] ...future.oldOptions$nwarnings <- NULL [13:30:35.185] } [13:30:35.185] base::options(...future.oldOptions) [13:30:35.185] if (.Platform$OS.type == "windows") { [13:30:35.185] old_names <- names(...future.oldEnvVars) [13:30:35.185] envs <- base::Sys.getenv() [13:30:35.185] names <- names(envs) [13:30:35.185] common <- intersect(names, old_names) [13:30:35.185] added <- setdiff(names, old_names) [13:30:35.185] removed <- setdiff(old_names, names) [13:30:35.185] changed <- common[...future.oldEnvVars[common] != [13:30:35.185] envs[common]] [13:30:35.185] NAMES <- toupper(changed) [13:30:35.185] args <- list() [13:30:35.185] for (kk in seq_along(NAMES)) { [13:30:35.185] name <- changed[[kk]] [13:30:35.185] NAME <- NAMES[[kk]] [13:30:35.185] if (name != NAME && is.element(NAME, old_names)) [13:30:35.185] next [13:30:35.185] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.185] } [13:30:35.185] NAMES <- toupper(added) [13:30:35.185] for (kk in seq_along(NAMES)) { [13:30:35.185] name <- added[[kk]] [13:30:35.185] NAME <- NAMES[[kk]] [13:30:35.185] if (name != NAME && is.element(NAME, old_names)) [13:30:35.185] next [13:30:35.185] args[[name]] <- "" [13:30:35.185] } [13:30:35.185] NAMES <- toupper(removed) [13:30:35.185] for (kk in seq_along(NAMES)) { [13:30:35.185] name <- removed[[kk]] [13:30:35.185] NAME <- NAMES[[kk]] [13:30:35.185] if (name != NAME && is.element(NAME, old_names)) [13:30:35.185] next [13:30:35.185] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.185] } [13:30:35.185] if (length(args) > 0) [13:30:35.185] base::do.call(base::Sys.setenv, args = args) [13:30:35.185] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.185] } [13:30:35.185] else { [13:30:35.185] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.185] } [13:30:35.185] { [13:30:35.185] if (base::length(...future.futureOptionsAdded) > [13:30:35.185] 0L) { [13:30:35.185] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.185] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.185] base::options(opts) [13:30:35.185] } [13:30:35.185] { [13:30:35.185] NULL [13:30:35.185] options(future.plan = NULL) [13:30:35.185] if (is.na(NA_character_)) [13:30:35.185] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.185] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.185] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.185] .init = FALSE) [13:30:35.185] } [13:30:35.185] } [13:30:35.185] } [13:30:35.185] }) [13:30:35.185] if (TRUE) { [13:30:35.185] base::sink(type = "output", split = FALSE) [13:30:35.185] if (TRUE) { [13:30:35.185] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.185] } [13:30:35.185] else { [13:30:35.185] ...future.result["stdout"] <- base::list(NULL) [13:30:35.185] } [13:30:35.185] base::close(...future.stdout) [13:30:35.185] ...future.stdout <- NULL [13:30:35.185] } [13:30:35.185] ...future.result$conditions <- ...future.conditions [13:30:35.185] ...future.result$finished <- base::Sys.time() [13:30:35.185] ...future.result [13:30:35.185] } 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:30:35.190] resolved() for 'MiraiFuture' ... [13:30:35.190] - state: 'running' [13:30:35.190] - run: TRUE [13:30:35.191] - result: 'NULL' [13:30:35.191] - resolved: FALSE [13:30:35.191] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.192] getGlobalsAndPackages() ... [13:30:35.192] Searching for globals... [13:30:35.192] [13:30:35.193] Searching for globals ... DONE [13:30:35.193] - globals: [0] [13:30:35.193] getGlobalsAndPackages() ... DONE [13:30:35.193] run() for 'Future' ... [13:30:35.194] - state: 'created' [13:30:35.194] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.194] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.194] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.195] - Field: 'label' [13:30:35.195] - Field: 'local' [13:30:35.195] - Field: 'owner' [13:30:35.195] - Field: 'envir' [13:30:35.195] - Field: 'packages' [13:30:35.195] - Field: 'gc' [13:30:35.196] - Field: 'conditions' [13:30:35.196] - Field: 'expr' [13:30:35.196] - Field: 'uuid' [13:30:35.196] - Field: 'seed' [13:30:35.196] - Field: 'version' [13:30:35.197] - Field: 'result' [13:30:35.197] - Field: 'asynchronous' [13:30:35.197] - Field: 'calls' [13:30:35.197] - Field: 'globals' [13:30:35.197] - Field: 'stdout' [13:30:35.197] - Field: 'earlySignal' [13:30:35.198] - Field: 'lazy' [13:30:35.198] - Field: 'state' [13:30:35.198] - Field: '.cluster' [13:30:35.198] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.198] - Launch lazy future ... [13:30:35.198] Packages needed by the future expression (n = 0): [13:30:35.199] Packages needed by future strategies (n = 0): [13:30:35.199] { [13:30:35.199] { [13:30:35.199] { [13:30:35.199] ...future.startTime <- base::Sys.time() [13:30:35.199] { [13:30:35.199] { [13:30:35.199] { [13:30:35.199] base::local({ [13:30:35.199] has_future <- base::requireNamespace("future", [13:30:35.199] quietly = TRUE) [13:30:35.199] if (has_future) { [13:30:35.199] ns <- base::getNamespace("future") [13:30:35.199] version <- ns[[".package"]][["version"]] [13:30:35.199] if (is.null(version)) [13:30:35.199] version <- utils::packageVersion("future") [13:30:35.199] } [13:30:35.199] else { [13:30:35.199] version <- NULL [13:30:35.199] } [13:30:35.199] if (!has_future || version < "1.8.0") { [13:30:35.199] info <- base::c(r_version = base::gsub("R version ", [13:30:35.199] "", base::R.version$version.string), [13:30:35.199] platform = base::sprintf("%s (%s-bit)", [13:30:35.199] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.199] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.199] "release", "version")], collapse = " "), [13:30:35.199] hostname = base::Sys.info()[["nodename"]]) [13:30:35.199] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.199] info) [13:30:35.199] info <- base::paste(info, collapse = "; ") [13:30:35.199] if (!has_future) { [13:30:35.199] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.199] info) [13:30:35.199] } [13:30:35.199] else { [13:30:35.199] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.199] info, version) [13:30:35.199] } [13:30:35.199] base::stop(msg) [13:30:35.199] } [13:30:35.199] }) [13:30:35.199] } [13:30:35.199] ...future.strategy.old <- future::plan("list") [13:30:35.199] options(future.plan = NULL) [13:30:35.199] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.199] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.199] } [13:30:35.199] ...future.workdir <- getwd() [13:30:35.199] } [13:30:35.199] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.199] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.199] } [13:30:35.199] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.199] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.199] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.199] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.199] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.199] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.199] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.199] base::names(...future.oldOptions)) [13:30:35.199] } [13:30:35.199] if (FALSE) { [13:30:35.199] } [13:30:35.199] else { [13:30:35.199] if (TRUE) { [13:30:35.199] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.199] open = "w") [13:30:35.199] } [13:30:35.199] else { [13:30:35.199] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.199] windows = "NUL", "/dev/null"), open = "w") [13:30:35.199] } [13:30:35.199] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.199] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.199] base::sink(type = "output", split = FALSE) [13:30:35.199] base::close(...future.stdout) [13:30:35.199] }, add = TRUE) [13:30:35.199] } [13:30:35.199] ...future.frame <- base::sys.nframe() [13:30:35.199] ...future.conditions <- base::list() [13:30:35.199] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.199] if (FALSE) { [13:30:35.199] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.199] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.199] } [13:30:35.199] ...future.result <- base::tryCatch({ [13:30:35.199] base::withCallingHandlers({ [13:30:35.199] ...future.value <- base::withVisible(base::local(42)) [13:30:35.199] future::FutureResult(value = ...future.value$value, [13:30:35.199] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.199] ...future.rng), globalenv = if (FALSE) [13:30:35.199] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.199] ...future.globalenv.names)) [13:30:35.199] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.199] }, condition = base::local({ [13:30:35.199] c <- base::c [13:30:35.199] inherits <- base::inherits [13:30:35.199] invokeRestart <- base::invokeRestart [13:30:35.199] length <- base::length [13:30:35.199] list <- base::list [13:30:35.199] seq.int <- base::seq.int [13:30:35.199] signalCondition <- base::signalCondition [13:30:35.199] sys.calls <- base::sys.calls [13:30:35.199] `[[` <- base::`[[` [13:30:35.199] `+` <- base::`+` [13:30:35.199] `<<-` <- base::`<<-` [13:30:35.199] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.199] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.199] 3L)] [13:30:35.199] } [13:30:35.199] function(cond) { [13:30:35.199] is_error <- inherits(cond, "error") [13:30:35.199] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.199] NULL) [13:30:35.199] if (is_error) { [13:30:35.199] sessionInformation <- function() { [13:30:35.199] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.199] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.199] search = base::search(), system = base::Sys.info()) [13:30:35.199] } [13:30:35.199] ...future.conditions[[length(...future.conditions) + [13:30:35.199] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.199] cond$call), session = sessionInformation(), [13:30:35.199] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.199] signalCondition(cond) [13:30:35.199] } [13:30:35.199] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.199] signal <- FALSE && inherits(cond, character(0)) [13:30:35.199] ...future.conditions[[length(...future.conditions) + [13:30:35.199] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.199] if (FALSE && !signal) { [13:30:35.199] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.199] { [13:30:35.199] inherits <- base::inherits [13:30:35.199] invokeRestart <- base::invokeRestart [13:30:35.199] is.null <- base::is.null [13:30:35.199] muffled <- FALSE [13:30:35.199] if (inherits(cond, "message")) { [13:30:35.199] muffled <- grepl(pattern, "muffleMessage") [13:30:35.199] if (muffled) [13:30:35.199] invokeRestart("muffleMessage") [13:30:35.199] } [13:30:35.199] else if (inherits(cond, "warning")) { [13:30:35.199] muffled <- grepl(pattern, "muffleWarning") [13:30:35.199] if (muffled) [13:30:35.199] invokeRestart("muffleWarning") [13:30:35.199] } [13:30:35.199] else if (inherits(cond, "condition")) { [13:30:35.199] if (!is.null(pattern)) { [13:30:35.199] computeRestarts <- base::computeRestarts [13:30:35.199] grepl <- base::grepl [13:30:35.199] restarts <- computeRestarts(cond) [13:30:35.199] for (restart in restarts) { [13:30:35.199] name <- restart$name [13:30:35.199] if (is.null(name)) [13:30:35.199] next [13:30:35.199] if (!grepl(pattern, name)) [13:30:35.199] next [13:30:35.199] invokeRestart(restart) [13:30:35.199] muffled <- TRUE [13:30:35.199] break [13:30:35.199] } [13:30:35.199] } [13:30:35.199] } [13:30:35.199] invisible(muffled) [13:30:35.199] } [13:30:35.199] muffleCondition(cond, pattern = "^muffle") [13:30:35.199] } [13:30:35.199] } [13:30:35.199] else { [13:30:35.199] if (TRUE) { [13:30:35.199] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.199] { [13:30:35.199] inherits <- base::inherits [13:30:35.199] invokeRestart <- base::invokeRestart [13:30:35.199] is.null <- base::is.null [13:30:35.199] muffled <- FALSE [13:30:35.199] if (inherits(cond, "message")) { [13:30:35.199] muffled <- grepl(pattern, "muffleMessage") [13:30:35.199] if (muffled) [13:30:35.199] invokeRestart("muffleMessage") [13:30:35.199] } [13:30:35.199] else if (inherits(cond, "warning")) { [13:30:35.199] muffled <- grepl(pattern, "muffleWarning") [13:30:35.199] if (muffled) [13:30:35.199] invokeRestart("muffleWarning") [13:30:35.199] } [13:30:35.199] else if (inherits(cond, "condition")) { [13:30:35.199] if (!is.null(pattern)) { [13:30:35.199] computeRestarts <- base::computeRestarts [13:30:35.199] grepl <- base::grepl [13:30:35.199] restarts <- computeRestarts(cond) [13:30:35.199] for (restart in restarts) { [13:30:35.199] name <- restart$name [13:30:35.199] if (is.null(name)) [13:30:35.199] next [13:30:35.199] if (!grepl(pattern, name)) [13:30:35.199] next [13:30:35.199] invokeRestart(restart) [13:30:35.199] muffled <- TRUE [13:30:35.199] break [13:30:35.199] } [13:30:35.199] } [13:30:35.199] } [13:30:35.199] invisible(muffled) [13:30:35.199] } [13:30:35.199] muffleCondition(cond, pattern = "^muffle") [13:30:35.199] } [13:30:35.199] } [13:30:35.199] } [13:30:35.199] })) [13:30:35.199] }, error = function(ex) { [13:30:35.199] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.199] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.199] ...future.rng), started = ...future.startTime, [13:30:35.199] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.199] version = "1.8"), class = "FutureResult") [13:30:35.199] }, finally = { [13:30:35.199] if (!identical(...future.workdir, getwd())) [13:30:35.199] setwd(...future.workdir) [13:30:35.199] { [13:30:35.199] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.199] ...future.oldOptions$nwarnings <- NULL [13:30:35.199] } [13:30:35.199] base::options(...future.oldOptions) [13:30:35.199] if (.Platform$OS.type == "windows") { [13:30:35.199] old_names <- names(...future.oldEnvVars) [13:30:35.199] envs <- base::Sys.getenv() [13:30:35.199] names <- names(envs) [13:30:35.199] common <- intersect(names, old_names) [13:30:35.199] added <- setdiff(names, old_names) [13:30:35.199] removed <- setdiff(old_names, names) [13:30:35.199] changed <- common[...future.oldEnvVars[common] != [13:30:35.199] envs[common]] [13:30:35.199] NAMES <- toupper(changed) [13:30:35.199] args <- list() [13:30:35.199] for (kk in seq_along(NAMES)) { [13:30:35.199] name <- changed[[kk]] [13:30:35.199] NAME <- NAMES[[kk]] [13:30:35.199] if (name != NAME && is.element(NAME, old_names)) [13:30:35.199] next [13:30:35.199] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.199] } [13:30:35.199] NAMES <- toupper(added) [13:30:35.199] for (kk in seq_along(NAMES)) { [13:30:35.199] name <- added[[kk]] [13:30:35.199] NAME <- NAMES[[kk]] [13:30:35.199] if (name != NAME && is.element(NAME, old_names)) [13:30:35.199] next [13:30:35.199] args[[name]] <- "" [13:30:35.199] } [13:30:35.199] NAMES <- toupper(removed) [13:30:35.199] for (kk in seq_along(NAMES)) { [13:30:35.199] name <- removed[[kk]] [13:30:35.199] NAME <- NAMES[[kk]] [13:30:35.199] if (name != NAME && is.element(NAME, old_names)) [13:30:35.199] next [13:30:35.199] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.199] } [13:30:35.199] if (length(args) > 0) [13:30:35.199] base::do.call(base::Sys.setenv, args = args) [13:30:35.199] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.199] } [13:30:35.199] else { [13:30:35.199] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.199] } [13:30:35.199] { [13:30:35.199] if (base::length(...future.futureOptionsAdded) > [13:30:35.199] 0L) { [13:30:35.199] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.199] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.199] base::options(opts) [13:30:35.199] } [13:30:35.199] { [13:30:35.199] NULL [13:30:35.199] options(future.plan = NULL) [13:30:35.199] if (is.na(NA_character_)) [13:30:35.199] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.199] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.199] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.199] .init = FALSE) [13:30:35.199] } [13:30:35.199] } [13:30:35.199] } [13:30:35.199] }) [13:30:35.199] if (TRUE) { [13:30:35.199] base::sink(type = "output", split = FALSE) [13:30:35.199] if (TRUE) { [13:30:35.199] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.199] } [13:30:35.199] else { [13:30:35.199] ...future.result["stdout"] <- base::list(NULL) [13:30:35.199] } [13:30:35.199] base::close(...future.stdout) [13:30:35.199] ...future.stdout <- NULL [13:30:35.199] } [13:30:35.199] ...future.result$conditions <- ...future.conditions [13:30:35.199] ...future.result$finished <- base::Sys.time() [13:30:35.199] ...future.result [13:30:35.199] } [13:30:35.203] - Launch lazy future ... done [13:30:35.203] 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:30:35.204] resolved() for 'MiraiFuture' ... [13:30:35.204] - state: 'running' [13:30:35.204] - run: TRUE [13:30:35.204] - result: 'NULL' [13:30:35.205] - resolved: FALSE [13:30:35.205] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.206] getGlobalsAndPackages() ... [13:30:35.206] Searching for globals... [13:30:35.209] - globals found: [1] '{' [13:30:35.210] Searching for globals ... DONE [13:30:35.210] Resolving globals: FALSE [13:30:35.210] [13:30:35.210] [13:30:35.211] getGlobalsAndPackages() ... DONE [13:30:35.211] run() for 'Future' ... [13:30:35.211] - state: 'created' [13:30:35.211] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.212] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.212] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.212] - Field: 'label' [13:30:35.212] - Field: 'local' [13:30:35.212] - Field: 'owner' [13:30:35.213] - Field: 'envir' [13:30:35.213] - Field: 'packages' [13:30:35.213] - Field: 'gc' [13:30:35.213] - Field: 'conditions' [13:30:35.213] - Field: 'expr' [13:30:35.213] - Field: 'uuid' [13:30:35.214] - Field: 'seed' [13:30:35.214] - Field: 'version' [13:30:35.214] - Field: 'result' [13:30:35.214] - Field: 'asynchronous' [13:30:35.214] - Field: 'calls' [13:30:35.214] - Field: 'globals' [13:30:35.215] - Field: 'stdout' [13:30:35.215] - Field: 'earlySignal' [13:30:35.215] - Field: 'lazy' [13:30:35.215] - Field: 'state' [13:30:35.215] - Field: '.cluster' [13:30:35.215] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.216] - Launch lazy future ... [13:30:35.216] Packages needed by the future expression (n = 0): [13:30:35.216] Packages needed by future strategies (n = 0): [13:30:35.216] { [13:30:35.216] { [13:30:35.216] { [13:30:35.216] ...future.startTime <- base::Sys.time() [13:30:35.216] { [13:30:35.216] { [13:30:35.216] { [13:30:35.216] base::local({ [13:30:35.216] has_future <- base::requireNamespace("future", [13:30:35.216] quietly = TRUE) [13:30:35.216] if (has_future) { [13:30:35.216] ns <- base::getNamespace("future") [13:30:35.216] version <- ns[[".package"]][["version"]] [13:30:35.216] if (is.null(version)) [13:30:35.216] version <- utils::packageVersion("future") [13:30:35.216] } [13:30:35.216] else { [13:30:35.216] version <- NULL [13:30:35.216] } [13:30:35.216] if (!has_future || version < "1.8.0") { [13:30:35.216] info <- base::c(r_version = base::gsub("R version ", [13:30:35.216] "", base::R.version$version.string), [13:30:35.216] platform = base::sprintf("%s (%s-bit)", [13:30:35.216] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.216] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.216] "release", "version")], collapse = " "), [13:30:35.216] hostname = base::Sys.info()[["nodename"]]) [13:30:35.216] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.216] info) [13:30:35.216] info <- base::paste(info, collapse = "; ") [13:30:35.216] if (!has_future) { [13:30:35.216] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.216] info) [13:30:35.216] } [13:30:35.216] else { [13:30:35.216] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.216] info, version) [13:30:35.216] } [13:30:35.216] base::stop(msg) [13:30:35.216] } [13:30:35.216] }) [13:30:35.216] } [13:30:35.216] ...future.strategy.old <- future::plan("list") [13:30:35.216] options(future.plan = NULL) [13:30:35.216] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.216] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.216] } [13:30:35.216] ...future.workdir <- getwd() [13:30:35.216] } [13:30:35.216] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.216] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.216] } [13:30:35.216] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.216] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.216] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.216] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.216] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.216] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.216] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.216] base::names(...future.oldOptions)) [13:30:35.216] } [13:30:35.216] if (FALSE) { [13:30:35.216] } [13:30:35.216] else { [13:30:35.216] if (TRUE) { [13:30:35.216] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.216] open = "w") [13:30:35.216] } [13:30:35.216] else { [13:30:35.216] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.216] windows = "NUL", "/dev/null"), open = "w") [13:30:35.216] } [13:30:35.216] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.216] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.216] base::sink(type = "output", split = FALSE) [13:30:35.216] base::close(...future.stdout) [13:30:35.216] }, add = TRUE) [13:30:35.216] } [13:30:35.216] ...future.frame <- base::sys.nframe() [13:30:35.216] ...future.conditions <- base::list() [13:30:35.216] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.216] if (FALSE) { [13:30:35.216] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.216] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.216] } [13:30:35.216] ...future.result <- base::tryCatch({ [13:30:35.216] base::withCallingHandlers({ [13:30:35.216] ...future.value <- base::withVisible(base::local({ [13:30:35.216] 42 [13:30:35.216] })) [13:30:35.216] future::FutureResult(value = ...future.value$value, [13:30:35.216] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.216] ...future.rng), globalenv = if (FALSE) [13:30:35.216] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.216] ...future.globalenv.names)) [13:30:35.216] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.216] }, condition = base::local({ [13:30:35.216] c <- base::c [13:30:35.216] inherits <- base::inherits [13:30:35.216] invokeRestart <- base::invokeRestart [13:30:35.216] length <- base::length [13:30:35.216] list <- base::list [13:30:35.216] seq.int <- base::seq.int [13:30:35.216] signalCondition <- base::signalCondition [13:30:35.216] sys.calls <- base::sys.calls [13:30:35.216] `[[` <- base::`[[` [13:30:35.216] `+` <- base::`+` [13:30:35.216] `<<-` <- base::`<<-` [13:30:35.216] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.216] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.216] 3L)] [13:30:35.216] } [13:30:35.216] function(cond) { [13:30:35.216] is_error <- inherits(cond, "error") [13:30:35.216] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.216] NULL) [13:30:35.216] if (is_error) { [13:30:35.216] sessionInformation <- function() { [13:30:35.216] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.216] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.216] search = base::search(), system = base::Sys.info()) [13:30:35.216] } [13:30:35.216] ...future.conditions[[length(...future.conditions) + [13:30:35.216] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.216] cond$call), session = sessionInformation(), [13:30:35.216] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.216] signalCondition(cond) [13:30:35.216] } [13:30:35.216] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.216] signal <- FALSE && inherits(cond, character(0)) [13:30:35.216] ...future.conditions[[length(...future.conditions) + [13:30:35.216] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.216] if (FALSE && !signal) { [13:30:35.216] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.216] { [13:30:35.216] inherits <- base::inherits [13:30:35.216] invokeRestart <- base::invokeRestart [13:30:35.216] is.null <- base::is.null [13:30:35.216] muffled <- FALSE [13:30:35.216] if (inherits(cond, "message")) { [13:30:35.216] muffled <- grepl(pattern, "muffleMessage") [13:30:35.216] if (muffled) [13:30:35.216] invokeRestart("muffleMessage") [13:30:35.216] } [13:30:35.216] else if (inherits(cond, "warning")) { [13:30:35.216] muffled <- grepl(pattern, "muffleWarning") [13:30:35.216] if (muffled) [13:30:35.216] invokeRestart("muffleWarning") [13:30:35.216] } [13:30:35.216] else if (inherits(cond, "condition")) { [13:30:35.216] if (!is.null(pattern)) { [13:30:35.216] computeRestarts <- base::computeRestarts [13:30:35.216] grepl <- base::grepl [13:30:35.216] restarts <- computeRestarts(cond) [13:30:35.216] for (restart in restarts) { [13:30:35.216] name <- restart$name [13:30:35.216] if (is.null(name)) [13:30:35.216] next [13:30:35.216] if (!grepl(pattern, name)) [13:30:35.216] next [13:30:35.216] invokeRestart(restart) [13:30:35.216] muffled <- TRUE [13:30:35.216] break [13:30:35.216] } [13:30:35.216] } [13:30:35.216] } [13:30:35.216] invisible(muffled) [13:30:35.216] } [13:30:35.216] muffleCondition(cond, pattern = "^muffle") [13:30:35.216] } [13:30:35.216] } [13:30:35.216] else { [13:30:35.216] if (TRUE) { [13:30:35.216] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.216] { [13:30:35.216] inherits <- base::inherits [13:30:35.216] invokeRestart <- base::invokeRestart [13:30:35.216] is.null <- base::is.null [13:30:35.216] muffled <- FALSE [13:30:35.216] if (inherits(cond, "message")) { [13:30:35.216] muffled <- grepl(pattern, "muffleMessage") [13:30:35.216] if (muffled) [13:30:35.216] invokeRestart("muffleMessage") [13:30:35.216] } [13:30:35.216] else if (inherits(cond, "warning")) { [13:30:35.216] muffled <- grepl(pattern, "muffleWarning") [13:30:35.216] if (muffled) [13:30:35.216] invokeRestart("muffleWarning") [13:30:35.216] } [13:30:35.216] else if (inherits(cond, "condition")) { [13:30:35.216] if (!is.null(pattern)) { [13:30:35.216] computeRestarts <- base::computeRestarts [13:30:35.216] grepl <- base::grepl [13:30:35.216] restarts <- computeRestarts(cond) [13:30:35.216] for (restart in restarts) { [13:30:35.216] name <- restart$name [13:30:35.216] if (is.null(name)) [13:30:35.216] next [13:30:35.216] if (!grepl(pattern, name)) [13:30:35.216] next [13:30:35.216] invokeRestart(restart) [13:30:35.216] muffled <- TRUE [13:30:35.216] break [13:30:35.216] } [13:30:35.216] } [13:30:35.216] } [13:30:35.216] invisible(muffled) [13:30:35.216] } [13:30:35.216] muffleCondition(cond, pattern = "^muffle") [13:30:35.216] } [13:30:35.216] } [13:30:35.216] } [13:30:35.216] })) [13:30:35.216] }, error = function(ex) { [13:30:35.216] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.216] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.216] ...future.rng), started = ...future.startTime, [13:30:35.216] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.216] version = "1.8"), class = "FutureResult") [13:30:35.216] }, finally = { [13:30:35.216] if (!identical(...future.workdir, getwd())) [13:30:35.216] setwd(...future.workdir) [13:30:35.216] { [13:30:35.216] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.216] ...future.oldOptions$nwarnings <- NULL [13:30:35.216] } [13:30:35.216] base::options(...future.oldOptions) [13:30:35.216] if (.Platform$OS.type == "windows") { [13:30:35.216] old_names <- names(...future.oldEnvVars) [13:30:35.216] envs <- base::Sys.getenv() [13:30:35.216] names <- names(envs) [13:30:35.216] common <- intersect(names, old_names) [13:30:35.216] added <- setdiff(names, old_names) [13:30:35.216] removed <- setdiff(old_names, names) [13:30:35.216] changed <- common[...future.oldEnvVars[common] != [13:30:35.216] envs[common]] [13:30:35.216] NAMES <- toupper(changed) [13:30:35.216] args <- list() [13:30:35.216] for (kk in seq_along(NAMES)) { [13:30:35.216] name <- changed[[kk]] [13:30:35.216] NAME <- NAMES[[kk]] [13:30:35.216] if (name != NAME && is.element(NAME, old_names)) [13:30:35.216] next [13:30:35.216] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.216] } [13:30:35.216] NAMES <- toupper(added) [13:30:35.216] for (kk in seq_along(NAMES)) { [13:30:35.216] name <- added[[kk]] [13:30:35.216] NAME <- NAMES[[kk]] [13:30:35.216] if (name != NAME && is.element(NAME, old_names)) [13:30:35.216] next [13:30:35.216] args[[name]] <- "" [13:30:35.216] } [13:30:35.216] NAMES <- toupper(removed) [13:30:35.216] for (kk in seq_along(NAMES)) { [13:30:35.216] name <- removed[[kk]] [13:30:35.216] NAME <- NAMES[[kk]] [13:30:35.216] if (name != NAME && is.element(NAME, old_names)) [13:30:35.216] next [13:30:35.216] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.216] } [13:30:35.216] if (length(args) > 0) [13:30:35.216] base::do.call(base::Sys.setenv, args = args) [13:30:35.216] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.216] } [13:30:35.216] else { [13:30:35.216] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.216] } [13:30:35.216] { [13:30:35.216] if (base::length(...future.futureOptionsAdded) > [13:30:35.216] 0L) { [13:30:35.216] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.216] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.216] base::options(opts) [13:30:35.216] } [13:30:35.216] { [13:30:35.216] NULL [13:30:35.216] options(future.plan = NULL) [13:30:35.216] if (is.na(NA_character_)) [13:30:35.216] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.216] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.216] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.216] .init = FALSE) [13:30:35.216] } [13:30:35.216] } [13:30:35.216] } [13:30:35.216] }) [13:30:35.216] if (TRUE) { [13:30:35.216] base::sink(type = "output", split = FALSE) [13:30:35.216] if (TRUE) { [13:30:35.216] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.216] } [13:30:35.216] else { [13:30:35.216] ...future.result["stdout"] <- base::list(NULL) [13:30:35.216] } [13:30:35.216] base::close(...future.stdout) [13:30:35.216] ...future.stdout <- NULL [13:30:35.216] } [13:30:35.216] ...future.result$conditions <- ...future.conditions [13:30:35.216] ...future.result$finished <- base::Sys.time() [13:30:35.216] ...future.result [13:30:35.216] } [13:30:35.220] - Launch lazy future ... done [13:30:35.220] 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:30:35.221] resolved() for 'MiraiFuture' ... [13:30:35.221] - state: 'running' [13:30:35.222] - run: TRUE [13:30:35.222] - result: 'NULL' [13:30:35.222] - resolved: FALSE [13:30:35.222] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.223] getGlobalsAndPackages() ... [13:30:35.223] Searching for globals... [13:30:35.223] [13:30:35.223] Searching for globals ... DONE [13:30:35.223] - globals: [0] [13:30:35.224] getGlobalsAndPackages() ... DONE [13:30:35.224] getGlobalsAndPackages() ... [13:30:35.224] [13:30:35.224] - globals: [0] [13:30:35.224] getGlobalsAndPackages() ... DONE [13:30:35.225] Packages needed by the future expression (n = 0): [13:30:35.225] Packages needed by future strategies (n = 0): [13:30:35.225] { [13:30:35.225] { [13:30:35.225] { [13:30:35.225] ...future.startTime <- base::Sys.time() [13:30:35.225] { [13:30:35.225] { [13:30:35.225] { [13:30:35.225] base::local({ [13:30:35.225] has_future <- base::requireNamespace("future", [13:30:35.225] quietly = TRUE) [13:30:35.225] if (has_future) { [13:30:35.225] ns <- base::getNamespace("future") [13:30:35.225] version <- ns[[".package"]][["version"]] [13:30:35.225] if (is.null(version)) [13:30:35.225] version <- utils::packageVersion("future") [13:30:35.225] } [13:30:35.225] else { [13:30:35.225] version <- NULL [13:30:35.225] } [13:30:35.225] if (!has_future || version < "1.8.0") { [13:30:35.225] info <- base::c(r_version = base::gsub("R version ", [13:30:35.225] "", base::R.version$version.string), [13:30:35.225] platform = base::sprintf("%s (%s-bit)", [13:30:35.225] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.225] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.225] "release", "version")], collapse = " "), [13:30:35.225] hostname = base::Sys.info()[["nodename"]]) [13:30:35.225] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.225] info) [13:30:35.225] info <- base::paste(info, collapse = "; ") [13:30:35.225] if (!has_future) { [13:30:35.225] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.225] info) [13:30:35.225] } [13:30:35.225] else { [13:30:35.225] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.225] info, version) [13:30:35.225] } [13:30:35.225] base::stop(msg) [13:30:35.225] } [13:30:35.225] }) [13:30:35.225] } [13:30:35.225] ...future.strategy.old <- future::plan("list") [13:30:35.225] options(future.plan = NULL) [13:30:35.225] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.225] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.225] } [13:30:35.225] ...future.workdir <- getwd() [13:30:35.225] } [13:30:35.225] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.225] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.225] } [13:30:35.225] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.225] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.225] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.225] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.225] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.225] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.225] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.225] base::names(...future.oldOptions)) [13:30:35.225] } [13:30:35.225] if (FALSE) { [13:30:35.225] } [13:30:35.225] else { [13:30:35.225] if (TRUE) { [13:30:35.225] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.225] open = "w") [13:30:35.225] } [13:30:35.225] else { [13:30:35.225] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.225] windows = "NUL", "/dev/null"), open = "w") [13:30:35.225] } [13:30:35.225] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.225] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.225] base::sink(type = "output", split = FALSE) [13:30:35.225] base::close(...future.stdout) [13:30:35.225] }, add = TRUE) [13:30:35.225] } [13:30:35.225] ...future.frame <- base::sys.nframe() [13:30:35.225] ...future.conditions <- base::list() [13:30:35.225] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.225] if (FALSE) { [13:30:35.225] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.225] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.225] } [13:30:35.225] ...future.result <- base::tryCatch({ [13:30:35.225] base::withCallingHandlers({ [13:30:35.225] ...future.value <- base::withVisible(base::local(42)) [13:30:35.225] future::FutureResult(value = ...future.value$value, [13:30:35.225] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.225] ...future.rng), globalenv = if (FALSE) [13:30:35.225] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.225] ...future.globalenv.names)) [13:30:35.225] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.225] }, condition = base::local({ [13:30:35.225] c <- base::c [13:30:35.225] inherits <- base::inherits [13:30:35.225] invokeRestart <- base::invokeRestart [13:30:35.225] length <- base::length [13:30:35.225] list <- base::list [13:30:35.225] seq.int <- base::seq.int [13:30:35.225] signalCondition <- base::signalCondition [13:30:35.225] sys.calls <- base::sys.calls [13:30:35.225] `[[` <- base::`[[` [13:30:35.225] `+` <- base::`+` [13:30:35.225] `<<-` <- base::`<<-` [13:30:35.225] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.225] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.225] 3L)] [13:30:35.225] } [13:30:35.225] function(cond) { [13:30:35.225] is_error <- inherits(cond, "error") [13:30:35.225] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.225] NULL) [13:30:35.225] if (is_error) { [13:30:35.225] sessionInformation <- function() { [13:30:35.225] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.225] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.225] search = base::search(), system = base::Sys.info()) [13:30:35.225] } [13:30:35.225] ...future.conditions[[length(...future.conditions) + [13:30:35.225] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.225] cond$call), session = sessionInformation(), [13:30:35.225] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.225] signalCondition(cond) [13:30:35.225] } [13:30:35.225] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.225] signal <- FALSE && inherits(cond, character(0)) [13:30:35.225] ...future.conditions[[length(...future.conditions) + [13:30:35.225] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.225] if (FALSE && !signal) { [13:30:35.225] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.225] { [13:30:35.225] inherits <- base::inherits [13:30:35.225] invokeRestart <- base::invokeRestart [13:30:35.225] is.null <- base::is.null [13:30:35.225] muffled <- FALSE [13:30:35.225] if (inherits(cond, "message")) { [13:30:35.225] muffled <- grepl(pattern, "muffleMessage") [13:30:35.225] if (muffled) [13:30:35.225] invokeRestart("muffleMessage") [13:30:35.225] } [13:30:35.225] else if (inherits(cond, "warning")) { [13:30:35.225] muffled <- grepl(pattern, "muffleWarning") [13:30:35.225] if (muffled) [13:30:35.225] invokeRestart("muffleWarning") [13:30:35.225] } [13:30:35.225] else if (inherits(cond, "condition")) { [13:30:35.225] if (!is.null(pattern)) { [13:30:35.225] computeRestarts <- base::computeRestarts [13:30:35.225] grepl <- base::grepl [13:30:35.225] restarts <- computeRestarts(cond) [13:30:35.225] for (restart in restarts) { [13:30:35.225] name <- restart$name [13:30:35.225] if (is.null(name)) [13:30:35.225] next [13:30:35.225] if (!grepl(pattern, name)) [13:30:35.225] next [13:30:35.225] invokeRestart(restart) [13:30:35.225] muffled <- TRUE [13:30:35.225] break [13:30:35.225] } [13:30:35.225] } [13:30:35.225] } [13:30:35.225] invisible(muffled) [13:30:35.225] } [13:30:35.225] muffleCondition(cond, pattern = "^muffle") [13:30:35.225] } [13:30:35.225] } [13:30:35.225] else { [13:30:35.225] if (TRUE) { [13:30:35.225] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.225] { [13:30:35.225] inherits <- base::inherits [13:30:35.225] invokeRestart <- base::invokeRestart [13:30:35.225] is.null <- base::is.null [13:30:35.225] muffled <- FALSE [13:30:35.225] if (inherits(cond, "message")) { [13:30:35.225] muffled <- grepl(pattern, "muffleMessage") [13:30:35.225] if (muffled) [13:30:35.225] invokeRestart("muffleMessage") [13:30:35.225] } [13:30:35.225] else if (inherits(cond, "warning")) { [13:30:35.225] muffled <- grepl(pattern, "muffleWarning") [13:30:35.225] if (muffled) [13:30:35.225] invokeRestart("muffleWarning") [13:30:35.225] } [13:30:35.225] else if (inherits(cond, "condition")) { [13:30:35.225] if (!is.null(pattern)) { [13:30:35.225] computeRestarts <- base::computeRestarts [13:30:35.225] grepl <- base::grepl [13:30:35.225] restarts <- computeRestarts(cond) [13:30:35.225] for (restart in restarts) { [13:30:35.225] name <- restart$name [13:30:35.225] if (is.null(name)) [13:30:35.225] next [13:30:35.225] if (!grepl(pattern, name)) [13:30:35.225] next [13:30:35.225] invokeRestart(restart) [13:30:35.225] muffled <- TRUE [13:30:35.225] break [13:30:35.225] } [13:30:35.225] } [13:30:35.225] } [13:30:35.225] invisible(muffled) [13:30:35.225] } [13:30:35.225] muffleCondition(cond, pattern = "^muffle") [13:30:35.225] } [13:30:35.225] } [13:30:35.225] } [13:30:35.225] })) [13:30:35.225] }, error = function(ex) { [13:30:35.225] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.225] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.225] ...future.rng), started = ...future.startTime, [13:30:35.225] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.225] version = "1.8"), class = "FutureResult") [13:30:35.225] }, finally = { [13:30:35.225] if (!identical(...future.workdir, getwd())) [13:30:35.225] setwd(...future.workdir) [13:30:35.225] { [13:30:35.225] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.225] ...future.oldOptions$nwarnings <- NULL [13:30:35.225] } [13:30:35.225] base::options(...future.oldOptions) [13:30:35.225] if (.Platform$OS.type == "windows") { [13:30:35.225] old_names <- names(...future.oldEnvVars) [13:30:35.225] envs <- base::Sys.getenv() [13:30:35.225] names <- names(envs) [13:30:35.225] common <- intersect(names, old_names) [13:30:35.225] added <- setdiff(names, old_names) [13:30:35.225] removed <- setdiff(old_names, names) [13:30:35.225] changed <- common[...future.oldEnvVars[common] != [13:30:35.225] envs[common]] [13:30:35.225] NAMES <- toupper(changed) [13:30:35.225] args <- list() [13:30:35.225] for (kk in seq_along(NAMES)) { [13:30:35.225] name <- changed[[kk]] [13:30:35.225] NAME <- NAMES[[kk]] [13:30:35.225] if (name != NAME && is.element(NAME, old_names)) [13:30:35.225] next [13:30:35.225] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.225] } [13:30:35.225] NAMES <- toupper(added) [13:30:35.225] for (kk in seq_along(NAMES)) { [13:30:35.225] name <- added[[kk]] [13:30:35.225] NAME <- NAMES[[kk]] [13:30:35.225] if (name != NAME && is.element(NAME, old_names)) [13:30:35.225] next [13:30:35.225] args[[name]] <- "" [13:30:35.225] } [13:30:35.225] NAMES <- toupper(removed) [13:30:35.225] for (kk in seq_along(NAMES)) { [13:30:35.225] name <- removed[[kk]] [13:30:35.225] NAME <- NAMES[[kk]] [13:30:35.225] if (name != NAME && is.element(NAME, old_names)) [13:30:35.225] next [13:30:35.225] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.225] } [13:30:35.225] if (length(args) > 0) [13:30:35.225] base::do.call(base::Sys.setenv, args = args) [13:30:35.225] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.225] } [13:30:35.225] else { [13:30:35.225] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.225] } [13:30:35.225] { [13:30:35.225] if (base::length(...future.futureOptionsAdded) > [13:30:35.225] 0L) { [13:30:35.225] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.225] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.225] base::options(opts) [13:30:35.225] } [13:30:35.225] { [13:30:35.225] NULL [13:30:35.225] options(future.plan = NULL) [13:30:35.225] if (is.na(NA_character_)) [13:30:35.225] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.225] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.225] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.225] .init = FALSE) [13:30:35.225] } [13:30:35.225] } [13:30:35.225] } [13:30:35.225] }) [13:30:35.225] if (TRUE) { [13:30:35.225] base::sink(type = "output", split = FALSE) [13:30:35.225] if (TRUE) { [13:30:35.225] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.225] } [13:30:35.225] else { [13:30:35.225] ...future.result["stdout"] <- base::list(NULL) [13:30:35.225] } [13:30:35.225] base::close(...future.stdout) [13:30:35.225] ...future.stdout <- NULL [13:30:35.225] } [13:30:35.225] ...future.result$conditions <- ...future.conditions [13:30:35.225] ...future.result$finished <- base::Sys.time() [13:30:35.225] ...future.result [13:30:35.225] } 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:30:35.229] resolved() for 'MiraiFuture' ... [13:30:35.230] - state: 'running' [13:30:35.230] - run: TRUE [13:30:35.230] - result: 'NULL' [13:30:35.230] - resolved: FALSE [13:30:35.230] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.231] getGlobalsAndPackages() ... [13:30:35.231] Searching for globals... [13:30:35.232] [13:30:35.232] Searching for globals ... DONE [13:30:35.232] - globals: [0] [13:30:35.232] getGlobalsAndPackages() ... DONE [13:30:35.232] run() for 'Future' ... [13:30:35.233] - state: 'created' [13:30:35.233] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.233] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.233] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.233] - Field: 'label' [13:30:35.234] - Field: 'local' [13:30:35.234] - Field: 'owner' [13:30:35.234] - Field: 'envir' [13:30:35.234] - Field: 'packages' [13:30:35.234] - Field: 'gc' [13:30:35.235] - Field: 'conditions' [13:30:35.235] - Field: 'expr' [13:30:35.235] - Field: 'uuid' [13:30:35.235] - Field: 'seed' [13:30:35.235] - Field: 'version' [13:30:35.235] - Field: 'result' [13:30:35.236] - Field: 'asynchronous' [13:30:35.236] - Field: 'calls' [13:30:35.236] - Field: 'globals' [13:30:35.236] - Field: 'stdout' [13:30:35.236] - Field: 'earlySignal' [13:30:35.236] - Field: 'lazy' [13:30:35.237] - Field: 'state' [13:30:35.237] - Field: '.cluster' [13:30:35.237] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.237] - Launch lazy future ... [13:30:35.237] Packages needed by the future expression (n = 0): [13:30:35.237] Packages needed by future strategies (n = 0): [13:30:35.238] { [13:30:35.238] { [13:30:35.238] { [13:30:35.238] ...future.startTime <- base::Sys.time() [13:30:35.238] { [13:30:35.238] { [13:30:35.238] { [13:30:35.238] base::local({ [13:30:35.238] has_future <- base::requireNamespace("future", [13:30:35.238] quietly = TRUE) [13:30:35.238] if (has_future) { [13:30:35.238] ns <- base::getNamespace("future") [13:30:35.238] version <- ns[[".package"]][["version"]] [13:30:35.238] if (is.null(version)) [13:30:35.238] version <- utils::packageVersion("future") [13:30:35.238] } [13:30:35.238] else { [13:30:35.238] version <- NULL [13:30:35.238] } [13:30:35.238] if (!has_future || version < "1.8.0") { [13:30:35.238] info <- base::c(r_version = base::gsub("R version ", [13:30:35.238] "", base::R.version$version.string), [13:30:35.238] platform = base::sprintf("%s (%s-bit)", [13:30:35.238] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.238] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.238] "release", "version")], collapse = " "), [13:30:35.238] hostname = base::Sys.info()[["nodename"]]) [13:30:35.238] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.238] info) [13:30:35.238] info <- base::paste(info, collapse = "; ") [13:30:35.238] if (!has_future) { [13:30:35.238] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.238] info) [13:30:35.238] } [13:30:35.238] else { [13:30:35.238] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.238] info, version) [13:30:35.238] } [13:30:35.238] base::stop(msg) [13:30:35.238] } [13:30:35.238] }) [13:30:35.238] } [13:30:35.238] ...future.strategy.old <- future::plan("list") [13:30:35.238] options(future.plan = NULL) [13:30:35.238] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.238] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.238] } [13:30:35.238] ...future.workdir <- getwd() [13:30:35.238] } [13:30:35.238] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.238] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.238] } [13:30:35.238] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.238] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.238] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.238] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.238] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.238] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.238] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.238] base::names(...future.oldOptions)) [13:30:35.238] } [13:30:35.238] if (FALSE) { [13:30:35.238] } [13:30:35.238] else { [13:30:35.238] if (TRUE) { [13:30:35.238] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.238] open = "w") [13:30:35.238] } [13:30:35.238] else { [13:30:35.238] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.238] windows = "NUL", "/dev/null"), open = "w") [13:30:35.238] } [13:30:35.238] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.238] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.238] base::sink(type = "output", split = FALSE) [13:30:35.238] base::close(...future.stdout) [13:30:35.238] }, add = TRUE) [13:30:35.238] } [13:30:35.238] ...future.frame <- base::sys.nframe() [13:30:35.238] ...future.conditions <- base::list() [13:30:35.238] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.238] if (FALSE) { [13:30:35.238] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.238] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.238] } [13:30:35.238] ...future.result <- base::tryCatch({ [13:30:35.238] base::withCallingHandlers({ [13:30:35.238] ...future.value <- base::withVisible(base::local(42)) [13:30:35.238] future::FutureResult(value = ...future.value$value, [13:30:35.238] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.238] ...future.rng), globalenv = if (FALSE) [13:30:35.238] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.238] ...future.globalenv.names)) [13:30:35.238] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.238] }, condition = base::local({ [13:30:35.238] c <- base::c [13:30:35.238] inherits <- base::inherits [13:30:35.238] invokeRestart <- base::invokeRestart [13:30:35.238] length <- base::length [13:30:35.238] list <- base::list [13:30:35.238] seq.int <- base::seq.int [13:30:35.238] signalCondition <- base::signalCondition [13:30:35.238] sys.calls <- base::sys.calls [13:30:35.238] `[[` <- base::`[[` [13:30:35.238] `+` <- base::`+` [13:30:35.238] `<<-` <- base::`<<-` [13:30:35.238] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.238] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.238] 3L)] [13:30:35.238] } [13:30:35.238] function(cond) { [13:30:35.238] is_error <- inherits(cond, "error") [13:30:35.238] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.238] NULL) [13:30:35.238] if (is_error) { [13:30:35.238] sessionInformation <- function() { [13:30:35.238] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.238] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.238] search = base::search(), system = base::Sys.info()) [13:30:35.238] } [13:30:35.238] ...future.conditions[[length(...future.conditions) + [13:30:35.238] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.238] cond$call), session = sessionInformation(), [13:30:35.238] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.238] signalCondition(cond) [13:30:35.238] } [13:30:35.238] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.238] signal <- FALSE && inherits(cond, character(0)) [13:30:35.238] ...future.conditions[[length(...future.conditions) + [13:30:35.238] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.238] if (FALSE && !signal) { [13:30:35.238] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.238] { [13:30:35.238] inherits <- base::inherits [13:30:35.238] invokeRestart <- base::invokeRestart [13:30:35.238] is.null <- base::is.null [13:30:35.238] muffled <- FALSE [13:30:35.238] if (inherits(cond, "message")) { [13:30:35.238] muffled <- grepl(pattern, "muffleMessage") [13:30:35.238] if (muffled) [13:30:35.238] invokeRestart("muffleMessage") [13:30:35.238] } [13:30:35.238] else if (inherits(cond, "warning")) { [13:30:35.238] muffled <- grepl(pattern, "muffleWarning") [13:30:35.238] if (muffled) [13:30:35.238] invokeRestart("muffleWarning") [13:30:35.238] } [13:30:35.238] else if (inherits(cond, "condition")) { [13:30:35.238] if (!is.null(pattern)) { [13:30:35.238] computeRestarts <- base::computeRestarts [13:30:35.238] grepl <- base::grepl [13:30:35.238] restarts <- computeRestarts(cond) [13:30:35.238] for (restart in restarts) { [13:30:35.238] name <- restart$name [13:30:35.238] if (is.null(name)) [13:30:35.238] next [13:30:35.238] if (!grepl(pattern, name)) [13:30:35.238] next [13:30:35.238] invokeRestart(restart) [13:30:35.238] muffled <- TRUE [13:30:35.238] break [13:30:35.238] } [13:30:35.238] } [13:30:35.238] } [13:30:35.238] invisible(muffled) [13:30:35.238] } [13:30:35.238] muffleCondition(cond, pattern = "^muffle") [13:30:35.238] } [13:30:35.238] } [13:30:35.238] else { [13:30:35.238] if (TRUE) { [13:30:35.238] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.238] { [13:30:35.238] inherits <- base::inherits [13:30:35.238] invokeRestart <- base::invokeRestart [13:30:35.238] is.null <- base::is.null [13:30:35.238] muffled <- FALSE [13:30:35.238] if (inherits(cond, "message")) { [13:30:35.238] muffled <- grepl(pattern, "muffleMessage") [13:30:35.238] if (muffled) [13:30:35.238] invokeRestart("muffleMessage") [13:30:35.238] } [13:30:35.238] else if (inherits(cond, "warning")) { [13:30:35.238] muffled <- grepl(pattern, "muffleWarning") [13:30:35.238] if (muffled) [13:30:35.238] invokeRestart("muffleWarning") [13:30:35.238] } [13:30:35.238] else if (inherits(cond, "condition")) { [13:30:35.238] if (!is.null(pattern)) { [13:30:35.238] computeRestarts <- base::computeRestarts [13:30:35.238] grepl <- base::grepl [13:30:35.238] restarts <- computeRestarts(cond) [13:30:35.238] for (restart in restarts) { [13:30:35.238] name <- restart$name [13:30:35.238] if (is.null(name)) [13:30:35.238] next [13:30:35.238] if (!grepl(pattern, name)) [13:30:35.238] next [13:30:35.238] invokeRestart(restart) [13:30:35.238] muffled <- TRUE [13:30:35.238] break [13:30:35.238] } [13:30:35.238] } [13:30:35.238] } [13:30:35.238] invisible(muffled) [13:30:35.238] } [13:30:35.238] muffleCondition(cond, pattern = "^muffle") [13:30:35.238] } [13:30:35.238] } [13:30:35.238] } [13:30:35.238] })) [13:30:35.238] }, error = function(ex) { [13:30:35.238] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.238] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.238] ...future.rng), started = ...future.startTime, [13:30:35.238] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.238] version = "1.8"), class = "FutureResult") [13:30:35.238] }, finally = { [13:30:35.238] if (!identical(...future.workdir, getwd())) [13:30:35.238] setwd(...future.workdir) [13:30:35.238] { [13:30:35.238] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.238] ...future.oldOptions$nwarnings <- NULL [13:30:35.238] } [13:30:35.238] base::options(...future.oldOptions) [13:30:35.238] if (.Platform$OS.type == "windows") { [13:30:35.238] old_names <- names(...future.oldEnvVars) [13:30:35.238] envs <- base::Sys.getenv() [13:30:35.238] names <- names(envs) [13:30:35.238] common <- intersect(names, old_names) [13:30:35.238] added <- setdiff(names, old_names) [13:30:35.238] removed <- setdiff(old_names, names) [13:30:35.238] changed <- common[...future.oldEnvVars[common] != [13:30:35.238] envs[common]] [13:30:35.238] NAMES <- toupper(changed) [13:30:35.238] args <- list() [13:30:35.238] for (kk in seq_along(NAMES)) { [13:30:35.238] name <- changed[[kk]] [13:30:35.238] NAME <- NAMES[[kk]] [13:30:35.238] if (name != NAME && is.element(NAME, old_names)) [13:30:35.238] next [13:30:35.238] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.238] } [13:30:35.238] NAMES <- toupper(added) [13:30:35.238] for (kk in seq_along(NAMES)) { [13:30:35.238] name <- added[[kk]] [13:30:35.238] NAME <- NAMES[[kk]] [13:30:35.238] if (name != NAME && is.element(NAME, old_names)) [13:30:35.238] next [13:30:35.238] args[[name]] <- "" [13:30:35.238] } [13:30:35.238] NAMES <- toupper(removed) [13:30:35.238] for (kk in seq_along(NAMES)) { [13:30:35.238] name <- removed[[kk]] [13:30:35.238] NAME <- NAMES[[kk]] [13:30:35.238] if (name != NAME && is.element(NAME, old_names)) [13:30:35.238] next [13:30:35.238] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.238] } [13:30:35.238] if (length(args) > 0) [13:30:35.238] base::do.call(base::Sys.setenv, args = args) [13:30:35.238] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.238] } [13:30:35.238] else { [13:30:35.238] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.238] } [13:30:35.238] { [13:30:35.238] if (base::length(...future.futureOptionsAdded) > [13:30:35.238] 0L) { [13:30:35.238] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.238] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.238] base::options(opts) [13:30:35.238] } [13:30:35.238] { [13:30:35.238] NULL [13:30:35.238] options(future.plan = NULL) [13:30:35.238] if (is.na(NA_character_)) [13:30:35.238] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.238] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.238] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.238] .init = FALSE) [13:30:35.238] } [13:30:35.238] } [13:30:35.238] } [13:30:35.238] }) [13:30:35.238] if (TRUE) { [13:30:35.238] base::sink(type = "output", split = FALSE) [13:30:35.238] if (TRUE) { [13:30:35.238] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.238] } [13:30:35.238] else { [13:30:35.238] ...future.result["stdout"] <- base::list(NULL) [13:30:35.238] } [13:30:35.238] base::close(...future.stdout) [13:30:35.238] ...future.stdout <- NULL [13:30:35.238] } [13:30:35.238] ...future.result$conditions <- ...future.conditions [13:30:35.238] ...future.result$finished <- base::Sys.time() [13:30:35.238] ...future.result [13:30:35.238] } [13:30:35.242] - Launch lazy future ... done [13:30:35.242] 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:30:35.242] resolved() for 'MiraiFuture' ... [13:30:35.243] - state: 'running' [13:30:35.243] - run: TRUE [13:30:35.243] - result: 'NULL' [13:30:35.243] - resolved: FALSE [13:30:35.243] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.244] getGlobalsAndPackages() ... [13:30:35.244] Searching for globals... [13:30:35.245] - globals found: [1] '{' [13:30:35.245] Searching for globals ... DONE [13:30:35.245] Resolving globals: FALSE [13:30:35.246] [13:30:35.246] [13:30:35.246] getGlobalsAndPackages() ... DONE [13:30:35.246] run() for 'Future' ... [13:30:35.247] - state: 'created' [13:30:35.247] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.247] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.247] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.247] - Field: 'label' [13:30:35.248] - Field: 'local' [13:30:35.248] - Field: 'owner' [13:30:35.248] - Field: 'envir' [13:30:35.248] - Field: 'packages' [13:30:35.248] - Field: 'gc' [13:30:35.248] - Field: 'conditions' [13:30:35.249] - Field: 'expr' [13:30:35.249] - Field: 'uuid' [13:30:35.249] - Field: 'seed' [13:30:35.249] - Field: 'version' [13:30:35.249] - Field: 'result' [13:30:35.249] - Field: 'asynchronous' [13:30:35.250] - Field: 'calls' [13:30:35.250] - Field: 'globals' [13:30:35.250] - Field: 'stdout' [13:30:35.250] - Field: 'earlySignal' [13:30:35.250] - Field: 'lazy' [13:30:35.251] - Field: 'state' [13:30:35.251] - Field: '.cluster' [13:30:35.251] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.251] - Launch lazy future ... [13:30:35.251] Packages needed by the future expression (n = 0): [13:30:35.251] Packages needed by future strategies (n = 0): [13:30:35.253] { [13:30:35.253] { [13:30:35.253] { [13:30:35.253] ...future.startTime <- base::Sys.time() [13:30:35.253] { [13:30:35.253] { [13:30:35.253] { [13:30:35.253] base::local({ [13:30:35.253] has_future <- base::requireNamespace("future", [13:30:35.253] quietly = TRUE) [13:30:35.253] if (has_future) { [13:30:35.253] ns <- base::getNamespace("future") [13:30:35.253] version <- ns[[".package"]][["version"]] [13:30:35.253] if (is.null(version)) [13:30:35.253] version <- utils::packageVersion("future") [13:30:35.253] } [13:30:35.253] else { [13:30:35.253] version <- NULL [13:30:35.253] } [13:30:35.253] if (!has_future || version < "1.8.0") { [13:30:35.253] info <- base::c(r_version = base::gsub("R version ", [13:30:35.253] "", base::R.version$version.string), [13:30:35.253] platform = base::sprintf("%s (%s-bit)", [13:30:35.253] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.253] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.253] "release", "version")], collapse = " "), [13:30:35.253] hostname = base::Sys.info()[["nodename"]]) [13:30:35.253] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.253] info) [13:30:35.253] info <- base::paste(info, collapse = "; ") [13:30:35.253] if (!has_future) { [13:30:35.253] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.253] info) [13:30:35.253] } [13:30:35.253] else { [13:30:35.253] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.253] info, version) [13:30:35.253] } [13:30:35.253] base::stop(msg) [13:30:35.253] } [13:30:35.253] }) [13:30:35.253] } [13:30:35.253] ...future.strategy.old <- future::plan("list") [13:30:35.253] options(future.plan = NULL) [13:30:35.253] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.253] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.253] } [13:30:35.253] ...future.workdir <- getwd() [13:30:35.253] } [13:30:35.253] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.253] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.253] } [13:30:35.253] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.253] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.253] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.253] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.253] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.253] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.253] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.253] base::names(...future.oldOptions)) [13:30:35.253] } [13:30:35.253] if (FALSE) { [13:30:35.253] } [13:30:35.253] else { [13:30:35.253] if (TRUE) { [13:30:35.253] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.253] open = "w") [13:30:35.253] } [13:30:35.253] else { [13:30:35.253] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.253] windows = "NUL", "/dev/null"), open = "w") [13:30:35.253] } [13:30:35.253] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.253] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.253] base::sink(type = "output", split = FALSE) [13:30:35.253] base::close(...future.stdout) [13:30:35.253] }, add = TRUE) [13:30:35.253] } [13:30:35.253] ...future.frame <- base::sys.nframe() [13:30:35.253] ...future.conditions <- base::list() [13:30:35.253] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.253] if (FALSE) { [13:30:35.253] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.253] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.253] } [13:30:35.253] ...future.result <- base::tryCatch({ [13:30:35.253] base::withCallingHandlers({ [13:30:35.253] ...future.value <- base::withVisible(base::local({ [13:30:35.253] 42 [13:30:35.253] })) [13:30:35.253] future::FutureResult(value = ...future.value$value, [13:30:35.253] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.253] ...future.rng), globalenv = if (FALSE) [13:30:35.253] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.253] ...future.globalenv.names)) [13:30:35.253] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.253] }, condition = base::local({ [13:30:35.253] c <- base::c [13:30:35.253] inherits <- base::inherits [13:30:35.253] invokeRestart <- base::invokeRestart [13:30:35.253] length <- base::length [13:30:35.253] list <- base::list [13:30:35.253] seq.int <- base::seq.int [13:30:35.253] signalCondition <- base::signalCondition [13:30:35.253] sys.calls <- base::sys.calls [13:30:35.253] `[[` <- base::`[[` [13:30:35.253] `+` <- base::`+` [13:30:35.253] `<<-` <- base::`<<-` [13:30:35.253] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.253] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.253] 3L)] [13:30:35.253] } [13:30:35.253] function(cond) { [13:30:35.253] is_error <- inherits(cond, "error") [13:30:35.253] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.253] NULL) [13:30:35.253] if (is_error) { [13:30:35.253] sessionInformation <- function() { [13:30:35.253] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.253] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.253] search = base::search(), system = base::Sys.info()) [13:30:35.253] } [13:30:35.253] ...future.conditions[[length(...future.conditions) + [13:30:35.253] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.253] cond$call), session = sessionInformation(), [13:30:35.253] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.253] signalCondition(cond) [13:30:35.253] } [13:30:35.253] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.253] signal <- FALSE && inherits(cond, character(0)) [13:30:35.253] ...future.conditions[[length(...future.conditions) + [13:30:35.253] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.253] if (FALSE && !signal) { [13:30:35.253] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.253] { [13:30:35.253] inherits <- base::inherits [13:30:35.253] invokeRestart <- base::invokeRestart [13:30:35.253] is.null <- base::is.null [13:30:35.253] muffled <- FALSE [13:30:35.253] if (inherits(cond, "message")) { [13:30:35.253] muffled <- grepl(pattern, "muffleMessage") [13:30:35.253] if (muffled) [13:30:35.253] invokeRestart("muffleMessage") [13:30:35.253] } [13:30:35.253] else if (inherits(cond, "warning")) { [13:30:35.253] muffled <- grepl(pattern, "muffleWarning") [13:30:35.253] if (muffled) [13:30:35.253] invokeRestart("muffleWarning") [13:30:35.253] } [13:30:35.253] else if (inherits(cond, "condition")) { [13:30:35.253] if (!is.null(pattern)) { [13:30:35.253] computeRestarts <- base::computeRestarts [13:30:35.253] grepl <- base::grepl [13:30:35.253] restarts <- computeRestarts(cond) [13:30:35.253] for (restart in restarts) { [13:30:35.253] name <- restart$name [13:30:35.253] if (is.null(name)) [13:30:35.253] next [13:30:35.253] if (!grepl(pattern, name)) [13:30:35.253] next [13:30:35.253] invokeRestart(restart) [13:30:35.253] muffled <- TRUE [13:30:35.253] break [13:30:35.253] } [13:30:35.253] } [13:30:35.253] } [13:30:35.253] invisible(muffled) [13:30:35.253] } [13:30:35.253] muffleCondition(cond, pattern = "^muffle") [13:30:35.253] } [13:30:35.253] } [13:30:35.253] else { [13:30:35.253] if (TRUE) { [13:30:35.253] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.253] { [13:30:35.253] inherits <- base::inherits [13:30:35.253] invokeRestart <- base::invokeRestart [13:30:35.253] is.null <- base::is.null [13:30:35.253] muffled <- FALSE [13:30:35.253] if (inherits(cond, "message")) { [13:30:35.253] muffled <- grepl(pattern, "muffleMessage") [13:30:35.253] if (muffled) [13:30:35.253] invokeRestart("muffleMessage") [13:30:35.253] } [13:30:35.253] else if (inherits(cond, "warning")) { [13:30:35.253] muffled <- grepl(pattern, "muffleWarning") [13:30:35.253] if (muffled) [13:30:35.253] invokeRestart("muffleWarning") [13:30:35.253] } [13:30:35.253] else if (inherits(cond, "condition")) { [13:30:35.253] if (!is.null(pattern)) { [13:30:35.253] computeRestarts <- base::computeRestarts [13:30:35.253] grepl <- base::grepl [13:30:35.253] restarts <- computeRestarts(cond) [13:30:35.253] for (restart in restarts) { [13:30:35.253] name <- restart$name [13:30:35.253] if (is.null(name)) [13:30:35.253] next [13:30:35.253] if (!grepl(pattern, name)) [13:30:35.253] next [13:30:35.253] invokeRestart(restart) [13:30:35.253] muffled <- TRUE [13:30:35.253] break [13:30:35.253] } [13:30:35.253] } [13:30:35.253] } [13:30:35.253] invisible(muffled) [13:30:35.253] } [13:30:35.253] muffleCondition(cond, pattern = "^muffle") [13:30:35.253] } [13:30:35.253] } [13:30:35.253] } [13:30:35.253] })) [13:30:35.253] }, error = function(ex) { [13:30:35.253] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.253] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.253] ...future.rng), started = ...future.startTime, [13:30:35.253] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.253] version = "1.8"), class = "FutureResult") [13:30:35.253] }, finally = { [13:30:35.253] if (!identical(...future.workdir, getwd())) [13:30:35.253] setwd(...future.workdir) [13:30:35.253] { [13:30:35.253] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.253] ...future.oldOptions$nwarnings <- NULL [13:30:35.253] } [13:30:35.253] base::options(...future.oldOptions) [13:30:35.253] if (.Platform$OS.type == "windows") { [13:30:35.253] old_names <- names(...future.oldEnvVars) [13:30:35.253] envs <- base::Sys.getenv() [13:30:35.253] names <- names(envs) [13:30:35.253] common <- intersect(names, old_names) [13:30:35.253] added <- setdiff(names, old_names) [13:30:35.253] removed <- setdiff(old_names, names) [13:30:35.253] changed <- common[...future.oldEnvVars[common] != [13:30:35.253] envs[common]] [13:30:35.253] NAMES <- toupper(changed) [13:30:35.253] args <- list() [13:30:35.253] for (kk in seq_along(NAMES)) { [13:30:35.253] name <- changed[[kk]] [13:30:35.253] NAME <- NAMES[[kk]] [13:30:35.253] if (name != NAME && is.element(NAME, old_names)) [13:30:35.253] next [13:30:35.253] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.253] } [13:30:35.253] NAMES <- toupper(added) [13:30:35.253] for (kk in seq_along(NAMES)) { [13:30:35.253] name <- added[[kk]] [13:30:35.253] NAME <- NAMES[[kk]] [13:30:35.253] if (name != NAME && is.element(NAME, old_names)) [13:30:35.253] next [13:30:35.253] args[[name]] <- "" [13:30:35.253] } [13:30:35.253] NAMES <- toupper(removed) [13:30:35.253] for (kk in seq_along(NAMES)) { [13:30:35.253] name <- removed[[kk]] [13:30:35.253] NAME <- NAMES[[kk]] [13:30:35.253] if (name != NAME && is.element(NAME, old_names)) [13:30:35.253] next [13:30:35.253] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.253] } [13:30:35.253] if (length(args) > 0) [13:30:35.253] base::do.call(base::Sys.setenv, args = args) [13:30:35.253] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.253] } [13:30:35.253] else { [13:30:35.253] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.253] } [13:30:35.253] { [13:30:35.253] if (base::length(...future.futureOptionsAdded) > [13:30:35.253] 0L) { [13:30:35.253] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.253] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.253] base::options(opts) [13:30:35.253] } [13:30:35.253] { [13:30:35.253] NULL [13:30:35.253] options(future.plan = NULL) [13:30:35.253] if (is.na(NA_character_)) [13:30:35.253] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.253] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.253] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.253] .init = FALSE) [13:30:35.253] } [13:30:35.253] } [13:30:35.253] } [13:30:35.253] }) [13:30:35.253] if (TRUE) { [13:30:35.253] base::sink(type = "output", split = FALSE) [13:30:35.253] if (TRUE) { [13:30:35.253] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.253] } [13:30:35.253] else { [13:30:35.253] ...future.result["stdout"] <- base::list(NULL) [13:30:35.253] } [13:30:35.253] base::close(...future.stdout) [13:30:35.253] ...future.stdout <- NULL [13:30:35.253] } [13:30:35.253] ...future.result$conditions <- ...future.conditions [13:30:35.253] ...future.result$finished <- base::Sys.time() [13:30:35.253] ...future.result [13:30:35.253] } [13:30:35.257] - Launch lazy future ... done [13:30:35.257] 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:30:35.258] resolved() for 'MiraiFuture' ... [13:30:35.258] - state: 'running' [13:30:35.258] - run: TRUE [13:30:35.258] - result: 'NULL' [13:30:35.259] - resolved: FALSE [13:30:35.259] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.259] - plan('mirai_cluster') ... DONE[13:30:35.259] - plan('mirai_multisession') ...[13:30:35.260] plan(): Setting new future strategy stack: [13:30:35.260] List of future strategies: [13:30:35.260] 1. mirai_multisession: [13:30:35.260] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:30:35.260] - tweaked: FALSE [13:30:35.260] - call: plan(strategy) [13:30:35.260] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:30:35.260] < mirai | $data > [13:30:35.262] getGlobalsAndPackages() ... [13:30:35.263] Not searching for globals [13:30:35.263] - globals: [0] [13:30:35.263] getGlobalsAndPackages() ... DONE [13:30:35.263] getGlobalsAndPackages() ... [13:30:35.263] [13:30:35.263] - globals: [0] [13:30:35.264] getGlobalsAndPackages() ... DONE [13:30:35.264] Packages needed by the future expression (n = 0): [13:30:35.264] Packages needed by future strategies (n = 0): [13:30:35.265] { [13:30:35.265] { [13:30:35.265] { [13:30:35.265] ...future.startTime <- base::Sys.time() [13:30:35.265] { [13:30:35.265] { [13:30:35.265] { [13:30:35.265] base::local({ [13:30:35.265] has_future <- base::requireNamespace("future", [13:30:35.265] quietly = TRUE) [13:30:35.265] if (has_future) { [13:30:35.265] ns <- base::getNamespace("future") [13:30:35.265] version <- ns[[".package"]][["version"]] [13:30:35.265] if (is.null(version)) [13:30:35.265] version <- utils::packageVersion("future") [13:30:35.265] } [13:30:35.265] else { [13:30:35.265] version <- NULL [13:30:35.265] } [13:30:35.265] if (!has_future || version < "1.8.0") { [13:30:35.265] info <- base::c(r_version = base::gsub("R version ", [13:30:35.265] "", base::R.version$version.string), [13:30:35.265] platform = base::sprintf("%s (%s-bit)", [13:30:35.265] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.265] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.265] "release", "version")], collapse = " "), [13:30:35.265] hostname = base::Sys.info()[["nodename"]]) [13:30:35.265] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.265] info) [13:30:35.265] info <- base::paste(info, collapse = "; ") [13:30:35.265] if (!has_future) { [13:30:35.265] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.265] info) [13:30:35.265] } [13:30:35.265] else { [13:30:35.265] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.265] info, version) [13:30:35.265] } [13:30:35.265] base::stop(msg) [13:30:35.265] } [13:30:35.265] }) [13:30:35.265] } [13:30:35.265] ...future.strategy.old <- future::plan("list") [13:30:35.265] options(future.plan = NULL) [13:30:35.265] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.265] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.265] } [13:30:35.265] ...future.workdir <- getwd() [13:30:35.265] } [13:30:35.265] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.265] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.265] } [13:30:35.265] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.265] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.265] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.265] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.265] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.265] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.265] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.265] base::names(...future.oldOptions)) [13:30:35.265] } [13:30:35.265] if (FALSE) { [13:30:35.265] } [13:30:35.265] else { [13:30:35.265] if (TRUE) { [13:30:35.265] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.265] open = "w") [13:30:35.265] } [13:30:35.265] else { [13:30:35.265] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.265] windows = "NUL", "/dev/null"), open = "w") [13:30:35.265] } [13:30:35.265] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.265] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.265] base::sink(type = "output", split = FALSE) [13:30:35.265] base::close(...future.stdout) [13:30:35.265] }, add = TRUE) [13:30:35.265] } [13:30:35.265] ...future.frame <- base::sys.nframe() [13:30:35.265] ...future.conditions <- base::list() [13:30:35.265] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.265] if (FALSE) { [13:30:35.265] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.265] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.265] } [13:30:35.265] ...future.result <- base::tryCatch({ [13:30:35.265] base::withCallingHandlers({ [13:30:35.265] ...future.value <- base::withVisible(base::local(NA)) [13:30:35.265] future::FutureResult(value = ...future.value$value, [13:30:35.265] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.265] ...future.rng), globalenv = if (FALSE) [13:30:35.265] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.265] ...future.globalenv.names)) [13:30:35.265] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.265] }, condition = base::local({ [13:30:35.265] c <- base::c [13:30:35.265] inherits <- base::inherits [13:30:35.265] invokeRestart <- base::invokeRestart [13:30:35.265] length <- base::length [13:30:35.265] list <- base::list [13:30:35.265] seq.int <- base::seq.int [13:30:35.265] signalCondition <- base::signalCondition [13:30:35.265] sys.calls <- base::sys.calls [13:30:35.265] `[[` <- base::`[[` [13:30:35.265] `+` <- base::`+` [13:30:35.265] `<<-` <- base::`<<-` [13:30:35.265] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.265] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.265] 3L)] [13:30:35.265] } [13:30:35.265] function(cond) { [13:30:35.265] is_error <- inherits(cond, "error") [13:30:35.265] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.265] NULL) [13:30:35.265] if (is_error) { [13:30:35.265] sessionInformation <- function() { [13:30:35.265] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.265] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.265] search = base::search(), system = base::Sys.info()) [13:30:35.265] } [13:30:35.265] ...future.conditions[[length(...future.conditions) + [13:30:35.265] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.265] cond$call), session = sessionInformation(), [13:30:35.265] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.265] signalCondition(cond) [13:30:35.265] } [13:30:35.265] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.265] signal <- FALSE && inherits(cond, character(0)) [13:30:35.265] ...future.conditions[[length(...future.conditions) + [13:30:35.265] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.265] if (FALSE && !signal) { [13:30:35.265] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.265] { [13:30:35.265] inherits <- base::inherits [13:30:35.265] invokeRestart <- base::invokeRestart [13:30:35.265] is.null <- base::is.null [13:30:35.265] muffled <- FALSE [13:30:35.265] if (inherits(cond, "message")) { [13:30:35.265] muffled <- grepl(pattern, "muffleMessage") [13:30:35.265] if (muffled) [13:30:35.265] invokeRestart("muffleMessage") [13:30:35.265] } [13:30:35.265] else if (inherits(cond, "warning")) { [13:30:35.265] muffled <- grepl(pattern, "muffleWarning") [13:30:35.265] if (muffled) [13:30:35.265] invokeRestart("muffleWarning") [13:30:35.265] } [13:30:35.265] else if (inherits(cond, "condition")) { [13:30:35.265] if (!is.null(pattern)) { [13:30:35.265] computeRestarts <- base::computeRestarts [13:30:35.265] grepl <- base::grepl [13:30:35.265] restarts <- computeRestarts(cond) [13:30:35.265] for (restart in restarts) { [13:30:35.265] name <- restart$name [13:30:35.265] if (is.null(name)) [13:30:35.265] next [13:30:35.265] if (!grepl(pattern, name)) [13:30:35.265] next [13:30:35.265] invokeRestart(restart) [13:30:35.265] muffled <- TRUE [13:30:35.265] break [13:30:35.265] } [13:30:35.265] } [13:30:35.265] } [13:30:35.265] invisible(muffled) [13:30:35.265] } [13:30:35.265] muffleCondition(cond, pattern = "^muffle") [13:30:35.265] } [13:30:35.265] } [13:30:35.265] else { [13:30:35.265] if (TRUE) { [13:30:35.265] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.265] { [13:30:35.265] inherits <- base::inherits [13:30:35.265] invokeRestart <- base::invokeRestart [13:30:35.265] is.null <- base::is.null [13:30:35.265] muffled <- FALSE [13:30:35.265] if (inherits(cond, "message")) { [13:30:35.265] muffled <- grepl(pattern, "muffleMessage") [13:30:35.265] if (muffled) [13:30:35.265] invokeRestart("muffleMessage") [13:30:35.265] } [13:30:35.265] else if (inherits(cond, "warning")) { [13:30:35.265] muffled <- grepl(pattern, "muffleWarning") [13:30:35.265] if (muffled) [13:30:35.265] invokeRestart("muffleWarning") [13:30:35.265] } [13:30:35.265] else if (inherits(cond, "condition")) { [13:30:35.265] if (!is.null(pattern)) { [13:30:35.265] computeRestarts <- base::computeRestarts [13:30:35.265] grepl <- base::grepl [13:30:35.265] restarts <- computeRestarts(cond) [13:30:35.265] for (restart in restarts) { [13:30:35.265] name <- restart$name [13:30:35.265] if (is.null(name)) [13:30:35.265] next [13:30:35.265] if (!grepl(pattern, name)) [13:30:35.265] next [13:30:35.265] invokeRestart(restart) [13:30:35.265] muffled <- TRUE [13:30:35.265] break [13:30:35.265] } [13:30:35.265] } [13:30:35.265] } [13:30:35.265] invisible(muffled) [13:30:35.265] } [13:30:35.265] muffleCondition(cond, pattern = "^muffle") [13:30:35.265] } [13:30:35.265] } [13:30:35.265] } [13:30:35.265] })) [13:30:35.265] }, error = function(ex) { [13:30:35.265] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.265] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.265] ...future.rng), started = ...future.startTime, [13:30:35.265] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.265] version = "1.8"), class = "FutureResult") [13:30:35.265] }, finally = { [13:30:35.265] if (!identical(...future.workdir, getwd())) [13:30:35.265] setwd(...future.workdir) [13:30:35.265] { [13:30:35.265] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.265] ...future.oldOptions$nwarnings <- NULL [13:30:35.265] } [13:30:35.265] base::options(...future.oldOptions) [13:30:35.265] if (.Platform$OS.type == "windows") { [13:30:35.265] old_names <- names(...future.oldEnvVars) [13:30:35.265] envs <- base::Sys.getenv() [13:30:35.265] names <- names(envs) [13:30:35.265] common <- intersect(names, old_names) [13:30:35.265] added <- setdiff(names, old_names) [13:30:35.265] removed <- setdiff(old_names, names) [13:30:35.265] changed <- common[...future.oldEnvVars[common] != [13:30:35.265] envs[common]] [13:30:35.265] NAMES <- toupper(changed) [13:30:35.265] args <- list() [13:30:35.265] for (kk in seq_along(NAMES)) { [13:30:35.265] name <- changed[[kk]] [13:30:35.265] NAME <- NAMES[[kk]] [13:30:35.265] if (name != NAME && is.element(NAME, old_names)) [13:30:35.265] next [13:30:35.265] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.265] } [13:30:35.265] NAMES <- toupper(added) [13:30:35.265] for (kk in seq_along(NAMES)) { [13:30:35.265] name <- added[[kk]] [13:30:35.265] NAME <- NAMES[[kk]] [13:30:35.265] if (name != NAME && is.element(NAME, old_names)) [13:30:35.265] next [13:30:35.265] args[[name]] <- "" [13:30:35.265] } [13:30:35.265] NAMES <- toupper(removed) [13:30:35.265] for (kk in seq_along(NAMES)) { [13:30:35.265] name <- removed[[kk]] [13:30:35.265] NAME <- NAMES[[kk]] [13:30:35.265] if (name != NAME && is.element(NAME, old_names)) [13:30:35.265] next [13:30:35.265] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.265] } [13:30:35.265] if (length(args) > 0) [13:30:35.265] base::do.call(base::Sys.setenv, args = args) [13:30:35.265] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.265] } [13:30:35.265] else { [13:30:35.265] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.265] } [13:30:35.265] { [13:30:35.265] if (base::length(...future.futureOptionsAdded) > [13:30:35.265] 0L) { [13:30:35.265] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.265] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.265] base::options(opts) [13:30:35.265] } [13:30:35.265] { [13:30:35.265] NULL [13:30:35.265] options(future.plan = NULL) [13:30:35.265] if (is.na(NA_character_)) [13:30:35.265] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.265] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.265] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.265] .init = FALSE) [13:30:35.265] } [13:30:35.265] } [13:30:35.265] } [13:30:35.265] }) [13:30:35.265] if (TRUE) { [13:30:35.265] base::sink(type = "output", split = FALSE) [13:30:35.265] if (TRUE) { [13:30:35.265] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.265] } [13:30:35.265] else { [13:30:35.265] ...future.result["stdout"] <- base::list(NULL) [13:30:35.265] } [13:30:35.265] base::close(...future.stdout) [13:30:35.265] ...future.stdout <- NULL [13:30:35.265] } [13:30:35.265] ...future.result$conditions <- ...future.conditions [13:30:35.265] ...future.result$finished <- base::Sys.time() [13:30:35.265] ...future.result [13:30:35.265] } [13:30:35.270] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:30:35.271] plan(): nbrOfWorkers() = 2 [13:30:35.273] getGlobalsAndPackages() ... [13:30:35.273] Searching for globals... [13:30:35.273] [13:30:35.274] Searching for globals ... DONE [13:30:35.274] - globals: [0] [13:30:35.274] getGlobalsAndPackages() ... DONE [13:30:35.274] getGlobalsAndPackages() ... [13:30:35.274] [13:30:35.274] - globals: [0] [13:30:35.274] getGlobalsAndPackages() ... DONE [13:30:35.275] Packages needed by the future expression (n = 0): [13:30:35.275] Packages needed by future strategies (n = 0): [13:30:35.276] { [13:30:35.276] { [13:30:35.276] { [13:30:35.276] ...future.startTime <- base::Sys.time() [13:30:35.276] { [13:30:35.276] { [13:30:35.276] { [13:30:35.276] base::local({ [13:30:35.276] has_future <- base::requireNamespace("future", [13:30:35.276] quietly = TRUE) [13:30:35.276] if (has_future) { [13:30:35.276] ns <- base::getNamespace("future") [13:30:35.276] version <- ns[[".package"]][["version"]] [13:30:35.276] if (is.null(version)) [13:30:35.276] version <- utils::packageVersion("future") [13:30:35.276] } [13:30:35.276] else { [13:30:35.276] version <- NULL [13:30:35.276] } [13:30:35.276] if (!has_future || version < "1.8.0") { [13:30:35.276] info <- base::c(r_version = base::gsub("R version ", [13:30:35.276] "", base::R.version$version.string), [13:30:35.276] platform = base::sprintf("%s (%s-bit)", [13:30:35.276] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.276] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.276] "release", "version")], collapse = " "), [13:30:35.276] hostname = base::Sys.info()[["nodename"]]) [13:30:35.276] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.276] info) [13:30:35.276] info <- base::paste(info, collapse = "; ") [13:30:35.276] if (!has_future) { [13:30:35.276] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.276] info) [13:30:35.276] } [13:30:35.276] else { [13:30:35.276] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.276] info, version) [13:30:35.276] } [13:30:35.276] base::stop(msg) [13:30:35.276] } [13:30:35.276] }) [13:30:35.276] } [13:30:35.276] ...future.strategy.old <- future::plan("list") [13:30:35.276] options(future.plan = NULL) [13:30:35.276] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.276] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.276] } [13:30:35.276] ...future.workdir <- getwd() [13:30:35.276] } [13:30:35.276] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.276] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.276] } [13:30:35.276] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.276] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.276] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.276] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.276] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.276] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.276] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.276] base::names(...future.oldOptions)) [13:30:35.276] } [13:30:35.276] if (FALSE) { [13:30:35.276] } [13:30:35.276] else { [13:30:35.276] if (TRUE) { [13:30:35.276] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.276] open = "w") [13:30:35.276] } [13:30:35.276] else { [13:30:35.276] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.276] windows = "NUL", "/dev/null"), open = "w") [13:30:35.276] } [13:30:35.276] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.276] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.276] base::sink(type = "output", split = FALSE) [13:30:35.276] base::close(...future.stdout) [13:30:35.276] }, add = TRUE) [13:30:35.276] } [13:30:35.276] ...future.frame <- base::sys.nframe() [13:30:35.276] ...future.conditions <- base::list() [13:30:35.276] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.276] if (FALSE) { [13:30:35.276] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.276] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.276] } [13:30:35.276] ...future.result <- base::tryCatch({ [13:30:35.276] base::withCallingHandlers({ [13:30:35.276] ...future.value <- base::withVisible(base::local(42)) [13:30:35.276] future::FutureResult(value = ...future.value$value, [13:30:35.276] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.276] ...future.rng), globalenv = if (FALSE) [13:30:35.276] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.276] ...future.globalenv.names)) [13:30:35.276] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.276] }, condition = base::local({ [13:30:35.276] c <- base::c [13:30:35.276] inherits <- base::inherits [13:30:35.276] invokeRestart <- base::invokeRestart [13:30:35.276] length <- base::length [13:30:35.276] list <- base::list [13:30:35.276] seq.int <- base::seq.int [13:30:35.276] signalCondition <- base::signalCondition [13:30:35.276] sys.calls <- base::sys.calls [13:30:35.276] `[[` <- base::`[[` [13:30:35.276] `+` <- base::`+` [13:30:35.276] `<<-` <- base::`<<-` [13:30:35.276] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.276] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.276] 3L)] [13:30:35.276] } [13:30:35.276] function(cond) { [13:30:35.276] is_error <- inherits(cond, "error") [13:30:35.276] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.276] NULL) [13:30:35.276] if (is_error) { [13:30:35.276] sessionInformation <- function() { [13:30:35.276] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.276] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.276] search = base::search(), system = base::Sys.info()) [13:30:35.276] } [13:30:35.276] ...future.conditions[[length(...future.conditions) + [13:30:35.276] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.276] cond$call), session = sessionInformation(), [13:30:35.276] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.276] signalCondition(cond) [13:30:35.276] } [13:30:35.276] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.276] signal <- FALSE && inherits(cond, character(0)) [13:30:35.276] ...future.conditions[[length(...future.conditions) + [13:30:35.276] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.276] if (FALSE && !signal) { [13:30:35.276] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.276] { [13:30:35.276] inherits <- base::inherits [13:30:35.276] invokeRestart <- base::invokeRestart [13:30:35.276] is.null <- base::is.null [13:30:35.276] muffled <- FALSE [13:30:35.276] if (inherits(cond, "message")) { [13:30:35.276] muffled <- grepl(pattern, "muffleMessage") [13:30:35.276] if (muffled) [13:30:35.276] invokeRestart("muffleMessage") [13:30:35.276] } [13:30:35.276] else if (inherits(cond, "warning")) { [13:30:35.276] muffled <- grepl(pattern, "muffleWarning") [13:30:35.276] if (muffled) [13:30:35.276] invokeRestart("muffleWarning") [13:30:35.276] } [13:30:35.276] else if (inherits(cond, "condition")) { [13:30:35.276] if (!is.null(pattern)) { [13:30:35.276] computeRestarts <- base::computeRestarts [13:30:35.276] grepl <- base::grepl [13:30:35.276] restarts <- computeRestarts(cond) [13:30:35.276] for (restart in restarts) { [13:30:35.276] name <- restart$name [13:30:35.276] if (is.null(name)) [13:30:35.276] next [13:30:35.276] if (!grepl(pattern, name)) [13:30:35.276] next [13:30:35.276] invokeRestart(restart) [13:30:35.276] muffled <- TRUE [13:30:35.276] break [13:30:35.276] } [13:30:35.276] } [13:30:35.276] } [13:30:35.276] invisible(muffled) [13:30:35.276] } [13:30:35.276] muffleCondition(cond, pattern = "^muffle") [13:30:35.276] } [13:30:35.276] } [13:30:35.276] else { [13:30:35.276] if (TRUE) { [13:30:35.276] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.276] { [13:30:35.276] inherits <- base::inherits [13:30:35.276] invokeRestart <- base::invokeRestart [13:30:35.276] is.null <- base::is.null [13:30:35.276] muffled <- FALSE [13:30:35.276] if (inherits(cond, "message")) { [13:30:35.276] muffled <- grepl(pattern, "muffleMessage") [13:30:35.276] if (muffled) [13:30:35.276] invokeRestart("muffleMessage") [13:30:35.276] } [13:30:35.276] else if (inherits(cond, "warning")) { [13:30:35.276] muffled <- grepl(pattern, "muffleWarning") [13:30:35.276] if (muffled) [13:30:35.276] invokeRestart("muffleWarning") [13:30:35.276] } [13:30:35.276] else if (inherits(cond, "condition")) { [13:30:35.276] if (!is.null(pattern)) { [13:30:35.276] computeRestarts <- base::computeRestarts [13:30:35.276] grepl <- base::grepl [13:30:35.276] restarts <- computeRestarts(cond) [13:30:35.276] for (restart in restarts) { [13:30:35.276] name <- restart$name [13:30:35.276] if (is.null(name)) [13:30:35.276] next [13:30:35.276] if (!grepl(pattern, name)) [13:30:35.276] next [13:30:35.276] invokeRestart(restart) [13:30:35.276] muffled <- TRUE [13:30:35.276] break [13:30:35.276] } [13:30:35.276] } [13:30:35.276] } [13:30:35.276] invisible(muffled) [13:30:35.276] } [13:30:35.276] muffleCondition(cond, pattern = "^muffle") [13:30:35.276] } [13:30:35.276] } [13:30:35.276] } [13:30:35.276] })) [13:30:35.276] }, error = function(ex) { [13:30:35.276] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.276] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.276] ...future.rng), started = ...future.startTime, [13:30:35.276] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.276] version = "1.8"), class = "FutureResult") [13:30:35.276] }, finally = { [13:30:35.276] if (!identical(...future.workdir, getwd())) [13:30:35.276] setwd(...future.workdir) [13:30:35.276] { [13:30:35.276] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.276] ...future.oldOptions$nwarnings <- NULL [13:30:35.276] } [13:30:35.276] base::options(...future.oldOptions) [13:30:35.276] if (.Platform$OS.type == "windows") { [13:30:35.276] old_names <- names(...future.oldEnvVars) [13:30:35.276] envs <- base::Sys.getenv() [13:30:35.276] names <- names(envs) [13:30:35.276] common <- intersect(names, old_names) [13:30:35.276] added <- setdiff(names, old_names) [13:30:35.276] removed <- setdiff(old_names, names) [13:30:35.276] changed <- common[...future.oldEnvVars[common] != [13:30:35.276] envs[common]] [13:30:35.276] NAMES <- toupper(changed) [13:30:35.276] args <- list() [13:30:35.276] for (kk in seq_along(NAMES)) { [13:30:35.276] name <- changed[[kk]] [13:30:35.276] NAME <- NAMES[[kk]] [13:30:35.276] if (name != NAME && is.element(NAME, old_names)) [13:30:35.276] next [13:30:35.276] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.276] } [13:30:35.276] NAMES <- toupper(added) [13:30:35.276] for (kk in seq_along(NAMES)) { [13:30:35.276] name <- added[[kk]] [13:30:35.276] NAME <- NAMES[[kk]] [13:30:35.276] if (name != NAME && is.element(NAME, old_names)) [13:30:35.276] next [13:30:35.276] args[[name]] <- "" [13:30:35.276] } [13:30:35.276] NAMES <- toupper(removed) [13:30:35.276] for (kk in seq_along(NAMES)) { [13:30:35.276] name <- removed[[kk]] [13:30:35.276] NAME <- NAMES[[kk]] [13:30:35.276] if (name != NAME && is.element(NAME, old_names)) [13:30:35.276] next [13:30:35.276] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.276] } [13:30:35.276] if (length(args) > 0) [13:30:35.276] base::do.call(base::Sys.setenv, args = args) [13:30:35.276] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.276] } [13:30:35.276] else { [13:30:35.276] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.276] } [13:30:35.276] { [13:30:35.276] if (base::length(...future.futureOptionsAdded) > [13:30:35.276] 0L) { [13:30:35.276] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.276] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.276] base::options(opts) [13:30:35.276] } [13:30:35.276] { [13:30:35.276] NULL [13:30:35.276] options(future.plan = NULL) [13:30:35.276] if (is.na(NA_character_)) [13:30:35.276] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.276] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.276] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.276] .init = FALSE) [13:30:35.276] } [13:30:35.276] } [13:30:35.276] } [13:30:35.276] }) [13:30:35.276] if (TRUE) { [13:30:35.276] base::sink(type = "output", split = FALSE) [13:30:35.276] if (TRUE) { [13:30:35.276] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.276] } [13:30:35.276] else { [13:30:35.276] ...future.result["stdout"] <- base::list(NULL) [13:30:35.276] } [13:30:35.276] base::close(...future.stdout) [13:30:35.276] ...future.stdout <- NULL [13:30:35.276] } [13:30:35.276] ...future.result$conditions <- ...future.conditions [13:30:35.276] ...future.result$finished <- base::Sys.time() [13:30:35.276] ...future.result [13:30:35.276] } 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:30:35.280] resolved() for 'MiraiFuture' ... [13:30:35.280] - state: 'running' [13:30:35.280] - run: TRUE [13:30:35.280] - result: 'NULL' [13:30:35.280] - resolved: FALSE [13:30:35.281] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.281] getGlobalsAndPackages() ... [13:30:35.281] Searching for globals... [13:30:35.282] [13:30:35.282] Searching for globals ... DONE [13:30:35.282] - globals: [0] [13:30:35.282] getGlobalsAndPackages() ... DONE [13:30:35.283] run() for 'Future' ... [13:30:35.283] - state: 'created' [13:30:35.283] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.285] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.286] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.286] - Field: 'label' [13:30:35.286] - Field: 'local' [13:30:35.286] - Field: 'owner' [13:30:35.286] - Field: 'envir' [13:30:35.286] - Field: 'packages' [13:30:35.287] - Field: 'gc' [13:30:35.287] - Field: 'conditions' [13:30:35.287] - Field: 'expr' [13:30:35.287] - Field: 'uuid' [13:30:35.287] - Field: 'seed' [13:30:35.287] - Field: 'version' [13:30:35.288] - Field: 'result' [13:30:35.288] - Field: 'asynchronous' [13:30:35.288] - Field: 'calls' [13:30:35.288] - Field: 'globals' [13:30:35.288] - Field: 'stdout' [13:30:35.288] - Field: 'earlySignal' [13:30:35.289] - Field: 'lazy' [13:30:35.289] - Field: 'state' [13:30:35.289] - Field: '.cluster' [13:30:35.289] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.289] - Launch lazy future ... [13:30:35.289] Packages needed by the future expression (n = 0): [13:30:35.290] Packages needed by future strategies (n = 0): [13:30:35.290] { [13:30:35.290] { [13:30:35.290] { [13:30:35.290] ...future.startTime <- base::Sys.time() [13:30:35.290] { [13:30:35.290] { [13:30:35.290] { [13:30:35.290] base::local({ [13:30:35.290] has_future <- base::requireNamespace("future", [13:30:35.290] quietly = TRUE) [13:30:35.290] if (has_future) { [13:30:35.290] ns <- base::getNamespace("future") [13:30:35.290] version <- ns[[".package"]][["version"]] [13:30:35.290] if (is.null(version)) [13:30:35.290] version <- utils::packageVersion("future") [13:30:35.290] } [13:30:35.290] else { [13:30:35.290] version <- NULL [13:30:35.290] } [13:30:35.290] if (!has_future || version < "1.8.0") { [13:30:35.290] info <- base::c(r_version = base::gsub("R version ", [13:30:35.290] "", base::R.version$version.string), [13:30:35.290] platform = base::sprintf("%s (%s-bit)", [13:30:35.290] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.290] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.290] "release", "version")], collapse = " "), [13:30:35.290] hostname = base::Sys.info()[["nodename"]]) [13:30:35.290] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.290] info) [13:30:35.290] info <- base::paste(info, collapse = "; ") [13:30:35.290] if (!has_future) { [13:30:35.290] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.290] info) [13:30:35.290] } [13:30:35.290] else { [13:30:35.290] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.290] info, version) [13:30:35.290] } [13:30:35.290] base::stop(msg) [13:30:35.290] } [13:30:35.290] }) [13:30:35.290] } [13:30:35.290] ...future.strategy.old <- future::plan("list") [13:30:35.290] options(future.plan = NULL) [13:30:35.290] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.290] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.290] } [13:30:35.290] ...future.workdir <- getwd() [13:30:35.290] } [13:30:35.290] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.290] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.290] } [13:30:35.290] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.290] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.290] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.290] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.290] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.290] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.290] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.290] base::names(...future.oldOptions)) [13:30:35.290] } [13:30:35.290] if (FALSE) { [13:30:35.290] } [13:30:35.290] else { [13:30:35.290] if (TRUE) { [13:30:35.290] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.290] open = "w") [13:30:35.290] } [13:30:35.290] else { [13:30:35.290] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.290] windows = "NUL", "/dev/null"), open = "w") [13:30:35.290] } [13:30:35.290] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.290] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.290] base::sink(type = "output", split = FALSE) [13:30:35.290] base::close(...future.stdout) [13:30:35.290] }, add = TRUE) [13:30:35.290] } [13:30:35.290] ...future.frame <- base::sys.nframe() [13:30:35.290] ...future.conditions <- base::list() [13:30:35.290] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.290] if (FALSE) { [13:30:35.290] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.290] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.290] } [13:30:35.290] ...future.result <- base::tryCatch({ [13:30:35.290] base::withCallingHandlers({ [13:30:35.290] ...future.value <- base::withVisible(base::local(42)) [13:30:35.290] future::FutureResult(value = ...future.value$value, [13:30:35.290] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.290] ...future.rng), globalenv = if (FALSE) [13:30:35.290] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.290] ...future.globalenv.names)) [13:30:35.290] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.290] }, condition = base::local({ [13:30:35.290] c <- base::c [13:30:35.290] inherits <- base::inherits [13:30:35.290] invokeRestart <- base::invokeRestart [13:30:35.290] length <- base::length [13:30:35.290] list <- base::list [13:30:35.290] seq.int <- base::seq.int [13:30:35.290] signalCondition <- base::signalCondition [13:30:35.290] sys.calls <- base::sys.calls [13:30:35.290] `[[` <- base::`[[` [13:30:35.290] `+` <- base::`+` [13:30:35.290] `<<-` <- base::`<<-` [13:30:35.290] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.290] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.290] 3L)] [13:30:35.290] } [13:30:35.290] function(cond) { [13:30:35.290] is_error <- inherits(cond, "error") [13:30:35.290] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.290] NULL) [13:30:35.290] if (is_error) { [13:30:35.290] sessionInformation <- function() { [13:30:35.290] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.290] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.290] search = base::search(), system = base::Sys.info()) [13:30:35.290] } [13:30:35.290] ...future.conditions[[length(...future.conditions) + [13:30:35.290] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.290] cond$call), session = sessionInformation(), [13:30:35.290] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.290] signalCondition(cond) [13:30:35.290] } [13:30:35.290] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.290] signal <- FALSE && inherits(cond, character(0)) [13:30:35.290] ...future.conditions[[length(...future.conditions) + [13:30:35.290] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.290] if (FALSE && !signal) { [13:30:35.290] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.290] { [13:30:35.290] inherits <- base::inherits [13:30:35.290] invokeRestart <- base::invokeRestart [13:30:35.290] is.null <- base::is.null [13:30:35.290] muffled <- FALSE [13:30:35.290] if (inherits(cond, "message")) { [13:30:35.290] muffled <- grepl(pattern, "muffleMessage") [13:30:35.290] if (muffled) [13:30:35.290] invokeRestart("muffleMessage") [13:30:35.290] } [13:30:35.290] else if (inherits(cond, "warning")) { [13:30:35.290] muffled <- grepl(pattern, "muffleWarning") [13:30:35.290] if (muffled) [13:30:35.290] invokeRestart("muffleWarning") [13:30:35.290] } [13:30:35.290] else if (inherits(cond, "condition")) { [13:30:35.290] if (!is.null(pattern)) { [13:30:35.290] computeRestarts <- base::computeRestarts [13:30:35.290] grepl <- base::grepl [13:30:35.290] restarts <- computeRestarts(cond) [13:30:35.290] for (restart in restarts) { [13:30:35.290] name <- restart$name [13:30:35.290] if (is.null(name)) [13:30:35.290] next [13:30:35.290] if (!grepl(pattern, name)) [13:30:35.290] next [13:30:35.290] invokeRestart(restart) [13:30:35.290] muffled <- TRUE [13:30:35.290] break [13:30:35.290] } [13:30:35.290] } [13:30:35.290] } [13:30:35.290] invisible(muffled) [13:30:35.290] } [13:30:35.290] muffleCondition(cond, pattern = "^muffle") [13:30:35.290] } [13:30:35.290] } [13:30:35.290] else { [13:30:35.290] if (TRUE) { [13:30:35.290] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.290] { [13:30:35.290] inherits <- base::inherits [13:30:35.290] invokeRestart <- base::invokeRestart [13:30:35.290] is.null <- base::is.null [13:30:35.290] muffled <- FALSE [13:30:35.290] if (inherits(cond, "message")) { [13:30:35.290] muffled <- grepl(pattern, "muffleMessage") [13:30:35.290] if (muffled) [13:30:35.290] invokeRestart("muffleMessage") [13:30:35.290] } [13:30:35.290] else if (inherits(cond, "warning")) { [13:30:35.290] muffled <- grepl(pattern, "muffleWarning") [13:30:35.290] if (muffled) [13:30:35.290] invokeRestart("muffleWarning") [13:30:35.290] } [13:30:35.290] else if (inherits(cond, "condition")) { [13:30:35.290] if (!is.null(pattern)) { [13:30:35.290] computeRestarts <- base::computeRestarts [13:30:35.290] grepl <- base::grepl [13:30:35.290] restarts <- computeRestarts(cond) [13:30:35.290] for (restart in restarts) { [13:30:35.290] name <- restart$name [13:30:35.290] if (is.null(name)) [13:30:35.290] next [13:30:35.290] if (!grepl(pattern, name)) [13:30:35.290] next [13:30:35.290] invokeRestart(restart) [13:30:35.290] muffled <- TRUE [13:30:35.290] break [13:30:35.290] } [13:30:35.290] } [13:30:35.290] } [13:30:35.290] invisible(muffled) [13:30:35.290] } [13:30:35.290] muffleCondition(cond, pattern = "^muffle") [13:30:35.290] } [13:30:35.290] } [13:30:35.290] } [13:30:35.290] })) [13:30:35.290] }, error = function(ex) { [13:30:35.290] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.290] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.290] ...future.rng), started = ...future.startTime, [13:30:35.290] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.290] version = "1.8"), class = "FutureResult") [13:30:35.290] }, finally = { [13:30:35.290] if (!identical(...future.workdir, getwd())) [13:30:35.290] setwd(...future.workdir) [13:30:35.290] { [13:30:35.290] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.290] ...future.oldOptions$nwarnings <- NULL [13:30:35.290] } [13:30:35.290] base::options(...future.oldOptions) [13:30:35.290] if (.Platform$OS.type == "windows") { [13:30:35.290] old_names <- names(...future.oldEnvVars) [13:30:35.290] envs <- base::Sys.getenv() [13:30:35.290] names <- names(envs) [13:30:35.290] common <- intersect(names, old_names) [13:30:35.290] added <- setdiff(names, old_names) [13:30:35.290] removed <- setdiff(old_names, names) [13:30:35.290] changed <- common[...future.oldEnvVars[common] != [13:30:35.290] envs[common]] [13:30:35.290] NAMES <- toupper(changed) [13:30:35.290] args <- list() [13:30:35.290] for (kk in seq_along(NAMES)) { [13:30:35.290] name <- changed[[kk]] [13:30:35.290] NAME <- NAMES[[kk]] [13:30:35.290] if (name != NAME && is.element(NAME, old_names)) [13:30:35.290] next [13:30:35.290] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.290] } [13:30:35.290] NAMES <- toupper(added) [13:30:35.290] for (kk in seq_along(NAMES)) { [13:30:35.290] name <- added[[kk]] [13:30:35.290] NAME <- NAMES[[kk]] [13:30:35.290] if (name != NAME && is.element(NAME, old_names)) [13:30:35.290] next [13:30:35.290] args[[name]] <- "" [13:30:35.290] } [13:30:35.290] NAMES <- toupper(removed) [13:30:35.290] for (kk in seq_along(NAMES)) { [13:30:35.290] name <- removed[[kk]] [13:30:35.290] NAME <- NAMES[[kk]] [13:30:35.290] if (name != NAME && is.element(NAME, old_names)) [13:30:35.290] next [13:30:35.290] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.290] } [13:30:35.290] if (length(args) > 0) [13:30:35.290] base::do.call(base::Sys.setenv, args = args) [13:30:35.290] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.290] } [13:30:35.290] else { [13:30:35.290] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.290] } [13:30:35.290] { [13:30:35.290] if (base::length(...future.futureOptionsAdded) > [13:30:35.290] 0L) { [13:30:35.290] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.290] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.290] base::options(opts) [13:30:35.290] } [13:30:35.290] { [13:30:35.290] NULL [13:30:35.290] options(future.plan = NULL) [13:30:35.290] if (is.na(NA_character_)) [13:30:35.290] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.290] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.290] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.290] .init = FALSE) [13:30:35.290] } [13:30:35.290] } [13:30:35.290] } [13:30:35.290] }) [13:30:35.290] if (TRUE) { [13:30:35.290] base::sink(type = "output", split = FALSE) [13:30:35.290] if (TRUE) { [13:30:35.290] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.290] } [13:30:35.290] else { [13:30:35.290] ...future.result["stdout"] <- base::list(NULL) [13:30:35.290] } [13:30:35.290] base::close(...future.stdout) [13:30:35.290] ...future.stdout <- NULL [13:30:35.290] } [13:30:35.290] ...future.result$conditions <- ...future.conditions [13:30:35.290] ...future.result$finished <- base::Sys.time() [13:30:35.290] ...future.result [13:30:35.290] } [13:30:35.294] - Launch lazy future ... done [13:30:35.294] 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:30:35.295] resolved() for 'MiraiFuture' ... [13:30:35.295] - state: 'running' [13:30:35.295] - run: TRUE [13:30:35.295] - result: 'NULL' [13:30:35.295] - resolved: FALSE [13:30:35.296] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.296] getGlobalsAndPackages() ... [13:30:35.297] Searching for globals... [13:30:35.297] - globals found: [1] '{' [13:30:35.297] Searching for globals ... DONE [13:30:35.298] Resolving globals: FALSE [13:30:35.298] [13:30:35.298] [13:30:35.298] getGlobalsAndPackages() ... DONE [13:30:35.298] run() for 'Future' ... [13:30:35.299] - state: 'created' [13:30:35.299] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.301] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.302] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.302] - Field: 'label' [13:30:35.302] - Field: 'local' [13:30:35.302] - Field: 'owner' [13:30:35.302] - Field: 'envir' [13:30:35.304] - Field: 'packages' [13:30:35.304] - Field: 'gc' [13:30:35.304] - Field: 'conditions' [13:30:35.304] - Field: 'expr' [13:30:35.304] - Field: 'uuid' [13:30:35.304] - Field: 'seed' [13:30:35.305] - Field: 'version' [13:30:35.305] - Field: 'result' [13:30:35.305] - Field: 'asynchronous' [13:30:35.305] - Field: 'calls' [13:30:35.305] - Field: 'globals' [13:30:35.305] - Field: 'stdout' [13:30:35.306] - Field: 'earlySignal' [13:30:35.306] - Field: 'lazy' [13:30:35.306] - Field: 'state' [13:30:35.306] - Field: '.cluster' [13:30:35.306] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.306] - Launch lazy future ... [13:30:35.307] Packages needed by the future expression (n = 0): [13:30:35.307] Packages needed by future strategies (n = 0): [13:30:35.307] { [13:30:35.307] { [13:30:35.307] { [13:30:35.307] ...future.startTime <- base::Sys.time() [13:30:35.307] { [13:30:35.307] { [13:30:35.307] { [13:30:35.307] base::local({ [13:30:35.307] has_future <- base::requireNamespace("future", [13:30:35.307] quietly = TRUE) [13:30:35.307] if (has_future) { [13:30:35.307] ns <- base::getNamespace("future") [13:30:35.307] version <- ns[[".package"]][["version"]] [13:30:35.307] if (is.null(version)) [13:30:35.307] version <- utils::packageVersion("future") [13:30:35.307] } [13:30:35.307] else { [13:30:35.307] version <- NULL [13:30:35.307] } [13:30:35.307] if (!has_future || version < "1.8.0") { [13:30:35.307] info <- base::c(r_version = base::gsub("R version ", [13:30:35.307] "", base::R.version$version.string), [13:30:35.307] platform = base::sprintf("%s (%s-bit)", [13:30:35.307] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.307] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.307] "release", "version")], collapse = " "), [13:30:35.307] hostname = base::Sys.info()[["nodename"]]) [13:30:35.307] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.307] info) [13:30:35.307] info <- base::paste(info, collapse = "; ") [13:30:35.307] if (!has_future) { [13:30:35.307] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.307] info) [13:30:35.307] } [13:30:35.307] else { [13:30:35.307] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.307] info, version) [13:30:35.307] } [13:30:35.307] base::stop(msg) [13:30:35.307] } [13:30:35.307] }) [13:30:35.307] } [13:30:35.307] ...future.strategy.old <- future::plan("list") [13:30:35.307] options(future.plan = NULL) [13:30:35.307] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.307] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.307] } [13:30:35.307] ...future.workdir <- getwd() [13:30:35.307] } [13:30:35.307] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.307] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.307] } [13:30:35.307] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.307] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.307] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.307] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.307] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.307] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.307] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.307] base::names(...future.oldOptions)) [13:30:35.307] } [13:30:35.307] if (FALSE) { [13:30:35.307] } [13:30:35.307] else { [13:30:35.307] if (TRUE) { [13:30:35.307] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.307] open = "w") [13:30:35.307] } [13:30:35.307] else { [13:30:35.307] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.307] windows = "NUL", "/dev/null"), open = "w") [13:30:35.307] } [13:30:35.307] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.307] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.307] base::sink(type = "output", split = FALSE) [13:30:35.307] base::close(...future.stdout) [13:30:35.307] }, add = TRUE) [13:30:35.307] } [13:30:35.307] ...future.frame <- base::sys.nframe() [13:30:35.307] ...future.conditions <- base::list() [13:30:35.307] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.307] if (FALSE) { [13:30:35.307] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.307] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.307] } [13:30:35.307] ...future.result <- base::tryCatch({ [13:30:35.307] base::withCallingHandlers({ [13:30:35.307] ...future.value <- base::withVisible(base::local({ [13:30:35.307] 42 [13:30:35.307] })) [13:30:35.307] future::FutureResult(value = ...future.value$value, [13:30:35.307] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.307] ...future.rng), globalenv = if (FALSE) [13:30:35.307] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.307] ...future.globalenv.names)) [13:30:35.307] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.307] }, condition = base::local({ [13:30:35.307] c <- base::c [13:30:35.307] inherits <- base::inherits [13:30:35.307] invokeRestart <- base::invokeRestart [13:30:35.307] length <- base::length [13:30:35.307] list <- base::list [13:30:35.307] seq.int <- base::seq.int [13:30:35.307] signalCondition <- base::signalCondition [13:30:35.307] sys.calls <- base::sys.calls [13:30:35.307] `[[` <- base::`[[` [13:30:35.307] `+` <- base::`+` [13:30:35.307] `<<-` <- base::`<<-` [13:30:35.307] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.307] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.307] 3L)] [13:30:35.307] } [13:30:35.307] function(cond) { [13:30:35.307] is_error <- inherits(cond, "error") [13:30:35.307] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.307] NULL) [13:30:35.307] if (is_error) { [13:30:35.307] sessionInformation <- function() { [13:30:35.307] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.307] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.307] search = base::search(), system = base::Sys.info()) [13:30:35.307] } [13:30:35.307] ...future.conditions[[length(...future.conditions) + [13:30:35.307] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.307] cond$call), session = sessionInformation(), [13:30:35.307] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.307] signalCondition(cond) [13:30:35.307] } [13:30:35.307] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.307] signal <- FALSE && inherits(cond, character(0)) [13:30:35.307] ...future.conditions[[length(...future.conditions) + [13:30:35.307] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.307] if (FALSE && !signal) { [13:30:35.307] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.307] { [13:30:35.307] inherits <- base::inherits [13:30:35.307] invokeRestart <- base::invokeRestart [13:30:35.307] is.null <- base::is.null [13:30:35.307] muffled <- FALSE [13:30:35.307] if (inherits(cond, "message")) { [13:30:35.307] muffled <- grepl(pattern, "muffleMessage") [13:30:35.307] if (muffled) [13:30:35.307] invokeRestart("muffleMessage") [13:30:35.307] } [13:30:35.307] else if (inherits(cond, "warning")) { [13:30:35.307] muffled <- grepl(pattern, "muffleWarning") [13:30:35.307] if (muffled) [13:30:35.307] invokeRestart("muffleWarning") [13:30:35.307] } [13:30:35.307] else if (inherits(cond, "condition")) { [13:30:35.307] if (!is.null(pattern)) { [13:30:35.307] computeRestarts <- base::computeRestarts [13:30:35.307] grepl <- base::grepl [13:30:35.307] restarts <- computeRestarts(cond) [13:30:35.307] for (restart in restarts) { [13:30:35.307] name <- restart$name [13:30:35.307] if (is.null(name)) [13:30:35.307] next [13:30:35.307] if (!grepl(pattern, name)) [13:30:35.307] next [13:30:35.307] invokeRestart(restart) [13:30:35.307] muffled <- TRUE [13:30:35.307] break [13:30:35.307] } [13:30:35.307] } [13:30:35.307] } [13:30:35.307] invisible(muffled) [13:30:35.307] } [13:30:35.307] muffleCondition(cond, pattern = "^muffle") [13:30:35.307] } [13:30:35.307] } [13:30:35.307] else { [13:30:35.307] if (TRUE) { [13:30:35.307] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.307] { [13:30:35.307] inherits <- base::inherits [13:30:35.307] invokeRestart <- base::invokeRestart [13:30:35.307] is.null <- base::is.null [13:30:35.307] muffled <- FALSE [13:30:35.307] if (inherits(cond, "message")) { [13:30:35.307] muffled <- grepl(pattern, "muffleMessage") [13:30:35.307] if (muffled) [13:30:35.307] invokeRestart("muffleMessage") [13:30:35.307] } [13:30:35.307] else if (inherits(cond, "warning")) { [13:30:35.307] muffled <- grepl(pattern, "muffleWarning") [13:30:35.307] if (muffled) [13:30:35.307] invokeRestart("muffleWarning") [13:30:35.307] } [13:30:35.307] else if (inherits(cond, "condition")) { [13:30:35.307] if (!is.null(pattern)) { [13:30:35.307] computeRestarts <- base::computeRestarts [13:30:35.307] grepl <- base::grepl [13:30:35.307] restarts <- computeRestarts(cond) [13:30:35.307] for (restart in restarts) { [13:30:35.307] name <- restart$name [13:30:35.307] if (is.null(name)) [13:30:35.307] next [13:30:35.307] if (!grepl(pattern, name)) [13:30:35.307] next [13:30:35.307] invokeRestart(restart) [13:30:35.307] muffled <- TRUE [13:30:35.307] break [13:30:35.307] } [13:30:35.307] } [13:30:35.307] } [13:30:35.307] invisible(muffled) [13:30:35.307] } [13:30:35.307] muffleCondition(cond, pattern = "^muffle") [13:30:35.307] } [13:30:35.307] } [13:30:35.307] } [13:30:35.307] })) [13:30:35.307] }, error = function(ex) { [13:30:35.307] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.307] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.307] ...future.rng), started = ...future.startTime, [13:30:35.307] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.307] version = "1.8"), class = "FutureResult") [13:30:35.307] }, finally = { [13:30:35.307] if (!identical(...future.workdir, getwd())) [13:30:35.307] setwd(...future.workdir) [13:30:35.307] { [13:30:35.307] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.307] ...future.oldOptions$nwarnings <- NULL [13:30:35.307] } [13:30:35.307] base::options(...future.oldOptions) [13:30:35.307] if (.Platform$OS.type == "windows") { [13:30:35.307] old_names <- names(...future.oldEnvVars) [13:30:35.307] envs <- base::Sys.getenv() [13:30:35.307] names <- names(envs) [13:30:35.307] common <- intersect(names, old_names) [13:30:35.307] added <- setdiff(names, old_names) [13:30:35.307] removed <- setdiff(old_names, names) [13:30:35.307] changed <- common[...future.oldEnvVars[common] != [13:30:35.307] envs[common]] [13:30:35.307] NAMES <- toupper(changed) [13:30:35.307] args <- list() [13:30:35.307] for (kk in seq_along(NAMES)) { [13:30:35.307] name <- changed[[kk]] [13:30:35.307] NAME <- NAMES[[kk]] [13:30:35.307] if (name != NAME && is.element(NAME, old_names)) [13:30:35.307] next [13:30:35.307] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.307] } [13:30:35.307] NAMES <- toupper(added) [13:30:35.307] for (kk in seq_along(NAMES)) { [13:30:35.307] name <- added[[kk]] [13:30:35.307] NAME <- NAMES[[kk]] [13:30:35.307] if (name != NAME && is.element(NAME, old_names)) [13:30:35.307] next [13:30:35.307] args[[name]] <- "" [13:30:35.307] } [13:30:35.307] NAMES <- toupper(removed) [13:30:35.307] for (kk in seq_along(NAMES)) { [13:30:35.307] name <- removed[[kk]] [13:30:35.307] NAME <- NAMES[[kk]] [13:30:35.307] if (name != NAME && is.element(NAME, old_names)) [13:30:35.307] next [13:30:35.307] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.307] } [13:30:35.307] if (length(args) > 0) [13:30:35.307] base::do.call(base::Sys.setenv, args = args) [13:30:35.307] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.307] } [13:30:35.307] else { [13:30:35.307] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.307] } [13:30:35.307] { [13:30:35.307] if (base::length(...future.futureOptionsAdded) > [13:30:35.307] 0L) { [13:30:35.307] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.307] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.307] base::options(opts) [13:30:35.307] } [13:30:35.307] { [13:30:35.307] NULL [13:30:35.307] options(future.plan = NULL) [13:30:35.307] if (is.na(NA_character_)) [13:30:35.307] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.307] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.307] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.307] .init = FALSE) [13:30:35.307] } [13:30:35.307] } [13:30:35.307] } [13:30:35.307] }) [13:30:35.307] if (TRUE) { [13:30:35.307] base::sink(type = "output", split = FALSE) [13:30:35.307] if (TRUE) { [13:30:35.307] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.307] } [13:30:35.307] else { [13:30:35.307] ...future.result["stdout"] <- base::list(NULL) [13:30:35.307] } [13:30:35.307] base::close(...future.stdout) [13:30:35.307] ...future.stdout <- NULL [13:30:35.307] } [13:30:35.307] ...future.result$conditions <- ...future.conditions [13:30:35.307] ...future.result$finished <- base::Sys.time() [13:30:35.307] ...future.result [13:30:35.307] } [13:30:35.311] - Launch lazy future ... done [13:30:35.311] 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:30:35.312] resolved() for 'MiraiFuture' ... [13:30:35.312] - state: 'running' [13:30:35.312] - run: TRUE [13:30:35.313] - result: 'NULL' [13:30:35.313] - resolved: FALSE [13:30:35.313] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.315] getGlobalsAndPackages() ... [13:30:35.315] Searching for globals... [13:30:35.316] [13:30:35.316] Searching for globals ... DONE [13:30:35.316] - globals: [0] [13:30:35.316] getGlobalsAndPackages() ... DONE [13:30:35.316] getGlobalsAndPackages() ... [13:30:35.317] [13:30:35.317] - globals: [0] [13:30:35.317] getGlobalsAndPackages() ... DONE [13:30:35.317] Packages needed by the future expression (n = 0): [13:30:35.317] Packages needed by future strategies (n = 0): [13:30:35.318] { [13:30:35.318] { [13:30:35.318] { [13:30:35.318] ...future.startTime <- base::Sys.time() [13:30:35.318] { [13:30:35.318] { [13:30:35.318] { [13:30:35.318] base::local({ [13:30:35.318] has_future <- base::requireNamespace("future", [13:30:35.318] quietly = TRUE) [13:30:35.318] if (has_future) { [13:30:35.318] ns <- base::getNamespace("future") [13:30:35.318] version <- ns[[".package"]][["version"]] [13:30:35.318] if (is.null(version)) [13:30:35.318] version <- utils::packageVersion("future") [13:30:35.318] } [13:30:35.318] else { [13:30:35.318] version <- NULL [13:30:35.318] } [13:30:35.318] if (!has_future || version < "1.8.0") { [13:30:35.318] info <- base::c(r_version = base::gsub("R version ", [13:30:35.318] "", base::R.version$version.string), [13:30:35.318] platform = base::sprintf("%s (%s-bit)", [13:30:35.318] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.318] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.318] "release", "version")], collapse = " "), [13:30:35.318] hostname = base::Sys.info()[["nodename"]]) [13:30:35.318] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.318] info) [13:30:35.318] info <- base::paste(info, collapse = "; ") [13:30:35.318] if (!has_future) { [13:30:35.318] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.318] info) [13:30:35.318] } [13:30:35.318] else { [13:30:35.318] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.318] info, version) [13:30:35.318] } [13:30:35.318] base::stop(msg) [13:30:35.318] } [13:30:35.318] }) [13:30:35.318] } [13:30:35.318] ...future.strategy.old <- future::plan("list") [13:30:35.318] options(future.plan = NULL) [13:30:35.318] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.318] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.318] } [13:30:35.318] ...future.workdir <- getwd() [13:30:35.318] } [13:30:35.318] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.318] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.318] } [13:30:35.318] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.318] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.318] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.318] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.318] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.318] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.318] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.318] base::names(...future.oldOptions)) [13:30:35.318] } [13:30:35.318] if (FALSE) { [13:30:35.318] } [13:30:35.318] else { [13:30:35.318] if (TRUE) { [13:30:35.318] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.318] open = "w") [13:30:35.318] } [13:30:35.318] else { [13:30:35.318] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.318] windows = "NUL", "/dev/null"), open = "w") [13:30:35.318] } [13:30:35.318] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.318] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.318] base::sink(type = "output", split = FALSE) [13:30:35.318] base::close(...future.stdout) [13:30:35.318] }, add = TRUE) [13:30:35.318] } [13:30:35.318] ...future.frame <- base::sys.nframe() [13:30:35.318] ...future.conditions <- base::list() [13:30:35.318] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.318] if (FALSE) { [13:30:35.318] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.318] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.318] } [13:30:35.318] ...future.result <- base::tryCatch({ [13:30:35.318] base::withCallingHandlers({ [13:30:35.318] ...future.value <- base::withVisible(base::local(42)) [13:30:35.318] future::FutureResult(value = ...future.value$value, [13:30:35.318] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.318] ...future.rng), globalenv = if (FALSE) [13:30:35.318] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.318] ...future.globalenv.names)) [13:30:35.318] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.318] }, condition = base::local({ [13:30:35.318] c <- base::c [13:30:35.318] inherits <- base::inherits [13:30:35.318] invokeRestart <- base::invokeRestart [13:30:35.318] length <- base::length [13:30:35.318] list <- base::list [13:30:35.318] seq.int <- base::seq.int [13:30:35.318] signalCondition <- base::signalCondition [13:30:35.318] sys.calls <- base::sys.calls [13:30:35.318] `[[` <- base::`[[` [13:30:35.318] `+` <- base::`+` [13:30:35.318] `<<-` <- base::`<<-` [13:30:35.318] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.318] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.318] 3L)] [13:30:35.318] } [13:30:35.318] function(cond) { [13:30:35.318] is_error <- inherits(cond, "error") [13:30:35.318] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.318] NULL) [13:30:35.318] if (is_error) { [13:30:35.318] sessionInformation <- function() { [13:30:35.318] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.318] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.318] search = base::search(), system = base::Sys.info()) [13:30:35.318] } [13:30:35.318] ...future.conditions[[length(...future.conditions) + [13:30:35.318] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.318] cond$call), session = sessionInformation(), [13:30:35.318] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.318] signalCondition(cond) [13:30:35.318] } [13:30:35.318] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.318] signal <- FALSE && inherits(cond, character(0)) [13:30:35.318] ...future.conditions[[length(...future.conditions) + [13:30:35.318] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.318] if (FALSE && !signal) { [13:30:35.318] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.318] { [13:30:35.318] inherits <- base::inherits [13:30:35.318] invokeRestart <- base::invokeRestart [13:30:35.318] is.null <- base::is.null [13:30:35.318] muffled <- FALSE [13:30:35.318] if (inherits(cond, "message")) { [13:30:35.318] muffled <- grepl(pattern, "muffleMessage") [13:30:35.318] if (muffled) [13:30:35.318] invokeRestart("muffleMessage") [13:30:35.318] } [13:30:35.318] else if (inherits(cond, "warning")) { [13:30:35.318] muffled <- grepl(pattern, "muffleWarning") [13:30:35.318] if (muffled) [13:30:35.318] invokeRestart("muffleWarning") [13:30:35.318] } [13:30:35.318] else if (inherits(cond, "condition")) { [13:30:35.318] if (!is.null(pattern)) { [13:30:35.318] computeRestarts <- base::computeRestarts [13:30:35.318] grepl <- base::grepl [13:30:35.318] restarts <- computeRestarts(cond) [13:30:35.318] for (restart in restarts) { [13:30:35.318] name <- restart$name [13:30:35.318] if (is.null(name)) [13:30:35.318] next [13:30:35.318] if (!grepl(pattern, name)) [13:30:35.318] next [13:30:35.318] invokeRestart(restart) [13:30:35.318] muffled <- TRUE [13:30:35.318] break [13:30:35.318] } [13:30:35.318] } [13:30:35.318] } [13:30:35.318] invisible(muffled) [13:30:35.318] } [13:30:35.318] muffleCondition(cond, pattern = "^muffle") [13:30:35.318] } [13:30:35.318] } [13:30:35.318] else { [13:30:35.318] if (TRUE) { [13:30:35.318] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.318] { [13:30:35.318] inherits <- base::inherits [13:30:35.318] invokeRestart <- base::invokeRestart [13:30:35.318] is.null <- base::is.null [13:30:35.318] muffled <- FALSE [13:30:35.318] if (inherits(cond, "message")) { [13:30:35.318] muffled <- grepl(pattern, "muffleMessage") [13:30:35.318] if (muffled) [13:30:35.318] invokeRestart("muffleMessage") [13:30:35.318] } [13:30:35.318] else if (inherits(cond, "warning")) { [13:30:35.318] muffled <- grepl(pattern, "muffleWarning") [13:30:35.318] if (muffled) [13:30:35.318] invokeRestart("muffleWarning") [13:30:35.318] } [13:30:35.318] else if (inherits(cond, "condition")) { [13:30:35.318] if (!is.null(pattern)) { [13:30:35.318] computeRestarts <- base::computeRestarts [13:30:35.318] grepl <- base::grepl [13:30:35.318] restarts <- computeRestarts(cond) [13:30:35.318] for (restart in restarts) { [13:30:35.318] name <- restart$name [13:30:35.318] if (is.null(name)) [13:30:35.318] next [13:30:35.318] if (!grepl(pattern, name)) [13:30:35.318] next [13:30:35.318] invokeRestart(restart) [13:30:35.318] muffled <- TRUE [13:30:35.318] break [13:30:35.318] } [13:30:35.318] } [13:30:35.318] } [13:30:35.318] invisible(muffled) [13:30:35.318] } [13:30:35.318] muffleCondition(cond, pattern = "^muffle") [13:30:35.318] } [13:30:35.318] } [13:30:35.318] } [13:30:35.318] })) [13:30:35.318] }, error = function(ex) { [13:30:35.318] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.318] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.318] ...future.rng), started = ...future.startTime, [13:30:35.318] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.318] version = "1.8"), class = "FutureResult") [13:30:35.318] }, finally = { [13:30:35.318] if (!identical(...future.workdir, getwd())) [13:30:35.318] setwd(...future.workdir) [13:30:35.318] { [13:30:35.318] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.318] ...future.oldOptions$nwarnings <- NULL [13:30:35.318] } [13:30:35.318] base::options(...future.oldOptions) [13:30:35.318] if (.Platform$OS.type == "windows") { [13:30:35.318] old_names <- names(...future.oldEnvVars) [13:30:35.318] envs <- base::Sys.getenv() [13:30:35.318] names <- names(envs) [13:30:35.318] common <- intersect(names, old_names) [13:30:35.318] added <- setdiff(names, old_names) [13:30:35.318] removed <- setdiff(old_names, names) [13:30:35.318] changed <- common[...future.oldEnvVars[common] != [13:30:35.318] envs[common]] [13:30:35.318] NAMES <- toupper(changed) [13:30:35.318] args <- list() [13:30:35.318] for (kk in seq_along(NAMES)) { [13:30:35.318] name <- changed[[kk]] [13:30:35.318] NAME <- NAMES[[kk]] [13:30:35.318] if (name != NAME && is.element(NAME, old_names)) [13:30:35.318] next [13:30:35.318] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.318] } [13:30:35.318] NAMES <- toupper(added) [13:30:35.318] for (kk in seq_along(NAMES)) { [13:30:35.318] name <- added[[kk]] [13:30:35.318] NAME <- NAMES[[kk]] [13:30:35.318] if (name != NAME && is.element(NAME, old_names)) [13:30:35.318] next [13:30:35.318] args[[name]] <- "" [13:30:35.318] } [13:30:35.318] NAMES <- toupper(removed) [13:30:35.318] for (kk in seq_along(NAMES)) { [13:30:35.318] name <- removed[[kk]] [13:30:35.318] NAME <- NAMES[[kk]] [13:30:35.318] if (name != NAME && is.element(NAME, old_names)) [13:30:35.318] next [13:30:35.318] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.318] } [13:30:35.318] if (length(args) > 0) [13:30:35.318] base::do.call(base::Sys.setenv, args = args) [13:30:35.318] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.318] } [13:30:35.318] else { [13:30:35.318] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.318] } [13:30:35.318] { [13:30:35.318] if (base::length(...future.futureOptionsAdded) > [13:30:35.318] 0L) { [13:30:35.318] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.318] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.318] base::options(opts) [13:30:35.318] } [13:30:35.318] { [13:30:35.318] NULL [13:30:35.318] options(future.plan = NULL) [13:30:35.318] if (is.na(NA_character_)) [13:30:35.318] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.318] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.318] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.318] .init = FALSE) [13:30:35.318] } [13:30:35.318] } [13:30:35.318] } [13:30:35.318] }) [13:30:35.318] if (TRUE) { [13:30:35.318] base::sink(type = "output", split = FALSE) [13:30:35.318] if (TRUE) { [13:30:35.318] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.318] } [13:30:35.318] else { [13:30:35.318] ...future.result["stdout"] <- base::list(NULL) [13:30:35.318] } [13:30:35.318] base::close(...future.stdout) [13:30:35.318] ...future.stdout <- NULL [13:30:35.318] } [13:30:35.318] ...future.result$conditions <- ...future.conditions [13:30:35.318] ...future.result$finished <- base::Sys.time() [13:30:35.318] ...future.result [13:30:35.318] } 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:30:35.322] resolved() for 'MiraiFuture' ... [13:30:35.322] - state: 'running' [13:30:35.322] - run: TRUE [13:30:35.323] - result: 'NULL' [13:30:35.323] - resolved: FALSE [13:30:35.323] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.324] getGlobalsAndPackages() ... [13:30:35.324] Searching for globals... [13:30:35.324] [13:30:35.324] Searching for globals ... DONE [13:30:35.325] - globals: [0] [13:30:35.325] getGlobalsAndPackages() ... DONE [13:30:35.325] run() for 'Future' ... [13:30:35.325] - state: 'created' [13:30:35.325] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.328] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.328] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.328] - Field: 'label' [13:30:35.328] - Field: 'local' [13:30:35.328] - Field: 'owner' [13:30:35.329] - Field: 'envir' [13:30:35.329] - Field: 'packages' [13:30:35.329] - Field: 'gc' [13:30:35.329] - Field: 'conditions' [13:30:35.329] - Field: 'expr' [13:30:35.329] - Field: 'uuid' [13:30:35.330] - Field: 'seed' [13:30:35.330] - Field: 'version' [13:30:35.330] - Field: 'result' [13:30:35.330] - Field: 'asynchronous' [13:30:35.330] - Field: 'calls' [13:30:35.330] - Field: 'globals' [13:30:35.331] - Field: 'stdout' [13:30:35.331] - Field: 'earlySignal' [13:30:35.331] - Field: 'lazy' [13:30:35.331] - Field: 'state' [13:30:35.331] - Field: '.cluster' [13:30:35.331] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.332] - Launch lazy future ... [13:30:35.332] Packages needed by the future expression (n = 0): [13:30:35.332] Packages needed by future strategies (n = 0): [13:30:35.333] { [13:30:35.333] { [13:30:35.333] { [13:30:35.333] ...future.startTime <- base::Sys.time() [13:30:35.333] { [13:30:35.333] { [13:30:35.333] { [13:30:35.333] base::local({ [13:30:35.333] has_future <- base::requireNamespace("future", [13:30:35.333] quietly = TRUE) [13:30:35.333] if (has_future) { [13:30:35.333] ns <- base::getNamespace("future") [13:30:35.333] version <- ns[[".package"]][["version"]] [13:30:35.333] if (is.null(version)) [13:30:35.333] version <- utils::packageVersion("future") [13:30:35.333] } [13:30:35.333] else { [13:30:35.333] version <- NULL [13:30:35.333] } [13:30:35.333] if (!has_future || version < "1.8.0") { [13:30:35.333] info <- base::c(r_version = base::gsub("R version ", [13:30:35.333] "", base::R.version$version.string), [13:30:35.333] platform = base::sprintf("%s (%s-bit)", [13:30:35.333] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.333] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.333] "release", "version")], collapse = " "), [13:30:35.333] hostname = base::Sys.info()[["nodename"]]) [13:30:35.333] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.333] info) [13:30:35.333] info <- base::paste(info, collapse = "; ") [13:30:35.333] if (!has_future) { [13:30:35.333] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.333] info) [13:30:35.333] } [13:30:35.333] else { [13:30:35.333] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.333] info, version) [13:30:35.333] } [13:30:35.333] base::stop(msg) [13:30:35.333] } [13:30:35.333] }) [13:30:35.333] } [13:30:35.333] ...future.strategy.old <- future::plan("list") [13:30:35.333] options(future.plan = NULL) [13:30:35.333] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.333] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.333] } [13:30:35.333] ...future.workdir <- getwd() [13:30:35.333] } [13:30:35.333] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.333] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.333] } [13:30:35.333] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.333] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.333] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.333] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.333] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.333] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.333] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.333] base::names(...future.oldOptions)) [13:30:35.333] } [13:30:35.333] if (FALSE) { [13:30:35.333] } [13:30:35.333] else { [13:30:35.333] if (TRUE) { [13:30:35.333] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.333] open = "w") [13:30:35.333] } [13:30:35.333] else { [13:30:35.333] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.333] windows = "NUL", "/dev/null"), open = "w") [13:30:35.333] } [13:30:35.333] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.333] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.333] base::sink(type = "output", split = FALSE) [13:30:35.333] base::close(...future.stdout) [13:30:35.333] }, add = TRUE) [13:30:35.333] } [13:30:35.333] ...future.frame <- base::sys.nframe() [13:30:35.333] ...future.conditions <- base::list() [13:30:35.333] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.333] if (FALSE) { [13:30:35.333] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.333] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.333] } [13:30:35.333] ...future.result <- base::tryCatch({ [13:30:35.333] base::withCallingHandlers({ [13:30:35.333] ...future.value <- base::withVisible(base::local(42)) [13:30:35.333] future::FutureResult(value = ...future.value$value, [13:30:35.333] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.333] ...future.rng), globalenv = if (FALSE) [13:30:35.333] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.333] ...future.globalenv.names)) [13:30:35.333] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.333] }, condition = base::local({ [13:30:35.333] c <- base::c [13:30:35.333] inherits <- base::inherits [13:30:35.333] invokeRestart <- base::invokeRestart [13:30:35.333] length <- base::length [13:30:35.333] list <- base::list [13:30:35.333] seq.int <- base::seq.int [13:30:35.333] signalCondition <- base::signalCondition [13:30:35.333] sys.calls <- base::sys.calls [13:30:35.333] `[[` <- base::`[[` [13:30:35.333] `+` <- base::`+` [13:30:35.333] `<<-` <- base::`<<-` [13:30:35.333] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.333] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.333] 3L)] [13:30:35.333] } [13:30:35.333] function(cond) { [13:30:35.333] is_error <- inherits(cond, "error") [13:30:35.333] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.333] NULL) [13:30:35.333] if (is_error) { [13:30:35.333] sessionInformation <- function() { [13:30:35.333] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.333] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.333] search = base::search(), system = base::Sys.info()) [13:30:35.333] } [13:30:35.333] ...future.conditions[[length(...future.conditions) + [13:30:35.333] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.333] cond$call), session = sessionInformation(), [13:30:35.333] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.333] signalCondition(cond) [13:30:35.333] } [13:30:35.333] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.333] signal <- FALSE && inherits(cond, character(0)) [13:30:35.333] ...future.conditions[[length(...future.conditions) + [13:30:35.333] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.333] if (FALSE && !signal) { [13:30:35.333] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.333] { [13:30:35.333] inherits <- base::inherits [13:30:35.333] invokeRestart <- base::invokeRestart [13:30:35.333] is.null <- base::is.null [13:30:35.333] muffled <- FALSE [13:30:35.333] if (inherits(cond, "message")) { [13:30:35.333] muffled <- grepl(pattern, "muffleMessage") [13:30:35.333] if (muffled) [13:30:35.333] invokeRestart("muffleMessage") [13:30:35.333] } [13:30:35.333] else if (inherits(cond, "warning")) { [13:30:35.333] muffled <- grepl(pattern, "muffleWarning") [13:30:35.333] if (muffled) [13:30:35.333] invokeRestart("muffleWarning") [13:30:35.333] } [13:30:35.333] else if (inherits(cond, "condition")) { [13:30:35.333] if (!is.null(pattern)) { [13:30:35.333] computeRestarts <- base::computeRestarts [13:30:35.333] grepl <- base::grepl [13:30:35.333] restarts <- computeRestarts(cond) [13:30:35.333] for (restart in restarts) { [13:30:35.333] name <- restart$name [13:30:35.333] if (is.null(name)) [13:30:35.333] next [13:30:35.333] if (!grepl(pattern, name)) [13:30:35.333] next [13:30:35.333] invokeRestart(restart) [13:30:35.333] muffled <- TRUE [13:30:35.333] break [13:30:35.333] } [13:30:35.333] } [13:30:35.333] } [13:30:35.333] invisible(muffled) [13:30:35.333] } [13:30:35.333] muffleCondition(cond, pattern = "^muffle") [13:30:35.333] } [13:30:35.333] } [13:30:35.333] else { [13:30:35.333] if (TRUE) { [13:30:35.333] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.333] { [13:30:35.333] inherits <- base::inherits [13:30:35.333] invokeRestart <- base::invokeRestart [13:30:35.333] is.null <- base::is.null [13:30:35.333] muffled <- FALSE [13:30:35.333] if (inherits(cond, "message")) { [13:30:35.333] muffled <- grepl(pattern, "muffleMessage") [13:30:35.333] if (muffled) [13:30:35.333] invokeRestart("muffleMessage") [13:30:35.333] } [13:30:35.333] else if (inherits(cond, "warning")) { [13:30:35.333] muffled <- grepl(pattern, "muffleWarning") [13:30:35.333] if (muffled) [13:30:35.333] invokeRestart("muffleWarning") [13:30:35.333] } [13:30:35.333] else if (inherits(cond, "condition")) { [13:30:35.333] if (!is.null(pattern)) { [13:30:35.333] computeRestarts <- base::computeRestarts [13:30:35.333] grepl <- base::grepl [13:30:35.333] restarts <- computeRestarts(cond) [13:30:35.333] for (restart in restarts) { [13:30:35.333] name <- restart$name [13:30:35.333] if (is.null(name)) [13:30:35.333] next [13:30:35.333] if (!grepl(pattern, name)) [13:30:35.333] next [13:30:35.333] invokeRestart(restart) [13:30:35.333] muffled <- TRUE [13:30:35.333] break [13:30:35.333] } [13:30:35.333] } [13:30:35.333] } [13:30:35.333] invisible(muffled) [13:30:35.333] } [13:30:35.333] muffleCondition(cond, pattern = "^muffle") [13:30:35.333] } [13:30:35.333] } [13:30:35.333] } [13:30:35.333] })) [13:30:35.333] }, error = function(ex) { [13:30:35.333] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.333] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.333] ...future.rng), started = ...future.startTime, [13:30:35.333] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.333] version = "1.8"), class = "FutureResult") [13:30:35.333] }, finally = { [13:30:35.333] if (!identical(...future.workdir, getwd())) [13:30:35.333] setwd(...future.workdir) [13:30:35.333] { [13:30:35.333] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.333] ...future.oldOptions$nwarnings <- NULL [13:30:35.333] } [13:30:35.333] base::options(...future.oldOptions) [13:30:35.333] if (.Platform$OS.type == "windows") { [13:30:35.333] old_names <- names(...future.oldEnvVars) [13:30:35.333] envs <- base::Sys.getenv() [13:30:35.333] names <- names(envs) [13:30:35.333] common <- intersect(names, old_names) [13:30:35.333] added <- setdiff(names, old_names) [13:30:35.333] removed <- setdiff(old_names, names) [13:30:35.333] changed <- common[...future.oldEnvVars[common] != [13:30:35.333] envs[common]] [13:30:35.333] NAMES <- toupper(changed) [13:30:35.333] args <- list() [13:30:35.333] for (kk in seq_along(NAMES)) { [13:30:35.333] name <- changed[[kk]] [13:30:35.333] NAME <- NAMES[[kk]] [13:30:35.333] if (name != NAME && is.element(NAME, old_names)) [13:30:35.333] next [13:30:35.333] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.333] } [13:30:35.333] NAMES <- toupper(added) [13:30:35.333] for (kk in seq_along(NAMES)) { [13:30:35.333] name <- added[[kk]] [13:30:35.333] NAME <- NAMES[[kk]] [13:30:35.333] if (name != NAME && is.element(NAME, old_names)) [13:30:35.333] next [13:30:35.333] args[[name]] <- "" [13:30:35.333] } [13:30:35.333] NAMES <- toupper(removed) [13:30:35.333] for (kk in seq_along(NAMES)) { [13:30:35.333] name <- removed[[kk]] [13:30:35.333] NAME <- NAMES[[kk]] [13:30:35.333] if (name != NAME && is.element(NAME, old_names)) [13:30:35.333] next [13:30:35.333] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.333] } [13:30:35.333] if (length(args) > 0) [13:30:35.333] base::do.call(base::Sys.setenv, args = args) [13:30:35.333] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.333] } [13:30:35.333] else { [13:30:35.333] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.333] } [13:30:35.333] { [13:30:35.333] if (base::length(...future.futureOptionsAdded) > [13:30:35.333] 0L) { [13:30:35.333] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.333] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.333] base::options(opts) [13:30:35.333] } [13:30:35.333] { [13:30:35.333] NULL [13:30:35.333] options(future.plan = NULL) [13:30:35.333] if (is.na(NA_character_)) [13:30:35.333] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.333] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.333] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.333] .init = FALSE) [13:30:35.333] } [13:30:35.333] } [13:30:35.333] } [13:30:35.333] }) [13:30:35.333] if (TRUE) { [13:30:35.333] base::sink(type = "output", split = FALSE) [13:30:35.333] if (TRUE) { [13:30:35.333] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.333] } [13:30:35.333] else { [13:30:35.333] ...future.result["stdout"] <- base::list(NULL) [13:30:35.333] } [13:30:35.333] base::close(...future.stdout) [13:30:35.333] ...future.stdout <- NULL [13:30:35.333] } [13:30:35.333] ...future.result$conditions <- ...future.conditions [13:30:35.333] ...future.result$finished <- base::Sys.time() [13:30:35.333] ...future.result [13:30:35.333] } [13:30:35.336] - Launch lazy future ... done [13:30:35.337] 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:30:35.337] resolved() for 'MiraiFuture' ... [13:30:35.337] - state: 'running' [13:30:35.337] - run: TRUE [13:30:35.338] - result: 'NULL' [13:30:35.338] - resolved: FALSE [13:30:35.338] resolved() for 'MiraiFuture' ... done Resolved: FALSE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.339] getGlobalsAndPackages() ... [13:30:35.339] Searching for globals... [13:30:35.340] - globals found: [1] '{' [13:30:35.340] Searching for globals ... DONE [13:30:35.340] Resolving globals: FALSE [13:30:35.340] [13:30:35.340] [13:30:35.341] getGlobalsAndPackages() ... DONE [13:30:35.341] run() for 'Future' ... [13:30:35.341] - state: 'created' [13:30:35.341] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:35.344] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.344] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:35.344] - Field: 'label' [13:30:35.344] - Field: 'local' [13:30:35.344] - Field: 'owner' [13:30:35.344] - Field: 'envir' [13:30:35.345] - Field: 'packages' [13:30:35.345] - Field: 'gc' [13:30:35.345] - Field: 'conditions' [13:30:35.345] - Field: 'expr' [13:30:35.345] - Field: 'uuid' [13:30:35.345] - Field: 'seed' [13:30:35.346] - Field: 'version' [13:30:35.346] - Field: 'result' [13:30:35.346] - Field: 'asynchronous' [13:30:35.346] - Field: 'calls' [13:30:35.346] - Field: 'globals' [13:30:35.346] - Field: 'stdout' [13:30:35.347] - Field: 'earlySignal' [13:30:35.347] - Field: 'lazy' [13:30:35.347] - Field: 'state' [13:30:35.348] - Field: '.cluster' [13:30:35.348] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:35.349] - Launch lazy future ... [13:30:35.349] Packages needed by the future expression (n = 0): [13:30:35.349] Packages needed by future strategies (n = 0): [13:30:35.349] { [13:30:35.349] { [13:30:35.349] { [13:30:35.349] ...future.startTime <- base::Sys.time() [13:30:35.349] { [13:30:35.349] { [13:30:35.349] { [13:30:35.349] base::local({ [13:30:35.349] has_future <- base::requireNamespace("future", [13:30:35.349] quietly = TRUE) [13:30:35.349] if (has_future) { [13:30:35.349] ns <- base::getNamespace("future") [13:30:35.349] version <- ns[[".package"]][["version"]] [13:30:35.349] if (is.null(version)) [13:30:35.349] version <- utils::packageVersion("future") [13:30:35.349] } [13:30:35.349] else { [13:30:35.349] version <- NULL [13:30:35.349] } [13:30:35.349] if (!has_future || version < "1.8.0") { [13:30:35.349] info <- base::c(r_version = base::gsub("R version ", [13:30:35.349] "", base::R.version$version.string), [13:30:35.349] platform = base::sprintf("%s (%s-bit)", [13:30:35.349] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:35.349] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:35.349] "release", "version")], collapse = " "), [13:30:35.349] hostname = base::Sys.info()[["nodename"]]) [13:30:35.349] info <- base::sprintf("%s: %s", base::names(info), [13:30:35.349] info) [13:30:35.349] info <- base::paste(info, collapse = "; ") [13:30:35.349] if (!has_future) { [13:30:35.349] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:35.349] info) [13:30:35.349] } [13:30:35.349] else { [13:30:35.349] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:35.349] info, version) [13:30:35.349] } [13:30:35.349] base::stop(msg) [13:30:35.349] } [13:30:35.349] }) [13:30:35.349] } [13:30:35.349] ...future.strategy.old <- future::plan("list") [13:30:35.349] options(future.plan = NULL) [13:30:35.349] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.349] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:35.349] } [13:30:35.349] ...future.workdir <- getwd() [13:30:35.349] } [13:30:35.349] ...future.oldOptions <- base::as.list(base::.Options) [13:30:35.349] ...future.oldEnvVars <- base::Sys.getenv() [13:30:35.349] } [13:30:35.349] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:35.349] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:35.349] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:35.349] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:35.349] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:35.349] future.stdout.windows.reencode = NULL, width = 80L) [13:30:35.349] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:35.349] base::names(...future.oldOptions)) [13:30:35.349] } [13:30:35.349] if (FALSE) { [13:30:35.349] } [13:30:35.349] else { [13:30:35.349] if (TRUE) { [13:30:35.349] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:35.349] open = "w") [13:30:35.349] } [13:30:35.349] else { [13:30:35.349] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:35.349] windows = "NUL", "/dev/null"), open = "w") [13:30:35.349] } [13:30:35.349] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:35.349] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:35.349] base::sink(type = "output", split = FALSE) [13:30:35.349] base::close(...future.stdout) [13:30:35.349] }, add = TRUE) [13:30:35.349] } [13:30:35.349] ...future.frame <- base::sys.nframe() [13:30:35.349] ...future.conditions <- base::list() [13:30:35.349] ...future.rng <- base::globalenv()$.Random.seed [13:30:35.349] if (FALSE) { [13:30:35.349] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:35.349] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:35.349] } [13:30:35.349] ...future.result <- base::tryCatch({ [13:30:35.349] base::withCallingHandlers({ [13:30:35.349] ...future.value <- base::withVisible(base::local({ [13:30:35.349] 42 [13:30:35.349] })) [13:30:35.349] future::FutureResult(value = ...future.value$value, [13:30:35.349] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.349] ...future.rng), globalenv = if (FALSE) [13:30:35.349] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:35.349] ...future.globalenv.names)) [13:30:35.349] else NULL, started = ...future.startTime, version = "1.8") [13:30:35.349] }, condition = base::local({ [13:30:35.349] c <- base::c [13:30:35.349] inherits <- base::inherits [13:30:35.349] invokeRestart <- base::invokeRestart [13:30:35.349] length <- base::length [13:30:35.349] list <- base::list [13:30:35.349] seq.int <- base::seq.int [13:30:35.349] signalCondition <- base::signalCondition [13:30:35.349] sys.calls <- base::sys.calls [13:30:35.349] `[[` <- base::`[[` [13:30:35.349] `+` <- base::`+` [13:30:35.349] `<<-` <- base::`<<-` [13:30:35.349] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:35.349] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:35.349] 3L)] [13:30:35.349] } [13:30:35.349] function(cond) { [13:30:35.349] is_error <- inherits(cond, "error") [13:30:35.349] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:35.349] NULL) [13:30:35.349] if (is_error) { [13:30:35.349] sessionInformation <- function() { [13:30:35.349] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:35.349] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:35.349] search = base::search(), system = base::Sys.info()) [13:30:35.349] } [13:30:35.349] ...future.conditions[[length(...future.conditions) + [13:30:35.349] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:35.349] cond$call), session = sessionInformation(), [13:30:35.349] timestamp = base::Sys.time(), signaled = 0L) [13:30:35.349] signalCondition(cond) [13:30:35.349] } [13:30:35.349] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:35.349] signal <- FALSE && inherits(cond, character(0)) [13:30:35.349] ...future.conditions[[length(...future.conditions) + [13:30:35.349] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:35.349] if (FALSE && !signal) { [13:30:35.349] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.349] { [13:30:35.349] inherits <- base::inherits [13:30:35.349] invokeRestart <- base::invokeRestart [13:30:35.349] is.null <- base::is.null [13:30:35.349] muffled <- FALSE [13:30:35.349] if (inherits(cond, "message")) { [13:30:35.349] muffled <- grepl(pattern, "muffleMessage") [13:30:35.349] if (muffled) [13:30:35.349] invokeRestart("muffleMessage") [13:30:35.349] } [13:30:35.349] else if (inherits(cond, "warning")) { [13:30:35.349] muffled <- grepl(pattern, "muffleWarning") [13:30:35.349] if (muffled) [13:30:35.349] invokeRestart("muffleWarning") [13:30:35.349] } [13:30:35.349] else if (inherits(cond, "condition")) { [13:30:35.349] if (!is.null(pattern)) { [13:30:35.349] computeRestarts <- base::computeRestarts [13:30:35.349] grepl <- base::grepl [13:30:35.349] restarts <- computeRestarts(cond) [13:30:35.349] for (restart in restarts) { [13:30:35.349] name <- restart$name [13:30:35.349] if (is.null(name)) [13:30:35.349] next [13:30:35.349] if (!grepl(pattern, name)) [13:30:35.349] next [13:30:35.349] invokeRestart(restart) [13:30:35.349] muffled <- TRUE [13:30:35.349] break [13:30:35.349] } [13:30:35.349] } [13:30:35.349] } [13:30:35.349] invisible(muffled) [13:30:35.349] } [13:30:35.349] muffleCondition(cond, pattern = "^muffle") [13:30:35.349] } [13:30:35.349] } [13:30:35.349] else { [13:30:35.349] if (TRUE) { [13:30:35.349] muffleCondition <- function (cond, pattern = "^muffle") [13:30:35.349] { [13:30:35.349] inherits <- base::inherits [13:30:35.349] invokeRestart <- base::invokeRestart [13:30:35.349] is.null <- base::is.null [13:30:35.349] muffled <- FALSE [13:30:35.349] if (inherits(cond, "message")) { [13:30:35.349] muffled <- grepl(pattern, "muffleMessage") [13:30:35.349] if (muffled) [13:30:35.349] invokeRestart("muffleMessage") [13:30:35.349] } [13:30:35.349] else if (inherits(cond, "warning")) { [13:30:35.349] muffled <- grepl(pattern, "muffleWarning") [13:30:35.349] if (muffled) [13:30:35.349] invokeRestart("muffleWarning") [13:30:35.349] } [13:30:35.349] else if (inherits(cond, "condition")) { [13:30:35.349] if (!is.null(pattern)) { [13:30:35.349] computeRestarts <- base::computeRestarts [13:30:35.349] grepl <- base::grepl [13:30:35.349] restarts <- computeRestarts(cond) [13:30:35.349] for (restart in restarts) { [13:30:35.349] name <- restart$name [13:30:35.349] if (is.null(name)) [13:30:35.349] next [13:30:35.349] if (!grepl(pattern, name)) [13:30:35.349] next [13:30:35.349] invokeRestart(restart) [13:30:35.349] muffled <- TRUE [13:30:35.349] break [13:30:35.349] } [13:30:35.349] } [13:30:35.349] } [13:30:35.349] invisible(muffled) [13:30:35.349] } [13:30:35.349] muffleCondition(cond, pattern = "^muffle") [13:30:35.349] } [13:30:35.349] } [13:30:35.349] } [13:30:35.349] })) [13:30:35.349] }, error = function(ex) { [13:30:35.349] base::structure(base::list(value = NULL, visible = NULL, [13:30:35.349] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:35.349] ...future.rng), started = ...future.startTime, [13:30:35.349] finished = Sys.time(), session_uuid = NA_character_, [13:30:35.349] version = "1.8"), class = "FutureResult") [13:30:35.349] }, finally = { [13:30:35.349] if (!identical(...future.workdir, getwd())) [13:30:35.349] setwd(...future.workdir) [13:30:35.349] { [13:30:35.349] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:35.349] ...future.oldOptions$nwarnings <- NULL [13:30:35.349] } [13:30:35.349] base::options(...future.oldOptions) [13:30:35.349] if (.Platform$OS.type == "windows") { [13:30:35.349] old_names <- names(...future.oldEnvVars) [13:30:35.349] envs <- base::Sys.getenv() [13:30:35.349] names <- names(envs) [13:30:35.349] common <- intersect(names, old_names) [13:30:35.349] added <- setdiff(names, old_names) [13:30:35.349] removed <- setdiff(old_names, names) [13:30:35.349] changed <- common[...future.oldEnvVars[common] != [13:30:35.349] envs[common]] [13:30:35.349] NAMES <- toupper(changed) [13:30:35.349] args <- list() [13:30:35.349] for (kk in seq_along(NAMES)) { [13:30:35.349] name <- changed[[kk]] [13:30:35.349] NAME <- NAMES[[kk]] [13:30:35.349] if (name != NAME && is.element(NAME, old_names)) [13:30:35.349] next [13:30:35.349] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.349] } [13:30:35.349] NAMES <- toupper(added) [13:30:35.349] for (kk in seq_along(NAMES)) { [13:30:35.349] name <- added[[kk]] [13:30:35.349] NAME <- NAMES[[kk]] [13:30:35.349] if (name != NAME && is.element(NAME, old_names)) [13:30:35.349] next [13:30:35.349] args[[name]] <- "" [13:30:35.349] } [13:30:35.349] NAMES <- toupper(removed) [13:30:35.349] for (kk in seq_along(NAMES)) { [13:30:35.349] name <- removed[[kk]] [13:30:35.349] NAME <- NAMES[[kk]] [13:30:35.349] if (name != NAME && is.element(NAME, old_names)) [13:30:35.349] next [13:30:35.349] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:35.349] } [13:30:35.349] if (length(args) > 0) [13:30:35.349] base::do.call(base::Sys.setenv, args = args) [13:30:35.349] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:35.349] } [13:30:35.349] else { [13:30:35.349] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:35.349] } [13:30:35.349] { [13:30:35.349] if (base::length(...future.futureOptionsAdded) > [13:30:35.349] 0L) { [13:30:35.349] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:35.349] base::names(opts) <- ...future.futureOptionsAdded [13:30:35.349] base::options(opts) [13:30:35.349] } [13:30:35.349] { [13:30:35.349] NULL [13:30:35.349] options(future.plan = NULL) [13:30:35.349] if (is.na(NA_character_)) [13:30:35.349] Sys.unsetenv("R_FUTURE_PLAN") [13:30:35.349] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:35.349] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:35.349] .init = FALSE) [13:30:35.349] } [13:30:35.349] } [13:30:35.349] } [13:30:35.349] }) [13:30:35.349] if (TRUE) { [13:30:35.349] base::sink(type = "output", split = FALSE) [13:30:35.349] if (TRUE) { [13:30:35.349] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:35.349] } [13:30:35.349] else { [13:30:35.349] ...future.result["stdout"] <- base::list(NULL) [13:30:35.349] } [13:30:35.349] base::close(...future.stdout) [13:30:35.349] ...future.stdout <- NULL [13:30:35.349] } [13:30:35.349] ...future.result$conditions <- ...future.conditions [13:30:35.349] ...future.result$finished <- base::Sys.time() [13:30:35.349] ...future.result [13:30:35.349] } [13:30:35.353] - Launch lazy future ... done [13:30:35.353] 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:30:35.354] resolved() for 'MiraiFuture' ... [13:30:35.354] - state: 'running' [13:30:35.355] - run: TRUE [13:30:35.355] - result: 'NULL' [13:30:35.355] - resolved: FALSE [13:30:35.355] resolved() for 'MiraiFuture' ... done Resolved: TRUE Value: Conditions captured: Early signaling: FALSE Owner process: 1e7300d2-ee86-1575-08a8-3e32ca610911 Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:35.355] - plan('mirai_multisession') ... DONE> > message("*** Futures - labels ... DONE") *** Futures - labels ... DONE > > source("incl/end.R") > > proc.time() user system elapsed 0.39 0.14 1.00