R version 4.4.0 beta (2024-04-15 r86425 ucrt) -- "Puppy Cup" Copyright (C) 2024 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") Loading required package: future [13:10:34.830] plan(): Setting new future strategy stack: [13:10:34.832] List of future strategies: [13:10:34.832] 1. mirai_multisession: [13:10:34.832] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:10:34.832] - tweaked: FALSE [13:10:34.832] - call: future::plan(future.mirai::mirai_multisession) [13:10:34.844] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:10:34.844] < mirai | $data > [13:10:34.849] getGlobalsAndPackages() ... [13:10:34.849] Not searching for globals [13:10:34.850] - globals: [0] [13:10:34.850] getGlobalsAndPackages() ... DONE [13:10:34.850] getGlobalsAndPackages() ... [13:10:34.850] [13:10:34.851] - globals: [0] [13:10:34.851] getGlobalsAndPackages() ... DONE [13:10:35.131] Packages needed by the future expression (n = 0): [13:10:35.132] Packages needed by future strategies (n = 0): [13:10:35.133] { [13:10:35.133] { [13:10:35.133] { [13:10:35.133] ...future.startTime <- base::Sys.time() [13:10:35.133] { [13:10:35.133] { [13:10:35.133] { [13:10:35.133] base::local({ [13:10:35.133] has_future <- base::requireNamespace("future", [13:10:35.133] quietly = TRUE) [13:10:35.133] if (has_future) { [13:10:35.133] ns <- base::getNamespace("future") [13:10:35.133] version <- ns[[".package"]][["version"]] [13:10:35.133] if (is.null(version)) [13:10:35.133] version <- utils::packageVersion("future") [13:10:35.133] } [13:10:35.133] else { [13:10:35.133] version <- NULL [13:10:35.133] } [13:10:35.133] if (!has_future || version < "1.8.0") { [13:10:35.133] info <- base::c(r_version = base::gsub("R version ", [13:10:35.133] "", base::R.version$version.string), [13:10:35.133] platform = base::sprintf("%s (%s-bit)", [13:10:35.133] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:35.133] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:35.133] "release", "version")], collapse = " "), [13:10:35.133] hostname = base::Sys.info()[["nodename"]]) [13:10:35.133] info <- base::sprintf("%s: %s", base::names(info), [13:10:35.133] info) [13:10:35.133] info <- base::paste(info, collapse = "; ") [13:10:35.133] if (!has_future) { [13:10:35.133] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:35.133] info) [13:10:35.133] } [13:10:35.133] else { [13:10:35.133] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:35.133] info, version) [13:10:35.133] } [13:10:35.133] base::stop(msg) [13:10:35.133] } [13:10:35.133] }) [13:10:35.133] } [13:10:35.133] ...future.strategy.old <- future::plan("list") [13:10:35.133] options(future.plan = NULL) [13:10:35.133] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.133] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:35.133] } [13:10:35.133] ...future.workdir <- getwd() [13:10:35.133] } [13:10:35.133] ...future.oldOptions <- base::as.list(base::.Options) [13:10:35.133] ...future.oldEnvVars <- base::Sys.getenv() [13:10:35.133] } [13:10:35.133] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:35.133] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:35.133] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:35.133] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:35.133] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:35.133] future.stdout.windows.reencode = NULL, width = 80L) [13:10:35.133] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:35.133] base::names(...future.oldOptions)) [13:10:35.133] } [13:10:35.133] if (FALSE) { [13:10:35.133] } [13:10:35.133] else { [13:10:35.133] if (TRUE) { [13:10:35.133] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:35.133] open = "w") [13:10:35.133] } [13:10:35.133] else { [13:10:35.133] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:35.133] windows = "NUL", "/dev/null"), open = "w") [13:10:35.133] } [13:10:35.133] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:35.133] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:35.133] base::sink(type = "output", split = FALSE) [13:10:35.133] base::close(...future.stdout) [13:10:35.133] }, add = TRUE) [13:10:35.133] } [13:10:35.133] ...future.frame <- base::sys.nframe() [13:10:35.133] ...future.conditions <- base::list() [13:10:35.133] ...future.rng <- base::globalenv()$.Random.seed [13:10:35.133] if (FALSE) { [13:10:35.133] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:35.133] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:35.133] } [13:10:35.133] ...future.result <- base::tryCatch({ [13:10:35.133] base::withCallingHandlers({ [13:10:35.133] ...future.value <- base::withVisible(base::local(NA)) [13:10:35.133] future::FutureResult(value = ...future.value$value, [13:10:35.133] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.133] ...future.rng), globalenv = if (FALSE) [13:10:35.133] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:35.133] ...future.globalenv.names)) [13:10:35.133] else NULL, started = ...future.startTime, version = "1.8") [13:10:35.133] }, condition = base::local({ [13:10:35.133] c <- base::c [13:10:35.133] inherits <- base::inherits [13:10:35.133] invokeRestart <- base::invokeRestart [13:10:35.133] length <- base::length [13:10:35.133] list <- base::list [13:10:35.133] seq.int <- base::seq.int [13:10:35.133] signalCondition <- base::signalCondition [13:10:35.133] sys.calls <- base::sys.calls [13:10:35.133] `[[` <- base::`[[` [13:10:35.133] `+` <- base::`+` [13:10:35.133] `<<-` <- base::`<<-` [13:10:35.133] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:35.133] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:35.133] 3L)] [13:10:35.133] } [13:10:35.133] function(cond) { [13:10:35.133] is_error <- inherits(cond, "error") [13:10:35.133] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:35.133] NULL) [13:10:35.133] if (is_error) { [13:10:35.133] sessionInformation <- function() { [13:10:35.133] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:35.133] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:35.133] search = base::search(), system = base::Sys.info()) [13:10:35.133] } [13:10:35.133] ...future.conditions[[length(...future.conditions) + [13:10:35.133] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:35.133] cond$call), session = sessionInformation(), [13:10:35.133] timestamp = base::Sys.time(), signaled = 0L) [13:10:35.133] signalCondition(cond) [13:10:35.133] } [13:10:35.133] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:35.133] signal <- FALSE && inherits(cond, character(0)) [13:10:35.133] ...future.conditions[[length(...future.conditions) + [13:10:35.133] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:35.133] if (FALSE && !signal) { [13:10:35.133] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.133] { [13:10:35.133] inherits <- base::inherits [13:10:35.133] invokeRestart <- base::invokeRestart [13:10:35.133] is.null <- base::is.null [13:10:35.133] muffled <- FALSE [13:10:35.133] if (inherits(cond, "message")) { [13:10:35.133] muffled <- grepl(pattern, "muffleMessage") [13:10:35.133] if (muffled) [13:10:35.133] invokeRestart("muffleMessage") [13:10:35.133] } [13:10:35.133] else if (inherits(cond, "warning")) { [13:10:35.133] muffled <- grepl(pattern, "muffleWarning") [13:10:35.133] if (muffled) [13:10:35.133] invokeRestart("muffleWarning") [13:10:35.133] } [13:10:35.133] else if (inherits(cond, "condition")) { [13:10:35.133] if (!is.null(pattern)) { [13:10:35.133] computeRestarts <- base::computeRestarts [13:10:35.133] grepl <- base::grepl [13:10:35.133] restarts <- computeRestarts(cond) [13:10:35.133] for (restart in restarts) { [13:10:35.133] name <- restart$name [13:10:35.133] if (is.null(name)) [13:10:35.133] next [13:10:35.133] if (!grepl(pattern, name)) [13:10:35.133] next [13:10:35.133] invokeRestart(restart) [13:10:35.133] muffled <- TRUE [13:10:35.133] break [13:10:35.133] } [13:10:35.133] } [13:10:35.133] } [13:10:35.133] invisible(muffled) [13:10:35.133] } [13:10:35.133] muffleCondition(cond, pattern = "^muffle") [13:10:35.133] } [13:10:35.133] } [13:10:35.133] else { [13:10:35.133] if (TRUE) { [13:10:35.133] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.133] { [13:10:35.133] inherits <- base::inherits [13:10:35.133] invokeRestart <- base::invokeRestart [13:10:35.133] is.null <- base::is.null [13:10:35.133] muffled <- FALSE [13:10:35.133] if (inherits(cond, "message")) { [13:10:35.133] muffled <- grepl(pattern, "muffleMessage") [13:10:35.133] if (muffled) [13:10:35.133] invokeRestart("muffleMessage") [13:10:35.133] } [13:10:35.133] else if (inherits(cond, "warning")) { [13:10:35.133] muffled <- grepl(pattern, "muffleWarning") [13:10:35.133] if (muffled) [13:10:35.133] invokeRestart("muffleWarning") [13:10:35.133] } [13:10:35.133] else if (inherits(cond, "condition")) { [13:10:35.133] if (!is.null(pattern)) { [13:10:35.133] computeRestarts <- base::computeRestarts [13:10:35.133] grepl <- base::grepl [13:10:35.133] restarts <- computeRestarts(cond) [13:10:35.133] for (restart in restarts) { [13:10:35.133] name <- restart$name [13:10:35.133] if (is.null(name)) [13:10:35.133] next [13:10:35.133] if (!grepl(pattern, name)) [13:10:35.133] next [13:10:35.133] invokeRestart(restart) [13:10:35.133] muffled <- TRUE [13:10:35.133] break [13:10:35.133] } [13:10:35.133] } [13:10:35.133] } [13:10:35.133] invisible(muffled) [13:10:35.133] } [13:10:35.133] muffleCondition(cond, pattern = "^muffle") [13:10:35.133] } [13:10:35.133] } [13:10:35.133] } [13:10:35.133] })) [13:10:35.133] }, error = function(ex) { [13:10:35.133] base::structure(base::list(value = NULL, visible = NULL, [13:10:35.133] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.133] ...future.rng), started = ...future.startTime, [13:10:35.133] finished = Sys.time(), session_uuid = NA_character_, [13:10:35.133] version = "1.8"), class = "FutureResult") [13:10:35.133] }, finally = { [13:10:35.133] if (!identical(...future.workdir, getwd())) [13:10:35.133] setwd(...future.workdir) [13:10:35.133] { [13:10:35.133] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:35.133] ...future.oldOptions$nwarnings <- NULL [13:10:35.133] } [13:10:35.133] base::options(...future.oldOptions) [13:10:35.133] if (.Platform$OS.type == "windows") { [13:10:35.133] old_names <- names(...future.oldEnvVars) [13:10:35.133] envs <- base::Sys.getenv() [13:10:35.133] names <- names(envs) [13:10:35.133] common <- intersect(names, old_names) [13:10:35.133] added <- setdiff(names, old_names) [13:10:35.133] removed <- setdiff(old_names, names) [13:10:35.133] changed <- common[...future.oldEnvVars[common] != [13:10:35.133] envs[common]] [13:10:35.133] NAMES <- toupper(changed) [13:10:35.133] args <- list() [13:10:35.133] for (kk in seq_along(NAMES)) { [13:10:35.133] name <- changed[[kk]] [13:10:35.133] NAME <- NAMES[[kk]] [13:10:35.133] if (name != NAME && is.element(NAME, old_names)) [13:10:35.133] next [13:10:35.133] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.133] } [13:10:35.133] NAMES <- toupper(added) [13:10:35.133] for (kk in seq_along(NAMES)) { [13:10:35.133] name <- added[[kk]] [13:10:35.133] NAME <- NAMES[[kk]] [13:10:35.133] if (name != NAME && is.element(NAME, old_names)) [13:10:35.133] next [13:10:35.133] args[[name]] <- "" [13:10:35.133] } [13:10:35.133] NAMES <- toupper(removed) [13:10:35.133] for (kk in seq_along(NAMES)) { [13:10:35.133] name <- removed[[kk]] [13:10:35.133] NAME <- NAMES[[kk]] [13:10:35.133] if (name != NAME && is.element(NAME, old_names)) [13:10:35.133] next [13:10:35.133] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.133] } [13:10:35.133] if (length(args) > 0) [13:10:35.133] base::do.call(base::Sys.setenv, args = args) [13:10:35.133] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:35.133] } [13:10:35.133] else { [13:10:35.133] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:35.133] } [13:10:35.133] { [13:10:35.133] if (base::length(...future.futureOptionsAdded) > [13:10:35.133] 0L) { [13:10:35.133] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:35.133] base::names(opts) <- ...future.futureOptionsAdded [13:10:35.133] base::options(opts) [13:10:35.133] } [13:10:35.133] { [13:10:35.133] NULL [13:10:35.133] options(future.plan = NULL) [13:10:35.133] if (is.na(NA_character_)) [13:10:35.133] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.133] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:35.133] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:35.133] .init = FALSE) [13:10:35.133] } [13:10:35.133] } [13:10:35.133] } [13:10:35.133] }) [13:10:35.133] if (TRUE) { [13:10:35.133] base::sink(type = "output", split = FALSE) [13:10:35.133] if (TRUE) { [13:10:35.133] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:35.133] } [13:10:35.133] else { [13:10:35.133] ...future.result["stdout"] <- base::list(NULL) [13:10:35.133] } [13:10:35.133] base::close(...future.stdout) [13:10:35.133] ...future.stdout <- NULL [13:10:35.133] } [13:10:35.133] ...future.result$conditions <- ...future.conditions [13:10:35.133] ...future.result$finished <- base::Sys.time() [13:10:35.133] ...future.result [13:10:35.133] } [13:10:35.235] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:10:35.235] plan(): nbrOfWorkers() = 2 > > message("*** Futures - lazy ...") *** Futures - lazy ... > > strategies <- c("mirai_cluster", "mirai_multisession") > > for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + + a <- 42 + f <- future(2 * a, lazy = TRUE) + a <- 21 + v <- value(f) + stopifnot(v == 84) + + a <- 42 + v %<-% { 2 * a } %lazy% TRUE + a <- 21 + stopifnot(v == 84) + + mprintf("- plan('%s') ... DONE", strategy) + } ## for (strategy ...) [13:10:35.243] - plan('mirai_cluster') ...[13:10:35.244] plan(): Setting new future strategy stack: [13:10:35.244] List of future strategies: [13:10:35.244] 1. mirai_cluster: [13:10:35.244] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = "") [13:10:35.244] - tweaked: FALSE [13:10:35.244] - call: plan(strategy) [13:10:35.258] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:10:35.258] < mirai | $data > [13:10:35.258] getGlobalsAndPackages() ... [13:10:35.258] Not searching for globals [13:10:35.259] - globals: [0] [13:10:35.259] getGlobalsAndPackages() ... DONE [13:10:35.259] getGlobalsAndPackages() ... [13:10:35.259] [13:10:35.259] - globals: [0] [13:10:35.259] getGlobalsAndPackages() ... DONE [13:10:35.260] Packages needed by the future expression (n = 0): [13:10:35.260] Packages needed by future strategies (n = 0): [13:10:35.260] { [13:10:35.260] { [13:10:35.260] { [13:10:35.260] ...future.startTime <- base::Sys.time() [13:10:35.260] { [13:10:35.260] { [13:10:35.260] { [13:10:35.260] base::local({ [13:10:35.260] has_future <- base::requireNamespace("future", [13:10:35.260] quietly = TRUE) [13:10:35.260] if (has_future) { [13:10:35.260] ns <- base::getNamespace("future") [13:10:35.260] version <- ns[[".package"]][["version"]] [13:10:35.260] if (is.null(version)) [13:10:35.260] version <- utils::packageVersion("future") [13:10:35.260] } [13:10:35.260] else { [13:10:35.260] version <- NULL [13:10:35.260] } [13:10:35.260] if (!has_future || version < "1.8.0") { [13:10:35.260] info <- base::c(r_version = base::gsub("R version ", [13:10:35.260] "", base::R.version$version.string), [13:10:35.260] platform = base::sprintf("%s (%s-bit)", [13:10:35.260] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:35.260] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:35.260] "release", "version")], collapse = " "), [13:10:35.260] hostname = base::Sys.info()[["nodename"]]) [13:10:35.260] info <- base::sprintf("%s: %s", base::names(info), [13:10:35.260] info) [13:10:35.260] info <- base::paste(info, collapse = "; ") [13:10:35.260] if (!has_future) { [13:10:35.260] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:35.260] info) [13:10:35.260] } [13:10:35.260] else { [13:10:35.260] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:35.260] info, version) [13:10:35.260] } [13:10:35.260] base::stop(msg) [13:10:35.260] } [13:10:35.260] }) [13:10:35.260] } [13:10:35.260] ...future.strategy.old <- future::plan("list") [13:10:35.260] options(future.plan = NULL) [13:10:35.260] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.260] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:35.260] } [13:10:35.260] ...future.workdir <- getwd() [13:10:35.260] } [13:10:35.260] ...future.oldOptions <- base::as.list(base::.Options) [13:10:35.260] ...future.oldEnvVars <- base::Sys.getenv() [13:10:35.260] } [13:10:35.260] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:35.260] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:35.260] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:35.260] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:35.260] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:35.260] future.stdout.windows.reencode = NULL, width = 80L) [13:10:35.260] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:35.260] base::names(...future.oldOptions)) [13:10:35.260] } [13:10:35.260] if (FALSE) { [13:10:35.260] } [13:10:35.260] else { [13:10:35.260] if (TRUE) { [13:10:35.260] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:35.260] open = "w") [13:10:35.260] } [13:10:35.260] else { [13:10:35.260] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:35.260] windows = "NUL", "/dev/null"), open = "w") [13:10:35.260] } [13:10:35.260] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:35.260] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:35.260] base::sink(type = "output", split = FALSE) [13:10:35.260] base::close(...future.stdout) [13:10:35.260] }, add = TRUE) [13:10:35.260] } [13:10:35.260] ...future.frame <- base::sys.nframe() [13:10:35.260] ...future.conditions <- base::list() [13:10:35.260] ...future.rng <- base::globalenv()$.Random.seed [13:10:35.260] if (FALSE) { [13:10:35.260] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:35.260] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:35.260] } [13:10:35.260] ...future.result <- base::tryCatch({ [13:10:35.260] base::withCallingHandlers({ [13:10:35.260] ...future.value <- base::withVisible(base::local(NA)) [13:10:35.260] future::FutureResult(value = ...future.value$value, [13:10:35.260] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.260] ...future.rng), globalenv = if (FALSE) [13:10:35.260] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:35.260] ...future.globalenv.names)) [13:10:35.260] else NULL, started = ...future.startTime, version = "1.8") [13:10:35.260] }, condition = base::local({ [13:10:35.260] c <- base::c [13:10:35.260] inherits <- base::inherits [13:10:35.260] invokeRestart <- base::invokeRestart [13:10:35.260] length <- base::length [13:10:35.260] list <- base::list [13:10:35.260] seq.int <- base::seq.int [13:10:35.260] signalCondition <- base::signalCondition [13:10:35.260] sys.calls <- base::sys.calls [13:10:35.260] `[[` <- base::`[[` [13:10:35.260] `+` <- base::`+` [13:10:35.260] `<<-` <- base::`<<-` [13:10:35.260] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:35.260] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:35.260] 3L)] [13:10:35.260] } [13:10:35.260] function(cond) { [13:10:35.260] is_error <- inherits(cond, "error") [13:10:35.260] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:35.260] NULL) [13:10:35.260] if (is_error) { [13:10:35.260] sessionInformation <- function() { [13:10:35.260] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:35.260] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:35.260] search = base::search(), system = base::Sys.info()) [13:10:35.260] } [13:10:35.260] ...future.conditions[[length(...future.conditions) + [13:10:35.260] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:35.260] cond$call), session = sessionInformation(), [13:10:35.260] timestamp = base::Sys.time(), signaled = 0L) [13:10:35.260] signalCondition(cond) [13:10:35.260] } [13:10:35.260] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:35.260] signal <- FALSE && inherits(cond, character(0)) [13:10:35.260] ...future.conditions[[length(...future.conditions) + [13:10:35.260] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:35.260] if (FALSE && !signal) { [13:10:35.260] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.260] { [13:10:35.260] inherits <- base::inherits [13:10:35.260] invokeRestart <- base::invokeRestart [13:10:35.260] is.null <- base::is.null [13:10:35.260] muffled <- FALSE [13:10:35.260] if (inherits(cond, "message")) { [13:10:35.260] muffled <- grepl(pattern, "muffleMessage") [13:10:35.260] if (muffled) [13:10:35.260] invokeRestart("muffleMessage") [13:10:35.260] } [13:10:35.260] else if (inherits(cond, "warning")) { [13:10:35.260] muffled <- grepl(pattern, "muffleWarning") [13:10:35.260] if (muffled) [13:10:35.260] invokeRestart("muffleWarning") [13:10:35.260] } [13:10:35.260] else if (inherits(cond, "condition")) { [13:10:35.260] if (!is.null(pattern)) { [13:10:35.260] computeRestarts <- base::computeRestarts [13:10:35.260] grepl <- base::grepl [13:10:35.260] restarts <- computeRestarts(cond) [13:10:35.260] for (restart in restarts) { [13:10:35.260] name <- restart$name [13:10:35.260] if (is.null(name)) [13:10:35.260] next [13:10:35.260] if (!grepl(pattern, name)) [13:10:35.260] next [13:10:35.260] invokeRestart(restart) [13:10:35.260] muffled <- TRUE [13:10:35.260] break [13:10:35.260] } [13:10:35.260] } [13:10:35.260] } [13:10:35.260] invisible(muffled) [13:10:35.260] } [13:10:35.260] muffleCondition(cond, pattern = "^muffle") [13:10:35.260] } [13:10:35.260] } [13:10:35.260] else { [13:10:35.260] if (TRUE) { [13:10:35.260] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.260] { [13:10:35.260] inherits <- base::inherits [13:10:35.260] invokeRestart <- base::invokeRestart [13:10:35.260] is.null <- base::is.null [13:10:35.260] muffled <- FALSE [13:10:35.260] if (inherits(cond, "message")) { [13:10:35.260] muffled <- grepl(pattern, "muffleMessage") [13:10:35.260] if (muffled) [13:10:35.260] invokeRestart("muffleMessage") [13:10:35.260] } [13:10:35.260] else if (inherits(cond, "warning")) { [13:10:35.260] muffled <- grepl(pattern, "muffleWarning") [13:10:35.260] if (muffled) [13:10:35.260] invokeRestart("muffleWarning") [13:10:35.260] } [13:10:35.260] else if (inherits(cond, "condition")) { [13:10:35.260] if (!is.null(pattern)) { [13:10:35.260] computeRestarts <- base::computeRestarts [13:10:35.260] grepl <- base::grepl [13:10:35.260] restarts <- computeRestarts(cond) [13:10:35.260] for (restart in restarts) { [13:10:35.260] name <- restart$name [13:10:35.260] if (is.null(name)) [13:10:35.260] next [13:10:35.260] if (!grepl(pattern, name)) [13:10:35.260] next [13:10:35.260] invokeRestart(restart) [13:10:35.260] muffled <- TRUE [13:10:35.260] break [13:10:35.260] } [13:10:35.260] } [13:10:35.260] } [13:10:35.260] invisible(muffled) [13:10:35.260] } [13:10:35.260] muffleCondition(cond, pattern = "^muffle") [13:10:35.260] } [13:10:35.260] } [13:10:35.260] } [13:10:35.260] })) [13:10:35.260] }, error = function(ex) { [13:10:35.260] base::structure(base::list(value = NULL, visible = NULL, [13:10:35.260] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.260] ...future.rng), started = ...future.startTime, [13:10:35.260] finished = Sys.time(), session_uuid = NA_character_, [13:10:35.260] version = "1.8"), class = "FutureResult") [13:10:35.260] }, finally = { [13:10:35.260] if (!identical(...future.workdir, getwd())) [13:10:35.260] setwd(...future.workdir) [13:10:35.260] { [13:10:35.260] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:35.260] ...future.oldOptions$nwarnings <- NULL [13:10:35.260] } [13:10:35.260] base::options(...future.oldOptions) [13:10:35.260] if (.Platform$OS.type == "windows") { [13:10:35.260] old_names <- names(...future.oldEnvVars) [13:10:35.260] envs <- base::Sys.getenv() [13:10:35.260] names <- names(envs) [13:10:35.260] common <- intersect(names, old_names) [13:10:35.260] added <- setdiff(names, old_names) [13:10:35.260] removed <- setdiff(old_names, names) [13:10:35.260] changed <- common[...future.oldEnvVars[common] != [13:10:35.260] envs[common]] [13:10:35.260] NAMES <- toupper(changed) [13:10:35.260] args <- list() [13:10:35.260] for (kk in seq_along(NAMES)) { [13:10:35.260] name <- changed[[kk]] [13:10:35.260] NAME <- NAMES[[kk]] [13:10:35.260] if (name != NAME && is.element(NAME, old_names)) [13:10:35.260] next [13:10:35.260] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.260] } [13:10:35.260] NAMES <- toupper(added) [13:10:35.260] for (kk in seq_along(NAMES)) { [13:10:35.260] name <- added[[kk]] [13:10:35.260] NAME <- NAMES[[kk]] [13:10:35.260] if (name != NAME && is.element(NAME, old_names)) [13:10:35.260] next [13:10:35.260] args[[name]] <- "" [13:10:35.260] } [13:10:35.260] NAMES <- toupper(removed) [13:10:35.260] for (kk in seq_along(NAMES)) { [13:10:35.260] name <- removed[[kk]] [13:10:35.260] NAME <- NAMES[[kk]] [13:10:35.260] if (name != NAME && is.element(NAME, old_names)) [13:10:35.260] next [13:10:35.260] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.260] } [13:10:35.260] if (length(args) > 0) [13:10:35.260] base::do.call(base::Sys.setenv, args = args) [13:10:35.260] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:35.260] } [13:10:35.260] else { [13:10:35.260] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:35.260] } [13:10:35.260] { [13:10:35.260] if (base::length(...future.futureOptionsAdded) > [13:10:35.260] 0L) { [13:10:35.260] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:35.260] base::names(opts) <- ...future.futureOptionsAdded [13:10:35.260] base::options(opts) [13:10:35.260] } [13:10:35.260] { [13:10:35.260] NULL [13:10:35.260] options(future.plan = NULL) [13:10:35.260] if (is.na(NA_character_)) [13:10:35.260] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.260] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:35.260] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:35.260] .init = FALSE) [13:10:35.260] } [13:10:35.260] } [13:10:35.260] } [13:10:35.260] }) [13:10:35.260] if (TRUE) { [13:10:35.260] base::sink(type = "output", split = FALSE) [13:10:35.260] if (TRUE) { [13:10:35.260] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:35.260] } [13:10:35.260] else { [13:10:35.260] ...future.result["stdout"] <- base::list(NULL) [13:10:35.260] } [13:10:35.260] base::close(...future.stdout) [13:10:35.260] ...future.stdout <- NULL [13:10:35.260] } [13:10:35.260] ...future.result$conditions <- ...future.conditions [13:10:35.260] ...future.result$finished <- base::Sys.time() [13:10:35.260] ...future.result [13:10:35.260] } [13:10:35.363] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:10:35.363] plan(): nbrOfWorkers() = 2 [13:10:35.363] getGlobalsAndPackages() ... [13:10:35.363] Searching for globals... [13:10:35.367] - globals found: [2] '*', 'a' [13:10:35.368] Searching for globals ... DONE [13:10:35.368] Resolving globals: FALSE [13:10:35.369] The total size of the 1 globals is 56 bytes (56 bytes) [13:10:35.369] The total size of the 1 globals exported for future expression ('2 * a') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (56 bytes of class 'numeric') [13:10:35.370] - globals: [1] 'a' [13:10:35.370] [13:10:35.370] getGlobalsAndPackages() ... DONE [13:10:35.370] run() for 'Future' ... [13:10:35.371] - state: 'created' [13:10:35.371] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:35.371] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:35.371] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:35.372] - Field: 'label' [13:10:35.372] - Field: 'local' [13:10:35.372] - Field: 'owner' [13:10:35.372] - Field: 'envir' [13:10:35.372] - Field: 'packages' [13:10:35.373] - Field: 'gc' [13:10:35.373] - Field: 'conditions' [13:10:35.373] - Field: 'expr' [13:10:35.373] - Field: 'uuid' [13:10:35.373] - Field: 'seed' [13:10:35.373] - Field: 'version' [13:10:35.374] - Field: 'result' [13:10:35.374] - Field: 'asynchronous' [13:10:35.374] - Field: 'calls' [13:10:35.374] - Field: 'globals' [13:10:35.374] - Field: 'stdout' [13:10:35.374] - Field: 'earlySignal' [13:10:35.375] - Field: 'lazy' [13:10:35.375] - Field: 'state' [13:10:35.375] - Field: '.cluster' [13:10:35.375] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:35.375] - Launch lazy future ... [13:10:35.375] Packages needed by the future expression (n = 0): [13:10:35.376] Packages needed by future strategies (n = 0): [13:10:35.376] { [13:10:35.376] { [13:10:35.376] { [13:10:35.376] ...future.startTime <- base::Sys.time() [13:10:35.376] { [13:10:35.376] { [13:10:35.376] { [13:10:35.376] base::local({ [13:10:35.376] has_future <- base::requireNamespace("future", [13:10:35.376] quietly = TRUE) [13:10:35.376] if (has_future) { [13:10:35.376] ns <- base::getNamespace("future") [13:10:35.376] version <- ns[[".package"]][["version"]] [13:10:35.376] if (is.null(version)) [13:10:35.376] version <- utils::packageVersion("future") [13:10:35.376] } [13:10:35.376] else { [13:10:35.376] version <- NULL [13:10:35.376] } [13:10:35.376] if (!has_future || version < "1.8.0") { [13:10:35.376] info <- base::c(r_version = base::gsub("R version ", [13:10:35.376] "", base::R.version$version.string), [13:10:35.376] platform = base::sprintf("%s (%s-bit)", [13:10:35.376] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:35.376] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:35.376] "release", "version")], collapse = " "), [13:10:35.376] hostname = base::Sys.info()[["nodename"]]) [13:10:35.376] info <- base::sprintf("%s: %s", base::names(info), [13:10:35.376] info) [13:10:35.376] info <- base::paste(info, collapse = "; ") [13:10:35.376] if (!has_future) { [13:10:35.376] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:35.376] info) [13:10:35.376] } [13:10:35.376] else { [13:10:35.376] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:35.376] info, version) [13:10:35.376] } [13:10:35.376] base::stop(msg) [13:10:35.376] } [13:10:35.376] }) [13:10:35.376] } [13:10:35.376] ...future.strategy.old <- future::plan("list") [13:10:35.376] options(future.plan = NULL) [13:10:35.376] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.376] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:35.376] } [13:10:35.376] ...future.workdir <- getwd() [13:10:35.376] } [13:10:35.376] ...future.oldOptions <- base::as.list(base::.Options) [13:10:35.376] ...future.oldEnvVars <- base::Sys.getenv() [13:10:35.376] } [13:10:35.376] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:35.376] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:35.376] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:35.376] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:35.376] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:35.376] future.stdout.windows.reencode = NULL, width = 80L) [13:10:35.376] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:35.376] base::names(...future.oldOptions)) [13:10:35.376] } [13:10:35.376] if (FALSE) { [13:10:35.376] } [13:10:35.376] else { [13:10:35.376] if (TRUE) { [13:10:35.376] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:35.376] open = "w") [13:10:35.376] } [13:10:35.376] else { [13:10:35.376] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:35.376] windows = "NUL", "/dev/null"), open = "w") [13:10:35.376] } [13:10:35.376] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:35.376] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:35.376] base::sink(type = "output", split = FALSE) [13:10:35.376] base::close(...future.stdout) [13:10:35.376] }, add = TRUE) [13:10:35.376] } [13:10:35.376] ...future.frame <- base::sys.nframe() [13:10:35.376] ...future.conditions <- base::list() [13:10:35.376] ...future.rng <- base::globalenv()$.Random.seed [13:10:35.376] if (FALSE) { [13:10:35.376] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:35.376] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:35.376] } [13:10:35.376] ...future.result <- base::tryCatch({ [13:10:35.376] base::withCallingHandlers({ [13:10:35.376] ...future.value <- base::withVisible(base::local(2 * [13:10:35.376] a)) [13:10:35.376] future::FutureResult(value = ...future.value$value, [13:10:35.376] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.376] ...future.rng), globalenv = if (FALSE) [13:10:35.376] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:35.376] ...future.globalenv.names)) [13:10:35.376] else NULL, started = ...future.startTime, version = "1.8") [13:10:35.376] }, condition = base::local({ [13:10:35.376] c <- base::c [13:10:35.376] inherits <- base::inherits [13:10:35.376] invokeRestart <- base::invokeRestart [13:10:35.376] length <- base::length [13:10:35.376] list <- base::list [13:10:35.376] seq.int <- base::seq.int [13:10:35.376] signalCondition <- base::signalCondition [13:10:35.376] sys.calls <- base::sys.calls [13:10:35.376] `[[` <- base::`[[` [13:10:35.376] `+` <- base::`+` [13:10:35.376] `<<-` <- base::`<<-` [13:10:35.376] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:35.376] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:35.376] 3L)] [13:10:35.376] } [13:10:35.376] function(cond) { [13:10:35.376] is_error <- inherits(cond, "error") [13:10:35.376] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:35.376] NULL) [13:10:35.376] if (is_error) { [13:10:35.376] sessionInformation <- function() { [13:10:35.376] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:35.376] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:35.376] search = base::search(), system = base::Sys.info()) [13:10:35.376] } [13:10:35.376] ...future.conditions[[length(...future.conditions) + [13:10:35.376] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:35.376] cond$call), session = sessionInformation(), [13:10:35.376] timestamp = base::Sys.time(), signaled = 0L) [13:10:35.376] signalCondition(cond) [13:10:35.376] } [13:10:35.376] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:35.376] signal <- FALSE && inherits(cond, character(0)) [13:10:35.376] ...future.conditions[[length(...future.conditions) + [13:10:35.376] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:35.376] if (FALSE && !signal) { [13:10:35.376] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.376] { [13:10:35.376] inherits <- base::inherits [13:10:35.376] invokeRestart <- base::invokeRestart [13:10:35.376] is.null <- base::is.null [13:10:35.376] muffled <- FALSE [13:10:35.376] if (inherits(cond, "message")) { [13:10:35.376] muffled <- grepl(pattern, "muffleMessage") [13:10:35.376] if (muffled) [13:10:35.376] invokeRestart("muffleMessage") [13:10:35.376] } [13:10:35.376] else if (inherits(cond, "warning")) { [13:10:35.376] muffled <- grepl(pattern, "muffleWarning") [13:10:35.376] if (muffled) [13:10:35.376] invokeRestart("muffleWarning") [13:10:35.376] } [13:10:35.376] else if (inherits(cond, "condition")) { [13:10:35.376] if (!is.null(pattern)) { [13:10:35.376] computeRestarts <- base::computeRestarts [13:10:35.376] grepl <- base::grepl [13:10:35.376] restarts <- computeRestarts(cond) [13:10:35.376] for (restart in restarts) { [13:10:35.376] name <- restart$name [13:10:35.376] if (is.null(name)) [13:10:35.376] next [13:10:35.376] if (!grepl(pattern, name)) [13:10:35.376] next [13:10:35.376] invokeRestart(restart) [13:10:35.376] muffled <- TRUE [13:10:35.376] break [13:10:35.376] } [13:10:35.376] } [13:10:35.376] } [13:10:35.376] invisible(muffled) [13:10:35.376] } [13:10:35.376] muffleCondition(cond, pattern = "^muffle") [13:10:35.376] } [13:10:35.376] } [13:10:35.376] else { [13:10:35.376] if (TRUE) { [13:10:35.376] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.376] { [13:10:35.376] inherits <- base::inherits [13:10:35.376] invokeRestart <- base::invokeRestart [13:10:35.376] is.null <- base::is.null [13:10:35.376] muffled <- FALSE [13:10:35.376] if (inherits(cond, "message")) { [13:10:35.376] muffled <- grepl(pattern, "muffleMessage") [13:10:35.376] if (muffled) [13:10:35.376] invokeRestart("muffleMessage") [13:10:35.376] } [13:10:35.376] else if (inherits(cond, "warning")) { [13:10:35.376] muffled <- grepl(pattern, "muffleWarning") [13:10:35.376] if (muffled) [13:10:35.376] invokeRestart("muffleWarning") [13:10:35.376] } [13:10:35.376] else if (inherits(cond, "condition")) { [13:10:35.376] if (!is.null(pattern)) { [13:10:35.376] computeRestarts <- base::computeRestarts [13:10:35.376] grepl <- base::grepl [13:10:35.376] restarts <- computeRestarts(cond) [13:10:35.376] for (restart in restarts) { [13:10:35.376] name <- restart$name [13:10:35.376] if (is.null(name)) [13:10:35.376] next [13:10:35.376] if (!grepl(pattern, name)) [13:10:35.376] next [13:10:35.376] invokeRestart(restart) [13:10:35.376] muffled <- TRUE [13:10:35.376] break [13:10:35.376] } [13:10:35.376] } [13:10:35.376] } [13:10:35.376] invisible(muffled) [13:10:35.376] } [13:10:35.376] muffleCondition(cond, pattern = "^muffle") [13:10:35.376] } [13:10:35.376] } [13:10:35.376] } [13:10:35.376] })) [13:10:35.376] }, error = function(ex) { [13:10:35.376] base::structure(base::list(value = NULL, visible = NULL, [13:10:35.376] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.376] ...future.rng), started = ...future.startTime, [13:10:35.376] finished = Sys.time(), session_uuid = NA_character_, [13:10:35.376] version = "1.8"), class = "FutureResult") [13:10:35.376] }, finally = { [13:10:35.376] if (!identical(...future.workdir, getwd())) [13:10:35.376] setwd(...future.workdir) [13:10:35.376] { [13:10:35.376] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:35.376] ...future.oldOptions$nwarnings <- NULL [13:10:35.376] } [13:10:35.376] base::options(...future.oldOptions) [13:10:35.376] if (.Platform$OS.type == "windows") { [13:10:35.376] old_names <- names(...future.oldEnvVars) [13:10:35.376] envs <- base::Sys.getenv() [13:10:35.376] names <- names(envs) [13:10:35.376] common <- intersect(names, old_names) [13:10:35.376] added <- setdiff(names, old_names) [13:10:35.376] removed <- setdiff(old_names, names) [13:10:35.376] changed <- common[...future.oldEnvVars[common] != [13:10:35.376] envs[common]] [13:10:35.376] NAMES <- toupper(changed) [13:10:35.376] args <- list() [13:10:35.376] for (kk in seq_along(NAMES)) { [13:10:35.376] name <- changed[[kk]] [13:10:35.376] NAME <- NAMES[[kk]] [13:10:35.376] if (name != NAME && is.element(NAME, old_names)) [13:10:35.376] next [13:10:35.376] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.376] } [13:10:35.376] NAMES <- toupper(added) [13:10:35.376] for (kk in seq_along(NAMES)) { [13:10:35.376] name <- added[[kk]] [13:10:35.376] NAME <- NAMES[[kk]] [13:10:35.376] if (name != NAME && is.element(NAME, old_names)) [13:10:35.376] next [13:10:35.376] args[[name]] <- "" [13:10:35.376] } [13:10:35.376] NAMES <- toupper(removed) [13:10:35.376] for (kk in seq_along(NAMES)) { [13:10:35.376] name <- removed[[kk]] [13:10:35.376] NAME <- NAMES[[kk]] [13:10:35.376] if (name != NAME && is.element(NAME, old_names)) [13:10:35.376] next [13:10:35.376] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.376] } [13:10:35.376] if (length(args) > 0) [13:10:35.376] base::do.call(base::Sys.setenv, args = args) [13:10:35.376] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:35.376] } [13:10:35.376] else { [13:10:35.376] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:35.376] } [13:10:35.376] { [13:10:35.376] if (base::length(...future.futureOptionsAdded) > [13:10:35.376] 0L) { [13:10:35.376] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:35.376] base::names(opts) <- ...future.futureOptionsAdded [13:10:35.376] base::options(opts) [13:10:35.376] } [13:10:35.376] { [13:10:35.376] NULL [13:10:35.376] options(future.plan = NULL) [13:10:35.376] if (is.na(NA_character_)) [13:10:35.376] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.376] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:35.376] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:35.376] .init = FALSE) [13:10:35.376] } [13:10:35.376] } [13:10:35.376] } [13:10:35.376] }) [13:10:35.376] if (TRUE) { [13:10:35.376] base::sink(type = "output", split = FALSE) [13:10:35.376] if (TRUE) { [13:10:35.376] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:35.376] } [13:10:35.376] else { [13:10:35.376] ...future.result["stdout"] <- base::list(NULL) [13:10:35.376] } [13:10:35.376] base::close(...future.stdout) [13:10:35.376] ...future.stdout <- NULL [13:10:35.376] } [13:10:35.376] ...future.result$conditions <- ...future.conditions [13:10:35.376] ...future.result$finished <- base::Sys.time() [13:10:35.376] ...future.result [13:10:35.376] } [13:10:35.380] - Launch lazy future ... done [13:10:35.380] run() for 'MiraiFuture' ... done [13:10:35.383] getGlobalsAndPackages() ... [13:10:35.384] Searching for globals... [13:10:35.387] - globals found: [3] '{', '*', 'a' [13:10:35.387] Searching for globals ... DONE [13:10:35.387] Resolving globals: FALSE [13:10:35.388] The total size of the 1 globals is 56 bytes (56 bytes) [13:10:35.388] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (56 bytes of class 'numeric') [13:10:35.388] - globals: [1] 'a' [13:10:35.389] [13:10:35.389] getGlobalsAndPackages() ... DONE [13:10:35.389] run() for 'Future' ... [13:10:35.389] - state: 'created' [13:10:35.390] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:35.390] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:35.390] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:35.390] - Field: 'label' [13:10:35.390] - Field: 'local' [13:10:35.391] - Field: 'owner' [13:10:35.391] - Field: 'envir' [13:10:35.391] - Field: 'packages' [13:10:35.391] - Field: 'gc' [13:10:35.391] - Field: 'conditions' [13:10:35.392] - Field: 'expr' [13:10:35.392] - Field: 'uuid' [13:10:35.392] - Field: 'seed' [13:10:35.392] - Field: 'version' [13:10:35.392] - Field: 'result' [13:10:35.392] - Field: 'asynchronous' [13:10:35.393] - Field: 'calls' [13:10:35.393] - Field: 'globals' [13:10:35.393] - Field: 'stdout' [13:10:35.393] - Field: 'earlySignal' [13:10:35.393] - Field: 'lazy' [13:10:35.393] - Field: 'state' [13:10:35.394] - Field: '.cluster' [13:10:35.394] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:35.394] - Launch lazy future ... [13:10:35.394] Packages needed by the future expression (n = 0): [13:10:35.394] Packages needed by future strategies (n = 0): [13:10:35.395] { [13:10:35.395] { [13:10:35.395] { [13:10:35.395] ...future.startTime <- base::Sys.time() [13:10:35.395] { [13:10:35.395] { [13:10:35.395] { [13:10:35.395] base::local({ [13:10:35.395] has_future <- base::requireNamespace("future", [13:10:35.395] quietly = TRUE) [13:10:35.395] if (has_future) { [13:10:35.395] ns <- base::getNamespace("future") [13:10:35.395] version <- ns[[".package"]][["version"]] [13:10:35.395] if (is.null(version)) [13:10:35.395] version <- utils::packageVersion("future") [13:10:35.395] } [13:10:35.395] else { [13:10:35.395] version <- NULL [13:10:35.395] } [13:10:35.395] if (!has_future || version < "1.8.0") { [13:10:35.395] info <- base::c(r_version = base::gsub("R version ", [13:10:35.395] "", base::R.version$version.string), [13:10:35.395] platform = base::sprintf("%s (%s-bit)", [13:10:35.395] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:35.395] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:35.395] "release", "version")], collapse = " "), [13:10:35.395] hostname = base::Sys.info()[["nodename"]]) [13:10:35.395] info <- base::sprintf("%s: %s", base::names(info), [13:10:35.395] info) [13:10:35.395] info <- base::paste(info, collapse = "; ") [13:10:35.395] if (!has_future) { [13:10:35.395] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:35.395] info) [13:10:35.395] } [13:10:35.395] else { [13:10:35.395] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:35.395] info, version) [13:10:35.395] } [13:10:35.395] base::stop(msg) [13:10:35.395] } [13:10:35.395] }) [13:10:35.395] } [13:10:35.395] ...future.strategy.old <- future::plan("list") [13:10:35.395] options(future.plan = NULL) [13:10:35.395] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.395] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:35.395] } [13:10:35.395] ...future.workdir <- getwd() [13:10:35.395] } [13:10:35.395] ...future.oldOptions <- base::as.list(base::.Options) [13:10:35.395] ...future.oldEnvVars <- base::Sys.getenv() [13:10:35.395] } [13:10:35.395] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:35.395] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:35.395] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:35.395] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:35.395] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:35.395] future.stdout.windows.reencode = NULL, width = 80L) [13:10:35.395] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:35.395] base::names(...future.oldOptions)) [13:10:35.395] } [13:10:35.395] if (FALSE) { [13:10:35.395] } [13:10:35.395] else { [13:10:35.395] if (TRUE) { [13:10:35.395] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:35.395] open = "w") [13:10:35.395] } [13:10:35.395] else { [13:10:35.395] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:35.395] windows = "NUL", "/dev/null"), open = "w") [13:10:35.395] } [13:10:35.395] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:35.395] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:35.395] base::sink(type = "output", split = FALSE) [13:10:35.395] base::close(...future.stdout) [13:10:35.395] }, add = TRUE) [13:10:35.395] } [13:10:35.395] ...future.frame <- base::sys.nframe() [13:10:35.395] ...future.conditions <- base::list() [13:10:35.395] ...future.rng <- base::globalenv()$.Random.seed [13:10:35.395] if (FALSE) { [13:10:35.395] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:35.395] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:35.395] } [13:10:35.395] ...future.result <- base::tryCatch({ [13:10:35.395] base::withCallingHandlers({ [13:10:35.395] ...future.value <- base::withVisible(base::local({ [13:10:35.395] 2 * a [13:10:35.395] })) [13:10:35.395] future::FutureResult(value = ...future.value$value, [13:10:35.395] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.395] ...future.rng), globalenv = if (FALSE) [13:10:35.395] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:35.395] ...future.globalenv.names)) [13:10:35.395] else NULL, started = ...future.startTime, version = "1.8") [13:10:35.395] }, condition = base::local({ [13:10:35.395] c <- base::c [13:10:35.395] inherits <- base::inherits [13:10:35.395] invokeRestart <- base::invokeRestart [13:10:35.395] length <- base::length [13:10:35.395] list <- base::list [13:10:35.395] seq.int <- base::seq.int [13:10:35.395] signalCondition <- base::signalCondition [13:10:35.395] sys.calls <- base::sys.calls [13:10:35.395] `[[` <- base::`[[` [13:10:35.395] `+` <- base::`+` [13:10:35.395] `<<-` <- base::`<<-` [13:10:35.395] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:35.395] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:35.395] 3L)] [13:10:35.395] } [13:10:35.395] function(cond) { [13:10:35.395] is_error <- inherits(cond, "error") [13:10:35.395] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:35.395] NULL) [13:10:35.395] if (is_error) { [13:10:35.395] sessionInformation <- function() { [13:10:35.395] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:35.395] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:35.395] search = base::search(), system = base::Sys.info()) [13:10:35.395] } [13:10:35.395] ...future.conditions[[length(...future.conditions) + [13:10:35.395] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:35.395] cond$call), session = sessionInformation(), [13:10:35.395] timestamp = base::Sys.time(), signaled = 0L) [13:10:35.395] signalCondition(cond) [13:10:35.395] } [13:10:35.395] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:35.395] signal <- FALSE && inherits(cond, character(0)) [13:10:35.395] ...future.conditions[[length(...future.conditions) + [13:10:35.395] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:35.395] if (FALSE && !signal) { [13:10:35.395] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.395] { [13:10:35.395] inherits <- base::inherits [13:10:35.395] invokeRestart <- base::invokeRestart [13:10:35.395] is.null <- base::is.null [13:10:35.395] muffled <- FALSE [13:10:35.395] if (inherits(cond, "message")) { [13:10:35.395] muffled <- grepl(pattern, "muffleMessage") [13:10:35.395] if (muffled) [13:10:35.395] invokeRestart("muffleMessage") [13:10:35.395] } [13:10:35.395] else if (inherits(cond, "warning")) { [13:10:35.395] muffled <- grepl(pattern, "muffleWarning") [13:10:35.395] if (muffled) [13:10:35.395] invokeRestart("muffleWarning") [13:10:35.395] } [13:10:35.395] else if (inherits(cond, "condition")) { [13:10:35.395] if (!is.null(pattern)) { [13:10:35.395] computeRestarts <- base::computeRestarts [13:10:35.395] grepl <- base::grepl [13:10:35.395] restarts <- computeRestarts(cond) [13:10:35.395] for (restart in restarts) { [13:10:35.395] name <- restart$name [13:10:35.395] if (is.null(name)) [13:10:35.395] next [13:10:35.395] if (!grepl(pattern, name)) [13:10:35.395] next [13:10:35.395] invokeRestart(restart) [13:10:35.395] muffled <- TRUE [13:10:35.395] break [13:10:35.395] } [13:10:35.395] } [13:10:35.395] } [13:10:35.395] invisible(muffled) [13:10:35.395] } [13:10:35.395] muffleCondition(cond, pattern = "^muffle") [13:10:35.395] } [13:10:35.395] } [13:10:35.395] else { [13:10:35.395] if (TRUE) { [13:10:35.395] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.395] { [13:10:35.395] inherits <- base::inherits [13:10:35.395] invokeRestart <- base::invokeRestart [13:10:35.395] is.null <- base::is.null [13:10:35.395] muffled <- FALSE [13:10:35.395] if (inherits(cond, "message")) { [13:10:35.395] muffled <- grepl(pattern, "muffleMessage") [13:10:35.395] if (muffled) [13:10:35.395] invokeRestart("muffleMessage") [13:10:35.395] } [13:10:35.395] else if (inherits(cond, "warning")) { [13:10:35.395] muffled <- grepl(pattern, "muffleWarning") [13:10:35.395] if (muffled) [13:10:35.395] invokeRestart("muffleWarning") [13:10:35.395] } [13:10:35.395] else if (inherits(cond, "condition")) { [13:10:35.395] if (!is.null(pattern)) { [13:10:35.395] computeRestarts <- base::computeRestarts [13:10:35.395] grepl <- base::grepl [13:10:35.395] restarts <- computeRestarts(cond) [13:10:35.395] for (restart in restarts) { [13:10:35.395] name <- restart$name [13:10:35.395] if (is.null(name)) [13:10:35.395] next [13:10:35.395] if (!grepl(pattern, name)) [13:10:35.395] next [13:10:35.395] invokeRestart(restart) [13:10:35.395] muffled <- TRUE [13:10:35.395] break [13:10:35.395] } [13:10:35.395] } [13:10:35.395] } [13:10:35.395] invisible(muffled) [13:10:35.395] } [13:10:35.395] muffleCondition(cond, pattern = "^muffle") [13:10:35.395] } [13:10:35.395] } [13:10:35.395] } [13:10:35.395] })) [13:10:35.395] }, error = function(ex) { [13:10:35.395] base::structure(base::list(value = NULL, visible = NULL, [13:10:35.395] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.395] ...future.rng), started = ...future.startTime, [13:10:35.395] finished = Sys.time(), session_uuid = NA_character_, [13:10:35.395] version = "1.8"), class = "FutureResult") [13:10:35.395] }, finally = { [13:10:35.395] if (!identical(...future.workdir, getwd())) [13:10:35.395] setwd(...future.workdir) [13:10:35.395] { [13:10:35.395] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:35.395] ...future.oldOptions$nwarnings <- NULL [13:10:35.395] } [13:10:35.395] base::options(...future.oldOptions) [13:10:35.395] if (.Platform$OS.type == "windows") { [13:10:35.395] old_names <- names(...future.oldEnvVars) [13:10:35.395] envs <- base::Sys.getenv() [13:10:35.395] names <- names(envs) [13:10:35.395] common <- intersect(names, old_names) [13:10:35.395] added <- setdiff(names, old_names) [13:10:35.395] removed <- setdiff(old_names, names) [13:10:35.395] changed <- common[...future.oldEnvVars[common] != [13:10:35.395] envs[common]] [13:10:35.395] NAMES <- toupper(changed) [13:10:35.395] args <- list() [13:10:35.395] for (kk in seq_along(NAMES)) { [13:10:35.395] name <- changed[[kk]] [13:10:35.395] NAME <- NAMES[[kk]] [13:10:35.395] if (name != NAME && is.element(NAME, old_names)) [13:10:35.395] next [13:10:35.395] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.395] } [13:10:35.395] NAMES <- toupper(added) [13:10:35.395] for (kk in seq_along(NAMES)) { [13:10:35.395] name <- added[[kk]] [13:10:35.395] NAME <- NAMES[[kk]] [13:10:35.395] if (name != NAME && is.element(NAME, old_names)) [13:10:35.395] next [13:10:35.395] args[[name]] <- "" [13:10:35.395] } [13:10:35.395] NAMES <- toupper(removed) [13:10:35.395] for (kk in seq_along(NAMES)) { [13:10:35.395] name <- removed[[kk]] [13:10:35.395] NAME <- NAMES[[kk]] [13:10:35.395] if (name != NAME && is.element(NAME, old_names)) [13:10:35.395] next [13:10:35.395] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.395] } [13:10:35.395] if (length(args) > 0) [13:10:35.395] base::do.call(base::Sys.setenv, args = args) [13:10:35.395] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:35.395] } [13:10:35.395] else { [13:10:35.395] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:35.395] } [13:10:35.395] { [13:10:35.395] if (base::length(...future.futureOptionsAdded) > [13:10:35.395] 0L) { [13:10:35.395] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:35.395] base::names(opts) <- ...future.futureOptionsAdded [13:10:35.395] base::options(opts) [13:10:35.395] } [13:10:35.395] { [13:10:35.395] NULL [13:10:35.395] options(future.plan = NULL) [13:10:35.395] if (is.na(NA_character_)) [13:10:35.395] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.395] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:35.395] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:35.395] .init = FALSE) [13:10:35.395] } [13:10:35.395] } [13:10:35.395] } [13:10:35.395] }) [13:10:35.395] if (TRUE) { [13:10:35.395] base::sink(type = "output", split = FALSE) [13:10:35.395] if (TRUE) { [13:10:35.395] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:35.395] } [13:10:35.395] else { [13:10:35.395] ...future.result["stdout"] <- base::list(NULL) [13:10:35.395] } [13:10:35.395] base::close(...future.stdout) [13:10:35.395] ...future.stdout <- NULL [13:10:35.395] } [13:10:35.395] ...future.result$conditions <- ...future.conditions [13:10:35.395] ...future.result$finished <- base::Sys.time() [13:10:35.395] ...future.result [13:10:35.395] } [13:10:35.399] - Launch lazy future ... done [13:10:35.399] run() for 'MiraiFuture' ... done [13:10:35.401] - plan('mirai_cluster') ... DONE[13:10:35.401] - plan('mirai_multisession') ...[13:10:35.401] plan(): Setting new future strategy stack: [13:10:35.401] List of future strategies: [13:10:35.401] 1. mirai_multisession: [13:10:35.401] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:10:35.401] - tweaked: FALSE [13:10:35.401] - call: plan(strategy) [13:10:35.402] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:10:35.402] < mirai | $data > [13:10:35.404] getGlobalsAndPackages() ... [13:10:35.405] Not searching for globals [13:10:35.405] - globals: [0] [13:10:35.405] getGlobalsAndPackages() ... DONE [13:10:35.407] getGlobalsAndPackages() ... [13:10:35.407] [13:10:35.407] - globals: [0] [13:10:35.407] getGlobalsAndPackages() ... DONE [13:10:35.408] Packages needed by the future expression (n = 0): [13:10:35.408] Packages needed by future strategies (n = 0): [13:10:35.408] { [13:10:35.408] { [13:10:35.408] { [13:10:35.408] ...future.startTime <- base::Sys.time() [13:10:35.408] { [13:10:35.408] { [13:10:35.408] { [13:10:35.408] base::local({ [13:10:35.408] has_future <- base::requireNamespace("future", [13:10:35.408] quietly = TRUE) [13:10:35.408] if (has_future) { [13:10:35.408] ns <- base::getNamespace("future") [13:10:35.408] version <- ns[[".package"]][["version"]] [13:10:35.408] if (is.null(version)) [13:10:35.408] version <- utils::packageVersion("future") [13:10:35.408] } [13:10:35.408] else { [13:10:35.408] version <- NULL [13:10:35.408] } [13:10:35.408] if (!has_future || version < "1.8.0") { [13:10:35.408] info <- base::c(r_version = base::gsub("R version ", [13:10:35.408] "", base::R.version$version.string), [13:10:35.408] platform = base::sprintf("%s (%s-bit)", [13:10:35.408] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:35.408] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:35.408] "release", "version")], collapse = " "), [13:10:35.408] hostname = base::Sys.info()[["nodename"]]) [13:10:35.408] info <- base::sprintf("%s: %s", base::names(info), [13:10:35.408] info) [13:10:35.408] info <- base::paste(info, collapse = "; ") [13:10:35.408] if (!has_future) { [13:10:35.408] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:35.408] info) [13:10:35.408] } [13:10:35.408] else { [13:10:35.408] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:35.408] info, version) [13:10:35.408] } [13:10:35.408] base::stop(msg) [13:10:35.408] } [13:10:35.408] }) [13:10:35.408] } [13:10:35.408] ...future.strategy.old <- future::plan("list") [13:10:35.408] options(future.plan = NULL) [13:10:35.408] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.408] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:35.408] } [13:10:35.408] ...future.workdir <- getwd() [13:10:35.408] } [13:10:35.408] ...future.oldOptions <- base::as.list(base::.Options) [13:10:35.408] ...future.oldEnvVars <- base::Sys.getenv() [13:10:35.408] } [13:10:35.408] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:35.408] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:35.408] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:35.408] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:35.408] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:35.408] future.stdout.windows.reencode = NULL, width = 80L) [13:10:35.408] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:35.408] base::names(...future.oldOptions)) [13:10:35.408] } [13:10:35.408] if (FALSE) { [13:10:35.408] } [13:10:35.408] else { [13:10:35.408] if (TRUE) { [13:10:35.408] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:35.408] open = "w") [13:10:35.408] } [13:10:35.408] else { [13:10:35.408] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:35.408] windows = "NUL", "/dev/null"), open = "w") [13:10:35.408] } [13:10:35.408] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:35.408] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:35.408] base::sink(type = "output", split = FALSE) [13:10:35.408] base::close(...future.stdout) [13:10:35.408] }, add = TRUE) [13:10:35.408] } [13:10:35.408] ...future.frame <- base::sys.nframe() [13:10:35.408] ...future.conditions <- base::list() [13:10:35.408] ...future.rng <- base::globalenv()$.Random.seed [13:10:35.408] if (FALSE) { [13:10:35.408] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:35.408] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:35.408] } [13:10:35.408] ...future.result <- base::tryCatch({ [13:10:35.408] base::withCallingHandlers({ [13:10:35.408] ...future.value <- base::withVisible(base::local(NA)) [13:10:35.408] future::FutureResult(value = ...future.value$value, [13:10:35.408] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.408] ...future.rng), globalenv = if (FALSE) [13:10:35.408] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:35.408] ...future.globalenv.names)) [13:10:35.408] else NULL, started = ...future.startTime, version = "1.8") [13:10:35.408] }, condition = base::local({ [13:10:35.408] c <- base::c [13:10:35.408] inherits <- base::inherits [13:10:35.408] invokeRestart <- base::invokeRestart [13:10:35.408] length <- base::length [13:10:35.408] list <- base::list [13:10:35.408] seq.int <- base::seq.int [13:10:35.408] signalCondition <- base::signalCondition [13:10:35.408] sys.calls <- base::sys.calls [13:10:35.408] `[[` <- base::`[[` [13:10:35.408] `+` <- base::`+` [13:10:35.408] `<<-` <- base::`<<-` [13:10:35.408] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:35.408] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:35.408] 3L)] [13:10:35.408] } [13:10:35.408] function(cond) { [13:10:35.408] is_error <- inherits(cond, "error") [13:10:35.408] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:35.408] NULL) [13:10:35.408] if (is_error) { [13:10:35.408] sessionInformation <- function() { [13:10:35.408] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:35.408] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:35.408] search = base::search(), system = base::Sys.info()) [13:10:35.408] } [13:10:35.408] ...future.conditions[[length(...future.conditions) + [13:10:35.408] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:35.408] cond$call), session = sessionInformation(), [13:10:35.408] timestamp = base::Sys.time(), signaled = 0L) [13:10:35.408] signalCondition(cond) [13:10:35.408] } [13:10:35.408] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:35.408] signal <- FALSE && inherits(cond, character(0)) [13:10:35.408] ...future.conditions[[length(...future.conditions) + [13:10:35.408] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:35.408] if (FALSE && !signal) { [13:10:35.408] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.408] { [13:10:35.408] inherits <- base::inherits [13:10:35.408] invokeRestart <- base::invokeRestart [13:10:35.408] is.null <- base::is.null [13:10:35.408] muffled <- FALSE [13:10:35.408] if (inherits(cond, "message")) { [13:10:35.408] muffled <- grepl(pattern, "muffleMessage") [13:10:35.408] if (muffled) [13:10:35.408] invokeRestart("muffleMessage") [13:10:35.408] } [13:10:35.408] else if (inherits(cond, "warning")) { [13:10:35.408] muffled <- grepl(pattern, "muffleWarning") [13:10:35.408] if (muffled) [13:10:35.408] invokeRestart("muffleWarning") [13:10:35.408] } [13:10:35.408] else if (inherits(cond, "condition")) { [13:10:35.408] if (!is.null(pattern)) { [13:10:35.408] computeRestarts <- base::computeRestarts [13:10:35.408] grepl <- base::grepl [13:10:35.408] restarts <- computeRestarts(cond) [13:10:35.408] for (restart in restarts) { [13:10:35.408] name <- restart$name [13:10:35.408] if (is.null(name)) [13:10:35.408] next [13:10:35.408] if (!grepl(pattern, name)) [13:10:35.408] next [13:10:35.408] invokeRestart(restart) [13:10:35.408] muffled <- TRUE [13:10:35.408] break [13:10:35.408] } [13:10:35.408] } [13:10:35.408] } [13:10:35.408] invisible(muffled) [13:10:35.408] } [13:10:35.408] muffleCondition(cond, pattern = "^muffle") [13:10:35.408] } [13:10:35.408] } [13:10:35.408] else { [13:10:35.408] if (TRUE) { [13:10:35.408] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.408] { [13:10:35.408] inherits <- base::inherits [13:10:35.408] invokeRestart <- base::invokeRestart [13:10:35.408] is.null <- base::is.null [13:10:35.408] muffled <- FALSE [13:10:35.408] if (inherits(cond, "message")) { [13:10:35.408] muffled <- grepl(pattern, "muffleMessage") [13:10:35.408] if (muffled) [13:10:35.408] invokeRestart("muffleMessage") [13:10:35.408] } [13:10:35.408] else if (inherits(cond, "warning")) { [13:10:35.408] muffled <- grepl(pattern, "muffleWarning") [13:10:35.408] if (muffled) [13:10:35.408] invokeRestart("muffleWarning") [13:10:35.408] } [13:10:35.408] else if (inherits(cond, "condition")) { [13:10:35.408] if (!is.null(pattern)) { [13:10:35.408] computeRestarts <- base::computeRestarts [13:10:35.408] grepl <- base::grepl [13:10:35.408] restarts <- computeRestarts(cond) [13:10:35.408] for (restart in restarts) { [13:10:35.408] name <- restart$name [13:10:35.408] if (is.null(name)) [13:10:35.408] next [13:10:35.408] if (!grepl(pattern, name)) [13:10:35.408] next [13:10:35.408] invokeRestart(restart) [13:10:35.408] muffled <- TRUE [13:10:35.408] break [13:10:35.408] } [13:10:35.408] } [13:10:35.408] } [13:10:35.408] invisible(muffled) [13:10:35.408] } [13:10:35.408] muffleCondition(cond, pattern = "^muffle") [13:10:35.408] } [13:10:35.408] } [13:10:35.408] } [13:10:35.408] })) [13:10:35.408] }, error = function(ex) { [13:10:35.408] base::structure(base::list(value = NULL, visible = NULL, [13:10:35.408] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.408] ...future.rng), started = ...future.startTime, [13:10:35.408] finished = Sys.time(), session_uuid = NA_character_, [13:10:35.408] version = "1.8"), class = "FutureResult") [13:10:35.408] }, finally = { [13:10:35.408] if (!identical(...future.workdir, getwd())) [13:10:35.408] setwd(...future.workdir) [13:10:35.408] { [13:10:35.408] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:35.408] ...future.oldOptions$nwarnings <- NULL [13:10:35.408] } [13:10:35.408] base::options(...future.oldOptions) [13:10:35.408] if (.Platform$OS.type == "windows") { [13:10:35.408] old_names <- names(...future.oldEnvVars) [13:10:35.408] envs <- base::Sys.getenv() [13:10:35.408] names <- names(envs) [13:10:35.408] common <- intersect(names, old_names) [13:10:35.408] added <- setdiff(names, old_names) [13:10:35.408] removed <- setdiff(old_names, names) [13:10:35.408] changed <- common[...future.oldEnvVars[common] != [13:10:35.408] envs[common]] [13:10:35.408] NAMES <- toupper(changed) [13:10:35.408] args <- list() [13:10:35.408] for (kk in seq_along(NAMES)) { [13:10:35.408] name <- changed[[kk]] [13:10:35.408] NAME <- NAMES[[kk]] [13:10:35.408] if (name != NAME && is.element(NAME, old_names)) [13:10:35.408] next [13:10:35.408] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.408] } [13:10:35.408] NAMES <- toupper(added) [13:10:35.408] for (kk in seq_along(NAMES)) { [13:10:35.408] name <- added[[kk]] [13:10:35.408] NAME <- NAMES[[kk]] [13:10:35.408] if (name != NAME && is.element(NAME, old_names)) [13:10:35.408] next [13:10:35.408] args[[name]] <- "" [13:10:35.408] } [13:10:35.408] NAMES <- toupper(removed) [13:10:35.408] for (kk in seq_along(NAMES)) { [13:10:35.408] name <- removed[[kk]] [13:10:35.408] NAME <- NAMES[[kk]] [13:10:35.408] if (name != NAME && is.element(NAME, old_names)) [13:10:35.408] next [13:10:35.408] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.408] } [13:10:35.408] if (length(args) > 0) [13:10:35.408] base::do.call(base::Sys.setenv, args = args) [13:10:35.408] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:35.408] } [13:10:35.408] else { [13:10:35.408] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:35.408] } [13:10:35.408] { [13:10:35.408] if (base::length(...future.futureOptionsAdded) > [13:10:35.408] 0L) { [13:10:35.408] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:35.408] base::names(opts) <- ...future.futureOptionsAdded [13:10:35.408] base::options(opts) [13:10:35.408] } [13:10:35.408] { [13:10:35.408] NULL [13:10:35.408] options(future.plan = NULL) [13:10:35.408] if (is.na(NA_character_)) [13:10:35.408] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.408] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:35.408] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:35.408] .init = FALSE) [13:10:35.408] } [13:10:35.408] } [13:10:35.408] } [13:10:35.408] }) [13:10:35.408] if (TRUE) { [13:10:35.408] base::sink(type = "output", split = FALSE) [13:10:35.408] if (TRUE) { [13:10:35.408] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:35.408] } [13:10:35.408] else { [13:10:35.408] ...future.result["stdout"] <- base::list(NULL) [13:10:35.408] } [13:10:35.408] base::close(...future.stdout) [13:10:35.408] ...future.stdout <- NULL [13:10:35.408] } [13:10:35.408] ...future.result$conditions <- ...future.conditions [13:10:35.408] ...future.result$finished <- base::Sys.time() [13:10:35.408] ...future.result [13:10:35.408] } [13:10:35.414] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:10:35.414] plan(): nbrOfWorkers() = 2 [13:10:35.414] getGlobalsAndPackages() ... [13:10:35.415] Searching for globals... [13:10:35.415] - globals found: [2] '*', 'a' [13:10:35.415] Searching for globals ... DONE [13:10:35.416] Resolving globals: FALSE [13:10:35.416] The total size of the 1 globals is 56 bytes (56 bytes) [13:10:35.417] The total size of the 1 globals exported for future expression ('2 * a') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (56 bytes of class 'numeric') [13:10:35.417] - globals: [1] 'a' [13:10:35.417] [13:10:35.417] getGlobalsAndPackages() ... DONE [13:10:35.417] run() for 'Future' ... [13:10:35.418] - state: 'created' [13:10:35.418] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:35.420] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:35.420] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:35.420] - Field: 'label' [13:10:35.421] - Field: 'local' [13:10:35.421] - Field: 'owner' [13:10:35.421] - Field: 'envir' [13:10:35.421] - Field: 'packages' [13:10:35.421] - Field: 'gc' [13:10:35.421] - Field: 'conditions' [13:10:35.422] - Field: 'expr' [13:10:35.422] - Field: 'uuid' [13:10:35.422] - Field: 'seed' [13:10:35.422] - Field: 'version' [13:10:35.422] - Field: 'result' [13:10:35.422] - Field: 'asynchronous' [13:10:35.423] - Field: 'calls' [13:10:35.423] - Field: 'globals' [13:10:35.423] - Field: 'stdout' [13:10:35.423] - Field: 'earlySignal' [13:10:35.423] - Field: 'lazy' [13:10:35.423] - Field: 'state' [13:10:35.424] - Field: '.cluster' [13:10:35.424] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:35.424] - Launch lazy future ... [13:10:35.424] Packages needed by the future expression (n = 0): [13:10:35.424] Packages needed by future strategies (n = 0): [13:10:35.425] { [13:10:35.425] { [13:10:35.425] { [13:10:35.425] ...future.startTime <- base::Sys.time() [13:10:35.425] { [13:10:35.425] { [13:10:35.425] { [13:10:35.425] base::local({ [13:10:35.425] has_future <- base::requireNamespace("future", [13:10:35.425] quietly = TRUE) [13:10:35.425] if (has_future) { [13:10:35.425] ns <- base::getNamespace("future") [13:10:35.425] version <- ns[[".package"]][["version"]] [13:10:35.425] if (is.null(version)) [13:10:35.425] version <- utils::packageVersion("future") [13:10:35.425] } [13:10:35.425] else { [13:10:35.425] version <- NULL [13:10:35.425] } [13:10:35.425] if (!has_future || version < "1.8.0") { [13:10:35.425] info <- base::c(r_version = base::gsub("R version ", [13:10:35.425] "", base::R.version$version.string), [13:10:35.425] platform = base::sprintf("%s (%s-bit)", [13:10:35.425] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:35.425] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:35.425] "release", "version")], collapse = " "), [13:10:35.425] hostname = base::Sys.info()[["nodename"]]) [13:10:35.425] info <- base::sprintf("%s: %s", base::names(info), [13:10:35.425] info) [13:10:35.425] info <- base::paste(info, collapse = "; ") [13:10:35.425] if (!has_future) { [13:10:35.425] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:35.425] info) [13:10:35.425] } [13:10:35.425] else { [13:10:35.425] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:35.425] info, version) [13:10:35.425] } [13:10:35.425] base::stop(msg) [13:10:35.425] } [13:10:35.425] }) [13:10:35.425] } [13:10:35.425] ...future.strategy.old <- future::plan("list") [13:10:35.425] options(future.plan = NULL) [13:10:35.425] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.425] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:35.425] } [13:10:35.425] ...future.workdir <- getwd() [13:10:35.425] } [13:10:35.425] ...future.oldOptions <- base::as.list(base::.Options) [13:10:35.425] ...future.oldEnvVars <- base::Sys.getenv() [13:10:35.425] } [13:10:35.425] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:35.425] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:35.425] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:35.425] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:35.425] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:35.425] future.stdout.windows.reencode = NULL, width = 80L) [13:10:35.425] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:35.425] base::names(...future.oldOptions)) [13:10:35.425] } [13:10:35.425] if (FALSE) { [13:10:35.425] } [13:10:35.425] else { [13:10:35.425] if (TRUE) { [13:10:35.425] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:35.425] open = "w") [13:10:35.425] } [13:10:35.425] else { [13:10:35.425] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:35.425] windows = "NUL", "/dev/null"), open = "w") [13:10:35.425] } [13:10:35.425] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:35.425] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:35.425] base::sink(type = "output", split = FALSE) [13:10:35.425] base::close(...future.stdout) [13:10:35.425] }, add = TRUE) [13:10:35.425] } [13:10:35.425] ...future.frame <- base::sys.nframe() [13:10:35.425] ...future.conditions <- base::list() [13:10:35.425] ...future.rng <- base::globalenv()$.Random.seed [13:10:35.425] if (FALSE) { [13:10:35.425] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:35.425] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:35.425] } [13:10:35.425] ...future.result <- base::tryCatch({ [13:10:35.425] base::withCallingHandlers({ [13:10:35.425] ...future.value <- base::withVisible(base::local(2 * [13:10:35.425] a)) [13:10:35.425] future::FutureResult(value = ...future.value$value, [13:10:35.425] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.425] ...future.rng), globalenv = if (FALSE) [13:10:35.425] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:35.425] ...future.globalenv.names)) [13:10:35.425] else NULL, started = ...future.startTime, version = "1.8") [13:10:35.425] }, condition = base::local({ [13:10:35.425] c <- base::c [13:10:35.425] inherits <- base::inherits [13:10:35.425] invokeRestart <- base::invokeRestart [13:10:35.425] length <- base::length [13:10:35.425] list <- base::list [13:10:35.425] seq.int <- base::seq.int [13:10:35.425] signalCondition <- base::signalCondition [13:10:35.425] sys.calls <- base::sys.calls [13:10:35.425] `[[` <- base::`[[` [13:10:35.425] `+` <- base::`+` [13:10:35.425] `<<-` <- base::`<<-` [13:10:35.425] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:35.425] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:35.425] 3L)] [13:10:35.425] } [13:10:35.425] function(cond) { [13:10:35.425] is_error <- inherits(cond, "error") [13:10:35.425] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:35.425] NULL) [13:10:35.425] if (is_error) { [13:10:35.425] sessionInformation <- function() { [13:10:35.425] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:35.425] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:35.425] search = base::search(), system = base::Sys.info()) [13:10:35.425] } [13:10:35.425] ...future.conditions[[length(...future.conditions) + [13:10:35.425] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:35.425] cond$call), session = sessionInformation(), [13:10:35.425] timestamp = base::Sys.time(), signaled = 0L) [13:10:35.425] signalCondition(cond) [13:10:35.425] } [13:10:35.425] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:35.425] signal <- FALSE && inherits(cond, character(0)) [13:10:35.425] ...future.conditions[[length(...future.conditions) + [13:10:35.425] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:35.425] if (FALSE && !signal) { [13:10:35.425] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.425] { [13:10:35.425] inherits <- base::inherits [13:10:35.425] invokeRestart <- base::invokeRestart [13:10:35.425] is.null <- base::is.null [13:10:35.425] muffled <- FALSE [13:10:35.425] if (inherits(cond, "message")) { [13:10:35.425] muffled <- grepl(pattern, "muffleMessage") [13:10:35.425] if (muffled) [13:10:35.425] invokeRestart("muffleMessage") [13:10:35.425] } [13:10:35.425] else if (inherits(cond, "warning")) { [13:10:35.425] muffled <- grepl(pattern, "muffleWarning") [13:10:35.425] if (muffled) [13:10:35.425] invokeRestart("muffleWarning") [13:10:35.425] } [13:10:35.425] else if (inherits(cond, "condition")) { [13:10:35.425] if (!is.null(pattern)) { [13:10:35.425] computeRestarts <- base::computeRestarts [13:10:35.425] grepl <- base::grepl [13:10:35.425] restarts <- computeRestarts(cond) [13:10:35.425] for (restart in restarts) { [13:10:35.425] name <- restart$name [13:10:35.425] if (is.null(name)) [13:10:35.425] next [13:10:35.425] if (!grepl(pattern, name)) [13:10:35.425] next [13:10:35.425] invokeRestart(restart) [13:10:35.425] muffled <- TRUE [13:10:35.425] break [13:10:35.425] } [13:10:35.425] } [13:10:35.425] } [13:10:35.425] invisible(muffled) [13:10:35.425] } [13:10:35.425] muffleCondition(cond, pattern = "^muffle") [13:10:35.425] } [13:10:35.425] } [13:10:35.425] else { [13:10:35.425] if (TRUE) { [13:10:35.425] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.425] { [13:10:35.425] inherits <- base::inherits [13:10:35.425] invokeRestart <- base::invokeRestart [13:10:35.425] is.null <- base::is.null [13:10:35.425] muffled <- FALSE [13:10:35.425] if (inherits(cond, "message")) { [13:10:35.425] muffled <- grepl(pattern, "muffleMessage") [13:10:35.425] if (muffled) [13:10:35.425] invokeRestart("muffleMessage") [13:10:35.425] } [13:10:35.425] else if (inherits(cond, "warning")) { [13:10:35.425] muffled <- grepl(pattern, "muffleWarning") [13:10:35.425] if (muffled) [13:10:35.425] invokeRestart("muffleWarning") [13:10:35.425] } [13:10:35.425] else if (inherits(cond, "condition")) { [13:10:35.425] if (!is.null(pattern)) { [13:10:35.425] computeRestarts <- base::computeRestarts [13:10:35.425] grepl <- base::grepl [13:10:35.425] restarts <- computeRestarts(cond) [13:10:35.425] for (restart in restarts) { [13:10:35.425] name <- restart$name [13:10:35.425] if (is.null(name)) [13:10:35.425] next [13:10:35.425] if (!grepl(pattern, name)) [13:10:35.425] next [13:10:35.425] invokeRestart(restart) [13:10:35.425] muffled <- TRUE [13:10:35.425] break [13:10:35.425] } [13:10:35.425] } [13:10:35.425] } [13:10:35.425] invisible(muffled) [13:10:35.425] } [13:10:35.425] muffleCondition(cond, pattern = "^muffle") [13:10:35.425] } [13:10:35.425] } [13:10:35.425] } [13:10:35.425] })) [13:10:35.425] }, error = function(ex) { [13:10:35.425] base::structure(base::list(value = NULL, visible = NULL, [13:10:35.425] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.425] ...future.rng), started = ...future.startTime, [13:10:35.425] finished = Sys.time(), session_uuid = NA_character_, [13:10:35.425] version = "1.8"), class = "FutureResult") [13:10:35.425] }, finally = { [13:10:35.425] if (!identical(...future.workdir, getwd())) [13:10:35.425] setwd(...future.workdir) [13:10:35.425] { [13:10:35.425] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:35.425] ...future.oldOptions$nwarnings <- NULL [13:10:35.425] } [13:10:35.425] base::options(...future.oldOptions) [13:10:35.425] if (.Platform$OS.type == "windows") { [13:10:35.425] old_names <- names(...future.oldEnvVars) [13:10:35.425] envs <- base::Sys.getenv() [13:10:35.425] names <- names(envs) [13:10:35.425] common <- intersect(names, old_names) [13:10:35.425] added <- setdiff(names, old_names) [13:10:35.425] removed <- setdiff(old_names, names) [13:10:35.425] changed <- common[...future.oldEnvVars[common] != [13:10:35.425] envs[common]] [13:10:35.425] NAMES <- toupper(changed) [13:10:35.425] args <- list() [13:10:35.425] for (kk in seq_along(NAMES)) { [13:10:35.425] name <- changed[[kk]] [13:10:35.425] NAME <- NAMES[[kk]] [13:10:35.425] if (name != NAME && is.element(NAME, old_names)) [13:10:35.425] next [13:10:35.425] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.425] } [13:10:35.425] NAMES <- toupper(added) [13:10:35.425] for (kk in seq_along(NAMES)) { [13:10:35.425] name <- added[[kk]] [13:10:35.425] NAME <- NAMES[[kk]] [13:10:35.425] if (name != NAME && is.element(NAME, old_names)) [13:10:35.425] next [13:10:35.425] args[[name]] <- "" [13:10:35.425] } [13:10:35.425] NAMES <- toupper(removed) [13:10:35.425] for (kk in seq_along(NAMES)) { [13:10:35.425] name <- removed[[kk]] [13:10:35.425] NAME <- NAMES[[kk]] [13:10:35.425] if (name != NAME && is.element(NAME, old_names)) [13:10:35.425] next [13:10:35.425] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.425] } [13:10:35.425] if (length(args) > 0) [13:10:35.425] base::do.call(base::Sys.setenv, args = args) [13:10:35.425] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:35.425] } [13:10:35.425] else { [13:10:35.425] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:35.425] } [13:10:35.425] { [13:10:35.425] if (base::length(...future.futureOptionsAdded) > [13:10:35.425] 0L) { [13:10:35.425] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:35.425] base::names(opts) <- ...future.futureOptionsAdded [13:10:35.425] base::options(opts) [13:10:35.425] } [13:10:35.425] { [13:10:35.425] NULL [13:10:35.425] options(future.plan = NULL) [13:10:35.425] if (is.na(NA_character_)) [13:10:35.425] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.425] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:35.425] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:35.425] .init = FALSE) [13:10:35.425] } [13:10:35.425] } [13:10:35.425] } [13:10:35.425] }) [13:10:35.425] if (TRUE) { [13:10:35.425] base::sink(type = "output", split = FALSE) [13:10:35.425] if (TRUE) { [13:10:35.425] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:35.425] } [13:10:35.425] else { [13:10:35.425] ...future.result["stdout"] <- base::list(NULL) [13:10:35.425] } [13:10:35.425] base::close(...future.stdout) [13:10:35.425] ...future.stdout <- NULL [13:10:35.425] } [13:10:35.425] ...future.result$conditions <- ...future.conditions [13:10:35.425] ...future.result$finished <- base::Sys.time() [13:10:35.425] ...future.result [13:10:35.425] } [13:10:35.429] - Launch lazy future ... done [13:10:35.429] run() for 'MiraiFuture' ... done [13:10:35.431] getGlobalsAndPackages() ... [13:10:35.431] Searching for globals... [13:10:35.432] - globals found: [3] '{', '*', 'a' [13:10:35.432] Searching for globals ... DONE [13:10:35.432] Resolving globals: FALSE [13:10:35.433] The total size of the 1 globals is 56 bytes (56 bytes) [13:10:35.433] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (56 bytes of class 'numeric') [13:10:35.433] - globals: [1] 'a' [13:10:35.434] [13:10:35.434] getGlobalsAndPackages() ... DONE [13:10:35.434] run() for 'Future' ... [13:10:35.434] - state: 'created' [13:10:35.434] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:10:35.437] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:10:35.437] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:10:35.437] - Field: 'label' [13:10:35.437] - Field: 'local' [13:10:35.437] - Field: 'owner' [13:10:35.438] - Field: 'envir' [13:10:35.438] - Field: 'packages' [13:10:35.438] - Field: 'gc' [13:10:35.438] - Field: 'conditions' [13:10:35.438] - Field: 'expr' [13:10:35.438] - Field: 'uuid' [13:10:35.439] - Field: 'seed' [13:10:35.439] - Field: 'version' [13:10:35.439] - Field: 'result' [13:10:35.439] - Field: 'asynchronous' [13:10:35.439] - Field: 'calls' [13:10:35.439] - Field: 'globals' [13:10:35.440] - Field: 'stdout' [13:10:35.440] - Field: 'earlySignal' [13:10:35.440] - Field: 'lazy' [13:10:35.440] - Field: 'state' [13:10:35.440] - Field: '.cluster' [13:10:35.440] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:10:35.441] - Launch lazy future ... [13:10:35.441] Packages needed by the future expression (n = 0): [13:10:35.441] Packages needed by future strategies (n = 0): [13:10:35.441] { [13:10:35.441] { [13:10:35.441] { [13:10:35.441] ...future.startTime <- base::Sys.time() [13:10:35.441] { [13:10:35.441] { [13:10:35.441] { [13:10:35.441] base::local({ [13:10:35.441] has_future <- base::requireNamespace("future", [13:10:35.441] quietly = TRUE) [13:10:35.441] if (has_future) { [13:10:35.441] ns <- base::getNamespace("future") [13:10:35.441] version <- ns[[".package"]][["version"]] [13:10:35.441] if (is.null(version)) [13:10:35.441] version <- utils::packageVersion("future") [13:10:35.441] } [13:10:35.441] else { [13:10:35.441] version <- NULL [13:10:35.441] } [13:10:35.441] if (!has_future || version < "1.8.0") { [13:10:35.441] info <- base::c(r_version = base::gsub("R version ", [13:10:35.441] "", base::R.version$version.string), [13:10:35.441] platform = base::sprintf("%s (%s-bit)", [13:10:35.441] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:10:35.441] os = base::paste(base::Sys.info()[base::c("sysname", [13:10:35.441] "release", "version")], collapse = " "), [13:10:35.441] hostname = base::Sys.info()[["nodename"]]) [13:10:35.441] info <- base::sprintf("%s: %s", base::names(info), [13:10:35.441] info) [13:10:35.441] info <- base::paste(info, collapse = "; ") [13:10:35.441] if (!has_future) { [13:10:35.441] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:10:35.441] info) [13:10:35.441] } [13:10:35.441] else { [13:10:35.441] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:10:35.441] info, version) [13:10:35.441] } [13:10:35.441] base::stop(msg) [13:10:35.441] } [13:10:35.441] }) [13:10:35.441] } [13:10:35.441] ...future.strategy.old <- future::plan("list") [13:10:35.441] options(future.plan = NULL) [13:10:35.441] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.441] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:10:35.441] } [13:10:35.441] ...future.workdir <- getwd() [13:10:35.441] } [13:10:35.441] ...future.oldOptions <- base::as.list(base::.Options) [13:10:35.441] ...future.oldEnvVars <- base::Sys.getenv() [13:10:35.441] } [13:10:35.441] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:10:35.441] future.globals.maxSize = NULL, future.globals.method = NULL, [13:10:35.441] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:10:35.441] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:10:35.441] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:10:35.441] future.stdout.windows.reencode = NULL, width = 80L) [13:10:35.441] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:10:35.441] base::names(...future.oldOptions)) [13:10:35.441] } [13:10:35.441] if (FALSE) { [13:10:35.441] } [13:10:35.441] else { [13:10:35.441] if (TRUE) { [13:10:35.441] ...future.stdout <- base::rawConnection(base::raw(0L), [13:10:35.441] open = "w") [13:10:35.441] } [13:10:35.441] else { [13:10:35.441] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:10:35.441] windows = "NUL", "/dev/null"), open = "w") [13:10:35.441] } [13:10:35.441] base::sink(...future.stdout, type = "output", split = FALSE) [13:10:35.441] base::on.exit(if (!base::is.null(...future.stdout)) { [13:10:35.441] base::sink(type = "output", split = FALSE) [13:10:35.441] base::close(...future.stdout) [13:10:35.441] }, add = TRUE) [13:10:35.441] } [13:10:35.441] ...future.frame <- base::sys.nframe() [13:10:35.441] ...future.conditions <- base::list() [13:10:35.441] ...future.rng <- base::globalenv()$.Random.seed [13:10:35.441] if (FALSE) { [13:10:35.441] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:10:35.441] "...future.value", "...future.globalenv.names", ".Random.seed") [13:10:35.441] } [13:10:35.441] ...future.result <- base::tryCatch({ [13:10:35.441] base::withCallingHandlers({ [13:10:35.441] ...future.value <- base::withVisible(base::local({ [13:10:35.441] 2 * a [13:10:35.441] })) [13:10:35.441] future::FutureResult(value = ...future.value$value, [13:10:35.441] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.441] ...future.rng), globalenv = if (FALSE) [13:10:35.441] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:10:35.441] ...future.globalenv.names)) [13:10:35.441] else NULL, started = ...future.startTime, version = "1.8") [13:10:35.441] }, condition = base::local({ [13:10:35.441] c <- base::c [13:10:35.441] inherits <- base::inherits [13:10:35.441] invokeRestart <- base::invokeRestart [13:10:35.441] length <- base::length [13:10:35.441] list <- base::list [13:10:35.441] seq.int <- base::seq.int [13:10:35.441] signalCondition <- base::signalCondition [13:10:35.441] sys.calls <- base::sys.calls [13:10:35.441] `[[` <- base::`[[` [13:10:35.441] `+` <- base::`+` [13:10:35.441] `<<-` <- base::`<<-` [13:10:35.441] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:10:35.441] calls[seq.int(from = from + 12L, to = length(calls) - [13:10:35.441] 3L)] [13:10:35.441] } [13:10:35.441] function(cond) { [13:10:35.441] is_error <- inherits(cond, "error") [13:10:35.441] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:10:35.441] NULL) [13:10:35.441] if (is_error) { [13:10:35.441] sessionInformation <- function() { [13:10:35.441] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:10:35.441] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:10:35.441] search = base::search(), system = base::Sys.info()) [13:10:35.441] } [13:10:35.441] ...future.conditions[[length(...future.conditions) + [13:10:35.441] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:10:35.441] cond$call), session = sessionInformation(), [13:10:35.441] timestamp = base::Sys.time(), signaled = 0L) [13:10:35.441] signalCondition(cond) [13:10:35.441] } [13:10:35.441] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:10:35.441] signal <- FALSE && inherits(cond, character(0)) [13:10:35.441] ...future.conditions[[length(...future.conditions) + [13:10:35.441] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:10:35.441] if (FALSE && !signal) { [13:10:35.441] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.441] { [13:10:35.441] inherits <- base::inherits [13:10:35.441] invokeRestart <- base::invokeRestart [13:10:35.441] is.null <- base::is.null [13:10:35.441] muffled <- FALSE [13:10:35.441] if (inherits(cond, "message")) { [13:10:35.441] muffled <- grepl(pattern, "muffleMessage") [13:10:35.441] if (muffled) [13:10:35.441] invokeRestart("muffleMessage") [13:10:35.441] } [13:10:35.441] else if (inherits(cond, "warning")) { [13:10:35.441] muffled <- grepl(pattern, "muffleWarning") [13:10:35.441] if (muffled) [13:10:35.441] invokeRestart("muffleWarning") [13:10:35.441] } [13:10:35.441] else if (inherits(cond, "condition")) { [13:10:35.441] if (!is.null(pattern)) { [13:10:35.441] computeRestarts <- base::computeRestarts [13:10:35.441] grepl <- base::grepl [13:10:35.441] restarts <- computeRestarts(cond) [13:10:35.441] for (restart in restarts) { [13:10:35.441] name <- restart$name [13:10:35.441] if (is.null(name)) [13:10:35.441] next [13:10:35.441] if (!grepl(pattern, name)) [13:10:35.441] next [13:10:35.441] invokeRestart(restart) [13:10:35.441] muffled <- TRUE [13:10:35.441] break [13:10:35.441] } [13:10:35.441] } [13:10:35.441] } [13:10:35.441] invisible(muffled) [13:10:35.441] } [13:10:35.441] muffleCondition(cond, pattern = "^muffle") [13:10:35.441] } [13:10:35.441] } [13:10:35.441] else { [13:10:35.441] if (TRUE) { [13:10:35.441] muffleCondition <- function (cond, pattern = "^muffle") [13:10:35.441] { [13:10:35.441] inherits <- base::inherits [13:10:35.441] invokeRestart <- base::invokeRestart [13:10:35.441] is.null <- base::is.null [13:10:35.441] muffled <- FALSE [13:10:35.441] if (inherits(cond, "message")) { [13:10:35.441] muffled <- grepl(pattern, "muffleMessage") [13:10:35.441] if (muffled) [13:10:35.441] invokeRestart("muffleMessage") [13:10:35.441] } [13:10:35.441] else if (inherits(cond, "warning")) { [13:10:35.441] muffled <- grepl(pattern, "muffleWarning") [13:10:35.441] if (muffled) [13:10:35.441] invokeRestart("muffleWarning") [13:10:35.441] } [13:10:35.441] else if (inherits(cond, "condition")) { [13:10:35.441] if (!is.null(pattern)) { [13:10:35.441] computeRestarts <- base::computeRestarts [13:10:35.441] grepl <- base::grepl [13:10:35.441] restarts <- computeRestarts(cond) [13:10:35.441] for (restart in restarts) { [13:10:35.441] name <- restart$name [13:10:35.441] if (is.null(name)) [13:10:35.441] next [13:10:35.441] if (!grepl(pattern, name)) [13:10:35.441] next [13:10:35.441] invokeRestart(restart) [13:10:35.441] muffled <- TRUE [13:10:35.441] break [13:10:35.441] } [13:10:35.441] } [13:10:35.441] } [13:10:35.441] invisible(muffled) [13:10:35.441] } [13:10:35.441] muffleCondition(cond, pattern = "^muffle") [13:10:35.441] } [13:10:35.441] } [13:10:35.441] } [13:10:35.441] })) [13:10:35.441] }, error = function(ex) { [13:10:35.441] base::structure(base::list(value = NULL, visible = NULL, [13:10:35.441] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:10:35.441] ...future.rng), started = ...future.startTime, [13:10:35.441] finished = Sys.time(), session_uuid = NA_character_, [13:10:35.441] version = "1.8"), class = "FutureResult") [13:10:35.441] }, finally = { [13:10:35.441] if (!identical(...future.workdir, getwd())) [13:10:35.441] setwd(...future.workdir) [13:10:35.441] { [13:10:35.441] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:10:35.441] ...future.oldOptions$nwarnings <- NULL [13:10:35.441] } [13:10:35.441] base::options(...future.oldOptions) [13:10:35.441] if (.Platform$OS.type == "windows") { [13:10:35.441] old_names <- names(...future.oldEnvVars) [13:10:35.441] envs <- base::Sys.getenv() [13:10:35.441] names <- names(envs) [13:10:35.441] common <- intersect(names, old_names) [13:10:35.441] added <- setdiff(names, old_names) [13:10:35.441] removed <- setdiff(old_names, names) [13:10:35.441] changed <- common[...future.oldEnvVars[common] != [13:10:35.441] envs[common]] [13:10:35.441] NAMES <- toupper(changed) [13:10:35.441] args <- list() [13:10:35.441] for (kk in seq_along(NAMES)) { [13:10:35.441] name <- changed[[kk]] [13:10:35.441] NAME <- NAMES[[kk]] [13:10:35.441] if (name != NAME && is.element(NAME, old_names)) [13:10:35.441] next [13:10:35.441] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.441] } [13:10:35.441] NAMES <- toupper(added) [13:10:35.441] for (kk in seq_along(NAMES)) { [13:10:35.441] name <- added[[kk]] [13:10:35.441] NAME <- NAMES[[kk]] [13:10:35.441] if (name != NAME && is.element(NAME, old_names)) [13:10:35.441] next [13:10:35.441] args[[name]] <- "" [13:10:35.441] } [13:10:35.441] NAMES <- toupper(removed) [13:10:35.441] for (kk in seq_along(NAMES)) { [13:10:35.441] name <- removed[[kk]] [13:10:35.441] NAME <- NAMES[[kk]] [13:10:35.441] if (name != NAME && is.element(NAME, old_names)) [13:10:35.441] next [13:10:35.441] args[[name]] <- ...future.oldEnvVars[[name]] [13:10:35.441] } [13:10:35.441] if (length(args) > 0) [13:10:35.441] base::do.call(base::Sys.setenv, args = args) [13:10:35.441] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:10:35.441] } [13:10:35.441] else { [13:10:35.441] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:10:35.441] } [13:10:35.441] { [13:10:35.441] if (base::length(...future.futureOptionsAdded) > [13:10:35.441] 0L) { [13:10:35.441] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:10:35.441] base::names(opts) <- ...future.futureOptionsAdded [13:10:35.441] base::options(opts) [13:10:35.441] } [13:10:35.441] { [13:10:35.441] NULL [13:10:35.441] options(future.plan = NULL) [13:10:35.441] if (is.na(NA_character_)) [13:10:35.441] Sys.unsetenv("R_FUTURE_PLAN") [13:10:35.441] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:10:35.441] future::plan(...future.strategy.old, .cleanup = FALSE, [13:10:35.441] .init = FALSE) [13:10:35.441] } [13:10:35.441] } [13:10:35.441] } [13:10:35.441] }) [13:10:35.441] if (TRUE) { [13:10:35.441] base::sink(type = "output", split = FALSE) [13:10:35.441] if (TRUE) { [13:10:35.441] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:10:35.441] } [13:10:35.441] else { [13:10:35.441] ...future.result["stdout"] <- base::list(NULL) [13:10:35.441] } [13:10:35.441] base::close(...future.stdout) [13:10:35.441] ...future.stdout <- NULL [13:10:35.441] } [13:10:35.441] ...future.result$conditions <- ...future.conditions [13:10:35.441] ...future.result$finished <- base::Sys.time() [13:10:35.441] ...future.result [13:10:35.441] } [13:10:35.445] - Launch lazy future ... done [13:10:35.445] run() for 'MiraiFuture' ... done [13:10:35.447] - plan('mirai_multisession') ... DONE> > message("*** Futures - lazy ... DONE") *** Futures - lazy ... DONE > > source("incl/end.R") > > proc.time() user system elapsed 0.37 0.06 0.92